R Under development (unstable) (2023-12-20 r85711 ucrt) -- "Unsuffered Consequences" Copyright (C) 2023 The R Foundation for Statistical Computing Platform: x86_64-w64-mingw32/x64 R is free software and comes with ABSOLUTELY NO WARRANTY. You are welcome to redistribute it under certain conditions. Type 'license()' or 'licence()' for distribution details. R is a collaborative project with many contributors. Type 'contributors()' for more information and 'citation()' on how to cite R or R packages in publications. Type 'demo()' for some demos, 'help()' for on-line help, or 'help.start()' for an HTML browser interface to help. Type 'q()' to quit R. > source("incl/start.R") Loading required package: future [13:13:38.553] plan(): Setting new future strategy stack: [13:13:38.554] List of future strategies: [13:13:38.554] 1. sequential: [13:13:38.554] - args: function (..., envir = parent.frame(), workers = "") [13:13:38.554] - tweaked: FALSE [13:13:38.554] - call: future::plan("sequential") [13:13:38.569] 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') ... [13:13:38.648] plan(): Setting new future strategy stack: [13:13:38.648] List of future strategies: [13:13:38.648] 1. sequential: [13:13:38.648] - args: function (..., envir = parent.frame(), workers = "") [13:13:38.648] - tweaked: FALSE [13:13:38.648] - call: plan(strategy) [13:13:38.661] plan(): nbrOfWorkers() = 1 - future_lapply(x, FUN = vector, ...) ... [13:13:38.661] future_lapply() ... [13:13:38.668] Number of chunks: 4 [13:13:38.668] getGlobalsAndPackagesXApply() ... [13:13:38.669] - future.globals: TRUE [13:13:38.669] getGlobalsAndPackages() ... [13:13:38.670] Searching for globals... [13:13:38.672] - globals found: [2] 'FUN', '.Internal' [13:13:38.672] Searching for globals ... DONE [13:13:38.673] Resolving globals: FALSE [13:13:38.674] The total size of the 1 globals is 2.13 KiB (2184 bytes) [13:13:38.674] 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') [13:13:38.674] - globals: [1] 'FUN' [13:13:38.675] [13:13:38.675] getGlobalsAndPackages() ... DONE [13:13:38.675] - globals found/used: [n=1] 'FUN' [13:13:38.675] - needed namespaces: [n=0] [13:13:38.675] Finding globals ... DONE [13:13:38.676] - use_args: TRUE [13:13:38.676] - Getting '...' globals ... [13:13:38.677] resolve() on list ... [13:13:38.677] recursive: 0 [13:13:38.679] length: 1 [13:13:38.679] elements: '...' [13:13:38.679] length: 0 (resolved future 1) [13:13:38.679] resolve() on list ... DONE [13:13:38.679] - '...' content: [n=1] 'length' [13:13:38.680] List of 1 [13:13:38.680] $ ...:List of 1 [13:13:38.680] ..$ length: int 2 [13:13:38.680] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:38.680] - attr(*, "where")=List of 1 [13:13:38.680] ..$ ...: [13:13:38.680] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:38.680] - attr(*, "resolved")= logi TRUE [13:13:38.680] - attr(*, "total_size")= num NA [13:13:38.683] - Getting '...' globals ... DONE [13:13:38.684] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:38.684] List of 2 [13:13:38.684] $ ...future.FUN:function (mode = "logical", length = 0L) [13:13:38.684] $ ... :List of 1 [13:13:38.684] ..$ length: int 2 [13:13:38.684] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:38.684] - attr(*, "where")=List of 2 [13:13:38.684] ..$ ...future.FUN: [13:13:38.684] ..$ ... : [13:13:38.684] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:38.684] - attr(*, "resolved")= logi FALSE [13:13:38.684] - attr(*, "total_size")= num 2240 [13:13:38.688] Packages to be attached in all futures: [n=0] [13:13:38.688] getGlobalsAndPackagesXApply() ... DONE [13:13:38.688] Number of futures (= number of chunks): 4 [13:13:38.688] Launching 4 futures (chunks) ... [13:13:38.689] Chunk #1 of 4 ... [13:13:38.689] - Finding globals in 'X' for chunk #1 ... [13:13:38.689] getGlobalsAndPackages() ... [13:13:38.689] Searching for globals... [13:13:38.690] [13:13:38.690] Searching for globals ... DONE [13:13:38.690] - globals: [0] [13:13:38.690] getGlobalsAndPackages() ... DONE [13:13:38.690] + additional globals found: [n=0] [13:13:38.690] + additional namespaces needed: [n=0] [13:13:38.691] - Finding globals in 'X' for chunk #1 ... DONE [13:13:38.691] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [13:13:38.691] - seeds: [13:13:38.691] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:38.691] getGlobalsAndPackages() ... [13:13:38.691] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:38.692] Resolving globals: FALSE [13:13:38.692] Tweak future expression to call with '...' arguments ... [13:13:38.692] { [13:13:38.692] do.call(function(...) { [13:13:38.692] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:38.692] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:38.692] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:38.692] on.exit(options(oopts), add = TRUE) [13:13:38.692] } [13:13:38.692] { [13:13:38.692] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:38.692] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:38.692] ...future.FUN(...future.X_jj, ...) [13:13:38.692] }) [13:13:38.692] } [13:13:38.692] }, args = future.call.arguments) [13:13:38.692] } [13:13:38.692] Tweak future expression to call with '...' arguments ... DONE [13:13:38.693] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:38.693] [13:13:38.693] getGlobalsAndPackages() ... DONE [13:13:38.694] run() for 'Future' ... [13:13:38.694] - state: 'created' [13:13:38.695] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:13:38.695] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:38.695] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:38.695] - Field: 'label' [13:13:38.696] - Field: 'local' [13:13:38.696] - Field: 'owner' [13:13:38.696] - Field: 'envir' [13:13:38.696] - Field: 'packages' [13:13:38.696] - Field: 'gc' [13:13:38.697] - Field: 'conditions' [13:13:38.697] - Field: 'expr' [13:13:38.697] - Field: 'uuid' [13:13:38.697] - Field: 'seed' [13:13:38.697] - Field: 'version' [13:13:38.697] - Field: 'result' [13:13:38.698] - Field: 'asynchronous' [13:13:38.698] - Field: 'calls' [13:13:38.698] - Field: 'globals' [13:13:38.698] - Field: 'stdout' [13:13:38.698] - Field: 'earlySignal' [13:13:38.698] - Field: 'lazy' [13:13:38.699] - Field: 'state' [13:13:38.699] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:38.699] - Launch lazy future ... [13:13:38.700] Packages needed by the future expression (n = 0): [13:13:38.700] Packages needed by future strategies (n = 0): [13:13:38.701] { [13:13:38.701] { [13:13:38.701] { [13:13:38.701] ...future.startTime <- base::Sys.time() [13:13:38.701] { [13:13:38.701] { [13:13:38.701] { [13:13:38.701] base::local({ [13:13:38.701] has_future <- base::requireNamespace("future", [13:13:38.701] quietly = TRUE) [13:13:38.701] if (has_future) { [13:13:38.701] ns <- base::getNamespace("future") [13:13:38.701] version <- ns[[".package"]][["version"]] [13:13:38.701] if (is.null(version)) [13:13:38.701] version <- utils::packageVersion("future") [13:13:38.701] } [13:13:38.701] else { [13:13:38.701] version <- NULL [13:13:38.701] } [13:13:38.701] if (!has_future || version < "1.8.0") { [13:13:38.701] info <- base::c(r_version = base::gsub("R version ", [13:13:38.701] "", base::R.version$version.string), [13:13:38.701] platform = base::sprintf("%s (%s-bit)", [13:13:38.701] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:38.701] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:38.701] "release", "version")], collapse = " "), [13:13:38.701] hostname = base::Sys.info()[["nodename"]]) [13:13:38.701] info <- base::sprintf("%s: %s", base::names(info), [13:13:38.701] info) [13:13:38.701] info <- base::paste(info, collapse = "; ") [13:13:38.701] if (!has_future) { [13:13:38.701] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:38.701] info) [13:13:38.701] } [13:13:38.701] else { [13:13:38.701] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:38.701] info, version) [13:13:38.701] } [13:13:38.701] base::stop(msg) [13:13:38.701] } [13:13:38.701] }) [13:13:38.701] } [13:13:38.701] options(future.plan = NULL) [13:13:38.701] Sys.unsetenv("R_FUTURE_PLAN") [13:13:38.701] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:38.701] } [13:13:38.701] ...future.workdir <- getwd() [13:13:38.701] } [13:13:38.701] ...future.oldOptions <- base::as.list(base::.Options) [13:13:38.701] ...future.oldEnvVars <- base::Sys.getenv() [13:13:38.701] } [13:13:38.701] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:38.701] future.globals.maxSize = 2097152000, future.globals.method = NULL, [13:13:38.701] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:38.701] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:38.701] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:38.701] future.stdout.windows.reencode = NULL, width = 80L) [13:13:38.701] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:38.701] base::names(...future.oldOptions)) [13:13:38.701] } [13:13:38.701] if (FALSE) { [13:13:38.701] } [13:13:38.701] else { [13:13:38.701] if (TRUE) { [13:13:38.701] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:38.701] open = "w") [13:13:38.701] } [13:13:38.701] else { [13:13:38.701] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:38.701] windows = "NUL", "/dev/null"), open = "w") [13:13:38.701] } [13:13:38.701] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:38.701] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:38.701] base::sink(type = "output", split = FALSE) [13:13:38.701] base::close(...future.stdout) [13:13:38.701] }, add = TRUE) [13:13:38.701] } [13:13:38.701] ...future.frame <- base::sys.nframe() [13:13:38.701] ...future.conditions <- base::list() [13:13:38.701] ...future.rng <- base::globalenv()$.Random.seed [13:13:38.701] if (FALSE) { [13:13:38.701] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:38.701] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:38.701] } [13:13:38.701] ...future.result <- base::tryCatch({ [13:13:38.701] base::withCallingHandlers({ [13:13:38.701] ...future.value <- base::withVisible(base::local({ [13:13:38.701] do.call(function(...) { [13:13:38.701] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:38.701] if (!identical(...future.globals.maxSize.org, [13:13:38.701] ...future.globals.maxSize)) { [13:13:38.701] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:38.701] on.exit(options(oopts), add = TRUE) [13:13:38.701] } [13:13:38.701] { [13:13:38.701] lapply(seq_along(...future.elements_ii), [13:13:38.701] FUN = function(jj) { [13:13:38.701] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:38.701] ...future.FUN(...future.X_jj, ...) [13:13:38.701] }) [13:13:38.701] } [13:13:38.701] }, args = future.call.arguments) [13:13:38.701] })) [13:13:38.701] future::FutureResult(value = ...future.value$value, [13:13:38.701] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:38.701] ...future.rng), globalenv = if (FALSE) [13:13:38.701] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:38.701] ...future.globalenv.names)) [13:13:38.701] else NULL, started = ...future.startTime, version = "1.8") [13:13:38.701] }, condition = base::local({ [13:13:38.701] c <- base::c [13:13:38.701] inherits <- base::inherits [13:13:38.701] invokeRestart <- base::invokeRestart [13:13:38.701] length <- base::length [13:13:38.701] list <- base::list [13:13:38.701] seq.int <- base::seq.int [13:13:38.701] signalCondition <- base::signalCondition [13:13:38.701] sys.calls <- base::sys.calls [13:13:38.701] `[[` <- base::`[[` [13:13:38.701] `+` <- base::`+` [13:13:38.701] `<<-` <- base::`<<-` [13:13:38.701] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:38.701] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:38.701] 3L)] [13:13:38.701] } [13:13:38.701] function(cond) { [13:13:38.701] is_error <- inherits(cond, "error") [13:13:38.701] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:38.701] NULL) [13:13:38.701] if (is_error) { [13:13:38.701] sessionInformation <- function() { [13:13:38.701] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:38.701] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:38.701] search = base::search(), system = base::Sys.info()) [13:13:38.701] } [13:13:38.701] ...future.conditions[[length(...future.conditions) + [13:13:38.701] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:38.701] cond$call), session = sessionInformation(), [13:13:38.701] timestamp = base::Sys.time(), signaled = 0L) [13:13:38.701] signalCondition(cond) [13:13:38.701] } [13:13:38.701] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:38.701] "immediateCondition"))) { [13:13:38.701] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:38.701] ...future.conditions[[length(...future.conditions) + [13:13:38.701] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:38.701] if (TRUE && !signal) { [13:13:38.701] muffleCondition <- function (cond, pattern = "^muffle") [13:13:38.701] { [13:13:38.701] inherits <- base::inherits [13:13:38.701] invokeRestart <- base::invokeRestart [13:13:38.701] is.null <- base::is.null [13:13:38.701] muffled <- FALSE [13:13:38.701] if (inherits(cond, "message")) { [13:13:38.701] muffled <- grepl(pattern, "muffleMessage") [13:13:38.701] if (muffled) [13:13:38.701] invokeRestart("muffleMessage") [13:13:38.701] } [13:13:38.701] else if (inherits(cond, "warning")) { [13:13:38.701] muffled <- grepl(pattern, "muffleWarning") [13:13:38.701] if (muffled) [13:13:38.701] invokeRestart("muffleWarning") [13:13:38.701] } [13:13:38.701] else if (inherits(cond, "condition")) { [13:13:38.701] if (!is.null(pattern)) { [13:13:38.701] computeRestarts <- base::computeRestarts [13:13:38.701] grepl <- base::grepl [13:13:38.701] restarts <- computeRestarts(cond) [13:13:38.701] for (restart in restarts) { [13:13:38.701] name <- restart$name [13:13:38.701] if (is.null(name)) [13:13:38.701] next [13:13:38.701] if (!grepl(pattern, name)) [13:13:38.701] next [13:13:38.701] invokeRestart(restart) [13:13:38.701] muffled <- TRUE [13:13:38.701] break [13:13:38.701] } [13:13:38.701] } [13:13:38.701] } [13:13:38.701] invisible(muffled) [13:13:38.701] } [13:13:38.701] muffleCondition(cond, pattern = "^muffle") [13:13:38.701] } [13:13:38.701] } [13:13:38.701] else { [13:13:38.701] if (TRUE) { [13:13:38.701] muffleCondition <- function (cond, pattern = "^muffle") [13:13:38.701] { [13:13:38.701] inherits <- base::inherits [13:13:38.701] invokeRestart <- base::invokeRestart [13:13:38.701] is.null <- base::is.null [13:13:38.701] muffled <- FALSE [13:13:38.701] if (inherits(cond, "message")) { [13:13:38.701] muffled <- grepl(pattern, "muffleMessage") [13:13:38.701] if (muffled) [13:13:38.701] invokeRestart("muffleMessage") [13:13:38.701] } [13:13:38.701] else if (inherits(cond, "warning")) { [13:13:38.701] muffled <- grepl(pattern, "muffleWarning") [13:13:38.701] if (muffled) [13:13:38.701] invokeRestart("muffleWarning") [13:13:38.701] } [13:13:38.701] else if (inherits(cond, "condition")) { [13:13:38.701] if (!is.null(pattern)) { [13:13:38.701] computeRestarts <- base::computeRestarts [13:13:38.701] grepl <- base::grepl [13:13:38.701] restarts <- computeRestarts(cond) [13:13:38.701] for (restart in restarts) { [13:13:38.701] name <- restart$name [13:13:38.701] if (is.null(name)) [13:13:38.701] next [13:13:38.701] if (!grepl(pattern, name)) [13:13:38.701] next [13:13:38.701] invokeRestart(restart) [13:13:38.701] muffled <- TRUE [13:13:38.701] break [13:13:38.701] } [13:13:38.701] } [13:13:38.701] } [13:13:38.701] invisible(muffled) [13:13:38.701] } [13:13:38.701] muffleCondition(cond, pattern = "^muffle") [13:13:38.701] } [13:13:38.701] } [13:13:38.701] } [13:13:38.701] })) [13:13:38.701] }, error = function(ex) { [13:13:38.701] base::structure(base::list(value = NULL, visible = NULL, [13:13:38.701] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:38.701] ...future.rng), started = ...future.startTime, [13:13:38.701] finished = Sys.time(), session_uuid = NA_character_, [13:13:38.701] version = "1.8"), class = "FutureResult") [13:13:38.701] }, finally = { [13:13:38.701] if (!identical(...future.workdir, getwd())) [13:13:38.701] setwd(...future.workdir) [13:13:38.701] { [13:13:38.701] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:38.701] ...future.oldOptions$nwarnings <- NULL [13:13:38.701] } [13:13:38.701] base::options(...future.oldOptions) [13:13:38.701] if (.Platform$OS.type == "windows") { [13:13:38.701] old_names <- names(...future.oldEnvVars) [13:13:38.701] envs <- base::Sys.getenv() [13:13:38.701] names <- names(envs) [13:13:38.701] common <- intersect(names, old_names) [13:13:38.701] added <- setdiff(names, old_names) [13:13:38.701] removed <- setdiff(old_names, names) [13:13:38.701] changed <- common[...future.oldEnvVars[common] != [13:13:38.701] envs[common]] [13:13:38.701] NAMES <- toupper(changed) [13:13:38.701] args <- list() [13:13:38.701] for (kk in seq_along(NAMES)) { [13:13:38.701] name <- changed[[kk]] [13:13:38.701] NAME <- NAMES[[kk]] [13:13:38.701] if (name != NAME && is.element(NAME, old_names)) [13:13:38.701] next [13:13:38.701] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:38.701] } [13:13:38.701] NAMES <- toupper(added) [13:13:38.701] for (kk in seq_along(NAMES)) { [13:13:38.701] name <- added[[kk]] [13:13:38.701] NAME <- NAMES[[kk]] [13:13:38.701] if (name != NAME && is.element(NAME, old_names)) [13:13:38.701] next [13:13:38.701] args[[name]] <- "" [13:13:38.701] } [13:13:38.701] NAMES <- toupper(removed) [13:13:38.701] for (kk in seq_along(NAMES)) { [13:13:38.701] name <- removed[[kk]] [13:13:38.701] NAME <- NAMES[[kk]] [13:13:38.701] if (name != NAME && is.element(NAME, old_names)) [13:13:38.701] next [13:13:38.701] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:38.701] } [13:13:38.701] if (length(args) > 0) [13:13:38.701] base::do.call(base::Sys.setenv, args = args) [13:13:38.701] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:38.701] } [13:13:38.701] else { [13:13:38.701] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:38.701] } [13:13:38.701] { [13:13:38.701] if (base::length(...future.futureOptionsAdded) > [13:13:38.701] 0L) { [13:13:38.701] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:38.701] base::names(opts) <- ...future.futureOptionsAdded [13:13:38.701] base::options(opts) [13:13:38.701] } [13:13:38.701] { [13:13:38.701] { [13:13:38.701] NULL [13:13:38.701] RNGkind("Mersenne-Twister") [13:13:38.701] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:38.701] inherits = FALSE) [13:13:38.701] } [13:13:38.701] options(future.plan = NULL) [13:13:38.701] if (is.na(NA_character_)) [13:13:38.701] Sys.unsetenv("R_FUTURE_PLAN") [13:13:38.701] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:38.701] future::plan(list(function (..., envir = parent.frame()) [13:13:38.701] { [13:13:38.701] future <- SequentialFuture(..., envir = envir) [13:13:38.701] if (!future$lazy) [13:13:38.701] future <- run(future) [13:13:38.701] invisible(future) [13:13:38.701] }), .cleanup = FALSE, .init = FALSE) [13:13:38.701] } [13:13:38.701] } [13:13:38.701] } [13:13:38.701] }) [13:13:38.701] if (TRUE) { [13:13:38.701] base::sink(type = "output", split = FALSE) [13:13:38.701] if (TRUE) { [13:13:38.701] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:38.701] } [13:13:38.701] else { [13:13:38.701] ...future.result["stdout"] <- base::list(NULL) [13:13:38.701] } [13:13:38.701] base::close(...future.stdout) [13:13:38.701] ...future.stdout <- NULL [13:13:38.701] } [13:13:38.701] ...future.result$conditions <- ...future.conditions [13:13:38.701] ...future.result$finished <- base::Sys.time() [13:13:38.701] ...future.result [13:13:38.701] } [13:13:38.705] assign_globals() ... [13:13:38.705] List of 5 [13:13:38.705] $ ...future.FUN :function (mode = "logical", length = 0L) [13:13:38.705] $ future.call.arguments :List of 1 [13:13:38.705] ..$ length: int 2 [13:13:38.705] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:38.705] $ ...future.elements_ii :List of 1 [13:13:38.705] ..$ a: chr "integer" [13:13:38.705] $ ...future.seeds_ii : NULL [13:13:38.705] $ ...future.globals.maxSize: NULL [13:13:38.705] - attr(*, "where")=List of 5 [13:13:38.705] ..$ ...future.FUN : [13:13:38.705] ..$ future.call.arguments : [13:13:38.705] ..$ ...future.elements_ii : [13:13:38.705] ..$ ...future.seeds_ii : [13:13:38.705] ..$ ...future.globals.maxSize: [13:13:38.705] - attr(*, "resolved")= logi FALSE [13:13:38.705] - attr(*, "total_size")= num 2240 [13:13:38.705] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:38.705] - attr(*, "already-done")= logi TRUE [13:13:38.713] - copied '...future.FUN' to environment [13:13:38.713] - copied 'future.call.arguments' to environment [13:13:38.713] - copied '...future.elements_ii' to environment [13:13:38.713] - copied '...future.seeds_ii' to environment [13:13:38.713] - copied '...future.globals.maxSize' to environment [13:13:38.713] assign_globals() ... done [13:13:38.714] plan(): Setting new future strategy stack: [13:13:38.714] List of future strategies: [13:13:38.714] 1. sequential: [13:13:38.714] - args: function (..., envir = parent.frame(), workers = "") [13:13:38.714] - tweaked: FALSE [13:13:38.714] - call: NULL [13:13:38.715] plan(): nbrOfWorkers() = 1 [13:13:38.717] plan(): Setting new future strategy stack: [13:13:38.717] List of future strategies: [13:13:38.717] 1. sequential: [13:13:38.717] - args: function (..., envir = parent.frame(), workers = "") [13:13:38.717] - tweaked: FALSE [13:13:38.717] - call: plan(strategy) [13:13:38.717] plan(): nbrOfWorkers() = 1 [13:13:38.718] SequentialFuture started (and completed) [13:13:38.718] - Launch lazy future ... done [13:13:38.718] run() for 'SequentialFuture' ... done [13:13:38.719] Created future: [13:13:38.719] SequentialFuture: [13:13:38.719] Label: 'future_lapply-1' [13:13:38.719] Expression: [13:13:38.719] { [13:13:38.719] do.call(function(...) { [13:13:38.719] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:38.719] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:38.719] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:38.719] on.exit(options(oopts), add = TRUE) [13:13:38.719] } [13:13:38.719] { [13:13:38.719] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:38.719] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:38.719] ...future.FUN(...future.X_jj, ...) [13:13:38.719] }) [13:13:38.719] } [13:13:38.719] }, args = future.call.arguments) [13:13:38.719] } [13:13:38.719] Lazy evaluation: FALSE [13:13:38.719] Asynchronous evaluation: FALSE [13:13:38.719] Local evaluation: TRUE [13:13:38.719] Environment: R_GlobalEnv [13:13:38.719] Capture standard output: TRUE [13:13:38.719] Capture condition classes: 'condition' (excluding 'nothing') [13:13:38.719] 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) [13:13:38.719] Packages: [13:13:38.719] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:38.719] Resolved: TRUE [13:13:38.719] Value: 56 bytes of class 'list' [13:13:38.719] Early signaling: FALSE [13:13:38.719] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:38.719] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:38.721] Chunk #1 of 4 ... DONE [13:13:38.721] Chunk #2 of 4 ... [13:13:38.721] - Finding globals in 'X' for chunk #2 ... [13:13:38.721] getGlobalsAndPackages() ... [13:13:38.721] Searching for globals... [13:13:38.722] [13:13:38.722] Searching for globals ... DONE [13:13:38.722] - globals: [0] [13:13:38.722] getGlobalsAndPackages() ... DONE [13:13:38.722] + additional globals found: [n=0] [13:13:38.722] + additional namespaces needed: [n=0] [13:13:38.723] - Finding globals in 'X' for chunk #2 ... DONE [13:13:38.723] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [13:13:38.723] - seeds: [13:13:38.723] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:38.723] getGlobalsAndPackages() ... [13:13:38.723] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:38.723] Resolving globals: FALSE [13:13:38.724] Tweak future expression to call with '...' arguments ... [13:13:38.724] { [13:13:38.724] do.call(function(...) { [13:13:38.724] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:38.724] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:38.724] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:38.724] on.exit(options(oopts), add = TRUE) [13:13:38.724] } [13:13:38.724] { [13:13:38.724] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:38.724] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:38.724] ...future.FUN(...future.X_jj, ...) [13:13:38.724] }) [13:13:38.724] } [13:13:38.724] }, args = future.call.arguments) [13:13:38.724] } [13:13:38.724] Tweak future expression to call with '...' arguments ... DONE [13:13:38.725] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:38.725] [13:13:38.725] getGlobalsAndPackages() ... DONE [13:13:38.726] run() for 'Future' ... [13:13:38.726] - state: 'created' [13:13:38.726] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:13:38.726] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:38.727] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:38.727] - Field: 'label' [13:13:38.727] - Field: 'local' [13:13:38.727] - Field: 'owner' [13:13:38.727] - Field: 'envir' [13:13:38.728] - Field: 'packages' [13:13:38.728] - Field: 'gc' [13:13:38.728] - Field: 'conditions' [13:13:38.728] - Field: 'expr' [13:13:38.729] - Field: 'uuid' [13:13:38.729] - Field: 'seed' [13:13:38.729] - Field: 'version' [13:13:38.729] - Field: 'result' [13:13:38.729] - Field: 'asynchronous' [13:13:38.729] - Field: 'calls' [13:13:38.730] - Field: 'globals' [13:13:38.730] - Field: 'stdout' [13:13:38.730] - Field: 'earlySignal' [13:13:38.730] - Field: 'lazy' [13:13:38.730] - Field: 'state' [13:13:38.730] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:38.731] - Launch lazy future ... [13:13:38.731] Packages needed by the future expression (n = 0): [13:13:38.731] Packages needed by future strategies (n = 0): [13:13:38.732] { [13:13:38.732] { [13:13:38.732] { [13:13:38.732] ...future.startTime <- base::Sys.time() [13:13:38.732] { [13:13:38.732] { [13:13:38.732] { [13:13:38.732] base::local({ [13:13:38.732] has_future <- base::requireNamespace("future", [13:13:38.732] quietly = TRUE) [13:13:38.732] if (has_future) { [13:13:38.732] ns <- base::getNamespace("future") [13:13:38.732] version <- ns[[".package"]][["version"]] [13:13:38.732] if (is.null(version)) [13:13:38.732] version <- utils::packageVersion("future") [13:13:38.732] } [13:13:38.732] else { [13:13:38.732] version <- NULL [13:13:38.732] } [13:13:38.732] if (!has_future || version < "1.8.0") { [13:13:38.732] info <- base::c(r_version = base::gsub("R version ", [13:13:38.732] "", base::R.version$version.string), [13:13:38.732] platform = base::sprintf("%s (%s-bit)", [13:13:38.732] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:38.732] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:38.732] "release", "version")], collapse = " "), [13:13:38.732] hostname = base::Sys.info()[["nodename"]]) [13:13:38.732] info <- base::sprintf("%s: %s", base::names(info), [13:13:38.732] info) [13:13:38.732] info <- base::paste(info, collapse = "; ") [13:13:38.732] if (!has_future) { [13:13:38.732] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:38.732] info) [13:13:38.732] } [13:13:38.732] else { [13:13:38.732] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:38.732] info, version) [13:13:38.732] } [13:13:38.732] base::stop(msg) [13:13:38.732] } [13:13:38.732] }) [13:13:38.732] } [13:13:38.732] options(future.plan = NULL) [13:13:38.732] Sys.unsetenv("R_FUTURE_PLAN") [13:13:38.732] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:38.732] } [13:13:38.732] ...future.workdir <- getwd() [13:13:38.732] } [13:13:38.732] ...future.oldOptions <- base::as.list(base::.Options) [13:13:38.732] ...future.oldEnvVars <- base::Sys.getenv() [13:13:38.732] } [13:13:38.732] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:38.732] future.globals.maxSize = 2097152000, future.globals.method = NULL, [13:13:38.732] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:38.732] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:38.732] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:38.732] future.stdout.windows.reencode = NULL, width = 80L) [13:13:38.732] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:38.732] base::names(...future.oldOptions)) [13:13:38.732] } [13:13:38.732] if (FALSE) { [13:13:38.732] } [13:13:38.732] else { [13:13:38.732] if (TRUE) { [13:13:38.732] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:38.732] open = "w") [13:13:38.732] } [13:13:38.732] else { [13:13:38.732] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:38.732] windows = "NUL", "/dev/null"), open = "w") [13:13:38.732] } [13:13:38.732] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:38.732] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:38.732] base::sink(type = "output", split = FALSE) [13:13:38.732] base::close(...future.stdout) [13:13:38.732] }, add = TRUE) [13:13:38.732] } [13:13:38.732] ...future.frame <- base::sys.nframe() [13:13:38.732] ...future.conditions <- base::list() [13:13:38.732] ...future.rng <- base::globalenv()$.Random.seed [13:13:38.732] if (FALSE) { [13:13:38.732] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:38.732] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:38.732] } [13:13:38.732] ...future.result <- base::tryCatch({ [13:13:38.732] base::withCallingHandlers({ [13:13:38.732] ...future.value <- base::withVisible(base::local({ [13:13:38.732] do.call(function(...) { [13:13:38.732] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:38.732] if (!identical(...future.globals.maxSize.org, [13:13:38.732] ...future.globals.maxSize)) { [13:13:38.732] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:38.732] on.exit(options(oopts), add = TRUE) [13:13:38.732] } [13:13:38.732] { [13:13:38.732] lapply(seq_along(...future.elements_ii), [13:13:38.732] FUN = function(jj) { [13:13:38.732] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:38.732] ...future.FUN(...future.X_jj, ...) [13:13:38.732] }) [13:13:38.732] } [13:13:38.732] }, args = future.call.arguments) [13:13:38.732] })) [13:13:38.732] future::FutureResult(value = ...future.value$value, [13:13:38.732] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:38.732] ...future.rng), globalenv = if (FALSE) [13:13:38.732] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:38.732] ...future.globalenv.names)) [13:13:38.732] else NULL, started = ...future.startTime, version = "1.8") [13:13:38.732] }, condition = base::local({ [13:13:38.732] c <- base::c [13:13:38.732] inherits <- base::inherits [13:13:38.732] invokeRestart <- base::invokeRestart [13:13:38.732] length <- base::length [13:13:38.732] list <- base::list [13:13:38.732] seq.int <- base::seq.int [13:13:38.732] signalCondition <- base::signalCondition [13:13:38.732] sys.calls <- base::sys.calls [13:13:38.732] `[[` <- base::`[[` [13:13:38.732] `+` <- base::`+` [13:13:38.732] `<<-` <- base::`<<-` [13:13:38.732] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:38.732] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:38.732] 3L)] [13:13:38.732] } [13:13:38.732] function(cond) { [13:13:38.732] is_error <- inherits(cond, "error") [13:13:38.732] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:38.732] NULL) [13:13:38.732] if (is_error) { [13:13:38.732] sessionInformation <- function() { [13:13:38.732] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:38.732] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:38.732] search = base::search(), system = base::Sys.info()) [13:13:38.732] } [13:13:38.732] ...future.conditions[[length(...future.conditions) + [13:13:38.732] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:38.732] cond$call), session = sessionInformation(), [13:13:38.732] timestamp = base::Sys.time(), signaled = 0L) [13:13:38.732] signalCondition(cond) [13:13:38.732] } [13:13:38.732] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:38.732] "immediateCondition"))) { [13:13:38.732] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:38.732] ...future.conditions[[length(...future.conditions) + [13:13:38.732] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:38.732] if (TRUE && !signal) { [13:13:38.732] muffleCondition <- function (cond, pattern = "^muffle") [13:13:38.732] { [13:13:38.732] inherits <- base::inherits [13:13:38.732] invokeRestart <- base::invokeRestart [13:13:38.732] is.null <- base::is.null [13:13:38.732] muffled <- FALSE [13:13:38.732] if (inherits(cond, "message")) { [13:13:38.732] muffled <- grepl(pattern, "muffleMessage") [13:13:38.732] if (muffled) [13:13:38.732] invokeRestart("muffleMessage") [13:13:38.732] } [13:13:38.732] else if (inherits(cond, "warning")) { [13:13:38.732] muffled <- grepl(pattern, "muffleWarning") [13:13:38.732] if (muffled) [13:13:38.732] invokeRestart("muffleWarning") [13:13:38.732] } [13:13:38.732] else if (inherits(cond, "condition")) { [13:13:38.732] if (!is.null(pattern)) { [13:13:38.732] computeRestarts <- base::computeRestarts [13:13:38.732] grepl <- base::grepl [13:13:38.732] restarts <- computeRestarts(cond) [13:13:38.732] for (restart in restarts) { [13:13:38.732] name <- restart$name [13:13:38.732] if (is.null(name)) [13:13:38.732] next [13:13:38.732] if (!grepl(pattern, name)) [13:13:38.732] next [13:13:38.732] invokeRestart(restart) [13:13:38.732] muffled <- TRUE [13:13:38.732] break [13:13:38.732] } [13:13:38.732] } [13:13:38.732] } [13:13:38.732] invisible(muffled) [13:13:38.732] } [13:13:38.732] muffleCondition(cond, pattern = "^muffle") [13:13:38.732] } [13:13:38.732] } [13:13:38.732] else { [13:13:38.732] if (TRUE) { [13:13:38.732] muffleCondition <- function (cond, pattern = "^muffle") [13:13:38.732] { [13:13:38.732] inherits <- base::inherits [13:13:38.732] invokeRestart <- base::invokeRestart [13:13:38.732] is.null <- base::is.null [13:13:38.732] muffled <- FALSE [13:13:38.732] if (inherits(cond, "message")) { [13:13:38.732] muffled <- grepl(pattern, "muffleMessage") [13:13:38.732] if (muffled) [13:13:38.732] invokeRestart("muffleMessage") [13:13:38.732] } [13:13:38.732] else if (inherits(cond, "warning")) { [13:13:38.732] muffled <- grepl(pattern, "muffleWarning") [13:13:38.732] if (muffled) [13:13:38.732] invokeRestart("muffleWarning") [13:13:38.732] } [13:13:38.732] else if (inherits(cond, "condition")) { [13:13:38.732] if (!is.null(pattern)) { [13:13:38.732] computeRestarts <- base::computeRestarts [13:13:38.732] grepl <- base::grepl [13:13:38.732] restarts <- computeRestarts(cond) [13:13:38.732] for (restart in restarts) { [13:13:38.732] name <- restart$name [13:13:38.732] if (is.null(name)) [13:13:38.732] next [13:13:38.732] if (!grepl(pattern, name)) [13:13:38.732] next [13:13:38.732] invokeRestart(restart) [13:13:38.732] muffled <- TRUE [13:13:38.732] break [13:13:38.732] } [13:13:38.732] } [13:13:38.732] } [13:13:38.732] invisible(muffled) [13:13:38.732] } [13:13:38.732] muffleCondition(cond, pattern = "^muffle") [13:13:38.732] } [13:13:38.732] } [13:13:38.732] } [13:13:38.732] })) [13:13:38.732] }, error = function(ex) { [13:13:38.732] base::structure(base::list(value = NULL, visible = NULL, [13:13:38.732] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:38.732] ...future.rng), started = ...future.startTime, [13:13:38.732] finished = Sys.time(), session_uuid = NA_character_, [13:13:38.732] version = "1.8"), class = "FutureResult") [13:13:38.732] }, finally = { [13:13:38.732] if (!identical(...future.workdir, getwd())) [13:13:38.732] setwd(...future.workdir) [13:13:38.732] { [13:13:38.732] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:38.732] ...future.oldOptions$nwarnings <- NULL [13:13:38.732] } [13:13:38.732] base::options(...future.oldOptions) [13:13:38.732] if (.Platform$OS.type == "windows") { [13:13:38.732] old_names <- names(...future.oldEnvVars) [13:13:38.732] envs <- base::Sys.getenv() [13:13:38.732] names <- names(envs) [13:13:38.732] common <- intersect(names, old_names) [13:13:38.732] added <- setdiff(names, old_names) [13:13:38.732] removed <- setdiff(old_names, names) [13:13:38.732] changed <- common[...future.oldEnvVars[common] != [13:13:38.732] envs[common]] [13:13:38.732] NAMES <- toupper(changed) [13:13:38.732] args <- list() [13:13:38.732] for (kk in seq_along(NAMES)) { [13:13:38.732] name <- changed[[kk]] [13:13:38.732] NAME <- NAMES[[kk]] [13:13:38.732] if (name != NAME && is.element(NAME, old_names)) [13:13:38.732] next [13:13:38.732] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:38.732] } [13:13:38.732] NAMES <- toupper(added) [13:13:38.732] for (kk in seq_along(NAMES)) { [13:13:38.732] name <- added[[kk]] [13:13:38.732] NAME <- NAMES[[kk]] [13:13:38.732] if (name != NAME && is.element(NAME, old_names)) [13:13:38.732] next [13:13:38.732] args[[name]] <- "" [13:13:38.732] } [13:13:38.732] NAMES <- toupper(removed) [13:13:38.732] for (kk in seq_along(NAMES)) { [13:13:38.732] name <- removed[[kk]] [13:13:38.732] NAME <- NAMES[[kk]] [13:13:38.732] if (name != NAME && is.element(NAME, old_names)) [13:13:38.732] next [13:13:38.732] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:38.732] } [13:13:38.732] if (length(args) > 0) [13:13:38.732] base::do.call(base::Sys.setenv, args = args) [13:13:38.732] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:38.732] } [13:13:38.732] else { [13:13:38.732] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:38.732] } [13:13:38.732] { [13:13:38.732] if (base::length(...future.futureOptionsAdded) > [13:13:38.732] 0L) { [13:13:38.732] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:38.732] base::names(opts) <- ...future.futureOptionsAdded [13:13:38.732] base::options(opts) [13:13:38.732] } [13:13:38.732] { [13:13:38.732] { [13:13:38.732] NULL [13:13:38.732] RNGkind("Mersenne-Twister") [13:13:38.732] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:38.732] inherits = FALSE) [13:13:38.732] } [13:13:38.732] options(future.plan = NULL) [13:13:38.732] if (is.na(NA_character_)) [13:13:38.732] Sys.unsetenv("R_FUTURE_PLAN") [13:13:38.732] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:38.732] future::plan(list(function (..., envir = parent.frame()) [13:13:38.732] { [13:13:38.732] future <- SequentialFuture(..., envir = envir) [13:13:38.732] if (!future$lazy) [13:13:38.732] future <- run(future) [13:13:38.732] invisible(future) [13:13:38.732] }), .cleanup = FALSE, .init = FALSE) [13:13:38.732] } [13:13:38.732] } [13:13:38.732] } [13:13:38.732] }) [13:13:38.732] if (TRUE) { [13:13:38.732] base::sink(type = "output", split = FALSE) [13:13:38.732] if (TRUE) { [13:13:38.732] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:38.732] } [13:13:38.732] else { [13:13:38.732] ...future.result["stdout"] <- base::list(NULL) [13:13:38.732] } [13:13:38.732] base::close(...future.stdout) [13:13:38.732] ...future.stdout <- NULL [13:13:38.732] } [13:13:38.732] ...future.result$conditions <- ...future.conditions [13:13:38.732] ...future.result$finished <- base::Sys.time() [13:13:38.732] ...future.result [13:13:38.732] } [13:13:38.735] assign_globals() ... [13:13:38.736] List of 5 [13:13:38.736] $ ...future.FUN :function (mode = "logical", length = 0L) [13:13:38.736] $ future.call.arguments :List of 1 [13:13:38.736] ..$ length: int 2 [13:13:38.736] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:38.736] $ ...future.elements_ii :List of 1 [13:13:38.736] ..$ b: chr "numeric" [13:13:38.736] $ ...future.seeds_ii : NULL [13:13:38.736] $ ...future.globals.maxSize: NULL [13:13:38.736] - attr(*, "where")=List of 5 [13:13:38.736] ..$ ...future.FUN : [13:13:38.736] ..$ future.call.arguments : [13:13:38.736] ..$ ...future.elements_ii : [13:13:38.736] ..$ ...future.seeds_ii : [13:13:38.736] ..$ ...future.globals.maxSize: [13:13:38.736] - attr(*, "resolved")= logi FALSE [13:13:38.736] - attr(*, "total_size")= num 2240 [13:13:38.736] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:38.736] - attr(*, "already-done")= logi TRUE [13:13:38.742] - copied '...future.FUN' to environment [13:13:38.742] - copied 'future.call.arguments' to environment [13:13:38.742] - copied '...future.elements_ii' to environment [13:13:38.742] - copied '...future.seeds_ii' to environment [13:13:38.742] - copied '...future.globals.maxSize' to environment [13:13:38.742] assign_globals() ... done [13:13:38.744] plan(): Setting new future strategy stack: [13:13:38.744] List of future strategies: [13:13:38.744] 1. sequential: [13:13:38.744] - args: function (..., envir = parent.frame(), workers = "") [13:13:38.744] - tweaked: FALSE [13:13:38.744] - call: NULL [13:13:38.744] plan(): nbrOfWorkers() = 1 [13:13:38.746] plan(): Setting new future strategy stack: [13:13:38.746] List of future strategies: [13:13:38.746] 1. sequential: [13:13:38.746] - args: function (..., envir = parent.frame(), workers = "") [13:13:38.746] - tweaked: FALSE [13:13:38.746] - call: plan(strategy) [13:13:38.746] plan(): nbrOfWorkers() = 1 [13:13:38.747] SequentialFuture started (and completed) [13:13:38.747] - Launch lazy future ... done [13:13:38.747] run() for 'SequentialFuture' ... done [13:13:38.747] Created future: [13:13:38.747] SequentialFuture: [13:13:38.747] Label: 'future_lapply-2' [13:13:38.747] Expression: [13:13:38.747] { [13:13:38.747] do.call(function(...) { [13:13:38.747] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:38.747] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:38.747] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:38.747] on.exit(options(oopts), add = TRUE) [13:13:38.747] } [13:13:38.747] { [13:13:38.747] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:38.747] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:38.747] ...future.FUN(...future.X_jj, ...) [13:13:38.747] }) [13:13:38.747] } [13:13:38.747] }, args = future.call.arguments) [13:13:38.747] } [13:13:38.747] Lazy evaluation: FALSE [13:13:38.747] Asynchronous evaluation: FALSE [13:13:38.747] Local evaluation: TRUE [13:13:38.747] Environment: R_GlobalEnv [13:13:38.747] Capture standard output: TRUE [13:13:38.747] Capture condition classes: 'condition' (excluding 'nothing') [13:13:38.747] 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) [13:13:38.747] Packages: [13:13:38.747] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:38.747] Resolved: TRUE [13:13:38.747] Value: 64 bytes of class 'list' [13:13:38.747] Early signaling: FALSE [13:13:38.747] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:38.747] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:38.749] Chunk #2 of 4 ... DONE [13:13:38.749] Chunk #3 of 4 ... [13:13:38.749] - Finding globals in 'X' for chunk #3 ... [13:13:38.749] getGlobalsAndPackages() ... [13:13:38.749] Searching for globals... [13:13:38.750] [13:13:38.750] Searching for globals ... DONE [13:13:38.750] - globals: [0] [13:13:38.750] getGlobalsAndPackages() ... DONE [13:13:38.750] + additional globals found: [n=0] [13:13:38.750] + additional namespaces needed: [n=0] [13:13:38.751] - Finding globals in 'X' for chunk #3 ... DONE [13:13:38.751] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [13:13:38.751] - seeds: [13:13:38.751] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:38.751] getGlobalsAndPackages() ... [13:13:38.751] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:38.751] Resolving globals: FALSE [13:13:38.752] Tweak future expression to call with '...' arguments ... [13:13:38.752] { [13:13:38.752] do.call(function(...) { [13:13:38.752] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:38.752] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:38.752] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:38.752] on.exit(options(oopts), add = TRUE) [13:13:38.752] } [13:13:38.752] { [13:13:38.752] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:38.752] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:38.752] ...future.FUN(...future.X_jj, ...) [13:13:38.752] }) [13:13:38.752] } [13:13:38.752] }, args = future.call.arguments) [13:13:38.752] } [13:13:38.752] Tweak future expression to call with '...' arguments ... DONE [13:13:38.753] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:38.753] [13:13:38.753] getGlobalsAndPackages() ... DONE [13:13:38.753] run() for 'Future' ... [13:13:38.754] - state: 'created' [13:13:38.754] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:13:38.754] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:38.754] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:38.755] - Field: 'label' [13:13:38.755] - Field: 'local' [13:13:38.755] - Field: 'owner' [13:13:38.755] - Field: 'envir' [13:13:38.755] - Field: 'packages' [13:13:38.755] - Field: 'gc' [13:13:38.756] - Field: 'conditions' [13:13:38.756] - Field: 'expr' [13:13:38.756] - Field: 'uuid' [13:13:38.756] - Field: 'seed' [13:13:38.756] - Field: 'version' [13:13:38.757] - Field: 'result' [13:13:38.757] - Field: 'asynchronous' [13:13:38.757] - Field: 'calls' [13:13:38.757] - Field: 'globals' [13:13:38.757] - Field: 'stdout' [13:13:38.757] - Field: 'earlySignal' [13:13:38.758] - Field: 'lazy' [13:13:38.758] - Field: 'state' [13:13:38.758] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:38.758] - Launch lazy future ... [13:13:38.758] Packages needed by the future expression (n = 0): [13:13:38.758] Packages needed by future strategies (n = 0): [13:13:38.759] { [13:13:38.759] { [13:13:38.759] { [13:13:38.759] ...future.startTime <- base::Sys.time() [13:13:38.759] { [13:13:38.759] { [13:13:38.759] { [13:13:38.759] base::local({ [13:13:38.759] has_future <- base::requireNamespace("future", [13:13:38.759] quietly = TRUE) [13:13:38.759] if (has_future) { [13:13:38.759] ns <- base::getNamespace("future") [13:13:38.759] version <- ns[[".package"]][["version"]] [13:13:38.759] if (is.null(version)) [13:13:38.759] version <- utils::packageVersion("future") [13:13:38.759] } [13:13:38.759] else { [13:13:38.759] version <- NULL [13:13:38.759] } [13:13:38.759] if (!has_future || version < "1.8.0") { [13:13:38.759] info <- base::c(r_version = base::gsub("R version ", [13:13:38.759] "", base::R.version$version.string), [13:13:38.759] platform = base::sprintf("%s (%s-bit)", [13:13:38.759] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:38.759] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:38.759] "release", "version")], collapse = " "), [13:13:38.759] hostname = base::Sys.info()[["nodename"]]) [13:13:38.759] info <- base::sprintf("%s: %s", base::names(info), [13:13:38.759] info) [13:13:38.759] info <- base::paste(info, collapse = "; ") [13:13:38.759] if (!has_future) { [13:13:38.759] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:38.759] info) [13:13:38.759] } [13:13:38.759] else { [13:13:38.759] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:38.759] info, version) [13:13:38.759] } [13:13:38.759] base::stop(msg) [13:13:38.759] } [13:13:38.759] }) [13:13:38.759] } [13:13:38.759] options(future.plan = NULL) [13:13:38.759] Sys.unsetenv("R_FUTURE_PLAN") [13:13:38.759] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:38.759] } [13:13:38.759] ...future.workdir <- getwd() [13:13:38.759] } [13:13:38.759] ...future.oldOptions <- base::as.list(base::.Options) [13:13:38.759] ...future.oldEnvVars <- base::Sys.getenv() [13:13:38.759] } [13:13:38.759] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:38.759] future.globals.maxSize = 2097152000, future.globals.method = NULL, [13:13:38.759] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:38.759] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:38.759] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:38.759] future.stdout.windows.reencode = NULL, width = 80L) [13:13:38.759] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:38.759] base::names(...future.oldOptions)) [13:13:38.759] } [13:13:38.759] if (FALSE) { [13:13:38.759] } [13:13:38.759] else { [13:13:38.759] if (TRUE) { [13:13:38.759] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:38.759] open = "w") [13:13:38.759] } [13:13:38.759] else { [13:13:38.759] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:38.759] windows = "NUL", "/dev/null"), open = "w") [13:13:38.759] } [13:13:38.759] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:38.759] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:38.759] base::sink(type = "output", split = FALSE) [13:13:38.759] base::close(...future.stdout) [13:13:38.759] }, add = TRUE) [13:13:38.759] } [13:13:38.759] ...future.frame <- base::sys.nframe() [13:13:38.759] ...future.conditions <- base::list() [13:13:38.759] ...future.rng <- base::globalenv()$.Random.seed [13:13:38.759] if (FALSE) { [13:13:38.759] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:38.759] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:38.759] } [13:13:38.759] ...future.result <- base::tryCatch({ [13:13:38.759] base::withCallingHandlers({ [13:13:38.759] ...future.value <- base::withVisible(base::local({ [13:13:38.759] do.call(function(...) { [13:13:38.759] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:38.759] if (!identical(...future.globals.maxSize.org, [13:13:38.759] ...future.globals.maxSize)) { [13:13:38.759] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:38.759] on.exit(options(oopts), add = TRUE) [13:13:38.759] } [13:13:38.759] { [13:13:38.759] lapply(seq_along(...future.elements_ii), [13:13:38.759] FUN = function(jj) { [13:13:38.759] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:38.759] ...future.FUN(...future.X_jj, ...) [13:13:38.759] }) [13:13:38.759] } [13:13:38.759] }, args = future.call.arguments) [13:13:38.759] })) [13:13:38.759] future::FutureResult(value = ...future.value$value, [13:13:38.759] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:38.759] ...future.rng), globalenv = if (FALSE) [13:13:38.759] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:38.759] ...future.globalenv.names)) [13:13:38.759] else NULL, started = ...future.startTime, version = "1.8") [13:13:38.759] }, condition = base::local({ [13:13:38.759] c <- base::c [13:13:38.759] inherits <- base::inherits [13:13:38.759] invokeRestart <- base::invokeRestart [13:13:38.759] length <- base::length [13:13:38.759] list <- base::list [13:13:38.759] seq.int <- base::seq.int [13:13:38.759] signalCondition <- base::signalCondition [13:13:38.759] sys.calls <- base::sys.calls [13:13:38.759] `[[` <- base::`[[` [13:13:38.759] `+` <- base::`+` [13:13:38.759] `<<-` <- base::`<<-` [13:13:38.759] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:38.759] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:38.759] 3L)] [13:13:38.759] } [13:13:38.759] function(cond) { [13:13:38.759] is_error <- inherits(cond, "error") [13:13:38.759] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:38.759] NULL) [13:13:38.759] if (is_error) { [13:13:38.759] sessionInformation <- function() { [13:13:38.759] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:38.759] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:38.759] search = base::search(), system = base::Sys.info()) [13:13:38.759] } [13:13:38.759] ...future.conditions[[length(...future.conditions) + [13:13:38.759] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:38.759] cond$call), session = sessionInformation(), [13:13:38.759] timestamp = base::Sys.time(), signaled = 0L) [13:13:38.759] signalCondition(cond) [13:13:38.759] } [13:13:38.759] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:38.759] "immediateCondition"))) { [13:13:38.759] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:38.759] ...future.conditions[[length(...future.conditions) + [13:13:38.759] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:38.759] if (TRUE && !signal) { [13:13:38.759] muffleCondition <- function (cond, pattern = "^muffle") [13:13:38.759] { [13:13:38.759] inherits <- base::inherits [13:13:38.759] invokeRestart <- base::invokeRestart [13:13:38.759] is.null <- base::is.null [13:13:38.759] muffled <- FALSE [13:13:38.759] if (inherits(cond, "message")) { [13:13:38.759] muffled <- grepl(pattern, "muffleMessage") [13:13:38.759] if (muffled) [13:13:38.759] invokeRestart("muffleMessage") [13:13:38.759] } [13:13:38.759] else if (inherits(cond, "warning")) { [13:13:38.759] muffled <- grepl(pattern, "muffleWarning") [13:13:38.759] if (muffled) [13:13:38.759] invokeRestart("muffleWarning") [13:13:38.759] } [13:13:38.759] else if (inherits(cond, "condition")) { [13:13:38.759] if (!is.null(pattern)) { [13:13:38.759] computeRestarts <- base::computeRestarts [13:13:38.759] grepl <- base::grepl [13:13:38.759] restarts <- computeRestarts(cond) [13:13:38.759] for (restart in restarts) { [13:13:38.759] name <- restart$name [13:13:38.759] if (is.null(name)) [13:13:38.759] next [13:13:38.759] if (!grepl(pattern, name)) [13:13:38.759] next [13:13:38.759] invokeRestart(restart) [13:13:38.759] muffled <- TRUE [13:13:38.759] break [13:13:38.759] } [13:13:38.759] } [13:13:38.759] } [13:13:38.759] invisible(muffled) [13:13:38.759] } [13:13:38.759] muffleCondition(cond, pattern = "^muffle") [13:13:38.759] } [13:13:38.759] } [13:13:38.759] else { [13:13:38.759] if (TRUE) { [13:13:38.759] muffleCondition <- function (cond, pattern = "^muffle") [13:13:38.759] { [13:13:38.759] inherits <- base::inherits [13:13:38.759] invokeRestart <- base::invokeRestart [13:13:38.759] is.null <- base::is.null [13:13:38.759] muffled <- FALSE [13:13:38.759] if (inherits(cond, "message")) { [13:13:38.759] muffled <- grepl(pattern, "muffleMessage") [13:13:38.759] if (muffled) [13:13:38.759] invokeRestart("muffleMessage") [13:13:38.759] } [13:13:38.759] else if (inherits(cond, "warning")) { [13:13:38.759] muffled <- grepl(pattern, "muffleWarning") [13:13:38.759] if (muffled) [13:13:38.759] invokeRestart("muffleWarning") [13:13:38.759] } [13:13:38.759] else if (inherits(cond, "condition")) { [13:13:38.759] if (!is.null(pattern)) { [13:13:38.759] computeRestarts <- base::computeRestarts [13:13:38.759] grepl <- base::grepl [13:13:38.759] restarts <- computeRestarts(cond) [13:13:38.759] for (restart in restarts) { [13:13:38.759] name <- restart$name [13:13:38.759] if (is.null(name)) [13:13:38.759] next [13:13:38.759] if (!grepl(pattern, name)) [13:13:38.759] next [13:13:38.759] invokeRestart(restart) [13:13:38.759] muffled <- TRUE [13:13:38.759] break [13:13:38.759] } [13:13:38.759] } [13:13:38.759] } [13:13:38.759] invisible(muffled) [13:13:38.759] } [13:13:38.759] muffleCondition(cond, pattern = "^muffle") [13:13:38.759] } [13:13:38.759] } [13:13:38.759] } [13:13:38.759] })) [13:13:38.759] }, error = function(ex) { [13:13:38.759] base::structure(base::list(value = NULL, visible = NULL, [13:13:38.759] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:38.759] ...future.rng), started = ...future.startTime, [13:13:38.759] finished = Sys.time(), session_uuid = NA_character_, [13:13:38.759] version = "1.8"), class = "FutureResult") [13:13:38.759] }, finally = { [13:13:38.759] if (!identical(...future.workdir, getwd())) [13:13:38.759] setwd(...future.workdir) [13:13:38.759] { [13:13:38.759] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:38.759] ...future.oldOptions$nwarnings <- NULL [13:13:38.759] } [13:13:38.759] base::options(...future.oldOptions) [13:13:38.759] if (.Platform$OS.type == "windows") { [13:13:38.759] old_names <- names(...future.oldEnvVars) [13:13:38.759] envs <- base::Sys.getenv() [13:13:38.759] names <- names(envs) [13:13:38.759] common <- intersect(names, old_names) [13:13:38.759] added <- setdiff(names, old_names) [13:13:38.759] removed <- setdiff(old_names, names) [13:13:38.759] changed <- common[...future.oldEnvVars[common] != [13:13:38.759] envs[common]] [13:13:38.759] NAMES <- toupper(changed) [13:13:38.759] args <- list() [13:13:38.759] for (kk in seq_along(NAMES)) { [13:13:38.759] name <- changed[[kk]] [13:13:38.759] NAME <- NAMES[[kk]] [13:13:38.759] if (name != NAME && is.element(NAME, old_names)) [13:13:38.759] next [13:13:38.759] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:38.759] } [13:13:38.759] NAMES <- toupper(added) [13:13:38.759] for (kk in seq_along(NAMES)) { [13:13:38.759] name <- added[[kk]] [13:13:38.759] NAME <- NAMES[[kk]] [13:13:38.759] if (name != NAME && is.element(NAME, old_names)) [13:13:38.759] next [13:13:38.759] args[[name]] <- "" [13:13:38.759] } [13:13:38.759] NAMES <- toupper(removed) [13:13:38.759] for (kk in seq_along(NAMES)) { [13:13:38.759] name <- removed[[kk]] [13:13:38.759] NAME <- NAMES[[kk]] [13:13:38.759] if (name != NAME && is.element(NAME, old_names)) [13:13:38.759] next [13:13:38.759] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:38.759] } [13:13:38.759] if (length(args) > 0) [13:13:38.759] base::do.call(base::Sys.setenv, args = args) [13:13:38.759] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:38.759] } [13:13:38.759] else { [13:13:38.759] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:38.759] } [13:13:38.759] { [13:13:38.759] if (base::length(...future.futureOptionsAdded) > [13:13:38.759] 0L) { [13:13:38.759] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:38.759] base::names(opts) <- ...future.futureOptionsAdded [13:13:38.759] base::options(opts) [13:13:38.759] } [13:13:38.759] { [13:13:38.759] { [13:13:38.759] NULL [13:13:38.759] RNGkind("Mersenne-Twister") [13:13:38.759] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:38.759] inherits = FALSE) [13:13:38.759] } [13:13:38.759] options(future.plan = NULL) [13:13:38.759] if (is.na(NA_character_)) [13:13:38.759] Sys.unsetenv("R_FUTURE_PLAN") [13:13:38.759] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:38.759] future::plan(list(function (..., envir = parent.frame()) [13:13:38.759] { [13:13:38.759] future <- SequentialFuture(..., envir = envir) [13:13:38.759] if (!future$lazy) [13:13:38.759] future <- run(future) [13:13:38.759] invisible(future) [13:13:38.759] }), .cleanup = FALSE, .init = FALSE) [13:13:38.759] } [13:13:38.759] } [13:13:38.759] } [13:13:38.759] }) [13:13:38.759] if (TRUE) { [13:13:38.759] base::sink(type = "output", split = FALSE) [13:13:38.759] if (TRUE) { [13:13:38.759] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:38.759] } [13:13:38.759] else { [13:13:38.759] ...future.result["stdout"] <- base::list(NULL) [13:13:38.759] } [13:13:38.759] base::close(...future.stdout) [13:13:38.759] ...future.stdout <- NULL [13:13:38.759] } [13:13:38.759] ...future.result$conditions <- ...future.conditions [13:13:38.759] ...future.result$finished <- base::Sys.time() [13:13:38.759] ...future.result [13:13:38.759] } [13:13:38.763] assign_globals() ... [13:13:38.763] List of 5 [13:13:38.763] $ ...future.FUN :function (mode = "logical", length = 0L) [13:13:38.763] $ future.call.arguments :List of 1 [13:13:38.763] ..$ length: int 2 [13:13:38.763] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:38.763] $ ...future.elements_ii :List of 1 [13:13:38.763] ..$ c: chr "character" [13:13:38.763] $ ...future.seeds_ii : NULL [13:13:38.763] $ ...future.globals.maxSize: NULL [13:13:38.763] - attr(*, "where")=List of 5 [13:13:38.763] ..$ ...future.FUN : [13:13:38.763] ..$ future.call.arguments : [13:13:38.763] ..$ ...future.elements_ii : [13:13:38.763] ..$ ...future.seeds_ii : [13:13:38.763] ..$ ...future.globals.maxSize: [13:13:38.763] - attr(*, "resolved")= logi FALSE [13:13:38.763] - attr(*, "total_size")= num 2240 [13:13:38.763] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:38.763] - attr(*, "already-done")= logi TRUE [13:13:38.769] - copied '...future.FUN' to environment [13:13:38.769] - copied 'future.call.arguments' to environment [13:13:38.769] - copied '...future.elements_ii' to environment [13:13:38.769] - copied '...future.seeds_ii' to environment [13:13:38.770] - copied '...future.globals.maxSize' to environment [13:13:38.770] assign_globals() ... done [13:13:38.770] plan(): Setting new future strategy stack: [13:13:38.770] List of future strategies: [13:13:38.770] 1. sequential: [13:13:38.770] - args: function (..., envir = parent.frame(), workers = "") [13:13:38.770] - tweaked: FALSE [13:13:38.770] - call: NULL [13:13:38.771] plan(): nbrOfWorkers() = 1 [13:13:38.772] plan(): Setting new future strategy stack: [13:13:38.772] List of future strategies: [13:13:38.772] 1. sequential: [13:13:38.772] - args: function (..., envir = parent.frame(), workers = "") [13:13:38.772] - tweaked: FALSE [13:13:38.772] - call: plan(strategy) [13:13:38.773] plan(): nbrOfWorkers() = 1 [13:13:38.773] SequentialFuture started (and completed) [13:13:38.773] - Launch lazy future ... done [13:13:38.774] run() for 'SequentialFuture' ... done [13:13:38.775] Created future: [13:13:38.775] SequentialFuture: [13:13:38.775] Label: 'future_lapply-3' [13:13:38.775] Expression: [13:13:38.775] { [13:13:38.775] do.call(function(...) { [13:13:38.775] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:38.775] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:38.775] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:38.775] on.exit(options(oopts), add = TRUE) [13:13:38.775] } [13:13:38.775] { [13:13:38.775] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:38.775] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:38.775] ...future.FUN(...future.X_jj, ...) [13:13:38.775] }) [13:13:38.775] } [13:13:38.775] }, args = future.call.arguments) [13:13:38.775] } [13:13:38.775] Lazy evaluation: FALSE [13:13:38.775] Asynchronous evaluation: FALSE [13:13:38.775] Local evaluation: TRUE [13:13:38.775] Environment: R_GlobalEnv [13:13:38.775] Capture standard output: TRUE [13:13:38.775] Capture condition classes: 'condition' (excluding 'nothing') [13:13:38.775] 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) [13:13:38.775] Packages: [13:13:38.775] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:38.775] Resolved: TRUE [13:13:38.775] Value: 120 bytes of class 'list' [13:13:38.775] Early signaling: FALSE [13:13:38.775] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:38.775] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:38.776] Chunk #3 of 4 ... DONE [13:13:38.776] Chunk #4 of 4 ... [13:13:38.776] - Finding globals in 'X' for chunk #4 ... [13:13:38.777] getGlobalsAndPackages() ... [13:13:38.777] Searching for globals... [13:13:38.777] [13:13:38.777] Searching for globals ... DONE [13:13:38.777] - globals: [0] [13:13:38.778] getGlobalsAndPackages() ... DONE [13:13:38.778] + additional globals found: [n=0] [13:13:38.778] + additional namespaces needed: [n=0] [13:13:38.778] - Finding globals in 'X' for chunk #4 ... DONE [13:13:38.778] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [13:13:38.778] - seeds: [13:13:38.778] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:38.779] getGlobalsAndPackages() ... [13:13:38.779] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:38.779] Resolving globals: FALSE [13:13:38.779] Tweak future expression to call with '...' arguments ... [13:13:38.779] { [13:13:38.779] do.call(function(...) { [13:13:38.779] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:38.779] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:38.779] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:38.779] on.exit(options(oopts), add = TRUE) [13:13:38.779] } [13:13:38.779] { [13:13:38.779] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:38.779] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:38.779] ...future.FUN(...future.X_jj, ...) [13:13:38.779] }) [13:13:38.779] } [13:13:38.779] }, args = future.call.arguments) [13:13:38.779] } [13:13:38.780] Tweak future expression to call with '...' arguments ... DONE [13:13:38.780] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:38.780] [13:13:38.781] getGlobalsAndPackages() ... DONE [13:13:38.781] run() for 'Future' ... [13:13:38.781] - state: 'created' [13:13:38.781] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:13:38.782] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:38.782] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:38.782] - Field: 'label' [13:13:38.782] - Field: 'local' [13:13:38.782] - Field: 'owner' [13:13:38.783] - Field: 'envir' [13:13:38.783] - Field: 'packages' [13:13:38.783] - Field: 'gc' [13:13:38.783] - Field: 'conditions' [13:13:38.783] - Field: 'expr' [13:13:38.783] - Field: 'uuid' [13:13:38.784] - Field: 'seed' [13:13:38.784] - Field: 'version' [13:13:38.784] - Field: 'result' [13:13:38.784] - Field: 'asynchronous' [13:13:38.784] - Field: 'calls' [13:13:38.784] - Field: 'globals' [13:13:38.785] - Field: 'stdout' [13:13:38.785] - Field: 'earlySignal' [13:13:38.785] - Field: 'lazy' [13:13:38.785] - Field: 'state' [13:13:38.785] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:38.785] - Launch lazy future ... [13:13:38.786] Packages needed by the future expression (n = 0): [13:13:38.786] Packages needed by future strategies (n = 0): [13:13:38.786] { [13:13:38.786] { [13:13:38.786] { [13:13:38.786] ...future.startTime <- base::Sys.time() [13:13:38.786] { [13:13:38.786] { [13:13:38.786] { [13:13:38.786] base::local({ [13:13:38.786] has_future <- base::requireNamespace("future", [13:13:38.786] quietly = TRUE) [13:13:38.786] if (has_future) { [13:13:38.786] ns <- base::getNamespace("future") [13:13:38.786] version <- ns[[".package"]][["version"]] [13:13:38.786] if (is.null(version)) [13:13:38.786] version <- utils::packageVersion("future") [13:13:38.786] } [13:13:38.786] else { [13:13:38.786] version <- NULL [13:13:38.786] } [13:13:38.786] if (!has_future || version < "1.8.0") { [13:13:38.786] info <- base::c(r_version = base::gsub("R version ", [13:13:38.786] "", base::R.version$version.string), [13:13:38.786] platform = base::sprintf("%s (%s-bit)", [13:13:38.786] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:38.786] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:38.786] "release", "version")], collapse = " "), [13:13:38.786] hostname = base::Sys.info()[["nodename"]]) [13:13:38.786] info <- base::sprintf("%s: %s", base::names(info), [13:13:38.786] info) [13:13:38.786] info <- base::paste(info, collapse = "; ") [13:13:38.786] if (!has_future) { [13:13:38.786] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:38.786] info) [13:13:38.786] } [13:13:38.786] else { [13:13:38.786] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:38.786] info, version) [13:13:38.786] } [13:13:38.786] base::stop(msg) [13:13:38.786] } [13:13:38.786] }) [13:13:38.786] } [13:13:38.786] options(future.plan = NULL) [13:13:38.786] Sys.unsetenv("R_FUTURE_PLAN") [13:13:38.786] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:38.786] } [13:13:38.786] ...future.workdir <- getwd() [13:13:38.786] } [13:13:38.786] ...future.oldOptions <- base::as.list(base::.Options) [13:13:38.786] ...future.oldEnvVars <- base::Sys.getenv() [13:13:38.786] } [13:13:38.786] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:38.786] future.globals.maxSize = 2097152000, future.globals.method = NULL, [13:13:38.786] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:38.786] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:38.786] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:38.786] future.stdout.windows.reencode = NULL, width = 80L) [13:13:38.786] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:38.786] base::names(...future.oldOptions)) [13:13:38.786] } [13:13:38.786] if (FALSE) { [13:13:38.786] } [13:13:38.786] else { [13:13:38.786] if (TRUE) { [13:13:38.786] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:38.786] open = "w") [13:13:38.786] } [13:13:38.786] else { [13:13:38.786] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:38.786] windows = "NUL", "/dev/null"), open = "w") [13:13:38.786] } [13:13:38.786] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:38.786] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:38.786] base::sink(type = "output", split = FALSE) [13:13:38.786] base::close(...future.stdout) [13:13:38.786] }, add = TRUE) [13:13:38.786] } [13:13:38.786] ...future.frame <- base::sys.nframe() [13:13:38.786] ...future.conditions <- base::list() [13:13:38.786] ...future.rng <- base::globalenv()$.Random.seed [13:13:38.786] if (FALSE) { [13:13:38.786] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:38.786] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:38.786] } [13:13:38.786] ...future.result <- base::tryCatch({ [13:13:38.786] base::withCallingHandlers({ [13:13:38.786] ...future.value <- base::withVisible(base::local({ [13:13:38.786] do.call(function(...) { [13:13:38.786] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:38.786] if (!identical(...future.globals.maxSize.org, [13:13:38.786] ...future.globals.maxSize)) { [13:13:38.786] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:38.786] on.exit(options(oopts), add = TRUE) [13:13:38.786] } [13:13:38.786] { [13:13:38.786] lapply(seq_along(...future.elements_ii), [13:13:38.786] FUN = function(jj) { [13:13:38.786] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:38.786] ...future.FUN(...future.X_jj, ...) [13:13:38.786] }) [13:13:38.786] } [13:13:38.786] }, args = future.call.arguments) [13:13:38.786] })) [13:13:38.786] future::FutureResult(value = ...future.value$value, [13:13:38.786] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:38.786] ...future.rng), globalenv = if (FALSE) [13:13:38.786] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:38.786] ...future.globalenv.names)) [13:13:38.786] else NULL, started = ...future.startTime, version = "1.8") [13:13:38.786] }, condition = base::local({ [13:13:38.786] c <- base::c [13:13:38.786] inherits <- base::inherits [13:13:38.786] invokeRestart <- base::invokeRestart [13:13:38.786] length <- base::length [13:13:38.786] list <- base::list [13:13:38.786] seq.int <- base::seq.int [13:13:38.786] signalCondition <- base::signalCondition [13:13:38.786] sys.calls <- base::sys.calls [13:13:38.786] `[[` <- base::`[[` [13:13:38.786] `+` <- base::`+` [13:13:38.786] `<<-` <- base::`<<-` [13:13:38.786] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:38.786] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:38.786] 3L)] [13:13:38.786] } [13:13:38.786] function(cond) { [13:13:38.786] is_error <- inherits(cond, "error") [13:13:38.786] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:38.786] NULL) [13:13:38.786] if (is_error) { [13:13:38.786] sessionInformation <- function() { [13:13:38.786] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:38.786] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:38.786] search = base::search(), system = base::Sys.info()) [13:13:38.786] } [13:13:38.786] ...future.conditions[[length(...future.conditions) + [13:13:38.786] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:38.786] cond$call), session = sessionInformation(), [13:13:38.786] timestamp = base::Sys.time(), signaled = 0L) [13:13:38.786] signalCondition(cond) [13:13:38.786] } [13:13:38.786] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:38.786] "immediateCondition"))) { [13:13:38.786] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:38.786] ...future.conditions[[length(...future.conditions) + [13:13:38.786] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:38.786] if (TRUE && !signal) { [13:13:38.786] muffleCondition <- function (cond, pattern = "^muffle") [13:13:38.786] { [13:13:38.786] inherits <- base::inherits [13:13:38.786] invokeRestart <- base::invokeRestart [13:13:38.786] is.null <- base::is.null [13:13:38.786] muffled <- FALSE [13:13:38.786] if (inherits(cond, "message")) { [13:13:38.786] muffled <- grepl(pattern, "muffleMessage") [13:13:38.786] if (muffled) [13:13:38.786] invokeRestart("muffleMessage") [13:13:38.786] } [13:13:38.786] else if (inherits(cond, "warning")) { [13:13:38.786] muffled <- grepl(pattern, "muffleWarning") [13:13:38.786] if (muffled) [13:13:38.786] invokeRestart("muffleWarning") [13:13:38.786] } [13:13:38.786] else if (inherits(cond, "condition")) { [13:13:38.786] if (!is.null(pattern)) { [13:13:38.786] computeRestarts <- base::computeRestarts [13:13:38.786] grepl <- base::grepl [13:13:38.786] restarts <- computeRestarts(cond) [13:13:38.786] for (restart in restarts) { [13:13:38.786] name <- restart$name [13:13:38.786] if (is.null(name)) [13:13:38.786] next [13:13:38.786] if (!grepl(pattern, name)) [13:13:38.786] next [13:13:38.786] invokeRestart(restart) [13:13:38.786] muffled <- TRUE [13:13:38.786] break [13:13:38.786] } [13:13:38.786] } [13:13:38.786] } [13:13:38.786] invisible(muffled) [13:13:38.786] } [13:13:38.786] muffleCondition(cond, pattern = "^muffle") [13:13:38.786] } [13:13:38.786] } [13:13:38.786] else { [13:13:38.786] if (TRUE) { [13:13:38.786] muffleCondition <- function (cond, pattern = "^muffle") [13:13:38.786] { [13:13:38.786] inherits <- base::inherits [13:13:38.786] invokeRestart <- base::invokeRestart [13:13:38.786] is.null <- base::is.null [13:13:38.786] muffled <- FALSE [13:13:38.786] if (inherits(cond, "message")) { [13:13:38.786] muffled <- grepl(pattern, "muffleMessage") [13:13:38.786] if (muffled) [13:13:38.786] invokeRestart("muffleMessage") [13:13:38.786] } [13:13:38.786] else if (inherits(cond, "warning")) { [13:13:38.786] muffled <- grepl(pattern, "muffleWarning") [13:13:38.786] if (muffled) [13:13:38.786] invokeRestart("muffleWarning") [13:13:38.786] } [13:13:38.786] else if (inherits(cond, "condition")) { [13:13:38.786] if (!is.null(pattern)) { [13:13:38.786] computeRestarts <- base::computeRestarts [13:13:38.786] grepl <- base::grepl [13:13:38.786] restarts <- computeRestarts(cond) [13:13:38.786] for (restart in restarts) { [13:13:38.786] name <- restart$name [13:13:38.786] if (is.null(name)) [13:13:38.786] next [13:13:38.786] if (!grepl(pattern, name)) [13:13:38.786] next [13:13:38.786] invokeRestart(restart) [13:13:38.786] muffled <- TRUE [13:13:38.786] break [13:13:38.786] } [13:13:38.786] } [13:13:38.786] } [13:13:38.786] invisible(muffled) [13:13:38.786] } [13:13:38.786] muffleCondition(cond, pattern = "^muffle") [13:13:38.786] } [13:13:38.786] } [13:13:38.786] } [13:13:38.786] })) [13:13:38.786] }, error = function(ex) { [13:13:38.786] base::structure(base::list(value = NULL, visible = NULL, [13:13:38.786] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:38.786] ...future.rng), started = ...future.startTime, [13:13:38.786] finished = Sys.time(), session_uuid = NA_character_, [13:13:38.786] version = "1.8"), class = "FutureResult") [13:13:38.786] }, finally = { [13:13:38.786] if (!identical(...future.workdir, getwd())) [13:13:38.786] setwd(...future.workdir) [13:13:38.786] { [13:13:38.786] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:38.786] ...future.oldOptions$nwarnings <- NULL [13:13:38.786] } [13:13:38.786] base::options(...future.oldOptions) [13:13:38.786] if (.Platform$OS.type == "windows") { [13:13:38.786] old_names <- names(...future.oldEnvVars) [13:13:38.786] envs <- base::Sys.getenv() [13:13:38.786] names <- names(envs) [13:13:38.786] common <- intersect(names, old_names) [13:13:38.786] added <- setdiff(names, old_names) [13:13:38.786] removed <- setdiff(old_names, names) [13:13:38.786] changed <- common[...future.oldEnvVars[common] != [13:13:38.786] envs[common]] [13:13:38.786] NAMES <- toupper(changed) [13:13:38.786] args <- list() [13:13:38.786] for (kk in seq_along(NAMES)) { [13:13:38.786] name <- changed[[kk]] [13:13:38.786] NAME <- NAMES[[kk]] [13:13:38.786] if (name != NAME && is.element(NAME, old_names)) [13:13:38.786] next [13:13:38.786] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:38.786] } [13:13:38.786] NAMES <- toupper(added) [13:13:38.786] for (kk in seq_along(NAMES)) { [13:13:38.786] name <- added[[kk]] [13:13:38.786] NAME <- NAMES[[kk]] [13:13:38.786] if (name != NAME && is.element(NAME, old_names)) [13:13:38.786] next [13:13:38.786] args[[name]] <- "" [13:13:38.786] } [13:13:38.786] NAMES <- toupper(removed) [13:13:38.786] for (kk in seq_along(NAMES)) { [13:13:38.786] name <- removed[[kk]] [13:13:38.786] NAME <- NAMES[[kk]] [13:13:38.786] if (name != NAME && is.element(NAME, old_names)) [13:13:38.786] next [13:13:38.786] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:38.786] } [13:13:38.786] if (length(args) > 0) [13:13:38.786] base::do.call(base::Sys.setenv, args = args) [13:13:38.786] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:38.786] } [13:13:38.786] else { [13:13:38.786] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:38.786] } [13:13:38.786] { [13:13:38.786] if (base::length(...future.futureOptionsAdded) > [13:13:38.786] 0L) { [13:13:38.786] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:38.786] base::names(opts) <- ...future.futureOptionsAdded [13:13:38.786] base::options(opts) [13:13:38.786] } [13:13:38.786] { [13:13:38.786] { [13:13:38.786] NULL [13:13:38.786] RNGkind("Mersenne-Twister") [13:13:38.786] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:38.786] inherits = FALSE) [13:13:38.786] } [13:13:38.786] options(future.plan = NULL) [13:13:38.786] if (is.na(NA_character_)) [13:13:38.786] Sys.unsetenv("R_FUTURE_PLAN") [13:13:38.786] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:38.786] future::plan(list(function (..., envir = parent.frame()) [13:13:38.786] { [13:13:38.786] future <- SequentialFuture(..., envir = envir) [13:13:38.786] if (!future$lazy) [13:13:38.786] future <- run(future) [13:13:38.786] invisible(future) [13:13:38.786] }), .cleanup = FALSE, .init = FALSE) [13:13:38.786] } [13:13:38.786] } [13:13:38.786] } [13:13:38.786] }) [13:13:38.786] if (TRUE) { [13:13:38.786] base::sink(type = "output", split = FALSE) [13:13:38.786] if (TRUE) { [13:13:38.786] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:38.786] } [13:13:38.786] else { [13:13:38.786] ...future.result["stdout"] <- base::list(NULL) [13:13:38.786] } [13:13:38.786] base::close(...future.stdout) [13:13:38.786] ...future.stdout <- NULL [13:13:38.786] } [13:13:38.786] ...future.result$conditions <- ...future.conditions [13:13:38.786] ...future.result$finished <- base::Sys.time() [13:13:38.786] ...future.result [13:13:38.786] } [13:13:38.790] assign_globals() ... [13:13:38.790] List of 5 [13:13:38.790] $ ...future.FUN :function (mode = "logical", length = 0L) [13:13:38.790] $ future.call.arguments :List of 1 [13:13:38.790] ..$ length: int 2 [13:13:38.790] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:38.790] $ ...future.elements_ii :List of 1 [13:13:38.790] ..$ c: chr "list" [13:13:38.790] $ ...future.seeds_ii : NULL [13:13:38.790] $ ...future.globals.maxSize: NULL [13:13:38.790] - attr(*, "where")=List of 5 [13:13:38.790] ..$ ...future.FUN : [13:13:38.790] ..$ future.call.arguments : [13:13:38.790] ..$ ...future.elements_ii : [13:13:38.790] ..$ ...future.seeds_ii : [13:13:38.790] ..$ ...future.globals.maxSize: [13:13:38.790] - attr(*, "resolved")= logi FALSE [13:13:38.790] - attr(*, "total_size")= num 2240 [13:13:38.790] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:38.790] - attr(*, "already-done")= logi TRUE [13:13:38.796] - copied '...future.FUN' to environment [13:13:38.797] - copied 'future.call.arguments' to environment [13:13:38.797] - copied '...future.elements_ii' to environment [13:13:38.797] - copied '...future.seeds_ii' to environment [13:13:38.797] - copied '...future.globals.maxSize' to environment [13:13:38.797] assign_globals() ... done [13:13:38.798] plan(): Setting new future strategy stack: [13:13:38.798] List of future strategies: [13:13:38.798] 1. sequential: [13:13:38.798] - args: function (..., envir = parent.frame(), workers = "") [13:13:38.798] - tweaked: FALSE [13:13:38.798] - call: NULL [13:13:38.798] plan(): nbrOfWorkers() = 1 [13:13:38.799] plan(): Setting new future strategy stack: [13:13:38.800] List of future strategies: [13:13:38.800] 1. sequential: [13:13:38.800] - args: function (..., envir = parent.frame(), workers = "") [13:13:38.800] - tweaked: FALSE [13:13:38.800] - call: plan(strategy) [13:13:38.800] plan(): nbrOfWorkers() = 1 [13:13:38.800] SequentialFuture started (and completed) [13:13:38.801] - Launch lazy future ... done [13:13:38.801] run() for 'SequentialFuture' ... done [13:13:38.801] Created future: [13:13:38.801] SequentialFuture: [13:13:38.801] Label: 'future_lapply-4' [13:13:38.801] Expression: [13:13:38.801] { [13:13:38.801] do.call(function(...) { [13:13:38.801] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:38.801] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:38.801] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:38.801] on.exit(options(oopts), add = TRUE) [13:13:38.801] } [13:13:38.801] { [13:13:38.801] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:38.801] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:38.801] ...future.FUN(...future.X_jj, ...) [13:13:38.801] }) [13:13:38.801] } [13:13:38.801] }, args = future.call.arguments) [13:13:38.801] } [13:13:38.801] Lazy evaluation: FALSE [13:13:38.801] Asynchronous evaluation: FALSE [13:13:38.801] Local evaluation: TRUE [13:13:38.801] Environment: R_GlobalEnv [13:13:38.801] Capture standard output: TRUE [13:13:38.801] Capture condition classes: 'condition' (excluding 'nothing') [13:13:38.801] 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) [13:13:38.801] Packages: [13:13:38.801] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:38.801] Resolved: TRUE [13:13:38.801] Value: 0 bytes of class 'list' [13:13:38.801] Early signaling: FALSE [13:13:38.801] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:38.801] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:38.802] Chunk #4 of 4 ... DONE [13:13:38.803] Launching 4 futures (chunks) ... DONE [13:13:38.803] Resolving 4 futures (chunks) ... [13:13:38.803] resolve() on list ... [13:13:38.803] recursive: 0 [13:13:38.803] length: 4 [13:13:38.804] [13:13:38.805] resolved() for 'SequentialFuture' ... [13:13:38.805] - state: 'finished' [13:13:38.805] - run: TRUE [13:13:38.805] - result: 'FutureResult' [13:13:38.805] resolved() for 'SequentialFuture' ... done [13:13:38.806] Future #1 [13:13:38.806] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:38.806] - nx: 4 [13:13:38.806] - relay: TRUE [13:13:38.806] - stdout: TRUE [13:13:38.807] - signal: TRUE [13:13:38.807] - resignal: FALSE [13:13:38.807] - force: TRUE [13:13:38.807] - relayed: [n=4] FALSE, FALSE, FALSE, FALSE [13:13:38.807] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [13:13:38.807] - until=1 [13:13:38.808] - relaying element #1 [13:13:38.808] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [13:13:38.808] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [13:13:38.808] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:38.808] length: 3 (resolved future 1) [13:13:38.809] resolved() for 'SequentialFuture' ... [13:13:38.809] - state: 'finished' [13:13:38.809] - run: TRUE [13:13:38.809] - result: 'FutureResult' [13:13:38.809] resolved() for 'SequentialFuture' ... done [13:13:38.810] Future #2 [13:13:38.810] signalConditionsASAP(SequentialFuture, pos=2) ... [13:13:38.810] - nx: 4 [13:13:38.810] - relay: TRUE [13:13:38.810] - stdout: TRUE [13:13:38.810] - signal: TRUE [13:13:38.811] - resignal: FALSE [13:13:38.811] - force: TRUE [13:13:38.811] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [13:13:38.811] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [13:13:38.811] - until=2 [13:13:38.811] - relaying element #2 [13:13:38.812] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [13:13:38.812] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [13:13:38.812] signalConditionsASAP(SequentialFuture, pos=2) ... done [13:13:38.812] length: 2 (resolved future 2) [13:13:38.812] resolved() for 'SequentialFuture' ... [13:13:38.812] - state: 'finished' [13:13:38.813] - run: TRUE [13:13:38.813] - result: 'FutureResult' [13:13:38.813] resolved() for 'SequentialFuture' ... done [13:13:38.813] Future #3 [13:13:38.813] signalConditionsASAP(SequentialFuture, pos=3) ... [13:13:38.813] - nx: 4 [13:13:38.814] - relay: TRUE [13:13:38.814] - stdout: TRUE [13:13:38.814] - signal: TRUE [13:13:38.814] - resignal: FALSE [13:13:38.814] - force: TRUE [13:13:38.814] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [13:13:38.815] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [13:13:38.815] - until=3 [13:13:38.815] - relaying element #3 [13:13:38.815] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [13:13:38.815] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [13:13:38.815] signalConditionsASAP(SequentialFuture, pos=3) ... done [13:13:38.816] length: 1 (resolved future 3) [13:13:38.816] resolved() for 'SequentialFuture' ... [13:13:38.816] - state: 'finished' [13:13:38.816] - run: TRUE [13:13:38.816] - result: 'FutureResult' [13:13:38.816] resolved() for 'SequentialFuture' ... done [13:13:38.817] Future #4 [13:13:38.817] signalConditionsASAP(SequentialFuture, pos=4) ... [13:13:38.817] - nx: 4 [13:13:38.817] - relay: TRUE [13:13:38.817] - stdout: TRUE [13:13:38.817] - signal: TRUE [13:13:38.818] - resignal: FALSE [13:13:38.818] - force: TRUE [13:13:38.818] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [13:13:38.818] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [13:13:38.818] - until=4 [13:13:38.818] - relaying element #4 [13:13:38.819] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [13:13:38.819] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [13:13:38.819] signalConditionsASAP(SequentialFuture, pos=4) ... done [13:13:38.819] length: 0 (resolved future 4) [13:13:38.819] Relaying remaining futures [13:13:38.819] signalConditionsASAP(NULL, pos=0) ... [13:13:38.820] - nx: 4 [13:13:38.820] - relay: TRUE [13:13:38.820] - stdout: TRUE [13:13:38.820] - signal: TRUE [13:13:38.820] - resignal: FALSE [13:13:38.820] - force: TRUE [13:13:38.820] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [13:13:38.821] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE - flush all [13:13:38.821] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [13:13:38.821] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [13:13:38.821] signalConditionsASAP(NULL, pos=0) ... done [13:13:38.821] resolve() on list ... DONE [13:13:38.822] - Number of value chunks collected: 4 [13:13:38.822] Resolving 4 futures (chunks) ... DONE [13:13:38.822] Reducing values from 4 chunks ... [13:13:38.822] - Number of values collected after concatenation: 4 [13:13:38.822] - Number of values expected: 4 [13:13:38.823] Reducing values from 4 chunks ... DONE [13:13:38.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 [13:13:38.825] future_lapply() ... [13:13:38.826] Number of chunks: 4 [13:13:38.826] getGlobalsAndPackagesXApply() ... [13:13:38.827] - future.globals: TRUE [13:13:38.827] getGlobalsAndPackages() ... [13:13:38.827] Searching for globals... [13:13:38.828] - globals found: [2] 'FUN', '.Internal' [13:13:38.829] Searching for globals ... DONE [13:13:38.829] Resolving globals: FALSE [13:13:38.829] The total size of the 1 globals is 2.13 KiB (2184 bytes) [13:13:38.830] 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') [13:13:38.830] - globals: [1] 'FUN' [13:13:38.830] [13:13:38.830] getGlobalsAndPackages() ... DONE [13:13:38.830] - globals found/used: [n=1] 'FUN' [13:13:38.830] - needed namespaces: [n=0] [13:13:38.831] Finding globals ... DONE [13:13:38.831] - use_args: TRUE [13:13:38.831] - Getting '...' globals ... [13:13:38.831] resolve() on list ... [13:13:38.832] recursive: 0 [13:13:38.832] length: 1 [13:13:38.833] elements: '...' [13:13:38.833] length: 0 (resolved future 1) [13:13:38.833] resolve() on list ... DONE [13:13:38.833] - '...' content: [n=1] 'length' [13:13:38.833] List of 1 [13:13:38.833] $ ...:List of 1 [13:13:38.833] ..$ length: int 2 [13:13:38.833] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:38.833] - attr(*, "where")=List of 1 [13:13:38.833] ..$ ...: [13:13:38.833] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:38.833] - attr(*, "resolved")= logi TRUE [13:13:38.833] - attr(*, "total_size")= num NA [13:13:38.837] - Getting '...' globals ... DONE [13:13:38.837] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:38.837] List of 2 [13:13:38.837] $ ...future.FUN:function (mode = "logical", length = 0L) [13:13:38.837] $ ... :List of 1 [13:13:38.837] ..$ length: int 2 [13:13:38.837] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:38.837] - attr(*, "where")=List of 2 [13:13:38.837] ..$ ...future.FUN: [13:13:38.837] ..$ ... : [13:13:38.837] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:38.837] - attr(*, "resolved")= logi FALSE [13:13:38.837] - attr(*, "total_size")= num 2240 [13:13:38.841] Packages to be attached in all futures: [n=0] [13:13:38.841] getGlobalsAndPackagesXApply() ... DONE [13:13:38.841] Number of futures (= number of chunks): 4 [13:13:38.842] Launching 4 futures (chunks) ... [13:13:38.842] Chunk #1 of 4 ... [13:13:38.842] - Finding globals in 'X' for chunk #1 ... [13:13:38.842] getGlobalsAndPackages() ... [13:13:38.842] Searching for globals... [13:13:38.843] [13:13:38.843] Searching for globals ... DONE [13:13:38.843] - globals: [0] [13:13:38.843] getGlobalsAndPackages() ... DONE [13:13:38.843] + additional globals found: [n=0] [13:13:38.843] + additional namespaces needed: [n=0] [13:13:38.844] - Finding globals in 'X' for chunk #1 ... DONE [13:13:38.844] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [13:13:38.844] - seeds: [13:13:38.844] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:38.844] getGlobalsAndPackages() ... [13:13:38.844] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:38.845] Resolving globals: FALSE [13:13:38.845] Tweak future expression to call with '...' arguments ... [13:13:38.845] { [13:13:38.845] do.call(function(...) { [13:13:38.845] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:38.845] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:38.845] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:38.845] on.exit(options(oopts), add = TRUE) [13:13:38.845] } [13:13:38.845] { [13:13:38.845] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:38.845] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:38.845] ...future.FUN(...future.X_jj, ...) [13:13:38.845] }) [13:13:38.845] } [13:13:38.845] }, args = future.call.arguments) [13:13:38.845] } [13:13:38.845] Tweak future expression to call with '...' arguments ... DONE [13:13:38.846] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:38.846] [13:13:38.846] getGlobalsAndPackages() ... DONE [13:13:38.846] run() for 'Future' ... [13:13:38.847] - state: 'created' [13:13:38.847] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:13:38.847] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:38.847] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:38.848] - Field: 'label' [13:13:38.848] - Field: 'local' [13:13:38.848] - Field: 'owner' [13:13:38.848] - Field: 'envir' [13:13:38.848] - Field: 'packages' [13:13:38.848] - Field: 'gc' [13:13:38.849] - Field: 'conditions' [13:13:38.849] - Field: 'expr' [13:13:38.849] - Field: 'uuid' [13:13:38.849] - Field: 'seed' [13:13:38.849] - Field: 'version' [13:13:38.849] - Field: 'result' [13:13:38.850] - Field: 'asynchronous' [13:13:38.850] - Field: 'calls' [13:13:38.850] - Field: 'globals' [13:13:38.850] - Field: 'stdout' [13:13:38.850] - Field: 'earlySignal' [13:13:38.851] - Field: 'lazy' [13:13:38.851] - Field: 'state' [13:13:38.851] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:38.851] - Launch lazy future ... [13:13:38.851] Packages needed by the future expression (n = 0): [13:13:38.852] Packages needed by future strategies (n = 0): [13:13:38.852] { [13:13:38.852] { [13:13:38.852] { [13:13:38.852] ...future.startTime <- base::Sys.time() [13:13:38.852] { [13:13:38.852] { [13:13:38.852] { [13:13:38.852] base::local({ [13:13:38.852] has_future <- base::requireNamespace("future", [13:13:38.852] quietly = TRUE) [13:13:38.852] if (has_future) { [13:13:38.852] ns <- base::getNamespace("future") [13:13:38.852] version <- ns[[".package"]][["version"]] [13:13:38.852] if (is.null(version)) [13:13:38.852] version <- utils::packageVersion("future") [13:13:38.852] } [13:13:38.852] else { [13:13:38.852] version <- NULL [13:13:38.852] } [13:13:38.852] if (!has_future || version < "1.8.0") { [13:13:38.852] info <- base::c(r_version = base::gsub("R version ", [13:13:38.852] "", base::R.version$version.string), [13:13:38.852] platform = base::sprintf("%s (%s-bit)", [13:13:38.852] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:38.852] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:38.852] "release", "version")], collapse = " "), [13:13:38.852] hostname = base::Sys.info()[["nodename"]]) [13:13:38.852] info <- base::sprintf("%s: %s", base::names(info), [13:13:38.852] info) [13:13:38.852] info <- base::paste(info, collapse = "; ") [13:13:38.852] if (!has_future) { [13:13:38.852] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:38.852] info) [13:13:38.852] } [13:13:38.852] else { [13:13:38.852] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:38.852] info, version) [13:13:38.852] } [13:13:38.852] base::stop(msg) [13:13:38.852] } [13:13:38.852] }) [13:13:38.852] } [13:13:38.852] options(future.plan = NULL) [13:13:38.852] Sys.unsetenv("R_FUTURE_PLAN") [13:13:38.852] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:38.852] } [13:13:38.852] ...future.workdir <- getwd() [13:13:38.852] } [13:13:38.852] ...future.oldOptions <- base::as.list(base::.Options) [13:13:38.852] ...future.oldEnvVars <- base::Sys.getenv() [13:13:38.852] } [13:13:38.852] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:38.852] future.globals.maxSize = 2097152000, future.globals.method = NULL, [13:13:38.852] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:38.852] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:38.852] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:38.852] future.stdout.windows.reencode = NULL, width = 80L) [13:13:38.852] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:38.852] base::names(...future.oldOptions)) [13:13:38.852] } [13:13:38.852] if (FALSE) { [13:13:38.852] } [13:13:38.852] else { [13:13:38.852] if (TRUE) { [13:13:38.852] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:38.852] open = "w") [13:13:38.852] } [13:13:38.852] else { [13:13:38.852] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:38.852] windows = "NUL", "/dev/null"), open = "w") [13:13:38.852] } [13:13:38.852] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:38.852] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:38.852] base::sink(type = "output", split = FALSE) [13:13:38.852] base::close(...future.stdout) [13:13:38.852] }, add = TRUE) [13:13:38.852] } [13:13:38.852] ...future.frame <- base::sys.nframe() [13:13:38.852] ...future.conditions <- base::list() [13:13:38.852] ...future.rng <- base::globalenv()$.Random.seed [13:13:38.852] if (FALSE) { [13:13:38.852] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:38.852] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:38.852] } [13:13:38.852] ...future.result <- base::tryCatch({ [13:13:38.852] base::withCallingHandlers({ [13:13:38.852] ...future.value <- base::withVisible(base::local({ [13:13:38.852] do.call(function(...) { [13:13:38.852] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:38.852] if (!identical(...future.globals.maxSize.org, [13:13:38.852] ...future.globals.maxSize)) { [13:13:38.852] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:38.852] on.exit(options(oopts), add = TRUE) [13:13:38.852] } [13:13:38.852] { [13:13:38.852] lapply(seq_along(...future.elements_ii), [13:13:38.852] FUN = function(jj) { [13:13:38.852] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:38.852] ...future.FUN(...future.X_jj, ...) [13:13:38.852] }) [13:13:38.852] } [13:13:38.852] }, args = future.call.arguments) [13:13:38.852] })) [13:13:38.852] future::FutureResult(value = ...future.value$value, [13:13:38.852] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:38.852] ...future.rng), globalenv = if (FALSE) [13:13:38.852] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:38.852] ...future.globalenv.names)) [13:13:38.852] else NULL, started = ...future.startTime, version = "1.8") [13:13:38.852] }, condition = base::local({ [13:13:38.852] c <- base::c [13:13:38.852] inherits <- base::inherits [13:13:38.852] invokeRestart <- base::invokeRestart [13:13:38.852] length <- base::length [13:13:38.852] list <- base::list [13:13:38.852] seq.int <- base::seq.int [13:13:38.852] signalCondition <- base::signalCondition [13:13:38.852] sys.calls <- base::sys.calls [13:13:38.852] `[[` <- base::`[[` [13:13:38.852] `+` <- base::`+` [13:13:38.852] `<<-` <- base::`<<-` [13:13:38.852] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:38.852] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:38.852] 3L)] [13:13:38.852] } [13:13:38.852] function(cond) { [13:13:38.852] is_error <- inherits(cond, "error") [13:13:38.852] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:38.852] NULL) [13:13:38.852] if (is_error) { [13:13:38.852] sessionInformation <- function() { [13:13:38.852] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:38.852] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:38.852] search = base::search(), system = base::Sys.info()) [13:13:38.852] } [13:13:38.852] ...future.conditions[[length(...future.conditions) + [13:13:38.852] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:38.852] cond$call), session = sessionInformation(), [13:13:38.852] timestamp = base::Sys.time(), signaled = 0L) [13:13:38.852] signalCondition(cond) [13:13:38.852] } [13:13:38.852] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:38.852] "immediateCondition"))) { [13:13:38.852] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:38.852] ...future.conditions[[length(...future.conditions) + [13:13:38.852] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:38.852] if (TRUE && !signal) { [13:13:38.852] muffleCondition <- function (cond, pattern = "^muffle") [13:13:38.852] { [13:13:38.852] inherits <- base::inherits [13:13:38.852] invokeRestart <- base::invokeRestart [13:13:38.852] is.null <- base::is.null [13:13:38.852] muffled <- FALSE [13:13:38.852] if (inherits(cond, "message")) { [13:13:38.852] muffled <- grepl(pattern, "muffleMessage") [13:13:38.852] if (muffled) [13:13:38.852] invokeRestart("muffleMessage") [13:13:38.852] } [13:13:38.852] else if (inherits(cond, "warning")) { [13:13:38.852] muffled <- grepl(pattern, "muffleWarning") [13:13:38.852] if (muffled) [13:13:38.852] invokeRestart("muffleWarning") [13:13:38.852] } [13:13:38.852] else if (inherits(cond, "condition")) { [13:13:38.852] if (!is.null(pattern)) { [13:13:38.852] computeRestarts <- base::computeRestarts [13:13:38.852] grepl <- base::grepl [13:13:38.852] restarts <- computeRestarts(cond) [13:13:38.852] for (restart in restarts) { [13:13:38.852] name <- restart$name [13:13:38.852] if (is.null(name)) [13:13:38.852] next [13:13:38.852] if (!grepl(pattern, name)) [13:13:38.852] next [13:13:38.852] invokeRestart(restart) [13:13:38.852] muffled <- TRUE [13:13:38.852] break [13:13:38.852] } [13:13:38.852] } [13:13:38.852] } [13:13:38.852] invisible(muffled) [13:13:38.852] } [13:13:38.852] muffleCondition(cond, pattern = "^muffle") [13:13:38.852] } [13:13:38.852] } [13:13:38.852] else { [13:13:38.852] if (TRUE) { [13:13:38.852] muffleCondition <- function (cond, pattern = "^muffle") [13:13:38.852] { [13:13:38.852] inherits <- base::inherits [13:13:38.852] invokeRestart <- base::invokeRestart [13:13:38.852] is.null <- base::is.null [13:13:38.852] muffled <- FALSE [13:13:38.852] if (inherits(cond, "message")) { [13:13:38.852] muffled <- grepl(pattern, "muffleMessage") [13:13:38.852] if (muffled) [13:13:38.852] invokeRestart("muffleMessage") [13:13:38.852] } [13:13:38.852] else if (inherits(cond, "warning")) { [13:13:38.852] muffled <- grepl(pattern, "muffleWarning") [13:13:38.852] if (muffled) [13:13:38.852] invokeRestart("muffleWarning") [13:13:38.852] } [13:13:38.852] else if (inherits(cond, "condition")) { [13:13:38.852] if (!is.null(pattern)) { [13:13:38.852] computeRestarts <- base::computeRestarts [13:13:38.852] grepl <- base::grepl [13:13:38.852] restarts <- computeRestarts(cond) [13:13:38.852] for (restart in restarts) { [13:13:38.852] name <- restart$name [13:13:38.852] if (is.null(name)) [13:13:38.852] next [13:13:38.852] if (!grepl(pattern, name)) [13:13:38.852] next [13:13:38.852] invokeRestart(restart) [13:13:38.852] muffled <- TRUE [13:13:38.852] break [13:13:38.852] } [13:13:38.852] } [13:13:38.852] } [13:13:38.852] invisible(muffled) [13:13:38.852] } [13:13:38.852] muffleCondition(cond, pattern = "^muffle") [13:13:38.852] } [13:13:38.852] } [13:13:38.852] } [13:13:38.852] })) [13:13:38.852] }, error = function(ex) { [13:13:38.852] base::structure(base::list(value = NULL, visible = NULL, [13:13:38.852] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:38.852] ...future.rng), started = ...future.startTime, [13:13:38.852] finished = Sys.time(), session_uuid = NA_character_, [13:13:38.852] version = "1.8"), class = "FutureResult") [13:13:38.852] }, finally = { [13:13:38.852] if (!identical(...future.workdir, getwd())) [13:13:38.852] setwd(...future.workdir) [13:13:38.852] { [13:13:38.852] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:38.852] ...future.oldOptions$nwarnings <- NULL [13:13:38.852] } [13:13:38.852] base::options(...future.oldOptions) [13:13:38.852] if (.Platform$OS.type == "windows") { [13:13:38.852] old_names <- names(...future.oldEnvVars) [13:13:38.852] envs <- base::Sys.getenv() [13:13:38.852] names <- names(envs) [13:13:38.852] common <- intersect(names, old_names) [13:13:38.852] added <- setdiff(names, old_names) [13:13:38.852] removed <- setdiff(old_names, names) [13:13:38.852] changed <- common[...future.oldEnvVars[common] != [13:13:38.852] envs[common]] [13:13:38.852] NAMES <- toupper(changed) [13:13:38.852] args <- list() [13:13:38.852] for (kk in seq_along(NAMES)) { [13:13:38.852] name <- changed[[kk]] [13:13:38.852] NAME <- NAMES[[kk]] [13:13:38.852] if (name != NAME && is.element(NAME, old_names)) [13:13:38.852] next [13:13:38.852] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:38.852] } [13:13:38.852] NAMES <- toupper(added) [13:13:38.852] for (kk in seq_along(NAMES)) { [13:13:38.852] name <- added[[kk]] [13:13:38.852] NAME <- NAMES[[kk]] [13:13:38.852] if (name != NAME && is.element(NAME, old_names)) [13:13:38.852] next [13:13:38.852] args[[name]] <- "" [13:13:38.852] } [13:13:38.852] NAMES <- toupper(removed) [13:13:38.852] for (kk in seq_along(NAMES)) { [13:13:38.852] name <- removed[[kk]] [13:13:38.852] NAME <- NAMES[[kk]] [13:13:38.852] if (name != NAME && is.element(NAME, old_names)) [13:13:38.852] next [13:13:38.852] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:38.852] } [13:13:38.852] if (length(args) > 0) [13:13:38.852] base::do.call(base::Sys.setenv, args = args) [13:13:38.852] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:38.852] } [13:13:38.852] else { [13:13:38.852] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:38.852] } [13:13:38.852] { [13:13:38.852] if (base::length(...future.futureOptionsAdded) > [13:13:38.852] 0L) { [13:13:38.852] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:38.852] base::names(opts) <- ...future.futureOptionsAdded [13:13:38.852] base::options(opts) [13:13:38.852] } [13:13:38.852] { [13:13:38.852] { [13:13:38.852] NULL [13:13:38.852] RNGkind("Mersenne-Twister") [13:13:38.852] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:38.852] inherits = FALSE) [13:13:38.852] } [13:13:38.852] options(future.plan = NULL) [13:13:38.852] if (is.na(NA_character_)) [13:13:38.852] Sys.unsetenv("R_FUTURE_PLAN") [13:13:38.852] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:38.852] future::plan(list(function (..., envir = parent.frame()) [13:13:38.852] { [13:13:38.852] future <- SequentialFuture(..., envir = envir) [13:13:38.852] if (!future$lazy) [13:13:38.852] future <- run(future) [13:13:38.852] invisible(future) [13:13:38.852] }), .cleanup = FALSE, .init = FALSE) [13:13:38.852] } [13:13:38.852] } [13:13:38.852] } [13:13:38.852] }) [13:13:38.852] if (TRUE) { [13:13:38.852] base::sink(type = "output", split = FALSE) [13:13:38.852] if (TRUE) { [13:13:38.852] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:38.852] } [13:13:38.852] else { [13:13:38.852] ...future.result["stdout"] <- base::list(NULL) [13:13:38.852] } [13:13:38.852] base::close(...future.stdout) [13:13:38.852] ...future.stdout <- NULL [13:13:38.852] } [13:13:38.852] ...future.result$conditions <- ...future.conditions [13:13:38.852] ...future.result$finished <- base::Sys.time() [13:13:38.852] ...future.result [13:13:38.852] } [13:13:38.856] assign_globals() ... [13:13:38.856] List of 5 [13:13:38.856] $ ...future.FUN :function (mode = "logical", length = 0L) [13:13:38.856] $ future.call.arguments :List of 1 [13:13:38.856] ..$ length: int 2 [13:13:38.856] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:38.856] $ ...future.elements_ii :List of 1 [13:13:38.856] ..$ a: chr "integer" [13:13:38.856] $ ...future.seeds_ii : NULL [13:13:38.856] $ ...future.globals.maxSize: NULL [13:13:38.856] - attr(*, "where")=List of 5 [13:13:38.856] ..$ ...future.FUN : [13:13:38.856] ..$ future.call.arguments : [13:13:38.856] ..$ ...future.elements_ii : [13:13:38.856] ..$ ...future.seeds_ii : [13:13:38.856] ..$ ...future.globals.maxSize: [13:13:38.856] - attr(*, "resolved")= logi FALSE [13:13:38.856] - attr(*, "total_size")= num 2240 [13:13:38.856] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:38.856] - attr(*, "already-done")= logi TRUE [13:13:38.863] - copied '...future.FUN' to environment [13:13:38.863] - copied 'future.call.arguments' to environment [13:13:38.863] - copied '...future.elements_ii' to environment [13:13:38.863] - copied '...future.seeds_ii' to environment [13:13:38.864] - copied '...future.globals.maxSize' to environment [13:13:38.864] assign_globals() ... done [13:13:38.864] plan(): Setting new future strategy stack: [13:13:38.864] List of future strategies: [13:13:38.864] 1. sequential: [13:13:38.864] - args: function (..., envir = parent.frame(), workers = "") [13:13:38.864] - tweaked: FALSE [13:13:38.864] - call: NULL [13:13:38.865] plan(): nbrOfWorkers() = 1 [13:13:38.866] plan(): Setting new future strategy stack: [13:13:38.866] List of future strategies: [13:13:38.866] 1. sequential: [13:13:38.866] - args: function (..., envir = parent.frame(), workers = "") [13:13:38.866] - tweaked: FALSE [13:13:38.866] - call: plan(strategy) [13:13:38.867] plan(): nbrOfWorkers() = 1 [13:13:38.867] SequentialFuture started (and completed) [13:13:38.867] - Launch lazy future ... done [13:13:38.867] run() for 'SequentialFuture' ... done [13:13:38.868] Created future: [13:13:38.868] SequentialFuture: [13:13:38.868] Label: 'future_lapply-1' [13:13:38.868] Expression: [13:13:38.868] { [13:13:38.868] do.call(function(...) { [13:13:38.868] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:38.868] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:38.868] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:38.868] on.exit(options(oopts), add = TRUE) [13:13:38.868] } [13:13:38.868] { [13:13:38.868] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:38.868] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:38.868] ...future.FUN(...future.X_jj, ...) [13:13:38.868] }) [13:13:38.868] } [13:13:38.868] }, args = future.call.arguments) [13:13:38.868] } [13:13:38.868] Lazy evaluation: FALSE [13:13:38.868] Asynchronous evaluation: FALSE [13:13:38.868] Local evaluation: TRUE [13:13:38.868] Environment: R_GlobalEnv [13:13:38.868] Capture standard output: TRUE [13:13:38.868] Capture condition classes: 'condition' (excluding 'nothing') [13:13:38.868] 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) [13:13:38.868] Packages: [13:13:38.868] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:38.868] Resolved: TRUE [13:13:38.868] Value: 56 bytes of class 'list' [13:13:38.868] Early signaling: FALSE [13:13:38.868] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:38.868] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:38.869] Chunk #1 of 4 ... DONE [13:13:38.869] Chunk #2 of 4 ... [13:13:38.869] - Finding globals in 'X' for chunk #2 ... [13:13:38.869] getGlobalsAndPackages() ... [13:13:38.870] Searching for globals... [13:13:38.870] [13:13:38.870] Searching for globals ... DONE [13:13:38.870] - globals: [0] [13:13:38.870] getGlobalsAndPackages() ... DONE [13:13:38.871] + additional globals found: [n=0] [13:13:38.871] + additional namespaces needed: [n=0] [13:13:38.871] - Finding globals in 'X' for chunk #2 ... DONE [13:13:38.871] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [13:13:38.871] - seeds: [13:13:38.871] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:38.872] getGlobalsAndPackages() ... [13:13:38.872] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:38.872] Resolving globals: FALSE [13:13:38.872] Tweak future expression to call with '...' arguments ... [13:13:38.872] { [13:13:38.872] do.call(function(...) { [13:13:38.872] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:38.872] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:38.872] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:38.872] on.exit(options(oopts), add = TRUE) [13:13:38.872] } [13:13:38.872] { [13:13:38.872] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:38.872] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:38.872] ...future.FUN(...future.X_jj, ...) [13:13:38.872] }) [13:13:38.872] } [13:13:38.872] }, args = future.call.arguments) [13:13:38.872] } [13:13:38.873] Tweak future expression to call with '...' arguments ... DONE [13:13:38.873] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:38.873] [13:13:38.873] getGlobalsAndPackages() ... DONE [13:13:38.874] run() for 'Future' ... [13:13:38.874] - state: 'created' [13:13:38.874] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:13:38.875] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:38.875] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:38.875] - Field: 'label' [13:13:38.875] - Field: 'local' [13:13:38.875] - Field: 'owner' [13:13:38.875] - Field: 'envir' [13:13:38.876] - Field: 'packages' [13:13:38.876] - Field: 'gc' [13:13:38.876] - Field: 'conditions' [13:13:38.876] - Field: 'expr' [13:13:38.876] - Field: 'uuid' [13:13:38.876] - Field: 'seed' [13:13:38.877] - Field: 'version' [13:13:38.877] - Field: 'result' [13:13:38.877] - Field: 'asynchronous' [13:13:38.877] - Field: 'calls' [13:13:38.877] - Field: 'globals' [13:13:38.877] - Field: 'stdout' [13:13:38.878] - Field: 'earlySignal' [13:13:38.878] - Field: 'lazy' [13:13:38.878] - Field: 'state' [13:13:38.878] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:38.878] - Launch lazy future ... [13:13:38.879] Packages needed by the future expression (n = 0): [13:13:38.879] Packages needed by future strategies (n = 0): [13:13:38.879] { [13:13:38.879] { [13:13:38.879] { [13:13:38.879] ...future.startTime <- base::Sys.time() [13:13:38.879] { [13:13:38.879] { [13:13:38.879] { [13:13:38.879] base::local({ [13:13:38.879] has_future <- base::requireNamespace("future", [13:13:38.879] quietly = TRUE) [13:13:38.879] if (has_future) { [13:13:38.879] ns <- base::getNamespace("future") [13:13:38.879] version <- ns[[".package"]][["version"]] [13:13:38.879] if (is.null(version)) [13:13:38.879] version <- utils::packageVersion("future") [13:13:38.879] } [13:13:38.879] else { [13:13:38.879] version <- NULL [13:13:38.879] } [13:13:38.879] if (!has_future || version < "1.8.0") { [13:13:38.879] info <- base::c(r_version = base::gsub("R version ", [13:13:38.879] "", base::R.version$version.string), [13:13:38.879] platform = base::sprintf("%s (%s-bit)", [13:13:38.879] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:38.879] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:38.879] "release", "version")], collapse = " "), [13:13:38.879] hostname = base::Sys.info()[["nodename"]]) [13:13:38.879] info <- base::sprintf("%s: %s", base::names(info), [13:13:38.879] info) [13:13:38.879] info <- base::paste(info, collapse = "; ") [13:13:38.879] if (!has_future) { [13:13:38.879] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:38.879] info) [13:13:38.879] } [13:13:38.879] else { [13:13:38.879] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:38.879] info, version) [13:13:38.879] } [13:13:38.879] base::stop(msg) [13:13:38.879] } [13:13:38.879] }) [13:13:38.879] } [13:13:38.879] options(future.plan = NULL) [13:13:38.879] Sys.unsetenv("R_FUTURE_PLAN") [13:13:38.879] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:38.879] } [13:13:38.879] ...future.workdir <- getwd() [13:13:38.879] } [13:13:38.879] ...future.oldOptions <- base::as.list(base::.Options) [13:13:38.879] ...future.oldEnvVars <- base::Sys.getenv() [13:13:38.879] } [13:13:38.879] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:38.879] future.globals.maxSize = 2097152000, future.globals.method = NULL, [13:13:38.879] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:38.879] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:38.879] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:38.879] future.stdout.windows.reencode = NULL, width = 80L) [13:13:38.879] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:38.879] base::names(...future.oldOptions)) [13:13:38.879] } [13:13:38.879] if (FALSE) { [13:13:38.879] } [13:13:38.879] else { [13:13:38.879] if (TRUE) { [13:13:38.879] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:38.879] open = "w") [13:13:38.879] } [13:13:38.879] else { [13:13:38.879] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:38.879] windows = "NUL", "/dev/null"), open = "w") [13:13:38.879] } [13:13:38.879] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:38.879] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:38.879] base::sink(type = "output", split = FALSE) [13:13:38.879] base::close(...future.stdout) [13:13:38.879] }, add = TRUE) [13:13:38.879] } [13:13:38.879] ...future.frame <- base::sys.nframe() [13:13:38.879] ...future.conditions <- base::list() [13:13:38.879] ...future.rng <- base::globalenv()$.Random.seed [13:13:38.879] if (FALSE) { [13:13:38.879] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:38.879] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:38.879] } [13:13:38.879] ...future.result <- base::tryCatch({ [13:13:38.879] base::withCallingHandlers({ [13:13:38.879] ...future.value <- base::withVisible(base::local({ [13:13:38.879] do.call(function(...) { [13:13:38.879] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:38.879] if (!identical(...future.globals.maxSize.org, [13:13:38.879] ...future.globals.maxSize)) { [13:13:38.879] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:38.879] on.exit(options(oopts), add = TRUE) [13:13:38.879] } [13:13:38.879] { [13:13:38.879] lapply(seq_along(...future.elements_ii), [13:13:38.879] FUN = function(jj) { [13:13:38.879] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:38.879] ...future.FUN(...future.X_jj, ...) [13:13:38.879] }) [13:13:38.879] } [13:13:38.879] }, args = future.call.arguments) [13:13:38.879] })) [13:13:38.879] future::FutureResult(value = ...future.value$value, [13:13:38.879] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:38.879] ...future.rng), globalenv = if (FALSE) [13:13:38.879] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:38.879] ...future.globalenv.names)) [13:13:38.879] else NULL, started = ...future.startTime, version = "1.8") [13:13:38.879] }, condition = base::local({ [13:13:38.879] c <- base::c [13:13:38.879] inherits <- base::inherits [13:13:38.879] invokeRestart <- base::invokeRestart [13:13:38.879] length <- base::length [13:13:38.879] list <- base::list [13:13:38.879] seq.int <- base::seq.int [13:13:38.879] signalCondition <- base::signalCondition [13:13:38.879] sys.calls <- base::sys.calls [13:13:38.879] `[[` <- base::`[[` [13:13:38.879] `+` <- base::`+` [13:13:38.879] `<<-` <- base::`<<-` [13:13:38.879] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:38.879] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:38.879] 3L)] [13:13:38.879] } [13:13:38.879] function(cond) { [13:13:38.879] is_error <- inherits(cond, "error") [13:13:38.879] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:38.879] NULL) [13:13:38.879] if (is_error) { [13:13:38.879] sessionInformation <- function() { [13:13:38.879] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:38.879] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:38.879] search = base::search(), system = base::Sys.info()) [13:13:38.879] } [13:13:38.879] ...future.conditions[[length(...future.conditions) + [13:13:38.879] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:38.879] cond$call), session = sessionInformation(), [13:13:38.879] timestamp = base::Sys.time(), signaled = 0L) [13:13:38.879] signalCondition(cond) [13:13:38.879] } [13:13:38.879] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:38.879] "immediateCondition"))) { [13:13:38.879] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:38.879] ...future.conditions[[length(...future.conditions) + [13:13:38.879] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:38.879] if (TRUE && !signal) { [13:13:38.879] muffleCondition <- function (cond, pattern = "^muffle") [13:13:38.879] { [13:13:38.879] inherits <- base::inherits [13:13:38.879] invokeRestart <- base::invokeRestart [13:13:38.879] is.null <- base::is.null [13:13:38.879] muffled <- FALSE [13:13:38.879] if (inherits(cond, "message")) { [13:13:38.879] muffled <- grepl(pattern, "muffleMessage") [13:13:38.879] if (muffled) [13:13:38.879] invokeRestart("muffleMessage") [13:13:38.879] } [13:13:38.879] else if (inherits(cond, "warning")) { [13:13:38.879] muffled <- grepl(pattern, "muffleWarning") [13:13:38.879] if (muffled) [13:13:38.879] invokeRestart("muffleWarning") [13:13:38.879] } [13:13:38.879] else if (inherits(cond, "condition")) { [13:13:38.879] if (!is.null(pattern)) { [13:13:38.879] computeRestarts <- base::computeRestarts [13:13:38.879] grepl <- base::grepl [13:13:38.879] restarts <- computeRestarts(cond) [13:13:38.879] for (restart in restarts) { [13:13:38.879] name <- restart$name [13:13:38.879] if (is.null(name)) [13:13:38.879] next [13:13:38.879] if (!grepl(pattern, name)) [13:13:38.879] next [13:13:38.879] invokeRestart(restart) [13:13:38.879] muffled <- TRUE [13:13:38.879] break [13:13:38.879] } [13:13:38.879] } [13:13:38.879] } [13:13:38.879] invisible(muffled) [13:13:38.879] } [13:13:38.879] muffleCondition(cond, pattern = "^muffle") [13:13:38.879] } [13:13:38.879] } [13:13:38.879] else { [13:13:38.879] if (TRUE) { [13:13:38.879] muffleCondition <- function (cond, pattern = "^muffle") [13:13:38.879] { [13:13:38.879] inherits <- base::inherits [13:13:38.879] invokeRestart <- base::invokeRestart [13:13:38.879] is.null <- base::is.null [13:13:38.879] muffled <- FALSE [13:13:38.879] if (inherits(cond, "message")) { [13:13:38.879] muffled <- grepl(pattern, "muffleMessage") [13:13:38.879] if (muffled) [13:13:38.879] invokeRestart("muffleMessage") [13:13:38.879] } [13:13:38.879] else if (inherits(cond, "warning")) { [13:13:38.879] muffled <- grepl(pattern, "muffleWarning") [13:13:38.879] if (muffled) [13:13:38.879] invokeRestart("muffleWarning") [13:13:38.879] } [13:13:38.879] else if (inherits(cond, "condition")) { [13:13:38.879] if (!is.null(pattern)) { [13:13:38.879] computeRestarts <- base::computeRestarts [13:13:38.879] grepl <- base::grepl [13:13:38.879] restarts <- computeRestarts(cond) [13:13:38.879] for (restart in restarts) { [13:13:38.879] name <- restart$name [13:13:38.879] if (is.null(name)) [13:13:38.879] next [13:13:38.879] if (!grepl(pattern, name)) [13:13:38.879] next [13:13:38.879] invokeRestart(restart) [13:13:38.879] muffled <- TRUE [13:13:38.879] break [13:13:38.879] } [13:13:38.879] } [13:13:38.879] } [13:13:38.879] invisible(muffled) [13:13:38.879] } [13:13:38.879] muffleCondition(cond, pattern = "^muffle") [13:13:38.879] } [13:13:38.879] } [13:13:38.879] } [13:13:38.879] })) [13:13:38.879] }, error = function(ex) { [13:13:38.879] base::structure(base::list(value = NULL, visible = NULL, [13:13:38.879] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:38.879] ...future.rng), started = ...future.startTime, [13:13:38.879] finished = Sys.time(), session_uuid = NA_character_, [13:13:38.879] version = "1.8"), class = "FutureResult") [13:13:38.879] }, finally = { [13:13:38.879] if (!identical(...future.workdir, getwd())) [13:13:38.879] setwd(...future.workdir) [13:13:38.879] { [13:13:38.879] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:38.879] ...future.oldOptions$nwarnings <- NULL [13:13:38.879] } [13:13:38.879] base::options(...future.oldOptions) [13:13:38.879] if (.Platform$OS.type == "windows") { [13:13:38.879] old_names <- names(...future.oldEnvVars) [13:13:38.879] envs <- base::Sys.getenv() [13:13:38.879] names <- names(envs) [13:13:38.879] common <- intersect(names, old_names) [13:13:38.879] added <- setdiff(names, old_names) [13:13:38.879] removed <- setdiff(old_names, names) [13:13:38.879] changed <- common[...future.oldEnvVars[common] != [13:13:38.879] envs[common]] [13:13:38.879] NAMES <- toupper(changed) [13:13:38.879] args <- list() [13:13:38.879] for (kk in seq_along(NAMES)) { [13:13:38.879] name <- changed[[kk]] [13:13:38.879] NAME <- NAMES[[kk]] [13:13:38.879] if (name != NAME && is.element(NAME, old_names)) [13:13:38.879] next [13:13:38.879] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:38.879] } [13:13:38.879] NAMES <- toupper(added) [13:13:38.879] for (kk in seq_along(NAMES)) { [13:13:38.879] name <- added[[kk]] [13:13:38.879] NAME <- NAMES[[kk]] [13:13:38.879] if (name != NAME && is.element(NAME, old_names)) [13:13:38.879] next [13:13:38.879] args[[name]] <- "" [13:13:38.879] } [13:13:38.879] NAMES <- toupper(removed) [13:13:38.879] for (kk in seq_along(NAMES)) { [13:13:38.879] name <- removed[[kk]] [13:13:38.879] NAME <- NAMES[[kk]] [13:13:38.879] if (name != NAME && is.element(NAME, old_names)) [13:13:38.879] next [13:13:38.879] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:38.879] } [13:13:38.879] if (length(args) > 0) [13:13:38.879] base::do.call(base::Sys.setenv, args = args) [13:13:38.879] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:38.879] } [13:13:38.879] else { [13:13:38.879] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:38.879] } [13:13:38.879] { [13:13:38.879] if (base::length(...future.futureOptionsAdded) > [13:13:38.879] 0L) { [13:13:38.879] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:38.879] base::names(opts) <- ...future.futureOptionsAdded [13:13:38.879] base::options(opts) [13:13:38.879] } [13:13:38.879] { [13:13:38.879] { [13:13:38.879] NULL [13:13:38.879] RNGkind("Mersenne-Twister") [13:13:38.879] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:38.879] inherits = FALSE) [13:13:38.879] } [13:13:38.879] options(future.plan = NULL) [13:13:38.879] if (is.na(NA_character_)) [13:13:38.879] Sys.unsetenv("R_FUTURE_PLAN") [13:13:38.879] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:38.879] future::plan(list(function (..., envir = parent.frame()) [13:13:38.879] { [13:13:38.879] future <- SequentialFuture(..., envir = envir) [13:13:38.879] if (!future$lazy) [13:13:38.879] future <- run(future) [13:13:38.879] invisible(future) [13:13:38.879] }), .cleanup = FALSE, .init = FALSE) [13:13:38.879] } [13:13:38.879] } [13:13:38.879] } [13:13:38.879] }) [13:13:38.879] if (TRUE) { [13:13:38.879] base::sink(type = "output", split = FALSE) [13:13:38.879] if (TRUE) { [13:13:38.879] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:38.879] } [13:13:38.879] else { [13:13:38.879] ...future.result["stdout"] <- base::list(NULL) [13:13:38.879] } [13:13:38.879] base::close(...future.stdout) [13:13:38.879] ...future.stdout <- NULL [13:13:38.879] } [13:13:38.879] ...future.result$conditions <- ...future.conditions [13:13:38.879] ...future.result$finished <- base::Sys.time() [13:13:38.879] ...future.result [13:13:38.879] } [13:13:38.883] assign_globals() ... [13:13:38.883] List of 5 [13:13:38.883] $ ...future.FUN :function (mode = "logical", length = 0L) [13:13:38.883] $ future.call.arguments :List of 1 [13:13:38.883] ..$ length: int 2 [13:13:38.883] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:38.883] $ ...future.elements_ii :List of 1 [13:13:38.883] ..$ b: chr "numeric" [13:13:38.883] $ ...future.seeds_ii : NULL [13:13:38.883] $ ...future.globals.maxSize: NULL [13:13:38.883] - attr(*, "where")=List of 5 [13:13:38.883] ..$ ...future.FUN : [13:13:38.883] ..$ future.call.arguments : [13:13:38.883] ..$ ...future.elements_ii : [13:13:38.883] ..$ ...future.seeds_ii : [13:13:38.883] ..$ ...future.globals.maxSize: [13:13:38.883] - attr(*, "resolved")= logi FALSE [13:13:38.883] - attr(*, "total_size")= num 2240 [13:13:38.883] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:38.883] - attr(*, "already-done")= logi TRUE [13:13:38.890] - copied '...future.FUN' to environment [13:13:38.890] - copied 'future.call.arguments' to environment [13:13:38.891] - copied '...future.elements_ii' to environment [13:13:38.891] - copied '...future.seeds_ii' to environment [13:13:38.891] - copied '...future.globals.maxSize' to environment [13:13:38.891] assign_globals() ... done [13:13:38.891] plan(): Setting new future strategy stack: [13:13:38.892] List of future strategies: [13:13:38.892] 1. sequential: [13:13:38.892] - args: function (..., envir = parent.frame(), workers = "") [13:13:38.892] - tweaked: FALSE [13:13:38.892] - call: NULL [13:13:38.892] plan(): nbrOfWorkers() = 1 [13:13:38.893] plan(): Setting new future strategy stack: [13:13:38.893] List of future strategies: [13:13:38.893] 1. sequential: [13:13:38.893] - args: function (..., envir = parent.frame(), workers = "") [13:13:38.893] - tweaked: FALSE [13:13:38.893] - call: plan(strategy) [13:13:38.894] plan(): nbrOfWorkers() = 1 [13:13:38.894] SequentialFuture started (and completed) [13:13:38.895] - Launch lazy future ... done [13:13:38.895] run() for 'SequentialFuture' ... done [13:13:38.895] Created future: [13:13:38.895] SequentialFuture: [13:13:38.895] Label: 'future_lapply-2' [13:13:38.895] Expression: [13:13:38.895] { [13:13:38.895] do.call(function(...) { [13:13:38.895] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:38.895] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:38.895] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:38.895] on.exit(options(oopts), add = TRUE) [13:13:38.895] } [13:13:38.895] { [13:13:38.895] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:38.895] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:38.895] ...future.FUN(...future.X_jj, ...) [13:13:38.895] }) [13:13:38.895] } [13:13:38.895] }, args = future.call.arguments) [13:13:38.895] } [13:13:38.895] Lazy evaluation: FALSE [13:13:38.895] Asynchronous evaluation: FALSE [13:13:38.895] Local evaluation: TRUE [13:13:38.895] Environment: R_GlobalEnv [13:13:38.895] Capture standard output: TRUE [13:13:38.895] Capture condition classes: 'condition' (excluding 'nothing') [13:13:38.895] 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) [13:13:38.895] Packages: [13:13:38.895] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:38.895] Resolved: TRUE [13:13:38.895] Value: 64 bytes of class 'list' [13:13:38.895] Early signaling: FALSE [13:13:38.895] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:38.895] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:38.896] Chunk #2 of 4 ... DONE [13:13:38.896] Chunk #3 of 4 ... [13:13:38.897] - Finding globals in 'X' for chunk #3 ... [13:13:38.897] getGlobalsAndPackages() ... [13:13:38.897] Searching for globals... [13:13:38.897] [13:13:38.897] Searching for globals ... DONE [13:13:38.898] - globals: [0] [13:13:38.898] getGlobalsAndPackages() ... DONE [13:13:38.898] + additional globals found: [n=0] [13:13:38.898] + additional namespaces needed: [n=0] [13:13:38.898] - Finding globals in 'X' for chunk #3 ... DONE [13:13:38.898] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [13:13:38.899] - seeds: [13:13:38.899] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:38.899] getGlobalsAndPackages() ... [13:13:38.899] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:38.899] Resolving globals: FALSE [13:13:38.899] Tweak future expression to call with '...' arguments ... [13:13:38.900] { [13:13:38.900] do.call(function(...) { [13:13:38.900] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:38.900] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:38.900] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:38.900] on.exit(options(oopts), add = TRUE) [13:13:38.900] } [13:13:38.900] { [13:13:38.900] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:38.900] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:38.900] ...future.FUN(...future.X_jj, ...) [13:13:38.900] }) [13:13:38.900] } [13:13:38.900] }, args = future.call.arguments) [13:13:38.900] } [13:13:38.900] Tweak future expression to call with '...' arguments ... DONE [13:13:38.900] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:38.901] [13:13:38.901] getGlobalsAndPackages() ... DONE [13:13:38.901] run() for 'Future' ... [13:13:38.901] - state: 'created' [13:13:38.902] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:13:38.902] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:38.902] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:38.902] - Field: 'label' [13:13:38.902] - Field: 'local' [13:13:38.903] - Field: 'owner' [13:13:38.903] - Field: 'envir' [13:13:38.903] - Field: 'packages' [13:13:38.903] - Field: 'gc' [13:13:38.903] - Field: 'conditions' [13:13:38.903] - Field: 'expr' [13:13:38.904] - Field: 'uuid' [13:13:38.904] - Field: 'seed' [13:13:38.904] - Field: 'version' [13:13:38.904] - Field: 'result' [13:13:38.904] - Field: 'asynchronous' [13:13:38.904] - Field: 'calls' [13:13:38.905] - Field: 'globals' [13:13:38.905] - Field: 'stdout' [13:13:38.905] - Field: 'earlySignal' [13:13:38.905] - Field: 'lazy' [13:13:38.905] - Field: 'state' [13:13:38.906] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:38.906] - Launch lazy future ... [13:13:38.906] Packages needed by the future expression (n = 0): [13:13:38.906] Packages needed by future strategies (n = 0): [13:13:38.907] { [13:13:38.907] { [13:13:38.907] { [13:13:38.907] ...future.startTime <- base::Sys.time() [13:13:38.907] { [13:13:38.907] { [13:13:38.907] { [13:13:38.907] base::local({ [13:13:38.907] has_future <- base::requireNamespace("future", [13:13:38.907] quietly = TRUE) [13:13:38.907] if (has_future) { [13:13:38.907] ns <- base::getNamespace("future") [13:13:38.907] version <- ns[[".package"]][["version"]] [13:13:38.907] if (is.null(version)) [13:13:38.907] version <- utils::packageVersion("future") [13:13:38.907] } [13:13:38.907] else { [13:13:38.907] version <- NULL [13:13:38.907] } [13:13:38.907] if (!has_future || version < "1.8.0") { [13:13:38.907] info <- base::c(r_version = base::gsub("R version ", [13:13:38.907] "", base::R.version$version.string), [13:13:38.907] platform = base::sprintf("%s (%s-bit)", [13:13:38.907] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:38.907] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:38.907] "release", "version")], collapse = " "), [13:13:38.907] hostname = base::Sys.info()[["nodename"]]) [13:13:38.907] info <- base::sprintf("%s: %s", base::names(info), [13:13:38.907] info) [13:13:38.907] info <- base::paste(info, collapse = "; ") [13:13:38.907] if (!has_future) { [13:13:38.907] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:38.907] info) [13:13:38.907] } [13:13:38.907] else { [13:13:38.907] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:38.907] info, version) [13:13:38.907] } [13:13:38.907] base::stop(msg) [13:13:38.907] } [13:13:38.907] }) [13:13:38.907] } [13:13:38.907] options(future.plan = NULL) [13:13:38.907] Sys.unsetenv("R_FUTURE_PLAN") [13:13:38.907] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:38.907] } [13:13:38.907] ...future.workdir <- getwd() [13:13:38.907] } [13:13:38.907] ...future.oldOptions <- base::as.list(base::.Options) [13:13:38.907] ...future.oldEnvVars <- base::Sys.getenv() [13:13:38.907] } [13:13:38.907] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:38.907] future.globals.maxSize = 2097152000, future.globals.method = NULL, [13:13:38.907] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:38.907] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:38.907] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:38.907] future.stdout.windows.reencode = NULL, width = 80L) [13:13:38.907] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:38.907] base::names(...future.oldOptions)) [13:13:38.907] } [13:13:38.907] if (FALSE) { [13:13:38.907] } [13:13:38.907] else { [13:13:38.907] if (TRUE) { [13:13:38.907] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:38.907] open = "w") [13:13:38.907] } [13:13:38.907] else { [13:13:38.907] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:38.907] windows = "NUL", "/dev/null"), open = "w") [13:13:38.907] } [13:13:38.907] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:38.907] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:38.907] base::sink(type = "output", split = FALSE) [13:13:38.907] base::close(...future.stdout) [13:13:38.907] }, add = TRUE) [13:13:38.907] } [13:13:38.907] ...future.frame <- base::sys.nframe() [13:13:38.907] ...future.conditions <- base::list() [13:13:38.907] ...future.rng <- base::globalenv()$.Random.seed [13:13:38.907] if (FALSE) { [13:13:38.907] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:38.907] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:38.907] } [13:13:38.907] ...future.result <- base::tryCatch({ [13:13:38.907] base::withCallingHandlers({ [13:13:38.907] ...future.value <- base::withVisible(base::local({ [13:13:38.907] do.call(function(...) { [13:13:38.907] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:38.907] if (!identical(...future.globals.maxSize.org, [13:13:38.907] ...future.globals.maxSize)) { [13:13:38.907] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:38.907] on.exit(options(oopts), add = TRUE) [13:13:38.907] } [13:13:38.907] { [13:13:38.907] lapply(seq_along(...future.elements_ii), [13:13:38.907] FUN = function(jj) { [13:13:38.907] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:38.907] ...future.FUN(...future.X_jj, ...) [13:13:38.907] }) [13:13:38.907] } [13:13:38.907] }, args = future.call.arguments) [13:13:38.907] })) [13:13:38.907] future::FutureResult(value = ...future.value$value, [13:13:38.907] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:38.907] ...future.rng), globalenv = if (FALSE) [13:13:38.907] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:38.907] ...future.globalenv.names)) [13:13:38.907] else NULL, started = ...future.startTime, version = "1.8") [13:13:38.907] }, condition = base::local({ [13:13:38.907] c <- base::c [13:13:38.907] inherits <- base::inherits [13:13:38.907] invokeRestart <- base::invokeRestart [13:13:38.907] length <- base::length [13:13:38.907] list <- base::list [13:13:38.907] seq.int <- base::seq.int [13:13:38.907] signalCondition <- base::signalCondition [13:13:38.907] sys.calls <- base::sys.calls [13:13:38.907] `[[` <- base::`[[` [13:13:38.907] `+` <- base::`+` [13:13:38.907] `<<-` <- base::`<<-` [13:13:38.907] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:38.907] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:38.907] 3L)] [13:13:38.907] } [13:13:38.907] function(cond) { [13:13:38.907] is_error <- inherits(cond, "error") [13:13:38.907] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:38.907] NULL) [13:13:38.907] if (is_error) { [13:13:38.907] sessionInformation <- function() { [13:13:38.907] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:38.907] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:38.907] search = base::search(), system = base::Sys.info()) [13:13:38.907] } [13:13:38.907] ...future.conditions[[length(...future.conditions) + [13:13:38.907] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:38.907] cond$call), session = sessionInformation(), [13:13:38.907] timestamp = base::Sys.time(), signaled = 0L) [13:13:38.907] signalCondition(cond) [13:13:38.907] } [13:13:38.907] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:38.907] "immediateCondition"))) { [13:13:38.907] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:38.907] ...future.conditions[[length(...future.conditions) + [13:13:38.907] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:38.907] if (TRUE && !signal) { [13:13:38.907] muffleCondition <- function (cond, pattern = "^muffle") [13:13:38.907] { [13:13:38.907] inherits <- base::inherits [13:13:38.907] invokeRestart <- base::invokeRestart [13:13:38.907] is.null <- base::is.null [13:13:38.907] muffled <- FALSE [13:13:38.907] if (inherits(cond, "message")) { [13:13:38.907] muffled <- grepl(pattern, "muffleMessage") [13:13:38.907] if (muffled) [13:13:38.907] invokeRestart("muffleMessage") [13:13:38.907] } [13:13:38.907] else if (inherits(cond, "warning")) { [13:13:38.907] muffled <- grepl(pattern, "muffleWarning") [13:13:38.907] if (muffled) [13:13:38.907] invokeRestart("muffleWarning") [13:13:38.907] } [13:13:38.907] else if (inherits(cond, "condition")) { [13:13:38.907] if (!is.null(pattern)) { [13:13:38.907] computeRestarts <- base::computeRestarts [13:13:38.907] grepl <- base::grepl [13:13:38.907] restarts <- computeRestarts(cond) [13:13:38.907] for (restart in restarts) { [13:13:38.907] name <- restart$name [13:13:38.907] if (is.null(name)) [13:13:38.907] next [13:13:38.907] if (!grepl(pattern, name)) [13:13:38.907] next [13:13:38.907] invokeRestart(restart) [13:13:38.907] muffled <- TRUE [13:13:38.907] break [13:13:38.907] } [13:13:38.907] } [13:13:38.907] } [13:13:38.907] invisible(muffled) [13:13:38.907] } [13:13:38.907] muffleCondition(cond, pattern = "^muffle") [13:13:38.907] } [13:13:38.907] } [13:13:38.907] else { [13:13:38.907] if (TRUE) { [13:13:38.907] muffleCondition <- function (cond, pattern = "^muffle") [13:13:38.907] { [13:13:38.907] inherits <- base::inherits [13:13:38.907] invokeRestart <- base::invokeRestart [13:13:38.907] is.null <- base::is.null [13:13:38.907] muffled <- FALSE [13:13:38.907] if (inherits(cond, "message")) { [13:13:38.907] muffled <- grepl(pattern, "muffleMessage") [13:13:38.907] if (muffled) [13:13:38.907] invokeRestart("muffleMessage") [13:13:38.907] } [13:13:38.907] else if (inherits(cond, "warning")) { [13:13:38.907] muffled <- grepl(pattern, "muffleWarning") [13:13:38.907] if (muffled) [13:13:38.907] invokeRestart("muffleWarning") [13:13:38.907] } [13:13:38.907] else if (inherits(cond, "condition")) { [13:13:38.907] if (!is.null(pattern)) { [13:13:38.907] computeRestarts <- base::computeRestarts [13:13:38.907] grepl <- base::grepl [13:13:38.907] restarts <- computeRestarts(cond) [13:13:38.907] for (restart in restarts) { [13:13:38.907] name <- restart$name [13:13:38.907] if (is.null(name)) [13:13:38.907] next [13:13:38.907] if (!grepl(pattern, name)) [13:13:38.907] next [13:13:38.907] invokeRestart(restart) [13:13:38.907] muffled <- TRUE [13:13:38.907] break [13:13:38.907] } [13:13:38.907] } [13:13:38.907] } [13:13:38.907] invisible(muffled) [13:13:38.907] } [13:13:38.907] muffleCondition(cond, pattern = "^muffle") [13:13:38.907] } [13:13:38.907] } [13:13:38.907] } [13:13:38.907] })) [13:13:38.907] }, error = function(ex) { [13:13:38.907] base::structure(base::list(value = NULL, visible = NULL, [13:13:38.907] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:38.907] ...future.rng), started = ...future.startTime, [13:13:38.907] finished = Sys.time(), session_uuid = NA_character_, [13:13:38.907] version = "1.8"), class = "FutureResult") [13:13:38.907] }, finally = { [13:13:38.907] if (!identical(...future.workdir, getwd())) [13:13:38.907] setwd(...future.workdir) [13:13:38.907] { [13:13:38.907] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:38.907] ...future.oldOptions$nwarnings <- NULL [13:13:38.907] } [13:13:38.907] base::options(...future.oldOptions) [13:13:38.907] if (.Platform$OS.type == "windows") { [13:13:38.907] old_names <- names(...future.oldEnvVars) [13:13:38.907] envs <- base::Sys.getenv() [13:13:38.907] names <- names(envs) [13:13:38.907] common <- intersect(names, old_names) [13:13:38.907] added <- setdiff(names, old_names) [13:13:38.907] removed <- setdiff(old_names, names) [13:13:38.907] changed <- common[...future.oldEnvVars[common] != [13:13:38.907] envs[common]] [13:13:38.907] NAMES <- toupper(changed) [13:13:38.907] args <- list() [13:13:38.907] for (kk in seq_along(NAMES)) { [13:13:38.907] name <- changed[[kk]] [13:13:38.907] NAME <- NAMES[[kk]] [13:13:38.907] if (name != NAME && is.element(NAME, old_names)) [13:13:38.907] next [13:13:38.907] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:38.907] } [13:13:38.907] NAMES <- toupper(added) [13:13:38.907] for (kk in seq_along(NAMES)) { [13:13:38.907] name <- added[[kk]] [13:13:38.907] NAME <- NAMES[[kk]] [13:13:38.907] if (name != NAME && is.element(NAME, old_names)) [13:13:38.907] next [13:13:38.907] args[[name]] <- "" [13:13:38.907] } [13:13:38.907] NAMES <- toupper(removed) [13:13:38.907] for (kk in seq_along(NAMES)) { [13:13:38.907] name <- removed[[kk]] [13:13:38.907] NAME <- NAMES[[kk]] [13:13:38.907] if (name != NAME && is.element(NAME, old_names)) [13:13:38.907] next [13:13:38.907] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:38.907] } [13:13:38.907] if (length(args) > 0) [13:13:38.907] base::do.call(base::Sys.setenv, args = args) [13:13:38.907] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:38.907] } [13:13:38.907] else { [13:13:38.907] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:38.907] } [13:13:38.907] { [13:13:38.907] if (base::length(...future.futureOptionsAdded) > [13:13:38.907] 0L) { [13:13:38.907] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:38.907] base::names(opts) <- ...future.futureOptionsAdded [13:13:38.907] base::options(opts) [13:13:38.907] } [13:13:38.907] { [13:13:38.907] { [13:13:38.907] NULL [13:13:38.907] RNGkind("Mersenne-Twister") [13:13:38.907] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:38.907] inherits = FALSE) [13:13:38.907] } [13:13:38.907] options(future.plan = NULL) [13:13:38.907] if (is.na(NA_character_)) [13:13:38.907] Sys.unsetenv("R_FUTURE_PLAN") [13:13:38.907] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:38.907] future::plan(list(function (..., envir = parent.frame()) [13:13:38.907] { [13:13:38.907] future <- SequentialFuture(..., envir = envir) [13:13:38.907] if (!future$lazy) [13:13:38.907] future <- run(future) [13:13:38.907] invisible(future) [13:13:38.907] }), .cleanup = FALSE, .init = FALSE) [13:13:38.907] } [13:13:38.907] } [13:13:38.907] } [13:13:38.907] }) [13:13:38.907] if (TRUE) { [13:13:38.907] base::sink(type = "output", split = FALSE) [13:13:38.907] if (TRUE) { [13:13:38.907] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:38.907] } [13:13:38.907] else { [13:13:38.907] ...future.result["stdout"] <- base::list(NULL) [13:13:38.907] } [13:13:38.907] base::close(...future.stdout) [13:13:38.907] ...future.stdout <- NULL [13:13:38.907] } [13:13:38.907] ...future.result$conditions <- ...future.conditions [13:13:38.907] ...future.result$finished <- base::Sys.time() [13:13:38.907] ...future.result [13:13:38.907] } [13:13:38.911] assign_globals() ... [13:13:38.911] List of 5 [13:13:38.911] $ ...future.FUN :function (mode = "logical", length = 0L) [13:13:38.911] $ future.call.arguments :List of 1 [13:13:38.911] ..$ length: int 2 [13:13:38.911] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:38.911] $ ...future.elements_ii :List of 1 [13:13:38.911] ..$ c: chr "character" [13:13:38.911] $ ...future.seeds_ii : NULL [13:13:38.911] $ ...future.globals.maxSize: NULL [13:13:38.911] - attr(*, "where")=List of 5 [13:13:38.911] ..$ ...future.FUN : [13:13:38.911] ..$ future.call.arguments : [13:13:38.911] ..$ ...future.elements_ii : [13:13:38.911] ..$ ...future.seeds_ii : [13:13:38.911] ..$ ...future.globals.maxSize: [13:13:38.911] - attr(*, "resolved")= logi FALSE [13:13:38.911] - attr(*, "total_size")= num 2240 [13:13:38.911] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:38.911] - attr(*, "already-done")= logi TRUE [13:13:38.917] - copied '...future.FUN' to environment [13:13:38.918] - copied 'future.call.arguments' to environment [13:13:38.918] - copied '...future.elements_ii' to environment [13:13:38.918] - copied '...future.seeds_ii' to environment [13:13:38.918] - copied '...future.globals.maxSize' to environment [13:13:38.918] assign_globals() ... done [13:13:38.919] plan(): Setting new future strategy stack: [13:13:38.919] List of future strategies: [13:13:38.919] 1. sequential: [13:13:38.919] - args: function (..., envir = parent.frame(), workers = "") [13:13:38.919] - tweaked: FALSE [13:13:38.919] - call: NULL [13:13:38.919] plan(): nbrOfWorkers() = 1 [13:13:38.921] plan(): Setting new future strategy stack: [13:13:38.921] List of future strategies: [13:13:38.921] 1. sequential: [13:13:38.921] - args: function (..., envir = parent.frame(), workers = "") [13:13:38.921] - tweaked: FALSE [13:13:38.921] - call: plan(strategy) [13:13:38.921] plan(): nbrOfWorkers() = 1 [13:13:38.922] SequentialFuture started (and completed) [13:13:38.922] - Launch lazy future ... done [13:13:38.922] run() for 'SequentialFuture' ... done [13:13:38.922] Created future: [13:13:38.922] SequentialFuture: [13:13:38.922] Label: 'future_lapply-3' [13:13:38.922] Expression: [13:13:38.922] { [13:13:38.922] do.call(function(...) { [13:13:38.922] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:38.922] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:38.922] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:38.922] on.exit(options(oopts), add = TRUE) [13:13:38.922] } [13:13:38.922] { [13:13:38.922] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:38.922] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:38.922] ...future.FUN(...future.X_jj, ...) [13:13:38.922] }) [13:13:38.922] } [13:13:38.922] }, args = future.call.arguments) [13:13:38.922] } [13:13:38.922] Lazy evaluation: FALSE [13:13:38.922] Asynchronous evaluation: FALSE [13:13:38.922] Local evaluation: TRUE [13:13:38.922] Environment: R_GlobalEnv [13:13:38.922] Capture standard output: TRUE [13:13:38.922] Capture condition classes: 'condition' (excluding 'nothing') [13:13:38.922] 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) [13:13:38.922] Packages: [13:13:38.922] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:38.922] Resolved: TRUE [13:13:38.922] Value: 120 bytes of class 'list' [13:13:38.922] Early signaling: FALSE [13:13:38.922] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:38.922] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:38.924] Chunk #3 of 4 ... DONE [13:13:38.924] Chunk #4 of 4 ... [13:13:38.924] - Finding globals in 'X' for chunk #4 ... [13:13:38.924] getGlobalsAndPackages() ... [13:13:38.924] Searching for globals... [13:13:38.924] [13:13:38.925] Searching for globals ... DONE [13:13:38.925] - globals: [0] [13:13:38.925] getGlobalsAndPackages() ... DONE [13:13:38.925] + additional globals found: [n=0] [13:13:38.925] + additional namespaces needed: [n=0] [13:13:38.925] - Finding globals in 'X' for chunk #4 ... DONE [13:13:38.926] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [13:13:38.926] - seeds: [13:13:38.926] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:38.926] getGlobalsAndPackages() ... [13:13:38.926] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:38.926] Resolving globals: FALSE [13:13:38.927] Tweak future expression to call with '...' arguments ... [13:13:38.927] { [13:13:38.927] do.call(function(...) { [13:13:38.927] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:38.927] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:38.927] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:38.927] on.exit(options(oopts), add = TRUE) [13:13:38.927] } [13:13:38.927] { [13:13:38.927] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:38.927] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:38.927] ...future.FUN(...future.X_jj, ...) [13:13:38.927] }) [13:13:38.927] } [13:13:38.927] }, args = future.call.arguments) [13:13:38.927] } [13:13:38.927] Tweak future expression to call with '...' arguments ... DONE [13:13:38.928] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:38.928] [13:13:38.928] getGlobalsAndPackages() ... DONE [13:13:38.928] run() for 'Future' ... [13:13:38.929] - state: 'created' [13:13:38.929] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:13:38.929] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:38.929] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:38.930] - Field: 'label' [13:13:38.930] - Field: 'local' [13:13:38.930] - Field: 'owner' [13:13:38.930] - Field: 'envir' [13:13:38.930] - Field: 'packages' [13:13:38.930] - Field: 'gc' [13:13:38.931] - Field: 'conditions' [13:13:38.931] - Field: 'expr' [13:13:38.931] - Field: 'uuid' [13:13:38.931] - Field: 'seed' [13:13:38.931] - Field: 'version' [13:13:38.931] - Field: 'result' [13:13:38.932] - Field: 'asynchronous' [13:13:38.932] - Field: 'calls' [13:13:38.932] - Field: 'globals' [13:13:38.932] - Field: 'stdout' [13:13:38.932] - Field: 'earlySignal' [13:13:38.932] - Field: 'lazy' [13:13:38.933] - Field: 'state' [13:13:38.933] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:38.933] - Launch lazy future ... [13:13:38.933] Packages needed by the future expression (n = 0): [13:13:38.933] Packages needed by future strategies (n = 0): [13:13:38.934] { [13:13:38.934] { [13:13:38.934] { [13:13:38.934] ...future.startTime <- base::Sys.time() [13:13:38.934] { [13:13:38.934] { [13:13:38.934] { [13:13:38.934] base::local({ [13:13:38.934] has_future <- base::requireNamespace("future", [13:13:38.934] quietly = TRUE) [13:13:38.934] if (has_future) { [13:13:38.934] ns <- base::getNamespace("future") [13:13:38.934] version <- ns[[".package"]][["version"]] [13:13:38.934] if (is.null(version)) [13:13:38.934] version <- utils::packageVersion("future") [13:13:38.934] } [13:13:38.934] else { [13:13:38.934] version <- NULL [13:13:38.934] } [13:13:38.934] if (!has_future || version < "1.8.0") { [13:13:38.934] info <- base::c(r_version = base::gsub("R version ", [13:13:38.934] "", base::R.version$version.string), [13:13:38.934] platform = base::sprintf("%s (%s-bit)", [13:13:38.934] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:38.934] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:38.934] "release", "version")], collapse = " "), [13:13:38.934] hostname = base::Sys.info()[["nodename"]]) [13:13:38.934] info <- base::sprintf("%s: %s", base::names(info), [13:13:38.934] info) [13:13:38.934] info <- base::paste(info, collapse = "; ") [13:13:38.934] if (!has_future) { [13:13:38.934] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:38.934] info) [13:13:38.934] } [13:13:38.934] else { [13:13:38.934] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:38.934] info, version) [13:13:38.934] } [13:13:38.934] base::stop(msg) [13:13:38.934] } [13:13:38.934] }) [13:13:38.934] } [13:13:38.934] options(future.plan = NULL) [13:13:38.934] Sys.unsetenv("R_FUTURE_PLAN") [13:13:38.934] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:38.934] } [13:13:38.934] ...future.workdir <- getwd() [13:13:38.934] } [13:13:38.934] ...future.oldOptions <- base::as.list(base::.Options) [13:13:38.934] ...future.oldEnvVars <- base::Sys.getenv() [13:13:38.934] } [13:13:38.934] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:38.934] future.globals.maxSize = 2097152000, future.globals.method = NULL, [13:13:38.934] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:38.934] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:38.934] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:38.934] future.stdout.windows.reencode = NULL, width = 80L) [13:13:38.934] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:38.934] base::names(...future.oldOptions)) [13:13:38.934] } [13:13:38.934] if (FALSE) { [13:13:38.934] } [13:13:38.934] else { [13:13:38.934] if (TRUE) { [13:13:38.934] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:38.934] open = "w") [13:13:38.934] } [13:13:38.934] else { [13:13:38.934] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:38.934] windows = "NUL", "/dev/null"), open = "w") [13:13:38.934] } [13:13:38.934] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:38.934] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:38.934] base::sink(type = "output", split = FALSE) [13:13:38.934] base::close(...future.stdout) [13:13:38.934] }, add = TRUE) [13:13:38.934] } [13:13:38.934] ...future.frame <- base::sys.nframe() [13:13:38.934] ...future.conditions <- base::list() [13:13:38.934] ...future.rng <- base::globalenv()$.Random.seed [13:13:38.934] if (FALSE) { [13:13:38.934] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:38.934] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:38.934] } [13:13:38.934] ...future.result <- base::tryCatch({ [13:13:38.934] base::withCallingHandlers({ [13:13:38.934] ...future.value <- base::withVisible(base::local({ [13:13:38.934] do.call(function(...) { [13:13:38.934] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:38.934] if (!identical(...future.globals.maxSize.org, [13:13:38.934] ...future.globals.maxSize)) { [13:13:38.934] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:38.934] on.exit(options(oopts), add = TRUE) [13:13:38.934] } [13:13:38.934] { [13:13:38.934] lapply(seq_along(...future.elements_ii), [13:13:38.934] FUN = function(jj) { [13:13:38.934] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:38.934] ...future.FUN(...future.X_jj, ...) [13:13:38.934] }) [13:13:38.934] } [13:13:38.934] }, args = future.call.arguments) [13:13:38.934] })) [13:13:38.934] future::FutureResult(value = ...future.value$value, [13:13:38.934] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:38.934] ...future.rng), globalenv = if (FALSE) [13:13:38.934] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:38.934] ...future.globalenv.names)) [13:13:38.934] else NULL, started = ...future.startTime, version = "1.8") [13:13:38.934] }, condition = base::local({ [13:13:38.934] c <- base::c [13:13:38.934] inherits <- base::inherits [13:13:38.934] invokeRestart <- base::invokeRestart [13:13:38.934] length <- base::length [13:13:38.934] list <- base::list [13:13:38.934] seq.int <- base::seq.int [13:13:38.934] signalCondition <- base::signalCondition [13:13:38.934] sys.calls <- base::sys.calls [13:13:38.934] `[[` <- base::`[[` [13:13:38.934] `+` <- base::`+` [13:13:38.934] `<<-` <- base::`<<-` [13:13:38.934] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:38.934] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:38.934] 3L)] [13:13:38.934] } [13:13:38.934] function(cond) { [13:13:38.934] is_error <- inherits(cond, "error") [13:13:38.934] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:38.934] NULL) [13:13:38.934] if (is_error) { [13:13:38.934] sessionInformation <- function() { [13:13:38.934] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:38.934] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:38.934] search = base::search(), system = base::Sys.info()) [13:13:38.934] } [13:13:38.934] ...future.conditions[[length(...future.conditions) + [13:13:38.934] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:38.934] cond$call), session = sessionInformation(), [13:13:38.934] timestamp = base::Sys.time(), signaled = 0L) [13:13:38.934] signalCondition(cond) [13:13:38.934] } [13:13:38.934] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:38.934] "immediateCondition"))) { [13:13:38.934] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:38.934] ...future.conditions[[length(...future.conditions) + [13:13:38.934] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:38.934] if (TRUE && !signal) { [13:13:38.934] muffleCondition <- function (cond, pattern = "^muffle") [13:13:38.934] { [13:13:38.934] inherits <- base::inherits [13:13:38.934] invokeRestart <- base::invokeRestart [13:13:38.934] is.null <- base::is.null [13:13:38.934] muffled <- FALSE [13:13:38.934] if (inherits(cond, "message")) { [13:13:38.934] muffled <- grepl(pattern, "muffleMessage") [13:13:38.934] if (muffled) [13:13:38.934] invokeRestart("muffleMessage") [13:13:38.934] } [13:13:38.934] else if (inherits(cond, "warning")) { [13:13:38.934] muffled <- grepl(pattern, "muffleWarning") [13:13:38.934] if (muffled) [13:13:38.934] invokeRestart("muffleWarning") [13:13:38.934] } [13:13:38.934] else if (inherits(cond, "condition")) { [13:13:38.934] if (!is.null(pattern)) { [13:13:38.934] computeRestarts <- base::computeRestarts [13:13:38.934] grepl <- base::grepl [13:13:38.934] restarts <- computeRestarts(cond) [13:13:38.934] for (restart in restarts) { [13:13:38.934] name <- restart$name [13:13:38.934] if (is.null(name)) [13:13:38.934] next [13:13:38.934] if (!grepl(pattern, name)) [13:13:38.934] next [13:13:38.934] invokeRestart(restart) [13:13:38.934] muffled <- TRUE [13:13:38.934] break [13:13:38.934] } [13:13:38.934] } [13:13:38.934] } [13:13:38.934] invisible(muffled) [13:13:38.934] } [13:13:38.934] muffleCondition(cond, pattern = "^muffle") [13:13:38.934] } [13:13:38.934] } [13:13:38.934] else { [13:13:38.934] if (TRUE) { [13:13:38.934] muffleCondition <- function (cond, pattern = "^muffle") [13:13:38.934] { [13:13:38.934] inherits <- base::inherits [13:13:38.934] invokeRestart <- base::invokeRestart [13:13:38.934] is.null <- base::is.null [13:13:38.934] muffled <- FALSE [13:13:38.934] if (inherits(cond, "message")) { [13:13:38.934] muffled <- grepl(pattern, "muffleMessage") [13:13:38.934] if (muffled) [13:13:38.934] invokeRestart("muffleMessage") [13:13:38.934] } [13:13:38.934] else if (inherits(cond, "warning")) { [13:13:38.934] muffled <- grepl(pattern, "muffleWarning") [13:13:38.934] if (muffled) [13:13:38.934] invokeRestart("muffleWarning") [13:13:38.934] } [13:13:38.934] else if (inherits(cond, "condition")) { [13:13:38.934] if (!is.null(pattern)) { [13:13:38.934] computeRestarts <- base::computeRestarts [13:13:38.934] grepl <- base::grepl [13:13:38.934] restarts <- computeRestarts(cond) [13:13:38.934] for (restart in restarts) { [13:13:38.934] name <- restart$name [13:13:38.934] if (is.null(name)) [13:13:38.934] next [13:13:38.934] if (!grepl(pattern, name)) [13:13:38.934] next [13:13:38.934] invokeRestart(restart) [13:13:38.934] muffled <- TRUE [13:13:38.934] break [13:13:38.934] } [13:13:38.934] } [13:13:38.934] } [13:13:38.934] invisible(muffled) [13:13:38.934] } [13:13:38.934] muffleCondition(cond, pattern = "^muffle") [13:13:38.934] } [13:13:38.934] } [13:13:38.934] } [13:13:38.934] })) [13:13:38.934] }, error = function(ex) { [13:13:38.934] base::structure(base::list(value = NULL, visible = NULL, [13:13:38.934] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:38.934] ...future.rng), started = ...future.startTime, [13:13:38.934] finished = Sys.time(), session_uuid = NA_character_, [13:13:38.934] version = "1.8"), class = "FutureResult") [13:13:38.934] }, finally = { [13:13:38.934] if (!identical(...future.workdir, getwd())) [13:13:38.934] setwd(...future.workdir) [13:13:38.934] { [13:13:38.934] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:38.934] ...future.oldOptions$nwarnings <- NULL [13:13:38.934] } [13:13:38.934] base::options(...future.oldOptions) [13:13:38.934] if (.Platform$OS.type == "windows") { [13:13:38.934] old_names <- names(...future.oldEnvVars) [13:13:38.934] envs <- base::Sys.getenv() [13:13:38.934] names <- names(envs) [13:13:38.934] common <- intersect(names, old_names) [13:13:38.934] added <- setdiff(names, old_names) [13:13:38.934] removed <- setdiff(old_names, names) [13:13:38.934] changed <- common[...future.oldEnvVars[common] != [13:13:38.934] envs[common]] [13:13:38.934] NAMES <- toupper(changed) [13:13:38.934] args <- list() [13:13:38.934] for (kk in seq_along(NAMES)) { [13:13:38.934] name <- changed[[kk]] [13:13:38.934] NAME <- NAMES[[kk]] [13:13:38.934] if (name != NAME && is.element(NAME, old_names)) [13:13:38.934] next [13:13:38.934] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:38.934] } [13:13:38.934] NAMES <- toupper(added) [13:13:38.934] for (kk in seq_along(NAMES)) { [13:13:38.934] name <- added[[kk]] [13:13:38.934] NAME <- NAMES[[kk]] [13:13:38.934] if (name != NAME && is.element(NAME, old_names)) [13:13:38.934] next [13:13:38.934] args[[name]] <- "" [13:13:38.934] } [13:13:38.934] NAMES <- toupper(removed) [13:13:38.934] for (kk in seq_along(NAMES)) { [13:13:38.934] name <- removed[[kk]] [13:13:38.934] NAME <- NAMES[[kk]] [13:13:38.934] if (name != NAME && is.element(NAME, old_names)) [13:13:38.934] next [13:13:38.934] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:38.934] } [13:13:38.934] if (length(args) > 0) [13:13:38.934] base::do.call(base::Sys.setenv, args = args) [13:13:38.934] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:38.934] } [13:13:38.934] else { [13:13:38.934] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:38.934] } [13:13:38.934] { [13:13:38.934] if (base::length(...future.futureOptionsAdded) > [13:13:38.934] 0L) { [13:13:38.934] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:38.934] base::names(opts) <- ...future.futureOptionsAdded [13:13:38.934] base::options(opts) [13:13:38.934] } [13:13:38.934] { [13:13:38.934] { [13:13:38.934] NULL [13:13:38.934] RNGkind("Mersenne-Twister") [13:13:38.934] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:38.934] inherits = FALSE) [13:13:38.934] } [13:13:38.934] options(future.plan = NULL) [13:13:38.934] if (is.na(NA_character_)) [13:13:38.934] Sys.unsetenv("R_FUTURE_PLAN") [13:13:38.934] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:38.934] future::plan(list(function (..., envir = parent.frame()) [13:13:38.934] { [13:13:38.934] future <- SequentialFuture(..., envir = envir) [13:13:38.934] if (!future$lazy) [13:13:38.934] future <- run(future) [13:13:38.934] invisible(future) [13:13:38.934] }), .cleanup = FALSE, .init = FALSE) [13:13:38.934] } [13:13:38.934] } [13:13:38.934] } [13:13:38.934] }) [13:13:38.934] if (TRUE) { [13:13:38.934] base::sink(type = "output", split = FALSE) [13:13:38.934] if (TRUE) { [13:13:38.934] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:38.934] } [13:13:38.934] else { [13:13:38.934] ...future.result["stdout"] <- base::list(NULL) [13:13:38.934] } [13:13:38.934] base::close(...future.stdout) [13:13:38.934] ...future.stdout <- NULL [13:13:38.934] } [13:13:38.934] ...future.result$conditions <- ...future.conditions [13:13:38.934] ...future.result$finished <- base::Sys.time() [13:13:38.934] ...future.result [13:13:38.934] } [13:13:38.938] assign_globals() ... [13:13:38.938] List of 5 [13:13:38.938] $ ...future.FUN :function (mode = "logical", length = 0L) [13:13:38.938] $ future.call.arguments :List of 1 [13:13:38.938] ..$ length: int 2 [13:13:38.938] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:38.938] $ ...future.elements_ii :List of 1 [13:13:38.938] ..$ c: chr "list" [13:13:38.938] $ ...future.seeds_ii : NULL [13:13:38.938] $ ...future.globals.maxSize: NULL [13:13:38.938] - attr(*, "where")=List of 5 [13:13:38.938] ..$ ...future.FUN : [13:13:38.938] ..$ future.call.arguments : [13:13:38.938] ..$ ...future.elements_ii : [13:13:38.938] ..$ ...future.seeds_ii : [13:13:38.938] ..$ ...future.globals.maxSize: [13:13:38.938] - attr(*, "resolved")= logi FALSE [13:13:38.938] - attr(*, "total_size")= num 2240 [13:13:38.938] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:38.938] - attr(*, "already-done")= logi TRUE [13:13:38.944] - copied '...future.FUN' to environment [13:13:38.945] - copied 'future.call.arguments' to environment [13:13:38.945] - copied '...future.elements_ii' to environment [13:13:38.945] - copied '...future.seeds_ii' to environment [13:13:38.945] - copied '...future.globals.maxSize' to environment [13:13:38.946] assign_globals() ... done [13:13:38.946] plan(): Setting new future strategy stack: [13:13:38.946] List of future strategies: [13:13:38.946] 1. sequential: [13:13:38.946] - args: function (..., envir = parent.frame(), workers = "") [13:13:38.946] - tweaked: FALSE [13:13:38.946] - call: NULL [13:13:38.947] plan(): nbrOfWorkers() = 1 [13:13:38.948] plan(): Setting new future strategy stack: [13:13:38.948] List of future strategies: [13:13:38.948] 1. sequential: [13:13:38.948] - args: function (..., envir = parent.frame(), workers = "") [13:13:38.948] - tweaked: FALSE [13:13:38.948] - call: plan(strategy) [13:13:38.949] plan(): nbrOfWorkers() = 1 [13:13:38.949] SequentialFuture started (and completed) [13:13:38.949] - Launch lazy future ... done [13:13:38.949] run() for 'SequentialFuture' ... done [13:13:38.949] Created future: [13:13:38.949] SequentialFuture: [13:13:38.949] Label: 'future_lapply-4' [13:13:38.949] Expression: [13:13:38.949] { [13:13:38.949] do.call(function(...) { [13:13:38.949] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:38.949] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:38.949] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:38.949] on.exit(options(oopts), add = TRUE) [13:13:38.949] } [13:13:38.949] { [13:13:38.949] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:38.949] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:38.949] ...future.FUN(...future.X_jj, ...) [13:13:38.949] }) [13:13:38.949] } [13:13:38.949] }, args = future.call.arguments) [13:13:38.949] } [13:13:38.949] Lazy evaluation: FALSE [13:13:38.949] Asynchronous evaluation: FALSE [13:13:38.949] Local evaluation: TRUE [13:13:38.949] Environment: R_GlobalEnv [13:13:38.949] Capture standard output: TRUE [13:13:38.949] Capture condition classes: 'condition' (excluding 'nothing') [13:13:38.949] 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) [13:13:38.949] Packages: [13:13:38.949] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:38.949] Resolved: TRUE [13:13:38.949] Value: 0 bytes of class 'list' [13:13:38.949] Early signaling: FALSE [13:13:38.949] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:38.949] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:38.951] Chunk #4 of 4 ... DONE [13:13:38.951] Launching 4 futures (chunks) ... DONE [13:13:38.951] Resolving 4 futures (chunks) ... [13:13:38.951] resolve() on list ... [13:13:38.951] recursive: 0 [13:13:38.952] length: 4 [13:13:38.952] [13:13:38.952] resolved() for 'SequentialFuture' ... [13:13:38.952] - state: 'finished' [13:13:38.952] - run: TRUE [13:13:38.952] - result: 'FutureResult' [13:13:38.953] resolved() for 'SequentialFuture' ... done [13:13:38.953] Future #1 [13:13:38.953] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:38.953] - nx: 4 [13:13:38.953] - relay: TRUE [13:13:38.953] - stdout: TRUE [13:13:38.954] - signal: TRUE [13:13:38.954] - resignal: FALSE [13:13:38.954] - force: TRUE [13:13:38.954] - relayed: [n=4] FALSE, FALSE, FALSE, FALSE [13:13:38.954] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [13:13:38.954] - until=1 [13:13:38.954] - relaying element #1 [13:13:38.955] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [13:13:38.955] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [13:13:38.955] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:38.955] length: 3 (resolved future 1) [13:13:38.955] resolved() for 'SequentialFuture' ... [13:13:38.956] - state: 'finished' [13:13:38.956] - run: TRUE [13:13:38.956] - result: 'FutureResult' [13:13:38.956] resolved() for 'SequentialFuture' ... done [13:13:38.956] Future #2 [13:13:38.957] signalConditionsASAP(SequentialFuture, pos=2) ... [13:13:38.957] - nx: 4 [13:13:38.957] - relay: TRUE [13:13:38.957] - stdout: TRUE [13:13:38.957] - signal: TRUE [13:13:38.957] - resignal: FALSE [13:13:38.958] - force: TRUE [13:13:38.958] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [13:13:38.958] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [13:13:38.958] - until=2 [13:13:38.958] - relaying element #2 [13:13:38.959] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [13:13:38.959] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [13:13:38.959] signalConditionsASAP(SequentialFuture, pos=2) ... done [13:13:38.959] length: 2 (resolved future 2) [13:13:38.959] resolved() for 'SequentialFuture' ... [13:13:38.959] - state: 'finished' [13:13:38.960] - run: TRUE [13:13:38.960] - result: 'FutureResult' [13:13:38.960] resolved() for 'SequentialFuture' ... done [13:13:38.960] Future #3 [13:13:38.960] signalConditionsASAP(SequentialFuture, pos=3) ... [13:13:38.961] - nx: 4 [13:13:38.961] - relay: TRUE [13:13:38.961] - stdout: TRUE [13:13:38.961] - signal: TRUE [13:13:38.961] - resignal: FALSE [13:13:38.961] - force: TRUE [13:13:38.961] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [13:13:38.962] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [13:13:38.962] - until=3 [13:13:38.962] - relaying element #3 [13:13:38.962] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [13:13:38.962] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [13:13:38.962] signalConditionsASAP(SequentialFuture, pos=3) ... done [13:13:38.963] length: 1 (resolved future 3) [13:13:38.963] resolved() for 'SequentialFuture' ... [13:13:38.963] - state: 'finished' [13:13:38.963] - run: TRUE [13:13:38.963] - result: 'FutureResult' [13:13:38.964] resolved() for 'SequentialFuture' ... done [13:13:38.964] Future #4 [13:13:38.964] signalConditionsASAP(SequentialFuture, pos=4) ... [13:13:38.964] - nx: 4 [13:13:38.964] - relay: TRUE [13:13:38.964] - stdout: TRUE [13:13:38.965] - signal: TRUE [13:13:38.965] - resignal: FALSE [13:13:38.965] - force: TRUE [13:13:38.965] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [13:13:38.965] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [13:13:38.965] - until=4 [13:13:38.965] - relaying element #4 [13:13:38.966] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [13:13:38.966] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [13:13:38.966] signalConditionsASAP(SequentialFuture, pos=4) ... done [13:13:38.966] length: 0 (resolved future 4) [13:13:38.966] Relaying remaining futures [13:13:38.967] signalConditionsASAP(NULL, pos=0) ... [13:13:38.967] - nx: 4 [13:13:38.967] - relay: TRUE [13:13:38.967] - stdout: TRUE [13:13:38.967] - signal: TRUE [13:13:38.967] - resignal: FALSE [13:13:38.967] - force: TRUE [13:13:38.968] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [13:13:38.968] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE - flush all [13:13:38.968] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [13:13:38.968] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [13:13:38.968] signalConditionsASAP(NULL, pos=0) ... done [13:13:38.968] resolve() on list ... DONE [13:13:38.969] - Number of value chunks collected: 4 [13:13:38.969] Resolving 4 futures (chunks) ... DONE [13:13:38.969] Reducing values from 4 chunks ... [13:13:38.969] - Number of values collected after concatenation: 4 [13:13:38.969] - Number of values expected: 4 [13:13:38.970] Reducing values from 4 chunks ... DONE [13:13:38.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, ...) ... [13:13:38.973] future_lapply() ... [13:13:38.974] Number of chunks: 4 [13:13:38.974] getGlobalsAndPackagesXApply() ... [13:13:38.974] - future.globals: TRUE [13:13:38.975] getGlobalsAndPackages() ... [13:13:38.975] Searching for globals... [13:13:38.976] - globals found: [2] 'FUN', '.Internal' [13:13:38.976] Searching for globals ... DONE [13:13:38.977] Resolving globals: FALSE [13:13:38.977] The total size of the 1 globals is 2.13 KiB (2184 bytes) [13:13:38.977] 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') [13:13:38.978] - globals: [1] 'FUN' [13:13:38.978] [13:13:38.978] getGlobalsAndPackages() ... DONE [13:13:38.978] - globals found/used: [n=1] 'FUN' [13:13:38.978] - needed namespaces: [n=0] [13:13:38.978] Finding globals ... DONE [13:13:38.979] - use_args: TRUE [13:13:38.979] - Getting '...' globals ... [13:13:38.979] resolve() on list ... [13:13:38.979] recursive: 0 [13:13:38.979] length: 1 [13:13:38.980] elements: '...' [13:13:38.980] length: 0 (resolved future 1) [13:13:38.980] resolve() on list ... DONE [13:13:38.980] - '...' content: [n=1] 'length' [13:13:38.980] List of 1 [13:13:38.980] $ ...:List of 1 [13:13:38.980] ..$ length: int 2 [13:13:38.980] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:38.980] - attr(*, "where")=List of 1 [13:13:38.980] ..$ ...: [13:13:38.980] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:38.980] - attr(*, "resolved")= logi TRUE [13:13:38.980] - attr(*, "total_size")= num NA [13:13:38.984] - Getting '...' globals ... DONE [13:13:38.984] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:38.984] List of 2 [13:13:38.984] $ ...future.FUN:function (mode = "logical", length = 0L) [13:13:38.984] $ ... :List of 1 [13:13:38.984] ..$ length: int 2 [13:13:38.984] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:38.984] - attr(*, "where")=List of 2 [13:13:38.984] ..$ ...future.FUN: [13:13:38.984] ..$ ... : [13:13:38.984] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:38.984] - attr(*, "resolved")= logi FALSE [13:13:38.984] - attr(*, "total_size")= num 2240 [13:13:38.988] Packages to be attached in all futures: [n=0] [13:13:38.988] getGlobalsAndPackagesXApply() ... DONE [13:13:38.988] Number of futures (= number of chunks): 4 [13:13:38.988] Launching 4 futures (chunks) ... [13:13:38.989] Chunk #1 of 4 ... [13:13:38.989] - Finding globals in 'X' for chunk #1 ... [13:13:38.989] getGlobalsAndPackages() ... [13:13:38.989] Searching for globals... [13:13:38.989] [13:13:38.990] Searching for globals ... DONE [13:13:38.990] - globals: [0] [13:13:38.990] getGlobalsAndPackages() ... DONE [13:13:38.990] + additional globals found: [n=0] [13:13:38.990] + additional namespaces needed: [n=0] [13:13:38.990] - Finding globals in 'X' for chunk #1 ... DONE [13:13:38.990] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [13:13:38.991] - seeds: [13:13:38.991] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:38.991] getGlobalsAndPackages() ... [13:13:38.991] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:38.991] Resolving globals: FALSE [13:13:38.991] Tweak future expression to call with '...' arguments ... [13:13:38.992] { [13:13:38.992] do.call(function(...) { [13:13:38.992] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:38.992] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:38.992] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:38.992] on.exit(options(oopts), add = TRUE) [13:13:38.992] } [13:13:38.992] { [13:13:38.992] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:38.992] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:38.992] ...future.FUN(...future.X_jj, ...) [13:13:38.992] }) [13:13:38.992] } [13:13:38.992] }, args = future.call.arguments) [13:13:38.992] } [13:13:38.992] Tweak future expression to call with '...' arguments ... DONE [13:13:38.993] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:38.993] [13:13:38.993] getGlobalsAndPackages() ... DONE [13:13:38.993] run() for 'Future' ... [13:13:38.993] - state: 'created' [13:13:38.994] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:13:38.994] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:38.995] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:38.995] - Field: 'label' [13:13:38.995] - Field: 'local' [13:13:38.996] - Field: 'owner' [13:13:38.996] - Field: 'envir' [13:13:38.996] - Field: 'packages' [13:13:38.996] - Field: 'gc' [13:13:38.996] - Field: 'conditions' [13:13:38.996] - Field: 'expr' [13:13:38.997] - Field: 'uuid' [13:13:38.997] - Field: 'seed' [13:13:38.997] - Field: 'version' [13:13:38.997] - Field: 'result' [13:13:38.997] - Field: 'asynchronous' [13:13:38.997] - Field: 'calls' [13:13:38.998] - Field: 'globals' [13:13:38.998] - Field: 'stdout' [13:13:38.998] - Field: 'earlySignal' [13:13:38.998] - Field: 'lazy' [13:13:38.998] - Field: 'state' [13:13:38.998] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:38.999] - Launch lazy future ... [13:13:38.999] Packages needed by the future expression (n = 0): [13:13:38.999] Packages needed by future strategies (n = 0): [13:13:39.000] { [13:13:39.000] { [13:13:39.000] { [13:13:39.000] ...future.startTime <- base::Sys.time() [13:13:39.000] { [13:13:39.000] { [13:13:39.000] { [13:13:39.000] base::local({ [13:13:39.000] has_future <- base::requireNamespace("future", [13:13:39.000] quietly = TRUE) [13:13:39.000] if (has_future) { [13:13:39.000] ns <- base::getNamespace("future") [13:13:39.000] version <- ns[[".package"]][["version"]] [13:13:39.000] if (is.null(version)) [13:13:39.000] version <- utils::packageVersion("future") [13:13:39.000] } [13:13:39.000] else { [13:13:39.000] version <- NULL [13:13:39.000] } [13:13:39.000] if (!has_future || version < "1.8.0") { [13:13:39.000] info <- base::c(r_version = base::gsub("R version ", [13:13:39.000] "", base::R.version$version.string), [13:13:39.000] platform = base::sprintf("%s (%s-bit)", [13:13:39.000] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:39.000] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:39.000] "release", "version")], collapse = " "), [13:13:39.000] hostname = base::Sys.info()[["nodename"]]) [13:13:39.000] info <- base::sprintf("%s: %s", base::names(info), [13:13:39.000] info) [13:13:39.000] info <- base::paste(info, collapse = "; ") [13:13:39.000] if (!has_future) { [13:13:39.000] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:39.000] info) [13:13:39.000] } [13:13:39.000] else { [13:13:39.000] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:39.000] info, version) [13:13:39.000] } [13:13:39.000] base::stop(msg) [13:13:39.000] } [13:13:39.000] }) [13:13:39.000] } [13:13:39.000] options(future.plan = NULL) [13:13:39.000] Sys.unsetenv("R_FUTURE_PLAN") [13:13:39.000] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:39.000] } [13:13:39.000] ...future.workdir <- getwd() [13:13:39.000] } [13:13:39.000] ...future.oldOptions <- base::as.list(base::.Options) [13:13:39.000] ...future.oldEnvVars <- base::Sys.getenv() [13:13:39.000] } [13:13:39.000] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:39.000] future.globals.maxSize = 2097152000, future.globals.method = NULL, [13:13:39.000] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:39.000] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:39.000] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:39.000] future.stdout.windows.reencode = NULL, width = 80L) [13:13:39.000] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:39.000] base::names(...future.oldOptions)) [13:13:39.000] } [13:13:39.000] if (FALSE) { [13:13:39.000] } [13:13:39.000] else { [13:13:39.000] if (TRUE) { [13:13:39.000] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:39.000] open = "w") [13:13:39.000] } [13:13:39.000] else { [13:13:39.000] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:39.000] windows = "NUL", "/dev/null"), open = "w") [13:13:39.000] } [13:13:39.000] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:39.000] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:39.000] base::sink(type = "output", split = FALSE) [13:13:39.000] base::close(...future.stdout) [13:13:39.000] }, add = TRUE) [13:13:39.000] } [13:13:39.000] ...future.frame <- base::sys.nframe() [13:13:39.000] ...future.conditions <- base::list() [13:13:39.000] ...future.rng <- base::globalenv()$.Random.seed [13:13:39.000] if (FALSE) { [13:13:39.000] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:39.000] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:39.000] } [13:13:39.000] ...future.result <- base::tryCatch({ [13:13:39.000] base::withCallingHandlers({ [13:13:39.000] ...future.value <- base::withVisible(base::local({ [13:13:39.000] do.call(function(...) { [13:13:39.000] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:39.000] if (!identical(...future.globals.maxSize.org, [13:13:39.000] ...future.globals.maxSize)) { [13:13:39.000] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:39.000] on.exit(options(oopts), add = TRUE) [13:13:39.000] } [13:13:39.000] { [13:13:39.000] lapply(seq_along(...future.elements_ii), [13:13:39.000] FUN = function(jj) { [13:13:39.000] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:39.000] ...future.FUN(...future.X_jj, ...) [13:13:39.000] }) [13:13:39.000] } [13:13:39.000] }, args = future.call.arguments) [13:13:39.000] })) [13:13:39.000] future::FutureResult(value = ...future.value$value, [13:13:39.000] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:39.000] ...future.rng), globalenv = if (FALSE) [13:13:39.000] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:39.000] ...future.globalenv.names)) [13:13:39.000] else NULL, started = ...future.startTime, version = "1.8") [13:13:39.000] }, condition = base::local({ [13:13:39.000] c <- base::c [13:13:39.000] inherits <- base::inherits [13:13:39.000] invokeRestart <- base::invokeRestart [13:13:39.000] length <- base::length [13:13:39.000] list <- base::list [13:13:39.000] seq.int <- base::seq.int [13:13:39.000] signalCondition <- base::signalCondition [13:13:39.000] sys.calls <- base::sys.calls [13:13:39.000] `[[` <- base::`[[` [13:13:39.000] `+` <- base::`+` [13:13:39.000] `<<-` <- base::`<<-` [13:13:39.000] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:39.000] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:39.000] 3L)] [13:13:39.000] } [13:13:39.000] function(cond) { [13:13:39.000] is_error <- inherits(cond, "error") [13:13:39.000] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:39.000] NULL) [13:13:39.000] if (is_error) { [13:13:39.000] sessionInformation <- function() { [13:13:39.000] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:39.000] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:39.000] search = base::search(), system = base::Sys.info()) [13:13:39.000] } [13:13:39.000] ...future.conditions[[length(...future.conditions) + [13:13:39.000] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:39.000] cond$call), session = sessionInformation(), [13:13:39.000] timestamp = base::Sys.time(), signaled = 0L) [13:13:39.000] signalCondition(cond) [13:13:39.000] } [13:13:39.000] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:39.000] "immediateCondition"))) { [13:13:39.000] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:39.000] ...future.conditions[[length(...future.conditions) + [13:13:39.000] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:39.000] if (TRUE && !signal) { [13:13:39.000] muffleCondition <- function (cond, pattern = "^muffle") [13:13:39.000] { [13:13:39.000] inherits <- base::inherits [13:13:39.000] invokeRestart <- base::invokeRestart [13:13:39.000] is.null <- base::is.null [13:13:39.000] muffled <- FALSE [13:13:39.000] if (inherits(cond, "message")) { [13:13:39.000] muffled <- grepl(pattern, "muffleMessage") [13:13:39.000] if (muffled) [13:13:39.000] invokeRestart("muffleMessage") [13:13:39.000] } [13:13:39.000] else if (inherits(cond, "warning")) { [13:13:39.000] muffled <- grepl(pattern, "muffleWarning") [13:13:39.000] if (muffled) [13:13:39.000] invokeRestart("muffleWarning") [13:13:39.000] } [13:13:39.000] else if (inherits(cond, "condition")) { [13:13:39.000] if (!is.null(pattern)) { [13:13:39.000] computeRestarts <- base::computeRestarts [13:13:39.000] grepl <- base::grepl [13:13:39.000] restarts <- computeRestarts(cond) [13:13:39.000] for (restart in restarts) { [13:13:39.000] name <- restart$name [13:13:39.000] if (is.null(name)) [13:13:39.000] next [13:13:39.000] if (!grepl(pattern, name)) [13:13:39.000] next [13:13:39.000] invokeRestart(restart) [13:13:39.000] muffled <- TRUE [13:13:39.000] break [13:13:39.000] } [13:13:39.000] } [13:13:39.000] } [13:13:39.000] invisible(muffled) [13:13:39.000] } [13:13:39.000] muffleCondition(cond, pattern = "^muffle") [13:13:39.000] } [13:13:39.000] } [13:13:39.000] else { [13:13:39.000] if (TRUE) { [13:13:39.000] muffleCondition <- function (cond, pattern = "^muffle") [13:13:39.000] { [13:13:39.000] inherits <- base::inherits [13:13:39.000] invokeRestart <- base::invokeRestart [13:13:39.000] is.null <- base::is.null [13:13:39.000] muffled <- FALSE [13:13:39.000] if (inherits(cond, "message")) { [13:13:39.000] muffled <- grepl(pattern, "muffleMessage") [13:13:39.000] if (muffled) [13:13:39.000] invokeRestart("muffleMessage") [13:13:39.000] } [13:13:39.000] else if (inherits(cond, "warning")) { [13:13:39.000] muffled <- grepl(pattern, "muffleWarning") [13:13:39.000] if (muffled) [13:13:39.000] invokeRestart("muffleWarning") [13:13:39.000] } [13:13:39.000] else if (inherits(cond, "condition")) { [13:13:39.000] if (!is.null(pattern)) { [13:13:39.000] computeRestarts <- base::computeRestarts [13:13:39.000] grepl <- base::grepl [13:13:39.000] restarts <- computeRestarts(cond) [13:13:39.000] for (restart in restarts) { [13:13:39.000] name <- restart$name [13:13:39.000] if (is.null(name)) [13:13:39.000] next [13:13:39.000] if (!grepl(pattern, name)) [13:13:39.000] next [13:13:39.000] invokeRestart(restart) [13:13:39.000] muffled <- TRUE [13:13:39.000] break [13:13:39.000] } [13:13:39.000] } [13:13:39.000] } [13:13:39.000] invisible(muffled) [13:13:39.000] } [13:13:39.000] muffleCondition(cond, pattern = "^muffle") [13:13:39.000] } [13:13:39.000] } [13:13:39.000] } [13:13:39.000] })) [13:13:39.000] }, error = function(ex) { [13:13:39.000] base::structure(base::list(value = NULL, visible = NULL, [13:13:39.000] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:39.000] ...future.rng), started = ...future.startTime, [13:13:39.000] finished = Sys.time(), session_uuid = NA_character_, [13:13:39.000] version = "1.8"), class = "FutureResult") [13:13:39.000] }, finally = { [13:13:39.000] if (!identical(...future.workdir, getwd())) [13:13:39.000] setwd(...future.workdir) [13:13:39.000] { [13:13:39.000] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:39.000] ...future.oldOptions$nwarnings <- NULL [13:13:39.000] } [13:13:39.000] base::options(...future.oldOptions) [13:13:39.000] if (.Platform$OS.type == "windows") { [13:13:39.000] old_names <- names(...future.oldEnvVars) [13:13:39.000] envs <- base::Sys.getenv() [13:13:39.000] names <- names(envs) [13:13:39.000] common <- intersect(names, old_names) [13:13:39.000] added <- setdiff(names, old_names) [13:13:39.000] removed <- setdiff(old_names, names) [13:13:39.000] changed <- common[...future.oldEnvVars[common] != [13:13:39.000] envs[common]] [13:13:39.000] NAMES <- toupper(changed) [13:13:39.000] args <- list() [13:13:39.000] for (kk in seq_along(NAMES)) { [13:13:39.000] name <- changed[[kk]] [13:13:39.000] NAME <- NAMES[[kk]] [13:13:39.000] if (name != NAME && is.element(NAME, old_names)) [13:13:39.000] next [13:13:39.000] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:39.000] } [13:13:39.000] NAMES <- toupper(added) [13:13:39.000] for (kk in seq_along(NAMES)) { [13:13:39.000] name <- added[[kk]] [13:13:39.000] NAME <- NAMES[[kk]] [13:13:39.000] if (name != NAME && is.element(NAME, old_names)) [13:13:39.000] next [13:13:39.000] args[[name]] <- "" [13:13:39.000] } [13:13:39.000] NAMES <- toupper(removed) [13:13:39.000] for (kk in seq_along(NAMES)) { [13:13:39.000] name <- removed[[kk]] [13:13:39.000] NAME <- NAMES[[kk]] [13:13:39.000] if (name != NAME && is.element(NAME, old_names)) [13:13:39.000] next [13:13:39.000] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:39.000] } [13:13:39.000] if (length(args) > 0) [13:13:39.000] base::do.call(base::Sys.setenv, args = args) [13:13:39.000] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:39.000] } [13:13:39.000] else { [13:13:39.000] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:39.000] } [13:13:39.000] { [13:13:39.000] if (base::length(...future.futureOptionsAdded) > [13:13:39.000] 0L) { [13:13:39.000] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:39.000] base::names(opts) <- ...future.futureOptionsAdded [13:13:39.000] base::options(opts) [13:13:39.000] } [13:13:39.000] { [13:13:39.000] { [13:13:39.000] NULL [13:13:39.000] RNGkind("Mersenne-Twister") [13:13:39.000] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:39.000] inherits = FALSE) [13:13:39.000] } [13:13:39.000] options(future.plan = NULL) [13:13:39.000] if (is.na(NA_character_)) [13:13:39.000] Sys.unsetenv("R_FUTURE_PLAN") [13:13:39.000] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:39.000] future::plan(list(function (..., envir = parent.frame()) [13:13:39.000] { [13:13:39.000] future <- SequentialFuture(..., envir = envir) [13:13:39.000] if (!future$lazy) [13:13:39.000] future <- run(future) [13:13:39.000] invisible(future) [13:13:39.000] }), .cleanup = FALSE, .init = FALSE) [13:13:39.000] } [13:13:39.000] } [13:13:39.000] } [13:13:39.000] }) [13:13:39.000] if (TRUE) { [13:13:39.000] base::sink(type = "output", split = FALSE) [13:13:39.000] if (TRUE) { [13:13:39.000] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:39.000] } [13:13:39.000] else { [13:13:39.000] ...future.result["stdout"] <- base::list(NULL) [13:13:39.000] } [13:13:39.000] base::close(...future.stdout) [13:13:39.000] ...future.stdout <- NULL [13:13:39.000] } [13:13:39.000] ...future.result$conditions <- ...future.conditions [13:13:39.000] ...future.result$finished <- base::Sys.time() [13:13:39.000] ...future.result [13:13:39.000] } [13:13:39.003] assign_globals() ... [13:13:39.004] List of 5 [13:13:39.004] $ ...future.FUN :function (mode = "logical", length = 0L) [13:13:39.004] $ future.call.arguments :List of 1 [13:13:39.004] ..$ length: int 2 [13:13:39.004] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:39.004] $ ...future.elements_ii :List of 1 [13:13:39.004] ..$ a: chr "integer" [13:13:39.004] $ ...future.seeds_ii : NULL [13:13:39.004] $ ...future.globals.maxSize: NULL [13:13:39.004] - attr(*, "where")=List of 5 [13:13:39.004] ..$ ...future.FUN : [13:13:39.004] ..$ future.call.arguments : [13:13:39.004] ..$ ...future.elements_ii : [13:13:39.004] ..$ ...future.seeds_ii : [13:13:39.004] ..$ ...future.globals.maxSize: [13:13:39.004] - attr(*, "resolved")= logi FALSE [13:13:39.004] - attr(*, "total_size")= num 2240 [13:13:39.004] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:39.004] - attr(*, "already-done")= logi TRUE [13:13:39.009] - copied '...future.FUN' to environment [13:13:39.010] - copied 'future.call.arguments' to environment [13:13:39.010] - copied '...future.elements_ii' to environment [13:13:39.010] - copied '...future.seeds_ii' to environment [13:13:39.010] - copied '...future.globals.maxSize' to environment [13:13:39.010] assign_globals() ... done [13:13:39.011] plan(): Setting new future strategy stack: [13:13:39.011] List of future strategies: [13:13:39.011] 1. sequential: [13:13:39.011] - args: function (..., envir = parent.frame(), workers = "") [13:13:39.011] - tweaked: FALSE [13:13:39.011] - call: NULL [13:13:39.011] plan(): nbrOfWorkers() = 1 [13:13:39.012] plan(): Setting new future strategy stack: [13:13:39.013] List of future strategies: [13:13:39.013] 1. sequential: [13:13:39.013] - args: function (..., envir = parent.frame(), workers = "") [13:13:39.013] - tweaked: FALSE [13:13:39.013] - call: plan(strategy) [13:13:39.013] plan(): nbrOfWorkers() = 1 [13:13:39.013] SequentialFuture started (and completed) [13:13:39.014] - Launch lazy future ... done [13:13:39.014] run() for 'SequentialFuture' ... done [13:13:39.014] Created future: [13:13:39.014] SequentialFuture: [13:13:39.014] Label: 'future_lapply-1' [13:13:39.014] Expression: [13:13:39.014] { [13:13:39.014] do.call(function(...) { [13:13:39.014] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:39.014] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:39.014] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:39.014] on.exit(options(oopts), add = TRUE) [13:13:39.014] } [13:13:39.014] { [13:13:39.014] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:39.014] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:39.014] ...future.FUN(...future.X_jj, ...) [13:13:39.014] }) [13:13:39.014] } [13:13:39.014] }, args = future.call.arguments) [13:13:39.014] } [13:13:39.014] Lazy evaluation: FALSE [13:13:39.014] Asynchronous evaluation: FALSE [13:13:39.014] Local evaluation: TRUE [13:13:39.014] Environment: R_GlobalEnv [13:13:39.014] Capture standard output: TRUE [13:13:39.014] Capture condition classes: 'condition' (excluding 'nothing') [13:13:39.014] 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) [13:13:39.014] Packages: [13:13:39.014] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:39.014] Resolved: TRUE [13:13:39.014] Value: 56 bytes of class 'list' [13:13:39.014] Early signaling: FALSE [13:13:39.014] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:39.014] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:39.015] Chunk #1 of 4 ... DONE [13:13:39.016] Chunk #2 of 4 ... [13:13:39.016] - Finding globals in 'X' for chunk #2 ... [13:13:39.016] getGlobalsAndPackages() ... [13:13:39.016] Searching for globals... [13:13:39.016] [13:13:39.017] Searching for globals ... DONE [13:13:39.017] - globals: [0] [13:13:39.017] getGlobalsAndPackages() ... DONE [13:13:39.017] + additional globals found: [n=0] [13:13:39.017] + additional namespaces needed: [n=0] [13:13:39.017] - Finding globals in 'X' for chunk #2 ... DONE [13:13:39.018] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [13:13:39.018] - seeds: [13:13:39.018] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:39.018] getGlobalsAndPackages() ... [13:13:39.018] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:39.018] Resolving globals: FALSE [13:13:39.019] Tweak future expression to call with '...' arguments ... [13:13:39.019] { [13:13:39.019] do.call(function(...) { [13:13:39.019] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:39.019] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:39.019] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:39.019] on.exit(options(oopts), add = TRUE) [13:13:39.019] } [13:13:39.019] { [13:13:39.019] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:39.019] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:39.019] ...future.FUN(...future.X_jj, ...) [13:13:39.019] }) [13:13:39.019] } [13:13:39.019] }, args = future.call.arguments) [13:13:39.019] } [13:13:39.019] Tweak future expression to call with '...' arguments ... DONE [13:13:39.020] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:39.020] [13:13:39.020] getGlobalsAndPackages() ... DONE [13:13:39.020] run() for 'Future' ... [13:13:39.021] - state: 'created' [13:13:39.021] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:13:39.021] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:39.021] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:39.021] - Field: 'label' [13:13:39.022] - Field: 'local' [13:13:39.023] - Field: 'owner' [13:13:39.023] - Field: 'envir' [13:13:39.023] - Field: 'packages' [13:13:39.023] - Field: 'gc' [13:13:39.023] - Field: 'conditions' [13:13:39.024] - Field: 'expr' [13:13:39.024] - Field: 'uuid' [13:13:39.024] - Field: 'seed' [13:13:39.024] - Field: 'version' [13:13:39.024] - Field: 'result' [13:13:39.024] - Field: 'asynchronous' [13:13:39.025] - Field: 'calls' [13:13:39.025] - Field: 'globals' [13:13:39.025] - Field: 'stdout' [13:13:39.025] - Field: 'earlySignal' [13:13:39.025] - Field: 'lazy' [13:13:39.026] - Field: 'state' [13:13:39.026] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:39.026] - Launch lazy future ... [13:13:39.026] Packages needed by the future expression (n = 0): [13:13:39.026] Packages needed by future strategies (n = 0): [13:13:39.027] { [13:13:39.027] { [13:13:39.027] { [13:13:39.027] ...future.startTime <- base::Sys.time() [13:13:39.027] { [13:13:39.027] { [13:13:39.027] { [13:13:39.027] base::local({ [13:13:39.027] has_future <- base::requireNamespace("future", [13:13:39.027] quietly = TRUE) [13:13:39.027] if (has_future) { [13:13:39.027] ns <- base::getNamespace("future") [13:13:39.027] version <- ns[[".package"]][["version"]] [13:13:39.027] if (is.null(version)) [13:13:39.027] version <- utils::packageVersion("future") [13:13:39.027] } [13:13:39.027] else { [13:13:39.027] version <- NULL [13:13:39.027] } [13:13:39.027] if (!has_future || version < "1.8.0") { [13:13:39.027] info <- base::c(r_version = base::gsub("R version ", [13:13:39.027] "", base::R.version$version.string), [13:13:39.027] platform = base::sprintf("%s (%s-bit)", [13:13:39.027] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:39.027] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:39.027] "release", "version")], collapse = " "), [13:13:39.027] hostname = base::Sys.info()[["nodename"]]) [13:13:39.027] info <- base::sprintf("%s: %s", base::names(info), [13:13:39.027] info) [13:13:39.027] info <- base::paste(info, collapse = "; ") [13:13:39.027] if (!has_future) { [13:13:39.027] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:39.027] info) [13:13:39.027] } [13:13:39.027] else { [13:13:39.027] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:39.027] info, version) [13:13:39.027] } [13:13:39.027] base::stop(msg) [13:13:39.027] } [13:13:39.027] }) [13:13:39.027] } [13:13:39.027] options(future.plan = NULL) [13:13:39.027] Sys.unsetenv("R_FUTURE_PLAN") [13:13:39.027] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:39.027] } [13:13:39.027] ...future.workdir <- getwd() [13:13:39.027] } [13:13:39.027] ...future.oldOptions <- base::as.list(base::.Options) [13:13:39.027] ...future.oldEnvVars <- base::Sys.getenv() [13:13:39.027] } [13:13:39.027] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:39.027] future.globals.maxSize = 2097152000, future.globals.method = NULL, [13:13:39.027] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:39.027] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:39.027] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:39.027] future.stdout.windows.reencode = NULL, width = 80L) [13:13:39.027] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:39.027] base::names(...future.oldOptions)) [13:13:39.027] } [13:13:39.027] if (FALSE) { [13:13:39.027] } [13:13:39.027] else { [13:13:39.027] if (TRUE) { [13:13:39.027] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:39.027] open = "w") [13:13:39.027] } [13:13:39.027] else { [13:13:39.027] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:39.027] windows = "NUL", "/dev/null"), open = "w") [13:13:39.027] } [13:13:39.027] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:39.027] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:39.027] base::sink(type = "output", split = FALSE) [13:13:39.027] base::close(...future.stdout) [13:13:39.027] }, add = TRUE) [13:13:39.027] } [13:13:39.027] ...future.frame <- base::sys.nframe() [13:13:39.027] ...future.conditions <- base::list() [13:13:39.027] ...future.rng <- base::globalenv()$.Random.seed [13:13:39.027] if (FALSE) { [13:13:39.027] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:39.027] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:39.027] } [13:13:39.027] ...future.result <- base::tryCatch({ [13:13:39.027] base::withCallingHandlers({ [13:13:39.027] ...future.value <- base::withVisible(base::local({ [13:13:39.027] do.call(function(...) { [13:13:39.027] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:39.027] if (!identical(...future.globals.maxSize.org, [13:13:39.027] ...future.globals.maxSize)) { [13:13:39.027] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:39.027] on.exit(options(oopts), add = TRUE) [13:13:39.027] } [13:13:39.027] { [13:13:39.027] lapply(seq_along(...future.elements_ii), [13:13:39.027] FUN = function(jj) { [13:13:39.027] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:39.027] ...future.FUN(...future.X_jj, ...) [13:13:39.027] }) [13:13:39.027] } [13:13:39.027] }, args = future.call.arguments) [13:13:39.027] })) [13:13:39.027] future::FutureResult(value = ...future.value$value, [13:13:39.027] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:39.027] ...future.rng), globalenv = if (FALSE) [13:13:39.027] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:39.027] ...future.globalenv.names)) [13:13:39.027] else NULL, started = ...future.startTime, version = "1.8") [13:13:39.027] }, condition = base::local({ [13:13:39.027] c <- base::c [13:13:39.027] inherits <- base::inherits [13:13:39.027] invokeRestart <- base::invokeRestart [13:13:39.027] length <- base::length [13:13:39.027] list <- base::list [13:13:39.027] seq.int <- base::seq.int [13:13:39.027] signalCondition <- base::signalCondition [13:13:39.027] sys.calls <- base::sys.calls [13:13:39.027] `[[` <- base::`[[` [13:13:39.027] `+` <- base::`+` [13:13:39.027] `<<-` <- base::`<<-` [13:13:39.027] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:39.027] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:39.027] 3L)] [13:13:39.027] } [13:13:39.027] function(cond) { [13:13:39.027] is_error <- inherits(cond, "error") [13:13:39.027] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:39.027] NULL) [13:13:39.027] if (is_error) { [13:13:39.027] sessionInformation <- function() { [13:13:39.027] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:39.027] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:39.027] search = base::search(), system = base::Sys.info()) [13:13:39.027] } [13:13:39.027] ...future.conditions[[length(...future.conditions) + [13:13:39.027] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:39.027] cond$call), session = sessionInformation(), [13:13:39.027] timestamp = base::Sys.time(), signaled = 0L) [13:13:39.027] signalCondition(cond) [13:13:39.027] } [13:13:39.027] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:39.027] "immediateCondition"))) { [13:13:39.027] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:39.027] ...future.conditions[[length(...future.conditions) + [13:13:39.027] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:39.027] if (TRUE && !signal) { [13:13:39.027] muffleCondition <- function (cond, pattern = "^muffle") [13:13:39.027] { [13:13:39.027] inherits <- base::inherits [13:13:39.027] invokeRestart <- base::invokeRestart [13:13:39.027] is.null <- base::is.null [13:13:39.027] muffled <- FALSE [13:13:39.027] if (inherits(cond, "message")) { [13:13:39.027] muffled <- grepl(pattern, "muffleMessage") [13:13:39.027] if (muffled) [13:13:39.027] invokeRestart("muffleMessage") [13:13:39.027] } [13:13:39.027] else if (inherits(cond, "warning")) { [13:13:39.027] muffled <- grepl(pattern, "muffleWarning") [13:13:39.027] if (muffled) [13:13:39.027] invokeRestart("muffleWarning") [13:13:39.027] } [13:13:39.027] else if (inherits(cond, "condition")) { [13:13:39.027] if (!is.null(pattern)) { [13:13:39.027] computeRestarts <- base::computeRestarts [13:13:39.027] grepl <- base::grepl [13:13:39.027] restarts <- computeRestarts(cond) [13:13:39.027] for (restart in restarts) { [13:13:39.027] name <- restart$name [13:13:39.027] if (is.null(name)) [13:13:39.027] next [13:13:39.027] if (!grepl(pattern, name)) [13:13:39.027] next [13:13:39.027] invokeRestart(restart) [13:13:39.027] muffled <- TRUE [13:13:39.027] break [13:13:39.027] } [13:13:39.027] } [13:13:39.027] } [13:13:39.027] invisible(muffled) [13:13:39.027] } [13:13:39.027] muffleCondition(cond, pattern = "^muffle") [13:13:39.027] } [13:13:39.027] } [13:13:39.027] else { [13:13:39.027] if (TRUE) { [13:13:39.027] muffleCondition <- function (cond, pattern = "^muffle") [13:13:39.027] { [13:13:39.027] inherits <- base::inherits [13:13:39.027] invokeRestart <- base::invokeRestart [13:13:39.027] is.null <- base::is.null [13:13:39.027] muffled <- FALSE [13:13:39.027] if (inherits(cond, "message")) { [13:13:39.027] muffled <- grepl(pattern, "muffleMessage") [13:13:39.027] if (muffled) [13:13:39.027] invokeRestart("muffleMessage") [13:13:39.027] } [13:13:39.027] else if (inherits(cond, "warning")) { [13:13:39.027] muffled <- grepl(pattern, "muffleWarning") [13:13:39.027] if (muffled) [13:13:39.027] invokeRestart("muffleWarning") [13:13:39.027] } [13:13:39.027] else if (inherits(cond, "condition")) { [13:13:39.027] if (!is.null(pattern)) { [13:13:39.027] computeRestarts <- base::computeRestarts [13:13:39.027] grepl <- base::grepl [13:13:39.027] restarts <- computeRestarts(cond) [13:13:39.027] for (restart in restarts) { [13:13:39.027] name <- restart$name [13:13:39.027] if (is.null(name)) [13:13:39.027] next [13:13:39.027] if (!grepl(pattern, name)) [13:13:39.027] next [13:13:39.027] invokeRestart(restart) [13:13:39.027] muffled <- TRUE [13:13:39.027] break [13:13:39.027] } [13:13:39.027] } [13:13:39.027] } [13:13:39.027] invisible(muffled) [13:13:39.027] } [13:13:39.027] muffleCondition(cond, pattern = "^muffle") [13:13:39.027] } [13:13:39.027] } [13:13:39.027] } [13:13:39.027] })) [13:13:39.027] }, error = function(ex) { [13:13:39.027] base::structure(base::list(value = NULL, visible = NULL, [13:13:39.027] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:39.027] ...future.rng), started = ...future.startTime, [13:13:39.027] finished = Sys.time(), session_uuid = NA_character_, [13:13:39.027] version = "1.8"), class = "FutureResult") [13:13:39.027] }, finally = { [13:13:39.027] if (!identical(...future.workdir, getwd())) [13:13:39.027] setwd(...future.workdir) [13:13:39.027] { [13:13:39.027] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:39.027] ...future.oldOptions$nwarnings <- NULL [13:13:39.027] } [13:13:39.027] base::options(...future.oldOptions) [13:13:39.027] if (.Platform$OS.type == "windows") { [13:13:39.027] old_names <- names(...future.oldEnvVars) [13:13:39.027] envs <- base::Sys.getenv() [13:13:39.027] names <- names(envs) [13:13:39.027] common <- intersect(names, old_names) [13:13:39.027] added <- setdiff(names, old_names) [13:13:39.027] removed <- setdiff(old_names, names) [13:13:39.027] changed <- common[...future.oldEnvVars[common] != [13:13:39.027] envs[common]] [13:13:39.027] NAMES <- toupper(changed) [13:13:39.027] args <- list() [13:13:39.027] for (kk in seq_along(NAMES)) { [13:13:39.027] name <- changed[[kk]] [13:13:39.027] NAME <- NAMES[[kk]] [13:13:39.027] if (name != NAME && is.element(NAME, old_names)) [13:13:39.027] next [13:13:39.027] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:39.027] } [13:13:39.027] NAMES <- toupper(added) [13:13:39.027] for (kk in seq_along(NAMES)) { [13:13:39.027] name <- added[[kk]] [13:13:39.027] NAME <- NAMES[[kk]] [13:13:39.027] if (name != NAME && is.element(NAME, old_names)) [13:13:39.027] next [13:13:39.027] args[[name]] <- "" [13:13:39.027] } [13:13:39.027] NAMES <- toupper(removed) [13:13:39.027] for (kk in seq_along(NAMES)) { [13:13:39.027] name <- removed[[kk]] [13:13:39.027] NAME <- NAMES[[kk]] [13:13:39.027] if (name != NAME && is.element(NAME, old_names)) [13:13:39.027] next [13:13:39.027] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:39.027] } [13:13:39.027] if (length(args) > 0) [13:13:39.027] base::do.call(base::Sys.setenv, args = args) [13:13:39.027] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:39.027] } [13:13:39.027] else { [13:13:39.027] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:39.027] } [13:13:39.027] { [13:13:39.027] if (base::length(...future.futureOptionsAdded) > [13:13:39.027] 0L) { [13:13:39.027] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:39.027] base::names(opts) <- ...future.futureOptionsAdded [13:13:39.027] base::options(opts) [13:13:39.027] } [13:13:39.027] { [13:13:39.027] { [13:13:39.027] NULL [13:13:39.027] RNGkind("Mersenne-Twister") [13:13:39.027] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:39.027] inherits = FALSE) [13:13:39.027] } [13:13:39.027] options(future.plan = NULL) [13:13:39.027] if (is.na(NA_character_)) [13:13:39.027] Sys.unsetenv("R_FUTURE_PLAN") [13:13:39.027] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:39.027] future::plan(list(function (..., envir = parent.frame()) [13:13:39.027] { [13:13:39.027] future <- SequentialFuture(..., envir = envir) [13:13:39.027] if (!future$lazy) [13:13:39.027] future <- run(future) [13:13:39.027] invisible(future) [13:13:39.027] }), .cleanup = FALSE, .init = FALSE) [13:13:39.027] } [13:13:39.027] } [13:13:39.027] } [13:13:39.027] }) [13:13:39.027] if (TRUE) { [13:13:39.027] base::sink(type = "output", split = FALSE) [13:13:39.027] if (TRUE) { [13:13:39.027] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:39.027] } [13:13:39.027] else { [13:13:39.027] ...future.result["stdout"] <- base::list(NULL) [13:13:39.027] } [13:13:39.027] base::close(...future.stdout) [13:13:39.027] ...future.stdout <- NULL [13:13:39.027] } [13:13:39.027] ...future.result$conditions <- ...future.conditions [13:13:39.027] ...future.result$finished <- base::Sys.time() [13:13:39.027] ...future.result [13:13:39.027] } [13:13:39.031] assign_globals() ... [13:13:39.031] List of 5 [13:13:39.031] $ ...future.FUN :function (mode = "logical", length = 0L) [13:13:39.031] $ future.call.arguments :List of 1 [13:13:39.031] ..$ length: int 2 [13:13:39.031] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:39.031] $ ...future.elements_ii :List of 1 [13:13:39.031] ..$ b: chr "numeric" [13:13:39.031] $ ...future.seeds_ii : NULL [13:13:39.031] $ ...future.globals.maxSize: NULL [13:13:39.031] - attr(*, "where")=List of 5 [13:13:39.031] ..$ ...future.FUN : [13:13:39.031] ..$ future.call.arguments : [13:13:39.031] ..$ ...future.elements_ii : [13:13:39.031] ..$ ...future.seeds_ii : [13:13:39.031] ..$ ...future.globals.maxSize: [13:13:39.031] - attr(*, "resolved")= logi FALSE [13:13:39.031] - attr(*, "total_size")= num 2240 [13:13:39.031] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:39.031] - attr(*, "already-done")= logi TRUE [13:13:39.037] - copied '...future.FUN' to environment [13:13:39.037] - copied 'future.call.arguments' to environment [13:13:39.037] - copied '...future.elements_ii' to environment [13:13:39.037] - copied '...future.seeds_ii' to environment [13:13:39.037] - copied '...future.globals.maxSize' to environment [13:13:39.038] assign_globals() ... done [13:13:39.038] plan(): Setting new future strategy stack: [13:13:39.038] List of future strategies: [13:13:39.038] 1. sequential: [13:13:39.038] - args: function (..., envir = parent.frame(), workers = "") [13:13:39.038] - tweaked: FALSE [13:13:39.038] - call: NULL [13:13:39.039] plan(): nbrOfWorkers() = 1 [13:13:39.040] plan(): Setting new future strategy stack: [13:13:39.040] List of future strategies: [13:13:39.040] 1. sequential: [13:13:39.040] - args: function (..., envir = parent.frame(), workers = "") [13:13:39.040] - tweaked: FALSE [13:13:39.040] - call: plan(strategy) [13:13:39.041] plan(): nbrOfWorkers() = 1 [13:13:39.041] SequentialFuture started (and completed) [13:13:39.041] - Launch lazy future ... done [13:13:39.041] run() for 'SequentialFuture' ... done [13:13:39.041] Created future: [13:13:39.041] SequentialFuture: [13:13:39.041] Label: 'future_lapply-2' [13:13:39.041] Expression: [13:13:39.041] { [13:13:39.041] do.call(function(...) { [13:13:39.041] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:39.041] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:39.041] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:39.041] on.exit(options(oopts), add = TRUE) [13:13:39.041] } [13:13:39.041] { [13:13:39.041] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:39.041] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:39.041] ...future.FUN(...future.X_jj, ...) [13:13:39.041] }) [13:13:39.041] } [13:13:39.041] }, args = future.call.arguments) [13:13:39.041] } [13:13:39.041] Lazy evaluation: FALSE [13:13:39.041] Asynchronous evaluation: FALSE [13:13:39.041] Local evaluation: TRUE [13:13:39.041] Environment: R_GlobalEnv [13:13:39.041] Capture standard output: TRUE [13:13:39.041] Capture condition classes: 'condition' (excluding 'nothing') [13:13:39.041] 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) [13:13:39.041] Packages: [13:13:39.041] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:39.041] Resolved: TRUE [13:13:39.041] Value: 64 bytes of class 'list' [13:13:39.041] Early signaling: FALSE [13:13:39.041] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:39.041] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:39.043] Chunk #2 of 4 ... DONE [13:13:39.043] Chunk #3 of 4 ... [13:13:39.043] - Finding globals in 'X' for chunk #3 ... [13:13:39.043] getGlobalsAndPackages() ... [13:13:39.043] Searching for globals... [13:13:39.044] [13:13:39.044] Searching for globals ... DONE [13:13:39.044] - globals: [0] [13:13:39.044] getGlobalsAndPackages() ... DONE [13:13:39.044] + additional globals found: [n=0] [13:13:39.045] + additional namespaces needed: [n=0] [13:13:39.045] - Finding globals in 'X' for chunk #3 ... DONE [13:13:39.045] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [13:13:39.045] - seeds: [13:13:39.045] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:39.045] getGlobalsAndPackages() ... [13:13:39.045] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:39.046] Resolving globals: FALSE [13:13:39.046] Tweak future expression to call with '...' arguments ... [13:13:39.046] { [13:13:39.046] do.call(function(...) { [13:13:39.046] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:39.046] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:39.046] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:39.046] on.exit(options(oopts), add = TRUE) [13:13:39.046] } [13:13:39.046] { [13:13:39.046] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:39.046] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:39.046] ...future.FUN(...future.X_jj, ...) [13:13:39.046] }) [13:13:39.046] } [13:13:39.046] }, args = future.call.arguments) [13:13:39.046] } [13:13:39.046] Tweak future expression to call with '...' arguments ... DONE [13:13:39.047] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:39.047] [13:13:39.047] getGlobalsAndPackages() ... DONE [13:13:39.048] run() for 'Future' ... [13:13:39.048] - state: 'created' [13:13:39.048] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:13:39.048] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:39.049] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:39.049] - Field: 'label' [13:13:39.049] - Field: 'local' [13:13:39.049] - Field: 'owner' [13:13:39.049] - Field: 'envir' [13:13:39.050] - Field: 'packages' [13:13:39.050] - Field: 'gc' [13:13:39.051] - Field: 'conditions' [13:13:39.051] - Field: 'expr' [13:13:39.051] - Field: 'uuid' [13:13:39.051] - Field: 'seed' [13:13:39.051] - Field: 'version' [13:13:39.051] - Field: 'result' [13:13:39.052] - Field: 'asynchronous' [13:13:39.052] - Field: 'calls' [13:13:39.052] - Field: 'globals' [13:13:39.052] - Field: 'stdout' [13:13:39.052] - Field: 'earlySignal' [13:13:39.053] - Field: 'lazy' [13:13:39.053] - Field: 'state' [13:13:39.053] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:39.053] - Launch lazy future ... [13:13:39.053] Packages needed by the future expression (n = 0): [13:13:39.053] Packages needed by future strategies (n = 0): [13:13:39.054] { [13:13:39.054] { [13:13:39.054] { [13:13:39.054] ...future.startTime <- base::Sys.time() [13:13:39.054] { [13:13:39.054] { [13:13:39.054] { [13:13:39.054] base::local({ [13:13:39.054] has_future <- base::requireNamespace("future", [13:13:39.054] quietly = TRUE) [13:13:39.054] if (has_future) { [13:13:39.054] ns <- base::getNamespace("future") [13:13:39.054] version <- ns[[".package"]][["version"]] [13:13:39.054] if (is.null(version)) [13:13:39.054] version <- utils::packageVersion("future") [13:13:39.054] } [13:13:39.054] else { [13:13:39.054] version <- NULL [13:13:39.054] } [13:13:39.054] if (!has_future || version < "1.8.0") { [13:13:39.054] info <- base::c(r_version = base::gsub("R version ", [13:13:39.054] "", base::R.version$version.string), [13:13:39.054] platform = base::sprintf("%s (%s-bit)", [13:13:39.054] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:39.054] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:39.054] "release", "version")], collapse = " "), [13:13:39.054] hostname = base::Sys.info()[["nodename"]]) [13:13:39.054] info <- base::sprintf("%s: %s", base::names(info), [13:13:39.054] info) [13:13:39.054] info <- base::paste(info, collapse = "; ") [13:13:39.054] if (!has_future) { [13:13:39.054] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:39.054] info) [13:13:39.054] } [13:13:39.054] else { [13:13:39.054] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:39.054] info, version) [13:13:39.054] } [13:13:39.054] base::stop(msg) [13:13:39.054] } [13:13:39.054] }) [13:13:39.054] } [13:13:39.054] options(future.plan = NULL) [13:13:39.054] Sys.unsetenv("R_FUTURE_PLAN") [13:13:39.054] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:39.054] } [13:13:39.054] ...future.workdir <- getwd() [13:13:39.054] } [13:13:39.054] ...future.oldOptions <- base::as.list(base::.Options) [13:13:39.054] ...future.oldEnvVars <- base::Sys.getenv() [13:13:39.054] } [13:13:39.054] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:39.054] future.globals.maxSize = 2097152000, future.globals.method = NULL, [13:13:39.054] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:39.054] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:39.054] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:39.054] future.stdout.windows.reencode = NULL, width = 80L) [13:13:39.054] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:39.054] base::names(...future.oldOptions)) [13:13:39.054] } [13:13:39.054] if (FALSE) { [13:13:39.054] } [13:13:39.054] else { [13:13:39.054] if (TRUE) { [13:13:39.054] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:39.054] open = "w") [13:13:39.054] } [13:13:39.054] else { [13:13:39.054] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:39.054] windows = "NUL", "/dev/null"), open = "w") [13:13:39.054] } [13:13:39.054] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:39.054] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:39.054] base::sink(type = "output", split = FALSE) [13:13:39.054] base::close(...future.stdout) [13:13:39.054] }, add = TRUE) [13:13:39.054] } [13:13:39.054] ...future.frame <- base::sys.nframe() [13:13:39.054] ...future.conditions <- base::list() [13:13:39.054] ...future.rng <- base::globalenv()$.Random.seed [13:13:39.054] if (FALSE) { [13:13:39.054] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:39.054] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:39.054] } [13:13:39.054] ...future.result <- base::tryCatch({ [13:13:39.054] base::withCallingHandlers({ [13:13:39.054] ...future.value <- base::withVisible(base::local({ [13:13:39.054] do.call(function(...) { [13:13:39.054] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:39.054] if (!identical(...future.globals.maxSize.org, [13:13:39.054] ...future.globals.maxSize)) { [13:13:39.054] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:39.054] on.exit(options(oopts), add = TRUE) [13:13:39.054] } [13:13:39.054] { [13:13:39.054] lapply(seq_along(...future.elements_ii), [13:13:39.054] FUN = function(jj) { [13:13:39.054] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:39.054] ...future.FUN(...future.X_jj, ...) [13:13:39.054] }) [13:13:39.054] } [13:13:39.054] }, args = future.call.arguments) [13:13:39.054] })) [13:13:39.054] future::FutureResult(value = ...future.value$value, [13:13:39.054] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:39.054] ...future.rng), globalenv = if (FALSE) [13:13:39.054] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:39.054] ...future.globalenv.names)) [13:13:39.054] else NULL, started = ...future.startTime, version = "1.8") [13:13:39.054] }, condition = base::local({ [13:13:39.054] c <- base::c [13:13:39.054] inherits <- base::inherits [13:13:39.054] invokeRestart <- base::invokeRestart [13:13:39.054] length <- base::length [13:13:39.054] list <- base::list [13:13:39.054] seq.int <- base::seq.int [13:13:39.054] signalCondition <- base::signalCondition [13:13:39.054] sys.calls <- base::sys.calls [13:13:39.054] `[[` <- base::`[[` [13:13:39.054] `+` <- base::`+` [13:13:39.054] `<<-` <- base::`<<-` [13:13:39.054] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:39.054] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:39.054] 3L)] [13:13:39.054] } [13:13:39.054] function(cond) { [13:13:39.054] is_error <- inherits(cond, "error") [13:13:39.054] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:39.054] NULL) [13:13:39.054] if (is_error) { [13:13:39.054] sessionInformation <- function() { [13:13:39.054] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:39.054] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:39.054] search = base::search(), system = base::Sys.info()) [13:13:39.054] } [13:13:39.054] ...future.conditions[[length(...future.conditions) + [13:13:39.054] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:39.054] cond$call), session = sessionInformation(), [13:13:39.054] timestamp = base::Sys.time(), signaled = 0L) [13:13:39.054] signalCondition(cond) [13:13:39.054] } [13:13:39.054] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:39.054] "immediateCondition"))) { [13:13:39.054] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:39.054] ...future.conditions[[length(...future.conditions) + [13:13:39.054] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:39.054] if (TRUE && !signal) { [13:13:39.054] muffleCondition <- function (cond, pattern = "^muffle") [13:13:39.054] { [13:13:39.054] inherits <- base::inherits [13:13:39.054] invokeRestart <- base::invokeRestart [13:13:39.054] is.null <- base::is.null [13:13:39.054] muffled <- FALSE [13:13:39.054] if (inherits(cond, "message")) { [13:13:39.054] muffled <- grepl(pattern, "muffleMessage") [13:13:39.054] if (muffled) [13:13:39.054] invokeRestart("muffleMessage") [13:13:39.054] } [13:13:39.054] else if (inherits(cond, "warning")) { [13:13:39.054] muffled <- grepl(pattern, "muffleWarning") [13:13:39.054] if (muffled) [13:13:39.054] invokeRestart("muffleWarning") [13:13:39.054] } [13:13:39.054] else if (inherits(cond, "condition")) { [13:13:39.054] if (!is.null(pattern)) { [13:13:39.054] computeRestarts <- base::computeRestarts [13:13:39.054] grepl <- base::grepl [13:13:39.054] restarts <- computeRestarts(cond) [13:13:39.054] for (restart in restarts) { [13:13:39.054] name <- restart$name [13:13:39.054] if (is.null(name)) [13:13:39.054] next [13:13:39.054] if (!grepl(pattern, name)) [13:13:39.054] next [13:13:39.054] invokeRestart(restart) [13:13:39.054] muffled <- TRUE [13:13:39.054] break [13:13:39.054] } [13:13:39.054] } [13:13:39.054] } [13:13:39.054] invisible(muffled) [13:13:39.054] } [13:13:39.054] muffleCondition(cond, pattern = "^muffle") [13:13:39.054] } [13:13:39.054] } [13:13:39.054] else { [13:13:39.054] if (TRUE) { [13:13:39.054] muffleCondition <- function (cond, pattern = "^muffle") [13:13:39.054] { [13:13:39.054] inherits <- base::inherits [13:13:39.054] invokeRestart <- base::invokeRestart [13:13:39.054] is.null <- base::is.null [13:13:39.054] muffled <- FALSE [13:13:39.054] if (inherits(cond, "message")) { [13:13:39.054] muffled <- grepl(pattern, "muffleMessage") [13:13:39.054] if (muffled) [13:13:39.054] invokeRestart("muffleMessage") [13:13:39.054] } [13:13:39.054] else if (inherits(cond, "warning")) { [13:13:39.054] muffled <- grepl(pattern, "muffleWarning") [13:13:39.054] if (muffled) [13:13:39.054] invokeRestart("muffleWarning") [13:13:39.054] } [13:13:39.054] else if (inherits(cond, "condition")) { [13:13:39.054] if (!is.null(pattern)) { [13:13:39.054] computeRestarts <- base::computeRestarts [13:13:39.054] grepl <- base::grepl [13:13:39.054] restarts <- computeRestarts(cond) [13:13:39.054] for (restart in restarts) { [13:13:39.054] name <- restart$name [13:13:39.054] if (is.null(name)) [13:13:39.054] next [13:13:39.054] if (!grepl(pattern, name)) [13:13:39.054] next [13:13:39.054] invokeRestart(restart) [13:13:39.054] muffled <- TRUE [13:13:39.054] break [13:13:39.054] } [13:13:39.054] } [13:13:39.054] } [13:13:39.054] invisible(muffled) [13:13:39.054] } [13:13:39.054] muffleCondition(cond, pattern = "^muffle") [13:13:39.054] } [13:13:39.054] } [13:13:39.054] } [13:13:39.054] })) [13:13:39.054] }, error = function(ex) { [13:13:39.054] base::structure(base::list(value = NULL, visible = NULL, [13:13:39.054] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:39.054] ...future.rng), started = ...future.startTime, [13:13:39.054] finished = Sys.time(), session_uuid = NA_character_, [13:13:39.054] version = "1.8"), class = "FutureResult") [13:13:39.054] }, finally = { [13:13:39.054] if (!identical(...future.workdir, getwd())) [13:13:39.054] setwd(...future.workdir) [13:13:39.054] { [13:13:39.054] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:39.054] ...future.oldOptions$nwarnings <- NULL [13:13:39.054] } [13:13:39.054] base::options(...future.oldOptions) [13:13:39.054] if (.Platform$OS.type == "windows") { [13:13:39.054] old_names <- names(...future.oldEnvVars) [13:13:39.054] envs <- base::Sys.getenv() [13:13:39.054] names <- names(envs) [13:13:39.054] common <- intersect(names, old_names) [13:13:39.054] added <- setdiff(names, old_names) [13:13:39.054] removed <- setdiff(old_names, names) [13:13:39.054] changed <- common[...future.oldEnvVars[common] != [13:13:39.054] envs[common]] [13:13:39.054] NAMES <- toupper(changed) [13:13:39.054] args <- list() [13:13:39.054] for (kk in seq_along(NAMES)) { [13:13:39.054] name <- changed[[kk]] [13:13:39.054] NAME <- NAMES[[kk]] [13:13:39.054] if (name != NAME && is.element(NAME, old_names)) [13:13:39.054] next [13:13:39.054] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:39.054] } [13:13:39.054] NAMES <- toupper(added) [13:13:39.054] for (kk in seq_along(NAMES)) { [13:13:39.054] name <- added[[kk]] [13:13:39.054] NAME <- NAMES[[kk]] [13:13:39.054] if (name != NAME && is.element(NAME, old_names)) [13:13:39.054] next [13:13:39.054] args[[name]] <- "" [13:13:39.054] } [13:13:39.054] NAMES <- toupper(removed) [13:13:39.054] for (kk in seq_along(NAMES)) { [13:13:39.054] name <- removed[[kk]] [13:13:39.054] NAME <- NAMES[[kk]] [13:13:39.054] if (name != NAME && is.element(NAME, old_names)) [13:13:39.054] next [13:13:39.054] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:39.054] } [13:13:39.054] if (length(args) > 0) [13:13:39.054] base::do.call(base::Sys.setenv, args = args) [13:13:39.054] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:39.054] } [13:13:39.054] else { [13:13:39.054] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:39.054] } [13:13:39.054] { [13:13:39.054] if (base::length(...future.futureOptionsAdded) > [13:13:39.054] 0L) { [13:13:39.054] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:39.054] base::names(opts) <- ...future.futureOptionsAdded [13:13:39.054] base::options(opts) [13:13:39.054] } [13:13:39.054] { [13:13:39.054] { [13:13:39.054] NULL [13:13:39.054] RNGkind("Mersenne-Twister") [13:13:39.054] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:39.054] inherits = FALSE) [13:13:39.054] } [13:13:39.054] options(future.plan = NULL) [13:13:39.054] if (is.na(NA_character_)) [13:13:39.054] Sys.unsetenv("R_FUTURE_PLAN") [13:13:39.054] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:39.054] future::plan(list(function (..., envir = parent.frame()) [13:13:39.054] { [13:13:39.054] future <- SequentialFuture(..., envir = envir) [13:13:39.054] if (!future$lazy) [13:13:39.054] future <- run(future) [13:13:39.054] invisible(future) [13:13:39.054] }), .cleanup = FALSE, .init = FALSE) [13:13:39.054] } [13:13:39.054] } [13:13:39.054] } [13:13:39.054] }) [13:13:39.054] if (TRUE) { [13:13:39.054] base::sink(type = "output", split = FALSE) [13:13:39.054] if (TRUE) { [13:13:39.054] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:39.054] } [13:13:39.054] else { [13:13:39.054] ...future.result["stdout"] <- base::list(NULL) [13:13:39.054] } [13:13:39.054] base::close(...future.stdout) [13:13:39.054] ...future.stdout <- NULL [13:13:39.054] } [13:13:39.054] ...future.result$conditions <- ...future.conditions [13:13:39.054] ...future.result$finished <- base::Sys.time() [13:13:39.054] ...future.result [13:13:39.054] } [13:13:39.058] assign_globals() ... [13:13:39.058] List of 5 [13:13:39.058] $ ...future.FUN :function (mode = "logical", length = 0L) [13:13:39.058] $ future.call.arguments :List of 1 [13:13:39.058] ..$ length: int 2 [13:13:39.058] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:39.058] $ ...future.elements_ii :List of 1 [13:13:39.058] ..$ c: chr "character" [13:13:39.058] $ ...future.seeds_ii : NULL [13:13:39.058] $ ...future.globals.maxSize: NULL [13:13:39.058] - attr(*, "where")=List of 5 [13:13:39.058] ..$ ...future.FUN : [13:13:39.058] ..$ future.call.arguments : [13:13:39.058] ..$ ...future.elements_ii : [13:13:39.058] ..$ ...future.seeds_ii : [13:13:39.058] ..$ ...future.globals.maxSize: [13:13:39.058] - attr(*, "resolved")= logi FALSE [13:13:39.058] - attr(*, "total_size")= num 2240 [13:13:39.058] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:39.058] - attr(*, "already-done")= logi TRUE [13:13:39.064] - copied '...future.FUN' to environment [13:13:39.064] - copied 'future.call.arguments' to environment [13:13:39.064] - copied '...future.elements_ii' to environment [13:13:39.064] - copied '...future.seeds_ii' to environment [13:13:39.065] - copied '...future.globals.maxSize' to environment [13:13:39.065] assign_globals() ... done [13:13:39.065] plan(): Setting new future strategy stack: [13:13:39.065] List of future strategies: [13:13:39.065] 1. sequential: [13:13:39.065] - args: function (..., envir = parent.frame(), workers = "") [13:13:39.065] - tweaked: FALSE [13:13:39.065] - call: NULL [13:13:39.066] plan(): nbrOfWorkers() = 1 [13:13:39.067] plan(): Setting new future strategy stack: [13:13:39.067] List of future strategies: [13:13:39.067] 1. sequential: [13:13:39.067] - args: function (..., envir = parent.frame(), workers = "") [13:13:39.067] - tweaked: FALSE [13:13:39.067] - call: plan(strategy) [13:13:39.068] plan(): nbrOfWorkers() = 1 [13:13:39.068] SequentialFuture started (and completed) [13:13:39.068] - Launch lazy future ... done [13:13:39.068] run() for 'SequentialFuture' ... done [13:13:39.069] Created future: [13:13:39.069] SequentialFuture: [13:13:39.069] Label: 'future_lapply-3' [13:13:39.069] Expression: [13:13:39.069] { [13:13:39.069] do.call(function(...) { [13:13:39.069] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:39.069] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:39.069] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:39.069] on.exit(options(oopts), add = TRUE) [13:13:39.069] } [13:13:39.069] { [13:13:39.069] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:39.069] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:39.069] ...future.FUN(...future.X_jj, ...) [13:13:39.069] }) [13:13:39.069] } [13:13:39.069] }, args = future.call.arguments) [13:13:39.069] } [13:13:39.069] Lazy evaluation: FALSE [13:13:39.069] Asynchronous evaluation: FALSE [13:13:39.069] Local evaluation: TRUE [13:13:39.069] Environment: R_GlobalEnv [13:13:39.069] Capture standard output: TRUE [13:13:39.069] Capture condition classes: 'condition' (excluding 'nothing') [13:13:39.069] 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) [13:13:39.069] Packages: [13:13:39.069] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:39.069] Resolved: TRUE [13:13:39.069] Value: 120 bytes of class 'list' [13:13:39.069] Early signaling: FALSE [13:13:39.069] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:39.069] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:39.070] Chunk #3 of 4 ... DONE [13:13:39.070] Chunk #4 of 4 ... [13:13:39.070] - Finding globals in 'X' for chunk #4 ... [13:13:39.071] getGlobalsAndPackages() ... [13:13:39.071] Searching for globals... [13:13:39.071] [13:13:39.071] Searching for globals ... DONE [13:13:39.071] - globals: [0] [13:13:39.072] getGlobalsAndPackages() ... DONE [13:13:39.072] + additional globals found: [n=0] [13:13:39.072] + additional namespaces needed: [n=0] [13:13:39.072] - Finding globals in 'X' for chunk #4 ... DONE [13:13:39.072] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [13:13:39.072] - seeds: [13:13:39.072] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:39.073] getGlobalsAndPackages() ... [13:13:39.073] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:39.073] Resolving globals: FALSE [13:13:39.073] Tweak future expression to call with '...' arguments ... [13:13:39.073] { [13:13:39.073] do.call(function(...) { [13:13:39.073] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:39.073] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:39.073] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:39.073] on.exit(options(oopts), add = TRUE) [13:13:39.073] } [13:13:39.073] { [13:13:39.073] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:39.073] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:39.073] ...future.FUN(...future.X_jj, ...) [13:13:39.073] }) [13:13:39.073] } [13:13:39.073] }, args = future.call.arguments) [13:13:39.073] } [13:13:39.074] Tweak future expression to call with '...' arguments ... DONE [13:13:39.074] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:39.074] [13:13:39.075] getGlobalsAndPackages() ... DONE [13:13:39.075] run() for 'Future' ... [13:13:39.075] - state: 'created' [13:13:39.075] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:13:39.076] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:39.076] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:39.076] - Field: 'label' [13:13:39.076] - Field: 'local' [13:13:39.076] - Field: 'owner' [13:13:39.077] - Field: 'envir' [13:13:39.077] - Field: 'packages' [13:13:39.077] - Field: 'gc' [13:13:39.078] - Field: 'conditions' [13:13:39.078] - Field: 'expr' [13:13:39.078] - Field: 'uuid' [13:13:39.079] - Field: 'seed' [13:13:39.079] - Field: 'version' [13:13:39.079] - Field: 'result' [13:13:39.079] - Field: 'asynchronous' [13:13:39.079] - Field: 'calls' [13:13:39.079] - Field: 'globals' [13:13:39.080] - Field: 'stdout' [13:13:39.080] - Field: 'earlySignal' [13:13:39.080] - Field: 'lazy' [13:13:39.080] - Field: 'state' [13:13:39.080] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:39.080] - Launch lazy future ... [13:13:39.081] Packages needed by the future expression (n = 0): [13:13:39.081] Packages needed by future strategies (n = 0): [13:13:39.081] { [13:13:39.081] { [13:13:39.081] { [13:13:39.081] ...future.startTime <- base::Sys.time() [13:13:39.081] { [13:13:39.081] { [13:13:39.081] { [13:13:39.081] base::local({ [13:13:39.081] has_future <- base::requireNamespace("future", [13:13:39.081] quietly = TRUE) [13:13:39.081] if (has_future) { [13:13:39.081] ns <- base::getNamespace("future") [13:13:39.081] version <- ns[[".package"]][["version"]] [13:13:39.081] if (is.null(version)) [13:13:39.081] version <- utils::packageVersion("future") [13:13:39.081] } [13:13:39.081] else { [13:13:39.081] version <- NULL [13:13:39.081] } [13:13:39.081] if (!has_future || version < "1.8.0") { [13:13:39.081] info <- base::c(r_version = base::gsub("R version ", [13:13:39.081] "", base::R.version$version.string), [13:13:39.081] platform = base::sprintf("%s (%s-bit)", [13:13:39.081] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:39.081] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:39.081] "release", "version")], collapse = " "), [13:13:39.081] hostname = base::Sys.info()[["nodename"]]) [13:13:39.081] info <- base::sprintf("%s: %s", base::names(info), [13:13:39.081] info) [13:13:39.081] info <- base::paste(info, collapse = "; ") [13:13:39.081] if (!has_future) { [13:13:39.081] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:39.081] info) [13:13:39.081] } [13:13:39.081] else { [13:13:39.081] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:39.081] info, version) [13:13:39.081] } [13:13:39.081] base::stop(msg) [13:13:39.081] } [13:13:39.081] }) [13:13:39.081] } [13:13:39.081] options(future.plan = NULL) [13:13:39.081] Sys.unsetenv("R_FUTURE_PLAN") [13:13:39.081] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:39.081] } [13:13:39.081] ...future.workdir <- getwd() [13:13:39.081] } [13:13:39.081] ...future.oldOptions <- base::as.list(base::.Options) [13:13:39.081] ...future.oldEnvVars <- base::Sys.getenv() [13:13:39.081] } [13:13:39.081] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:39.081] future.globals.maxSize = 2097152000, future.globals.method = NULL, [13:13:39.081] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:39.081] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:39.081] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:39.081] future.stdout.windows.reencode = NULL, width = 80L) [13:13:39.081] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:39.081] base::names(...future.oldOptions)) [13:13:39.081] } [13:13:39.081] if (FALSE) { [13:13:39.081] } [13:13:39.081] else { [13:13:39.081] if (TRUE) { [13:13:39.081] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:39.081] open = "w") [13:13:39.081] } [13:13:39.081] else { [13:13:39.081] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:39.081] windows = "NUL", "/dev/null"), open = "w") [13:13:39.081] } [13:13:39.081] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:39.081] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:39.081] base::sink(type = "output", split = FALSE) [13:13:39.081] base::close(...future.stdout) [13:13:39.081] }, add = TRUE) [13:13:39.081] } [13:13:39.081] ...future.frame <- base::sys.nframe() [13:13:39.081] ...future.conditions <- base::list() [13:13:39.081] ...future.rng <- base::globalenv()$.Random.seed [13:13:39.081] if (FALSE) { [13:13:39.081] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:39.081] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:39.081] } [13:13:39.081] ...future.result <- base::tryCatch({ [13:13:39.081] base::withCallingHandlers({ [13:13:39.081] ...future.value <- base::withVisible(base::local({ [13:13:39.081] do.call(function(...) { [13:13:39.081] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:39.081] if (!identical(...future.globals.maxSize.org, [13:13:39.081] ...future.globals.maxSize)) { [13:13:39.081] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:39.081] on.exit(options(oopts), add = TRUE) [13:13:39.081] } [13:13:39.081] { [13:13:39.081] lapply(seq_along(...future.elements_ii), [13:13:39.081] FUN = function(jj) { [13:13:39.081] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:39.081] ...future.FUN(...future.X_jj, ...) [13:13:39.081] }) [13:13:39.081] } [13:13:39.081] }, args = future.call.arguments) [13:13:39.081] })) [13:13:39.081] future::FutureResult(value = ...future.value$value, [13:13:39.081] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:39.081] ...future.rng), globalenv = if (FALSE) [13:13:39.081] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:39.081] ...future.globalenv.names)) [13:13:39.081] else NULL, started = ...future.startTime, version = "1.8") [13:13:39.081] }, condition = base::local({ [13:13:39.081] c <- base::c [13:13:39.081] inherits <- base::inherits [13:13:39.081] invokeRestart <- base::invokeRestart [13:13:39.081] length <- base::length [13:13:39.081] list <- base::list [13:13:39.081] seq.int <- base::seq.int [13:13:39.081] signalCondition <- base::signalCondition [13:13:39.081] sys.calls <- base::sys.calls [13:13:39.081] `[[` <- base::`[[` [13:13:39.081] `+` <- base::`+` [13:13:39.081] `<<-` <- base::`<<-` [13:13:39.081] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:39.081] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:39.081] 3L)] [13:13:39.081] } [13:13:39.081] function(cond) { [13:13:39.081] is_error <- inherits(cond, "error") [13:13:39.081] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:39.081] NULL) [13:13:39.081] if (is_error) { [13:13:39.081] sessionInformation <- function() { [13:13:39.081] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:39.081] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:39.081] search = base::search(), system = base::Sys.info()) [13:13:39.081] } [13:13:39.081] ...future.conditions[[length(...future.conditions) + [13:13:39.081] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:39.081] cond$call), session = sessionInformation(), [13:13:39.081] timestamp = base::Sys.time(), signaled = 0L) [13:13:39.081] signalCondition(cond) [13:13:39.081] } [13:13:39.081] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:39.081] "immediateCondition"))) { [13:13:39.081] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:39.081] ...future.conditions[[length(...future.conditions) + [13:13:39.081] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:39.081] if (TRUE && !signal) { [13:13:39.081] muffleCondition <- function (cond, pattern = "^muffle") [13:13:39.081] { [13:13:39.081] inherits <- base::inherits [13:13:39.081] invokeRestart <- base::invokeRestart [13:13:39.081] is.null <- base::is.null [13:13:39.081] muffled <- FALSE [13:13:39.081] if (inherits(cond, "message")) { [13:13:39.081] muffled <- grepl(pattern, "muffleMessage") [13:13:39.081] if (muffled) [13:13:39.081] invokeRestart("muffleMessage") [13:13:39.081] } [13:13:39.081] else if (inherits(cond, "warning")) { [13:13:39.081] muffled <- grepl(pattern, "muffleWarning") [13:13:39.081] if (muffled) [13:13:39.081] invokeRestart("muffleWarning") [13:13:39.081] } [13:13:39.081] else if (inherits(cond, "condition")) { [13:13:39.081] if (!is.null(pattern)) { [13:13:39.081] computeRestarts <- base::computeRestarts [13:13:39.081] grepl <- base::grepl [13:13:39.081] restarts <- computeRestarts(cond) [13:13:39.081] for (restart in restarts) { [13:13:39.081] name <- restart$name [13:13:39.081] if (is.null(name)) [13:13:39.081] next [13:13:39.081] if (!grepl(pattern, name)) [13:13:39.081] next [13:13:39.081] invokeRestart(restart) [13:13:39.081] muffled <- TRUE [13:13:39.081] break [13:13:39.081] } [13:13:39.081] } [13:13:39.081] } [13:13:39.081] invisible(muffled) [13:13:39.081] } [13:13:39.081] muffleCondition(cond, pattern = "^muffle") [13:13:39.081] } [13:13:39.081] } [13:13:39.081] else { [13:13:39.081] if (TRUE) { [13:13:39.081] muffleCondition <- function (cond, pattern = "^muffle") [13:13:39.081] { [13:13:39.081] inherits <- base::inherits [13:13:39.081] invokeRestart <- base::invokeRestart [13:13:39.081] is.null <- base::is.null [13:13:39.081] muffled <- FALSE [13:13:39.081] if (inherits(cond, "message")) { [13:13:39.081] muffled <- grepl(pattern, "muffleMessage") [13:13:39.081] if (muffled) [13:13:39.081] invokeRestart("muffleMessage") [13:13:39.081] } [13:13:39.081] else if (inherits(cond, "warning")) { [13:13:39.081] muffled <- grepl(pattern, "muffleWarning") [13:13:39.081] if (muffled) [13:13:39.081] invokeRestart("muffleWarning") [13:13:39.081] } [13:13:39.081] else if (inherits(cond, "condition")) { [13:13:39.081] if (!is.null(pattern)) { [13:13:39.081] computeRestarts <- base::computeRestarts [13:13:39.081] grepl <- base::grepl [13:13:39.081] restarts <- computeRestarts(cond) [13:13:39.081] for (restart in restarts) { [13:13:39.081] name <- restart$name [13:13:39.081] if (is.null(name)) [13:13:39.081] next [13:13:39.081] if (!grepl(pattern, name)) [13:13:39.081] next [13:13:39.081] invokeRestart(restart) [13:13:39.081] muffled <- TRUE [13:13:39.081] break [13:13:39.081] } [13:13:39.081] } [13:13:39.081] } [13:13:39.081] invisible(muffled) [13:13:39.081] } [13:13:39.081] muffleCondition(cond, pattern = "^muffle") [13:13:39.081] } [13:13:39.081] } [13:13:39.081] } [13:13:39.081] })) [13:13:39.081] }, error = function(ex) { [13:13:39.081] base::structure(base::list(value = NULL, visible = NULL, [13:13:39.081] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:39.081] ...future.rng), started = ...future.startTime, [13:13:39.081] finished = Sys.time(), session_uuid = NA_character_, [13:13:39.081] version = "1.8"), class = "FutureResult") [13:13:39.081] }, finally = { [13:13:39.081] if (!identical(...future.workdir, getwd())) [13:13:39.081] setwd(...future.workdir) [13:13:39.081] { [13:13:39.081] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:39.081] ...future.oldOptions$nwarnings <- NULL [13:13:39.081] } [13:13:39.081] base::options(...future.oldOptions) [13:13:39.081] if (.Platform$OS.type == "windows") { [13:13:39.081] old_names <- names(...future.oldEnvVars) [13:13:39.081] envs <- base::Sys.getenv() [13:13:39.081] names <- names(envs) [13:13:39.081] common <- intersect(names, old_names) [13:13:39.081] added <- setdiff(names, old_names) [13:13:39.081] removed <- setdiff(old_names, names) [13:13:39.081] changed <- common[...future.oldEnvVars[common] != [13:13:39.081] envs[common]] [13:13:39.081] NAMES <- toupper(changed) [13:13:39.081] args <- list() [13:13:39.081] for (kk in seq_along(NAMES)) { [13:13:39.081] name <- changed[[kk]] [13:13:39.081] NAME <- NAMES[[kk]] [13:13:39.081] if (name != NAME && is.element(NAME, old_names)) [13:13:39.081] next [13:13:39.081] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:39.081] } [13:13:39.081] NAMES <- toupper(added) [13:13:39.081] for (kk in seq_along(NAMES)) { [13:13:39.081] name <- added[[kk]] [13:13:39.081] NAME <- NAMES[[kk]] [13:13:39.081] if (name != NAME && is.element(NAME, old_names)) [13:13:39.081] next [13:13:39.081] args[[name]] <- "" [13:13:39.081] } [13:13:39.081] NAMES <- toupper(removed) [13:13:39.081] for (kk in seq_along(NAMES)) { [13:13:39.081] name <- removed[[kk]] [13:13:39.081] NAME <- NAMES[[kk]] [13:13:39.081] if (name != NAME && is.element(NAME, old_names)) [13:13:39.081] next [13:13:39.081] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:39.081] } [13:13:39.081] if (length(args) > 0) [13:13:39.081] base::do.call(base::Sys.setenv, args = args) [13:13:39.081] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:39.081] } [13:13:39.081] else { [13:13:39.081] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:39.081] } [13:13:39.081] { [13:13:39.081] if (base::length(...future.futureOptionsAdded) > [13:13:39.081] 0L) { [13:13:39.081] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:39.081] base::names(opts) <- ...future.futureOptionsAdded [13:13:39.081] base::options(opts) [13:13:39.081] } [13:13:39.081] { [13:13:39.081] { [13:13:39.081] NULL [13:13:39.081] RNGkind("Mersenne-Twister") [13:13:39.081] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:39.081] inherits = FALSE) [13:13:39.081] } [13:13:39.081] options(future.plan = NULL) [13:13:39.081] if (is.na(NA_character_)) [13:13:39.081] Sys.unsetenv("R_FUTURE_PLAN") [13:13:39.081] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:39.081] future::plan(list(function (..., envir = parent.frame()) [13:13:39.081] { [13:13:39.081] future <- SequentialFuture(..., envir = envir) [13:13:39.081] if (!future$lazy) [13:13:39.081] future <- run(future) [13:13:39.081] invisible(future) [13:13:39.081] }), .cleanup = FALSE, .init = FALSE) [13:13:39.081] } [13:13:39.081] } [13:13:39.081] } [13:13:39.081] }) [13:13:39.081] if (TRUE) { [13:13:39.081] base::sink(type = "output", split = FALSE) [13:13:39.081] if (TRUE) { [13:13:39.081] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:39.081] } [13:13:39.081] else { [13:13:39.081] ...future.result["stdout"] <- base::list(NULL) [13:13:39.081] } [13:13:39.081] base::close(...future.stdout) [13:13:39.081] ...future.stdout <- NULL [13:13:39.081] } [13:13:39.081] ...future.result$conditions <- ...future.conditions [13:13:39.081] ...future.result$finished <- base::Sys.time() [13:13:39.081] ...future.result [13:13:39.081] } [13:13:39.085] assign_globals() ... [13:13:39.086] List of 5 [13:13:39.086] $ ...future.FUN :function (mode = "logical", length = 0L) [13:13:39.086] $ future.call.arguments :List of 1 [13:13:39.086] ..$ length: int 2 [13:13:39.086] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:39.086] $ ...future.elements_ii :List of 1 [13:13:39.086] ..$ c: chr "list" [13:13:39.086] $ ...future.seeds_ii : NULL [13:13:39.086] $ ...future.globals.maxSize: NULL [13:13:39.086] - attr(*, "where")=List of 5 [13:13:39.086] ..$ ...future.FUN : [13:13:39.086] ..$ future.call.arguments : [13:13:39.086] ..$ ...future.elements_ii : [13:13:39.086] ..$ ...future.seeds_ii : [13:13:39.086] ..$ ...future.globals.maxSize: [13:13:39.086] - attr(*, "resolved")= logi FALSE [13:13:39.086] - attr(*, "total_size")= num 2240 [13:13:39.086] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:39.086] - attr(*, "already-done")= logi TRUE [13:13:39.091] - copied '...future.FUN' to environment [13:13:39.092] - copied 'future.call.arguments' to environment [13:13:39.092] - copied '...future.elements_ii' to environment [13:13:39.092] - copied '...future.seeds_ii' to environment [13:13:39.092] - copied '...future.globals.maxSize' to environment [13:13:39.092] assign_globals() ... done [13:13:39.093] plan(): Setting new future strategy stack: [13:13:39.093] List of future strategies: [13:13:39.093] 1. sequential: [13:13:39.093] - args: function (..., envir = parent.frame(), workers = "") [13:13:39.093] - tweaked: FALSE [13:13:39.093] - call: NULL [13:13:39.093] plan(): nbrOfWorkers() = 1 [13:13:39.094] plan(): Setting new future strategy stack: [13:13:39.095] List of future strategies: [13:13:39.095] 1. sequential: [13:13:39.095] - args: function (..., envir = parent.frame(), workers = "") [13:13:39.095] - tweaked: FALSE [13:13:39.095] - call: plan(strategy) [13:13:39.095] plan(): nbrOfWorkers() = 1 [13:13:39.095] SequentialFuture started (and completed) [13:13:39.096] - Launch lazy future ... done [13:13:39.096] run() for 'SequentialFuture' ... done [13:13:39.096] Created future: [13:13:39.096] SequentialFuture: [13:13:39.096] Label: 'future_lapply-4' [13:13:39.096] Expression: [13:13:39.096] { [13:13:39.096] do.call(function(...) { [13:13:39.096] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:39.096] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:39.096] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:39.096] on.exit(options(oopts), add = TRUE) [13:13:39.096] } [13:13:39.096] { [13:13:39.096] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:39.096] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:39.096] ...future.FUN(...future.X_jj, ...) [13:13:39.096] }) [13:13:39.096] } [13:13:39.096] }, args = future.call.arguments) [13:13:39.096] } [13:13:39.096] Lazy evaluation: FALSE [13:13:39.096] Asynchronous evaluation: FALSE [13:13:39.096] Local evaluation: TRUE [13:13:39.096] Environment: R_GlobalEnv [13:13:39.096] Capture standard output: TRUE [13:13:39.096] Capture condition classes: 'condition' (excluding 'nothing') [13:13:39.096] 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) [13:13:39.096] Packages: [13:13:39.096] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:39.096] Resolved: TRUE [13:13:39.096] Value: 0 bytes of class 'list' [13:13:39.096] Early signaling: FALSE [13:13:39.096] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:39.096] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:39.097] Chunk #4 of 4 ... DONE [13:13:39.098] Launching 4 futures (chunks) ... DONE [13:13:39.098] Resolving 4 futures (chunks) ... [13:13:39.098] resolve() on list ... [13:13:39.098] recursive: 0 [13:13:39.098] length: 4 [13:13:39.098] [13:13:39.099] resolved() for 'SequentialFuture' ... [13:13:39.099] - state: 'finished' [13:13:39.099] - run: TRUE [13:13:39.099] - result: 'FutureResult' [13:13:39.099] resolved() for 'SequentialFuture' ... done [13:13:39.100] Future #1 [13:13:39.100] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:39.100] - nx: 4 [13:13:39.100] - relay: TRUE [13:13:39.100] - stdout: TRUE [13:13:39.100] - signal: TRUE [13:13:39.101] - resignal: FALSE [13:13:39.101] - force: TRUE [13:13:39.101] - relayed: [n=4] FALSE, FALSE, FALSE, FALSE [13:13:39.101] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [13:13:39.101] - until=1 [13:13:39.101] - relaying element #1 [13:13:39.102] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [13:13:39.102] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [13:13:39.102] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:39.102] length: 3 (resolved future 1) [13:13:39.102] resolved() for 'SequentialFuture' ... [13:13:39.102] - state: 'finished' [13:13:39.103] - run: TRUE [13:13:39.103] - result: 'FutureResult' [13:13:39.103] resolved() for 'SequentialFuture' ... done [13:13:39.103] Future #2 [13:13:39.103] signalConditionsASAP(SequentialFuture, pos=2) ... [13:13:39.104] - nx: 4 [13:13:39.104] - relay: TRUE [13:13:39.104] - stdout: TRUE [13:13:39.104] - signal: TRUE [13:13:39.104] - resignal: FALSE [13:13:39.104] - force: TRUE [13:13:39.104] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [13:13:39.127] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [13:13:39.128] - until=2 [13:13:39.128] - relaying element #2 [13:13:39.128] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [13:13:39.128] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [13:13:39.128] signalConditionsASAP(SequentialFuture, pos=2) ... done [13:13:39.129] length: 2 (resolved future 2) [13:13:39.129] resolved() for 'SequentialFuture' ... [13:13:39.129] - state: 'finished' [13:13:39.129] - run: TRUE [13:13:39.129] - result: 'FutureResult' [13:13:39.130] resolved() for 'SequentialFuture' ... done [13:13:39.130] Future #3 [13:13:39.130] signalConditionsASAP(SequentialFuture, pos=3) ... [13:13:39.130] - nx: 4 [13:13:39.130] - relay: TRUE [13:13:39.131] - stdout: TRUE [13:13:39.131] - signal: TRUE [13:13:39.131] - resignal: FALSE [13:13:39.131] - force: TRUE [13:13:39.131] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [13:13:39.132] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [13:13:39.132] - until=3 [13:13:39.132] - relaying element #3 [13:13:39.132] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [13:13:39.132] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [13:13:39.132] signalConditionsASAP(SequentialFuture, pos=3) ... done [13:13:39.133] length: 1 (resolved future 3) [13:13:39.133] resolved() for 'SequentialFuture' ... [13:13:39.133] - state: 'finished' [13:13:39.133] - run: TRUE [13:13:39.133] - result: 'FutureResult' [13:13:39.134] resolved() for 'SequentialFuture' ... done [13:13:39.134] Future #4 [13:13:39.134] signalConditionsASAP(SequentialFuture, pos=4) ... [13:13:39.134] - nx: 4 [13:13:39.134] - relay: TRUE [13:13:39.134] - stdout: TRUE [13:13:39.135] - signal: TRUE [13:13:39.135] - resignal: FALSE [13:13:39.135] - force: TRUE [13:13:39.135] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [13:13:39.135] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [13:13:39.135] - until=4 [13:13:39.135] - relaying element #4 [13:13:39.136] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [13:13:39.136] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [13:13:39.136] signalConditionsASAP(SequentialFuture, pos=4) ... done [13:13:39.136] length: 0 (resolved future 4) [13:13:39.136] Relaying remaining futures [13:13:39.137] signalConditionsASAP(NULL, pos=0) ... [13:13:39.137] - nx: 4 [13:13:39.137] - relay: TRUE [13:13:39.137] - stdout: TRUE [13:13:39.137] - signal: TRUE [13:13:39.137] - resignal: FALSE [13:13:39.137] - force: TRUE [13:13:39.138] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [13:13:39.138] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE - flush all [13:13:39.138] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [13:13:39.138] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [13:13:39.138] signalConditionsASAP(NULL, pos=0) ... done [13:13:39.138] resolve() on list ... DONE [13:13:39.139] - Number of value chunks collected: 4 [13:13:39.139] Resolving 4 futures (chunks) ... DONE [13:13:39.139] Reducing values from 4 chunks ... [13:13:39.139] - Number of values collected after concatenation: 4 [13:13:39.140] - Number of values expected: 4 [13:13:39.140] Reducing values from 4 chunks ... DONE [13:13:39.140] 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, ...) ... [13:13:39.143] future_lapply() ... [13:13:39.155] Number of chunks: 1 [13:13:39.155] getGlobalsAndPackagesXApply() ... [13:13:39.155] - future.globals: TRUE [13:13:39.155] getGlobalsAndPackages() ... [13:13:39.155] Searching for globals... [13:13:39.165] - globals found: [22] 'FUN', 'if', 'missing', 'is.finite', '{', 'is.null', '<-', 'paste', 'length', '==', 'return', '>', '+', '[', 'seq_len', 'rev', 'c', '&&', '!', ':', '(', '-' [13:13:39.165] Searching for globals ... DONE [13:13:39.165] Resolving globals: FALSE [13:13:39.166] The total size of the 1 globals is 69.62 KiB (71288 bytes) [13:13:39.167] 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') [13:13:39.167] - globals: [1] 'FUN' [13:13:39.167] - packages: [1] 'future' [13:13:39.167] getGlobalsAndPackages() ... DONE [13:13:39.168] - globals found/used: [n=1] 'FUN' [13:13:39.168] - needed namespaces: [n=1] 'future' [13:13:39.168] Finding globals ... DONE [13:13:39.168] - use_args: TRUE [13:13:39.168] - Getting '...' globals ... [13:13:39.169] resolve() on list ... [13:13:39.169] recursive: 0 [13:13:39.169] length: 1 [13:13:39.169] elements: '...' [13:13:39.169] length: 0 (resolved future 1) [13:13:39.169] resolve() on list ... DONE [13:13:39.170] - '...' content: [n=2] 'collapse', 'maxHead' [13:13:39.170] List of 1 [13:13:39.170] $ ...:List of 2 [13:13:39.170] ..$ collapse: chr "; " [13:13:39.170] ..$ maxHead : int 3 [13:13:39.170] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:39.170] - attr(*, "where")=List of 1 [13:13:39.170] ..$ ...: [13:13:39.170] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:39.170] - attr(*, "resolved")= logi TRUE [13:13:39.170] - attr(*, "total_size")= num NA [13:13:39.174] - Getting '...' globals ... DONE [13:13:39.174] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:39.174] List of 2 [13:13:39.174] $ ...future.FUN:function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [13:13:39.174] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [13:13:39.174] $ ... :List of 2 [13:13:39.174] ..$ collapse: chr "; " [13:13:39.174] ..$ maxHead : int 3 [13:13:39.174] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:39.174] - attr(*, "where")=List of 2 [13:13:39.174] ..$ ...future.FUN: [13:13:39.174] ..$ ... : [13:13:39.174] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:39.174] - attr(*, "resolved")= logi FALSE [13:13:39.174] - attr(*, "total_size")= num 71456 [13:13:39.179] Packages to be attached in all futures: [n=1] 'future' [13:13:39.179] getGlobalsAndPackagesXApply() ... DONE [13:13:39.179] Number of futures (= number of chunks): 1 [13:13:39.179] Launching 1 futures (chunks) ... [13:13:39.180] Chunk #1 of 1 ... [13:13:39.180] - Finding globals in 'X' for chunk #1 ... [13:13:39.180] getGlobalsAndPackages() ... [13:13:39.180] Searching for globals... [13:13:39.180] [13:13:39.181] Searching for globals ... DONE [13:13:39.181] - globals: [0] [13:13:39.181] getGlobalsAndPackages() ... DONE [13:13:39.181] + additional globals found: [n=0] [13:13:39.181] + additional namespaces needed: [n=0] [13:13:39.181] - Finding globals in 'X' for chunk #1 ... DONE [13:13:39.182] - seeds: [13:13:39.182] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:39.182] getGlobalsAndPackages() ... [13:13:39.182] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:39.182] Resolving globals: FALSE [13:13:39.182] Tweak future expression to call with '...' arguments ... [13:13:39.183] { [13:13:39.183] do.call(function(...) { [13:13:39.183] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:39.183] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:39.183] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:39.183] on.exit(options(oopts), add = TRUE) [13:13:39.183] } [13:13:39.183] { [13:13:39.183] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:39.183] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:39.183] ...future.FUN(...future.X_jj, ...) [13:13:39.183] }) [13:13:39.183] } [13:13:39.183] }, args = future.call.arguments) [13:13:39.183] } [13:13:39.183] Tweak future expression to call with '...' arguments ... DONE [13:13:39.183] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:39.184] - packages: [1] 'future' [13:13:39.184] getGlobalsAndPackages() ... DONE [13:13:39.184] run() for 'Future' ... [13:13:39.184] - state: 'created' [13:13:39.185] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:13:39.185] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:39.185] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:39.185] - Field: 'label' [13:13:39.186] - Field: 'local' [13:13:39.186] - Field: 'owner' [13:13:39.186] - Field: 'envir' [13:13:39.186] - Field: 'packages' [13:13:39.186] - Field: 'gc' [13:13:39.186] - Field: 'conditions' [13:13:39.187] - Field: 'expr' [13:13:39.187] - Field: 'uuid' [13:13:39.187] - Field: 'seed' [13:13:39.187] - Field: 'version' [13:13:39.187] - Field: 'result' [13:13:39.187] - Field: 'asynchronous' [13:13:39.188] - Field: 'calls' [13:13:39.188] - Field: 'globals' [13:13:39.188] - Field: 'stdout' [13:13:39.188] - Field: 'earlySignal' [13:13:39.188] - Field: 'lazy' [13:13:39.188] - Field: 'state' [13:13:39.189] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:39.189] - Launch lazy future ... [13:13:39.189] Packages needed by the future expression (n = 1): 'future' [13:13:39.189] Packages needed by future strategies (n = 0): [13:13:39.190] { [13:13:39.190] { [13:13:39.190] { [13:13:39.190] ...future.startTime <- base::Sys.time() [13:13:39.190] { [13:13:39.190] { [13:13:39.190] { [13:13:39.190] { [13:13:39.190] base::local({ [13:13:39.190] has_future <- base::requireNamespace("future", [13:13:39.190] quietly = TRUE) [13:13:39.190] if (has_future) { [13:13:39.190] ns <- base::getNamespace("future") [13:13:39.190] version <- ns[[".package"]][["version"]] [13:13:39.190] if (is.null(version)) [13:13:39.190] version <- utils::packageVersion("future") [13:13:39.190] } [13:13:39.190] else { [13:13:39.190] version <- NULL [13:13:39.190] } [13:13:39.190] if (!has_future || version < "1.8.0") { [13:13:39.190] info <- base::c(r_version = base::gsub("R version ", [13:13:39.190] "", base::R.version$version.string), [13:13:39.190] platform = base::sprintf("%s (%s-bit)", [13:13:39.190] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:39.190] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:39.190] "release", "version")], collapse = " "), [13:13:39.190] hostname = base::Sys.info()[["nodename"]]) [13:13:39.190] info <- base::sprintf("%s: %s", base::names(info), [13:13:39.190] info) [13:13:39.190] info <- base::paste(info, collapse = "; ") [13:13:39.190] if (!has_future) { [13:13:39.190] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:39.190] info) [13:13:39.190] } [13:13:39.190] else { [13:13:39.190] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:39.190] info, version) [13:13:39.190] } [13:13:39.190] base::stop(msg) [13:13:39.190] } [13:13:39.190] }) [13:13:39.190] } [13:13:39.190] base::local({ [13:13:39.190] for (pkg in "future") { [13:13:39.190] base::loadNamespace(pkg) [13:13:39.190] base::library(pkg, character.only = TRUE) [13:13:39.190] } [13:13:39.190] }) [13:13:39.190] } [13:13:39.190] options(future.plan = NULL) [13:13:39.190] Sys.unsetenv("R_FUTURE_PLAN") [13:13:39.190] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:39.190] } [13:13:39.190] ...future.workdir <- getwd() [13:13:39.190] } [13:13:39.190] ...future.oldOptions <- base::as.list(base::.Options) [13:13:39.190] ...future.oldEnvVars <- base::Sys.getenv() [13:13:39.190] } [13:13:39.190] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:39.190] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:39.190] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:39.190] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:39.190] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:39.190] future.stdout.windows.reencode = NULL, width = 80L) [13:13:39.190] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:39.190] base::names(...future.oldOptions)) [13:13:39.190] } [13:13:39.190] if (FALSE) { [13:13:39.190] } [13:13:39.190] else { [13:13:39.190] if (TRUE) { [13:13:39.190] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:39.190] open = "w") [13:13:39.190] } [13:13:39.190] else { [13:13:39.190] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:39.190] windows = "NUL", "/dev/null"), open = "w") [13:13:39.190] } [13:13:39.190] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:39.190] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:39.190] base::sink(type = "output", split = FALSE) [13:13:39.190] base::close(...future.stdout) [13:13:39.190] }, add = TRUE) [13:13:39.190] } [13:13:39.190] ...future.frame <- base::sys.nframe() [13:13:39.190] ...future.conditions <- base::list() [13:13:39.190] ...future.rng <- base::globalenv()$.Random.seed [13:13:39.190] if (FALSE) { [13:13:39.190] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:39.190] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:39.190] } [13:13:39.190] ...future.result <- base::tryCatch({ [13:13:39.190] base::withCallingHandlers({ [13:13:39.190] ...future.value <- base::withVisible(base::local({ [13:13:39.190] do.call(function(...) { [13:13:39.190] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:39.190] if (!identical(...future.globals.maxSize.org, [13:13:39.190] ...future.globals.maxSize)) { [13:13:39.190] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:39.190] on.exit(options(oopts), add = TRUE) [13:13:39.190] } [13:13:39.190] { [13:13:39.190] lapply(seq_along(...future.elements_ii), [13:13:39.190] FUN = function(jj) { [13:13:39.190] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:39.190] ...future.FUN(...future.X_jj, ...) [13:13:39.190] }) [13:13:39.190] } [13:13:39.190] }, args = future.call.arguments) [13:13:39.190] })) [13:13:39.190] future::FutureResult(value = ...future.value$value, [13:13:39.190] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:39.190] ...future.rng), globalenv = if (FALSE) [13:13:39.190] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:39.190] ...future.globalenv.names)) [13:13:39.190] else NULL, started = ...future.startTime, version = "1.8") [13:13:39.190] }, condition = base::local({ [13:13:39.190] c <- base::c [13:13:39.190] inherits <- base::inherits [13:13:39.190] invokeRestart <- base::invokeRestart [13:13:39.190] length <- base::length [13:13:39.190] list <- base::list [13:13:39.190] seq.int <- base::seq.int [13:13:39.190] signalCondition <- base::signalCondition [13:13:39.190] sys.calls <- base::sys.calls [13:13:39.190] `[[` <- base::`[[` [13:13:39.190] `+` <- base::`+` [13:13:39.190] `<<-` <- base::`<<-` [13:13:39.190] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:39.190] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:39.190] 3L)] [13:13:39.190] } [13:13:39.190] function(cond) { [13:13:39.190] is_error <- inherits(cond, "error") [13:13:39.190] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:39.190] NULL) [13:13:39.190] if (is_error) { [13:13:39.190] sessionInformation <- function() { [13:13:39.190] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:39.190] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:39.190] search = base::search(), system = base::Sys.info()) [13:13:39.190] } [13:13:39.190] ...future.conditions[[length(...future.conditions) + [13:13:39.190] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:39.190] cond$call), session = sessionInformation(), [13:13:39.190] timestamp = base::Sys.time(), signaled = 0L) [13:13:39.190] signalCondition(cond) [13:13:39.190] } [13:13:39.190] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:39.190] "immediateCondition"))) { [13:13:39.190] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:39.190] ...future.conditions[[length(...future.conditions) + [13:13:39.190] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:39.190] if (TRUE && !signal) { [13:13:39.190] muffleCondition <- function (cond, pattern = "^muffle") [13:13:39.190] { [13:13:39.190] inherits <- base::inherits [13:13:39.190] invokeRestart <- base::invokeRestart [13:13:39.190] is.null <- base::is.null [13:13:39.190] muffled <- FALSE [13:13:39.190] if (inherits(cond, "message")) { [13:13:39.190] muffled <- grepl(pattern, "muffleMessage") [13:13:39.190] if (muffled) [13:13:39.190] invokeRestart("muffleMessage") [13:13:39.190] } [13:13:39.190] else if (inherits(cond, "warning")) { [13:13:39.190] muffled <- grepl(pattern, "muffleWarning") [13:13:39.190] if (muffled) [13:13:39.190] invokeRestart("muffleWarning") [13:13:39.190] } [13:13:39.190] else if (inherits(cond, "condition")) { [13:13:39.190] if (!is.null(pattern)) { [13:13:39.190] computeRestarts <- base::computeRestarts [13:13:39.190] grepl <- base::grepl [13:13:39.190] restarts <- computeRestarts(cond) [13:13:39.190] for (restart in restarts) { [13:13:39.190] name <- restart$name [13:13:39.190] if (is.null(name)) [13:13:39.190] next [13:13:39.190] if (!grepl(pattern, name)) [13:13:39.190] next [13:13:39.190] invokeRestart(restart) [13:13:39.190] muffled <- TRUE [13:13:39.190] break [13:13:39.190] } [13:13:39.190] } [13:13:39.190] } [13:13:39.190] invisible(muffled) [13:13:39.190] } [13:13:39.190] muffleCondition(cond, pattern = "^muffle") [13:13:39.190] } [13:13:39.190] } [13:13:39.190] else { [13:13:39.190] if (TRUE) { [13:13:39.190] muffleCondition <- function (cond, pattern = "^muffle") [13:13:39.190] { [13:13:39.190] inherits <- base::inherits [13:13:39.190] invokeRestart <- base::invokeRestart [13:13:39.190] is.null <- base::is.null [13:13:39.190] muffled <- FALSE [13:13:39.190] if (inherits(cond, "message")) { [13:13:39.190] muffled <- grepl(pattern, "muffleMessage") [13:13:39.190] if (muffled) [13:13:39.190] invokeRestart("muffleMessage") [13:13:39.190] } [13:13:39.190] else if (inherits(cond, "warning")) { [13:13:39.190] muffled <- grepl(pattern, "muffleWarning") [13:13:39.190] if (muffled) [13:13:39.190] invokeRestart("muffleWarning") [13:13:39.190] } [13:13:39.190] else if (inherits(cond, "condition")) { [13:13:39.190] if (!is.null(pattern)) { [13:13:39.190] computeRestarts <- base::computeRestarts [13:13:39.190] grepl <- base::grepl [13:13:39.190] restarts <- computeRestarts(cond) [13:13:39.190] for (restart in restarts) { [13:13:39.190] name <- restart$name [13:13:39.190] if (is.null(name)) [13:13:39.190] next [13:13:39.190] if (!grepl(pattern, name)) [13:13:39.190] next [13:13:39.190] invokeRestart(restart) [13:13:39.190] muffled <- TRUE [13:13:39.190] break [13:13:39.190] } [13:13:39.190] } [13:13:39.190] } [13:13:39.190] invisible(muffled) [13:13:39.190] } [13:13:39.190] muffleCondition(cond, pattern = "^muffle") [13:13:39.190] } [13:13:39.190] } [13:13:39.190] } [13:13:39.190] })) [13:13:39.190] }, error = function(ex) { [13:13:39.190] base::structure(base::list(value = NULL, visible = NULL, [13:13:39.190] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:39.190] ...future.rng), started = ...future.startTime, [13:13:39.190] finished = Sys.time(), session_uuid = NA_character_, [13:13:39.190] version = "1.8"), class = "FutureResult") [13:13:39.190] }, finally = { [13:13:39.190] if (!identical(...future.workdir, getwd())) [13:13:39.190] setwd(...future.workdir) [13:13:39.190] { [13:13:39.190] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:39.190] ...future.oldOptions$nwarnings <- NULL [13:13:39.190] } [13:13:39.190] base::options(...future.oldOptions) [13:13:39.190] if (.Platform$OS.type == "windows") { [13:13:39.190] old_names <- names(...future.oldEnvVars) [13:13:39.190] envs <- base::Sys.getenv() [13:13:39.190] names <- names(envs) [13:13:39.190] common <- intersect(names, old_names) [13:13:39.190] added <- setdiff(names, old_names) [13:13:39.190] removed <- setdiff(old_names, names) [13:13:39.190] changed <- common[...future.oldEnvVars[common] != [13:13:39.190] envs[common]] [13:13:39.190] NAMES <- toupper(changed) [13:13:39.190] args <- list() [13:13:39.190] for (kk in seq_along(NAMES)) { [13:13:39.190] name <- changed[[kk]] [13:13:39.190] NAME <- NAMES[[kk]] [13:13:39.190] if (name != NAME && is.element(NAME, old_names)) [13:13:39.190] next [13:13:39.190] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:39.190] } [13:13:39.190] NAMES <- toupper(added) [13:13:39.190] for (kk in seq_along(NAMES)) { [13:13:39.190] name <- added[[kk]] [13:13:39.190] NAME <- NAMES[[kk]] [13:13:39.190] if (name != NAME && is.element(NAME, old_names)) [13:13:39.190] next [13:13:39.190] args[[name]] <- "" [13:13:39.190] } [13:13:39.190] NAMES <- toupper(removed) [13:13:39.190] for (kk in seq_along(NAMES)) { [13:13:39.190] name <- removed[[kk]] [13:13:39.190] NAME <- NAMES[[kk]] [13:13:39.190] if (name != NAME && is.element(NAME, old_names)) [13:13:39.190] next [13:13:39.190] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:39.190] } [13:13:39.190] if (length(args) > 0) [13:13:39.190] base::do.call(base::Sys.setenv, args = args) [13:13:39.190] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:39.190] } [13:13:39.190] else { [13:13:39.190] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:39.190] } [13:13:39.190] { [13:13:39.190] if (base::length(...future.futureOptionsAdded) > [13:13:39.190] 0L) { [13:13:39.190] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:39.190] base::names(opts) <- ...future.futureOptionsAdded [13:13:39.190] base::options(opts) [13:13:39.190] } [13:13:39.190] { [13:13:39.190] { [13:13:39.190] NULL [13:13:39.190] RNGkind("Mersenne-Twister") [13:13:39.190] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:39.190] inherits = FALSE) [13:13:39.190] } [13:13:39.190] options(future.plan = NULL) [13:13:39.190] if (is.na(NA_character_)) [13:13:39.190] Sys.unsetenv("R_FUTURE_PLAN") [13:13:39.190] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:39.190] future::plan(list(function (..., envir = parent.frame()) [13:13:39.190] { [13:13:39.190] future <- SequentialFuture(..., envir = envir) [13:13:39.190] if (!future$lazy) [13:13:39.190] future <- run(future) [13:13:39.190] invisible(future) [13:13:39.190] }), .cleanup = FALSE, .init = FALSE) [13:13:39.190] } [13:13:39.190] } [13:13:39.190] } [13:13:39.190] }) [13:13:39.190] if (TRUE) { [13:13:39.190] base::sink(type = "output", split = FALSE) [13:13:39.190] if (TRUE) { [13:13:39.190] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:39.190] } [13:13:39.190] else { [13:13:39.190] ...future.result["stdout"] <- base::list(NULL) [13:13:39.190] } [13:13:39.190] base::close(...future.stdout) [13:13:39.190] ...future.stdout <- NULL [13:13:39.190] } [13:13:39.190] ...future.result$conditions <- ...future.conditions [13:13:39.190] ...future.result$finished <- base::Sys.time() [13:13:39.190] ...future.result [13:13:39.190] } [13:13:39.194] assign_globals() ... [13:13:39.194] List of 5 [13:13:39.194] $ ...future.FUN :function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [13:13:39.194] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [13:13:39.194] $ future.call.arguments :List of 2 [13:13:39.194] ..$ collapse: chr "; " [13:13:39.194] ..$ maxHead : int 3 [13:13:39.194] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:39.194] $ ...future.elements_ii :List of 1 [13:13:39.194] ..$ a: Named chr [1:101] "hello" "1" "2" "3" ... [13:13:39.194] .. ..- attr(*, "names")= chr [1:101] "" "b1" "b2" "b3" ... [13:13:39.194] $ ...future.seeds_ii : NULL [13:13:39.194] $ ...future.globals.maxSize: NULL [13:13:39.194] - attr(*, "where")=List of 5 [13:13:39.194] ..$ ...future.FUN : [13:13:39.194] ..$ future.call.arguments : [13:13:39.194] ..$ ...future.elements_ii : [13:13:39.194] ..$ ...future.seeds_ii : [13:13:39.194] ..$ ...future.globals.maxSize: [13:13:39.194] - attr(*, "resolved")= logi FALSE [13:13:39.194] - attr(*, "total_size")= num 71456 [13:13:39.194] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:39.194] - attr(*, "already-done")= logi TRUE [13:13:39.201] - copied '...future.FUN' to environment [13:13:39.201] - copied 'future.call.arguments' to environment [13:13:39.201] - copied '...future.elements_ii' to environment [13:13:39.201] - copied '...future.seeds_ii' to environment [13:13:39.201] - copied '...future.globals.maxSize' to environment [13:13:39.201] assign_globals() ... done [13:13:39.202] plan(): Setting new future strategy stack: [13:13:39.202] List of future strategies: [13:13:39.202] 1. sequential: [13:13:39.202] - args: function (..., envir = parent.frame(), workers = "") [13:13:39.202] - tweaked: FALSE [13:13:39.202] - call: NULL [13:13:39.203] plan(): nbrOfWorkers() = 1 [13:13:39.204] plan(): Setting new future strategy stack: [13:13:39.204] List of future strategies: [13:13:39.204] 1. sequential: [13:13:39.204] - args: function (..., envir = parent.frame(), workers = "") [13:13:39.204] - tweaked: FALSE [13:13:39.204] - call: plan(strategy) [13:13:39.205] plan(): nbrOfWorkers() = 1 [13:13:39.205] SequentialFuture started (and completed) [13:13:39.206] - Launch lazy future ... done [13:13:39.206] run() for 'SequentialFuture' ... done [13:13:39.206] Created future: [13:13:39.207] SequentialFuture: [13:13:39.207] Label: 'future_lapply-1' [13:13:39.207] Expression: [13:13:39.207] { [13:13:39.207] do.call(function(...) { [13:13:39.207] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:39.207] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:39.207] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:39.207] on.exit(options(oopts), add = TRUE) [13:13:39.207] } [13:13:39.207] { [13:13:39.207] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:39.207] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:39.207] ...future.FUN(...future.X_jj, ...) [13:13:39.207] }) [13:13:39.207] } [13:13:39.207] }, args = future.call.arguments) [13:13:39.207] } [13:13:39.207] Lazy evaluation: FALSE [13:13:39.207] Asynchronous evaluation: FALSE [13:13:39.207] Local evaluation: TRUE [13:13:39.207] Environment: R_GlobalEnv [13:13:39.207] Capture standard output: TRUE [13:13:39.207] Capture condition classes: 'condition' (excluding 'nothing') [13:13:39.207] 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) [13:13:39.207] Packages: 1 packages ('future') [13:13:39.207] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:39.207] Resolved: TRUE [13:13:39.207] Value: 136 bytes of class 'list' [13:13:39.207] Early signaling: FALSE [13:13:39.207] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:39.207] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:39.208] Chunk #1 of 1 ... DONE [13:13:39.208] Launching 1 futures (chunks) ... DONE [13:13:39.208] Resolving 1 futures (chunks) ... [13:13:39.209] resolve() on list ... [13:13:39.209] recursive: 0 [13:13:39.209] length: 1 [13:13:39.209] [13:13:39.209] resolved() for 'SequentialFuture' ... [13:13:39.209] - state: 'finished' [13:13:39.210] - run: TRUE [13:13:39.210] - result: 'FutureResult' [13:13:39.210] resolved() for 'SequentialFuture' ... done [13:13:39.210] Future #1 [13:13:39.210] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:39.211] - nx: 1 [13:13:39.211] - relay: TRUE [13:13:39.211] - stdout: TRUE [13:13:39.211] - signal: TRUE [13:13:39.211] - resignal: FALSE [13:13:39.211] - force: TRUE [13:13:39.211] - relayed: [n=1] FALSE [13:13:39.212] - queued futures: [n=1] FALSE [13:13:39.212] - until=1 [13:13:39.212] - relaying element #1 [13:13:39.212] - relayed: [n=1] TRUE [13:13:39.212] - queued futures: [n=1] TRUE [13:13:39.212] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:39.213] length: 0 (resolved future 1) [13:13:39.213] Relaying remaining futures [13:13:39.213] signalConditionsASAP(NULL, pos=0) ... [13:13:39.213] - nx: 1 [13:13:39.213] - relay: TRUE [13:13:39.213] - stdout: TRUE [13:13:39.214] - signal: TRUE [13:13:39.214] - resignal: FALSE [13:13:39.214] - force: TRUE [13:13:39.214] - relayed: [n=1] TRUE [13:13:39.214] - queued futures: [n=1] TRUE - flush all [13:13:39.214] - relayed: [n=1] TRUE [13:13:39.215] - queued futures: [n=1] TRUE [13:13:39.215] signalConditionsASAP(NULL, pos=0) ... done [13:13:39.215] resolve() on list ... DONE [13:13:39.215] - Number of value chunks collected: 1 [13:13:39.215] Resolving 1 futures (chunks) ... DONE [13:13:39.215] Reducing values from 1 chunks ... [13:13:39.216] - Number of values collected after concatenation: 1 [13:13:39.216] - Number of values expected: 1 [13:13:39.216] Reducing values from 1 chunks ... DONE [13:13:39.216] future_lapply() ... DONE List of 1 $ y:List of 1 ..$ a: chr "hello; 1; 2; ...; 100" - future_lapply(x, FUN = listenv::listenv, ...) ... [13:13:39.217] future_lapply() ... [13:13:39.218] Number of chunks: 2 [13:13:39.218] getGlobalsAndPackagesXApply() ... [13:13:39.218] - future.globals: TRUE [13:13:39.219] getGlobalsAndPackages() ... [13:13:39.219] Searching for globals... [13:13:39.220] - globals found: [4] 'FUN', '{', 'get', 'parent.env' [13:13:39.220] Searching for globals ... DONE [13:13:39.220] Resolving globals: FALSE [13:13:39.221] The total size of the 1 globals is 4.85 KiB (4968 bytes) [13:13:39.221] 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') [13:13:39.222] - globals: [1] 'FUN' [13:13:39.222] - packages: [1] 'listenv' [13:13:39.222] getGlobalsAndPackages() ... DONE [13:13:39.222] - globals found/used: [n=1] 'FUN' [13:13:39.222] - needed namespaces: [n=1] 'listenv' [13:13:39.222] Finding globals ... DONE [13:13:39.223] - use_args: TRUE [13:13:39.223] - Getting '...' globals ... [13:13:39.223] resolve() on list ... [13:13:39.223] recursive: 0 [13:13:39.223] length: 1 [13:13:39.224] elements: '...' [13:13:39.224] length: 0 (resolved future 1) [13:13:39.224] resolve() on list ... DONE [13:13:39.224] - '...' content: [n=0] [13:13:39.224] List of 1 [13:13:39.224] $ ...: list() [13:13:39.224] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:39.224] - attr(*, "where")=List of 1 [13:13:39.224] ..$ ...: [13:13:39.224] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:39.224] - attr(*, "resolved")= logi TRUE [13:13:39.224] - attr(*, "total_size")= num NA [13:13:39.227] - Getting '...' globals ... DONE [13:13:39.228] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:39.228] List of 2 [13:13:39.228] $ ...future.FUN:function (x, ...) [13:13:39.228] $ ... : list() [13:13:39.228] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:39.228] - attr(*, "where")=List of 2 [13:13:39.228] ..$ ...future.FUN: [13:13:39.228] ..$ ... : [13:13:39.228] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:39.228] - attr(*, "resolved")= logi FALSE [13:13:39.228] - attr(*, "total_size")= num 4968 [13:13:39.231] Packages to be attached in all futures: [n=1] 'listenv' [13:13:39.231] getGlobalsAndPackagesXApply() ... DONE [13:13:39.232] Number of futures (= number of chunks): 2 [13:13:39.232] Launching 2 futures (chunks) ... [13:13:39.232] Chunk #1 of 2 ... [13:13:39.233] - Finding globals in 'X' for chunk #1 ... [13:13:39.233] getGlobalsAndPackages() ... [13:13:39.233] Searching for globals... [13:13:39.234] [13:13:39.234] Searching for globals ... DONE [13:13:39.234] - globals: [0] [13:13:39.234] getGlobalsAndPackages() ... DONE [13:13:39.234] + additional globals found: [n=0] [13:13:39.234] + additional namespaces needed: [n=0] [13:13:39.234] - Finding globals in 'X' for chunk #1 ... DONE [13:13:39.235] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:13:39.235] - seeds: [13:13:39.235] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:39.235] getGlobalsAndPackages() ... [13:13:39.235] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:39.235] Resolving globals: FALSE [13:13:39.236] Tweak future expression to call with '...' arguments ... [13:13:39.236] { [13:13:39.236] do.call(function(...) { [13:13:39.236] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:39.236] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:39.236] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:39.236] on.exit(options(oopts), add = TRUE) [13:13:39.236] } [13:13:39.236] { [13:13:39.236] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:39.236] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:39.236] ...future.FUN(...future.X_jj, ...) [13:13:39.236] }) [13:13:39.236] } [13:13:39.236] }, args = future.call.arguments) [13:13:39.236] } [13:13:39.236] Tweak future expression to call with '...' arguments ... DONE [13:13:39.237] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:39.237] - packages: [1] 'listenv' [13:13:39.237] getGlobalsAndPackages() ... DONE [13:13:39.237] run() for 'Future' ... [13:13:39.238] - state: 'created' [13:13:39.238] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:13:39.238] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:39.238] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:39.239] - Field: 'label' [13:13:39.239] - Field: 'local' [13:13:39.239] - Field: 'owner' [13:13:39.239] - Field: 'envir' [13:13:39.239] - Field: 'packages' [13:13:39.239] - Field: 'gc' [13:13:39.240] - Field: 'conditions' [13:13:39.240] - Field: 'expr' [13:13:39.240] - Field: 'uuid' [13:13:39.240] - Field: 'seed' [13:13:39.240] - Field: 'version' [13:13:39.240] - Field: 'result' [13:13:39.241] - Field: 'asynchronous' [13:13:39.241] - Field: 'calls' [13:13:39.241] - Field: 'globals' [13:13:39.241] - Field: 'stdout' [13:13:39.241] - Field: 'earlySignal' [13:13:39.242] - Field: 'lazy' [13:13:39.242] - Field: 'state' [13:13:39.242] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:39.242] - Launch lazy future ... [13:13:39.242] Packages needed by the future expression (n = 1): 'listenv' [13:13:39.242] Packages needed by future strategies (n = 0): [13:13:39.243] { [13:13:39.243] { [13:13:39.243] { [13:13:39.243] ...future.startTime <- base::Sys.time() [13:13:39.243] { [13:13:39.243] { [13:13:39.243] { [13:13:39.243] { [13:13:39.243] base::local({ [13:13:39.243] has_future <- base::requireNamespace("future", [13:13:39.243] quietly = TRUE) [13:13:39.243] if (has_future) { [13:13:39.243] ns <- base::getNamespace("future") [13:13:39.243] version <- ns[[".package"]][["version"]] [13:13:39.243] if (is.null(version)) [13:13:39.243] version <- utils::packageVersion("future") [13:13:39.243] } [13:13:39.243] else { [13:13:39.243] version <- NULL [13:13:39.243] } [13:13:39.243] if (!has_future || version < "1.8.0") { [13:13:39.243] info <- base::c(r_version = base::gsub("R version ", [13:13:39.243] "", base::R.version$version.string), [13:13:39.243] platform = base::sprintf("%s (%s-bit)", [13:13:39.243] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:39.243] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:39.243] "release", "version")], collapse = " "), [13:13:39.243] hostname = base::Sys.info()[["nodename"]]) [13:13:39.243] info <- base::sprintf("%s: %s", base::names(info), [13:13:39.243] info) [13:13:39.243] info <- base::paste(info, collapse = "; ") [13:13:39.243] if (!has_future) { [13:13:39.243] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:39.243] info) [13:13:39.243] } [13:13:39.243] else { [13:13:39.243] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:39.243] info, version) [13:13:39.243] } [13:13:39.243] base::stop(msg) [13:13:39.243] } [13:13:39.243] }) [13:13:39.243] } [13:13:39.243] base::local({ [13:13:39.243] for (pkg in "listenv") { [13:13:39.243] base::loadNamespace(pkg) [13:13:39.243] base::library(pkg, character.only = TRUE) [13:13:39.243] } [13:13:39.243] }) [13:13:39.243] } [13:13:39.243] options(future.plan = NULL) [13:13:39.243] Sys.unsetenv("R_FUTURE_PLAN") [13:13:39.243] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:39.243] } [13:13:39.243] ...future.workdir <- getwd() [13:13:39.243] } [13:13:39.243] ...future.oldOptions <- base::as.list(base::.Options) [13:13:39.243] ...future.oldEnvVars <- base::Sys.getenv() [13:13:39.243] } [13:13:39.243] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:39.243] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:13:39.243] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:39.243] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:39.243] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:39.243] future.stdout.windows.reencode = NULL, width = 80L) [13:13:39.243] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:39.243] base::names(...future.oldOptions)) [13:13:39.243] } [13:13:39.243] if (FALSE) { [13:13:39.243] } [13:13:39.243] else { [13:13:39.243] if (TRUE) { [13:13:39.243] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:39.243] open = "w") [13:13:39.243] } [13:13:39.243] else { [13:13:39.243] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:39.243] windows = "NUL", "/dev/null"), open = "w") [13:13:39.243] } [13:13:39.243] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:39.243] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:39.243] base::sink(type = "output", split = FALSE) [13:13:39.243] base::close(...future.stdout) [13:13:39.243] }, add = TRUE) [13:13:39.243] } [13:13:39.243] ...future.frame <- base::sys.nframe() [13:13:39.243] ...future.conditions <- base::list() [13:13:39.243] ...future.rng <- base::globalenv()$.Random.seed [13:13:39.243] if (FALSE) { [13:13:39.243] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:39.243] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:39.243] } [13:13:39.243] ...future.result <- base::tryCatch({ [13:13:39.243] base::withCallingHandlers({ [13:13:39.243] ...future.value <- base::withVisible(base::local({ [13:13:39.243] do.call(function(...) { [13:13:39.243] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:39.243] if (!identical(...future.globals.maxSize.org, [13:13:39.243] ...future.globals.maxSize)) { [13:13:39.243] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:39.243] on.exit(options(oopts), add = TRUE) [13:13:39.243] } [13:13:39.243] { [13:13:39.243] lapply(seq_along(...future.elements_ii), [13:13:39.243] FUN = function(jj) { [13:13:39.243] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:39.243] ...future.FUN(...future.X_jj, ...) [13:13:39.243] }) [13:13:39.243] } [13:13:39.243] }, args = future.call.arguments) [13:13:39.243] })) [13:13:39.243] future::FutureResult(value = ...future.value$value, [13:13:39.243] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:39.243] ...future.rng), globalenv = if (FALSE) [13:13:39.243] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:39.243] ...future.globalenv.names)) [13:13:39.243] else NULL, started = ...future.startTime, version = "1.8") [13:13:39.243] }, condition = base::local({ [13:13:39.243] c <- base::c [13:13:39.243] inherits <- base::inherits [13:13:39.243] invokeRestart <- base::invokeRestart [13:13:39.243] length <- base::length [13:13:39.243] list <- base::list [13:13:39.243] seq.int <- base::seq.int [13:13:39.243] signalCondition <- base::signalCondition [13:13:39.243] sys.calls <- base::sys.calls [13:13:39.243] `[[` <- base::`[[` [13:13:39.243] `+` <- base::`+` [13:13:39.243] `<<-` <- base::`<<-` [13:13:39.243] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:39.243] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:39.243] 3L)] [13:13:39.243] } [13:13:39.243] function(cond) { [13:13:39.243] is_error <- inherits(cond, "error") [13:13:39.243] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:39.243] NULL) [13:13:39.243] if (is_error) { [13:13:39.243] sessionInformation <- function() { [13:13:39.243] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:39.243] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:39.243] search = base::search(), system = base::Sys.info()) [13:13:39.243] } [13:13:39.243] ...future.conditions[[length(...future.conditions) + [13:13:39.243] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:39.243] cond$call), session = sessionInformation(), [13:13:39.243] timestamp = base::Sys.time(), signaled = 0L) [13:13:39.243] signalCondition(cond) [13:13:39.243] } [13:13:39.243] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:39.243] "immediateCondition"))) { [13:13:39.243] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:39.243] ...future.conditions[[length(...future.conditions) + [13:13:39.243] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:39.243] if (TRUE && !signal) { [13:13:39.243] muffleCondition <- function (cond, pattern = "^muffle") [13:13:39.243] { [13:13:39.243] inherits <- base::inherits [13:13:39.243] invokeRestart <- base::invokeRestart [13:13:39.243] is.null <- base::is.null [13:13:39.243] muffled <- FALSE [13:13:39.243] if (inherits(cond, "message")) { [13:13:39.243] muffled <- grepl(pattern, "muffleMessage") [13:13:39.243] if (muffled) [13:13:39.243] invokeRestart("muffleMessage") [13:13:39.243] } [13:13:39.243] else if (inherits(cond, "warning")) { [13:13:39.243] muffled <- grepl(pattern, "muffleWarning") [13:13:39.243] if (muffled) [13:13:39.243] invokeRestart("muffleWarning") [13:13:39.243] } [13:13:39.243] else if (inherits(cond, "condition")) { [13:13:39.243] if (!is.null(pattern)) { [13:13:39.243] computeRestarts <- base::computeRestarts [13:13:39.243] grepl <- base::grepl [13:13:39.243] restarts <- computeRestarts(cond) [13:13:39.243] for (restart in restarts) { [13:13:39.243] name <- restart$name [13:13:39.243] if (is.null(name)) [13:13:39.243] next [13:13:39.243] if (!grepl(pattern, name)) [13:13:39.243] next [13:13:39.243] invokeRestart(restart) [13:13:39.243] muffled <- TRUE [13:13:39.243] break [13:13:39.243] } [13:13:39.243] } [13:13:39.243] } [13:13:39.243] invisible(muffled) [13:13:39.243] } [13:13:39.243] muffleCondition(cond, pattern = "^muffle") [13:13:39.243] } [13:13:39.243] } [13:13:39.243] else { [13:13:39.243] if (TRUE) { [13:13:39.243] muffleCondition <- function (cond, pattern = "^muffle") [13:13:39.243] { [13:13:39.243] inherits <- base::inherits [13:13:39.243] invokeRestart <- base::invokeRestart [13:13:39.243] is.null <- base::is.null [13:13:39.243] muffled <- FALSE [13:13:39.243] if (inherits(cond, "message")) { [13:13:39.243] muffled <- grepl(pattern, "muffleMessage") [13:13:39.243] if (muffled) [13:13:39.243] invokeRestart("muffleMessage") [13:13:39.243] } [13:13:39.243] else if (inherits(cond, "warning")) { [13:13:39.243] muffled <- grepl(pattern, "muffleWarning") [13:13:39.243] if (muffled) [13:13:39.243] invokeRestart("muffleWarning") [13:13:39.243] } [13:13:39.243] else if (inherits(cond, "condition")) { [13:13:39.243] if (!is.null(pattern)) { [13:13:39.243] computeRestarts <- base::computeRestarts [13:13:39.243] grepl <- base::grepl [13:13:39.243] restarts <- computeRestarts(cond) [13:13:39.243] for (restart in restarts) { [13:13:39.243] name <- restart$name [13:13:39.243] if (is.null(name)) [13:13:39.243] next [13:13:39.243] if (!grepl(pattern, name)) [13:13:39.243] next [13:13:39.243] invokeRestart(restart) [13:13:39.243] muffled <- TRUE [13:13:39.243] break [13:13:39.243] } [13:13:39.243] } [13:13:39.243] } [13:13:39.243] invisible(muffled) [13:13:39.243] } [13:13:39.243] muffleCondition(cond, pattern = "^muffle") [13:13:39.243] } [13:13:39.243] } [13:13:39.243] } [13:13:39.243] })) [13:13:39.243] }, error = function(ex) { [13:13:39.243] base::structure(base::list(value = NULL, visible = NULL, [13:13:39.243] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:39.243] ...future.rng), started = ...future.startTime, [13:13:39.243] finished = Sys.time(), session_uuid = NA_character_, [13:13:39.243] version = "1.8"), class = "FutureResult") [13:13:39.243] }, finally = { [13:13:39.243] if (!identical(...future.workdir, getwd())) [13:13:39.243] setwd(...future.workdir) [13:13:39.243] { [13:13:39.243] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:39.243] ...future.oldOptions$nwarnings <- NULL [13:13:39.243] } [13:13:39.243] base::options(...future.oldOptions) [13:13:39.243] if (.Platform$OS.type == "windows") { [13:13:39.243] old_names <- names(...future.oldEnvVars) [13:13:39.243] envs <- base::Sys.getenv() [13:13:39.243] names <- names(envs) [13:13:39.243] common <- intersect(names, old_names) [13:13:39.243] added <- setdiff(names, old_names) [13:13:39.243] removed <- setdiff(old_names, names) [13:13:39.243] changed <- common[...future.oldEnvVars[common] != [13:13:39.243] envs[common]] [13:13:39.243] NAMES <- toupper(changed) [13:13:39.243] args <- list() [13:13:39.243] for (kk in seq_along(NAMES)) { [13:13:39.243] name <- changed[[kk]] [13:13:39.243] NAME <- NAMES[[kk]] [13:13:39.243] if (name != NAME && is.element(NAME, old_names)) [13:13:39.243] next [13:13:39.243] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:39.243] } [13:13:39.243] NAMES <- toupper(added) [13:13:39.243] for (kk in seq_along(NAMES)) { [13:13:39.243] name <- added[[kk]] [13:13:39.243] NAME <- NAMES[[kk]] [13:13:39.243] if (name != NAME && is.element(NAME, old_names)) [13:13:39.243] next [13:13:39.243] args[[name]] <- "" [13:13:39.243] } [13:13:39.243] NAMES <- toupper(removed) [13:13:39.243] for (kk in seq_along(NAMES)) { [13:13:39.243] name <- removed[[kk]] [13:13:39.243] NAME <- NAMES[[kk]] [13:13:39.243] if (name != NAME && is.element(NAME, old_names)) [13:13:39.243] next [13:13:39.243] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:39.243] } [13:13:39.243] if (length(args) > 0) [13:13:39.243] base::do.call(base::Sys.setenv, args = args) [13:13:39.243] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:39.243] } [13:13:39.243] else { [13:13:39.243] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:39.243] } [13:13:39.243] { [13:13:39.243] if (base::length(...future.futureOptionsAdded) > [13:13:39.243] 0L) { [13:13:39.243] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:39.243] base::names(opts) <- ...future.futureOptionsAdded [13:13:39.243] base::options(opts) [13:13:39.243] } [13:13:39.243] { [13:13:39.243] { [13:13:39.243] NULL [13:13:39.243] RNGkind("Mersenne-Twister") [13:13:39.243] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:39.243] inherits = FALSE) [13:13:39.243] } [13:13:39.243] options(future.plan = NULL) [13:13:39.243] if (is.na(NA_character_)) [13:13:39.243] Sys.unsetenv("R_FUTURE_PLAN") [13:13:39.243] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:39.243] future::plan(list(function (..., envir = parent.frame()) [13:13:39.243] { [13:13:39.243] future <- SequentialFuture(..., envir = envir) [13:13:39.243] if (!future$lazy) [13:13:39.243] future <- run(future) [13:13:39.243] invisible(future) [13:13:39.243] }), .cleanup = FALSE, .init = FALSE) [13:13:39.243] } [13:13:39.243] } [13:13:39.243] } [13:13:39.243] }) [13:13:39.243] if (TRUE) { [13:13:39.243] base::sink(type = "output", split = FALSE) [13:13:39.243] if (TRUE) { [13:13:39.243] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:39.243] } [13:13:39.243] else { [13:13:39.243] ...future.result["stdout"] <- base::list(NULL) [13:13:39.243] } [13:13:39.243] base::close(...future.stdout) [13:13:39.243] ...future.stdout <- NULL [13:13:39.243] } [13:13:39.243] ...future.result$conditions <- ...future.conditions [13:13:39.243] ...future.result$finished <- base::Sys.time() [13:13:39.243] ...future.result [13:13:39.243] } [13:13:39.247] assign_globals() ... [13:13:39.247] List of 5 [13:13:39.247] $ ...future.FUN :function (x, ...) [13:13:39.247] $ future.call.arguments : list() [13:13:39.247] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:39.247] $ ...future.elements_ii :List of 1 [13:13:39.247] ..$ a:Classes 'listenv', 'environment' [13:13:39.247] $ ...future.seeds_ii : NULL [13:13:39.247] $ ...future.globals.maxSize: NULL [13:13:39.247] - attr(*, "where")=List of 5 [13:13:39.247] ..$ ...future.FUN : [13:13:39.247] ..$ future.call.arguments : [13:13:39.247] ..$ ...future.elements_ii : [13:13:39.247] ..$ ...future.seeds_ii : [13:13:39.247] ..$ ...future.globals.maxSize: [13:13:39.247] - attr(*, "resolved")= logi FALSE [13:13:39.247] - attr(*, "total_size")= num 4968 [13:13:39.247] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:39.247] - attr(*, "already-done")= logi TRUE [13:13:39.252] - copied '...future.FUN' to environment [13:13:39.253] - copied 'future.call.arguments' to environment [13:13:39.253] - copied '...future.elements_ii' to environment [13:13:39.253] - copied '...future.seeds_ii' to environment [13:13:39.253] - copied '...future.globals.maxSize' to environment [13:13:39.253] assign_globals() ... done [13:13:39.254] plan(): Setting new future strategy stack: [13:13:39.254] List of future strategies: [13:13:39.254] 1. sequential: [13:13:39.254] - args: function (..., envir = parent.frame(), workers = "") [13:13:39.254] - tweaked: FALSE [13:13:39.254] - call: NULL [13:13:39.255] plan(): nbrOfWorkers() = 1 [13:13:39.256] plan(): Setting new future strategy stack: [13:13:39.256] List of future strategies: [13:13:39.256] 1. sequential: [13:13:39.256] - args: function (..., envir = parent.frame(), workers = "") [13:13:39.256] - tweaked: FALSE [13:13:39.256] - call: plan(strategy) [13:13:39.257] plan(): nbrOfWorkers() = 1 [13:13:39.257] SequentialFuture started (and completed) [13:13:39.257] - Launch lazy future ... done [13:13:39.257] run() for 'SequentialFuture' ... done [13:13:39.257] Created future: [13:13:39.258] SequentialFuture: [13:13:39.258] Label: 'future_lapply-1' [13:13:39.258] Expression: [13:13:39.258] { [13:13:39.258] do.call(function(...) { [13:13:39.258] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:39.258] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:39.258] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:39.258] on.exit(options(oopts), add = TRUE) [13:13:39.258] } [13:13:39.258] { [13:13:39.258] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:39.258] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:39.258] ...future.FUN(...future.X_jj, ...) [13:13:39.258] }) [13:13:39.258] } [13:13:39.258] }, args = future.call.arguments) [13:13:39.258] } [13:13:39.258] Lazy evaluation: FALSE [13:13:39.258] Asynchronous evaluation: FALSE [13:13:39.258] Local evaluation: TRUE [13:13:39.258] Environment: R_GlobalEnv [13:13:39.258] Capture standard output: TRUE [13:13:39.258] Capture condition classes: 'condition' (excluding 'nothing') [13:13:39.258] 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) [13:13:39.258] Packages: 1 packages ('listenv') [13:13:39.258] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:39.258] Resolved: TRUE [13:13:39.258] Value: 336 bytes of class 'list' [13:13:39.258] Early signaling: FALSE [13:13:39.258] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:39.258] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:39.259] Chunk #1 of 2 ... DONE [13:13:39.259] Chunk #2 of 2 ... [13:13:39.259] - Finding globals in 'X' for chunk #2 ... [13:13:39.259] getGlobalsAndPackages() ... [13:13:39.260] Searching for globals... [13:13:39.260] [13:13:39.260] Searching for globals ... DONE [13:13:39.260] - globals: [0] [13:13:39.261] getGlobalsAndPackages() ... DONE [13:13:39.261] + additional globals found: [n=0] [13:13:39.261] + additional namespaces needed: [n=0] [13:13:39.261] - Finding globals in 'X' for chunk #2 ... DONE [13:13:39.261] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:13:39.261] - seeds: [13:13:39.262] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:39.262] getGlobalsAndPackages() ... [13:13:39.263] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:39.263] Resolving globals: FALSE [13:13:39.263] Tweak future expression to call with '...' arguments ... [13:13:39.263] { [13:13:39.263] do.call(function(...) { [13:13:39.263] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:39.263] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:39.263] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:39.263] on.exit(options(oopts), add = TRUE) [13:13:39.263] } [13:13:39.263] { [13:13:39.263] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:39.263] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:39.263] ...future.FUN(...future.X_jj, ...) [13:13:39.263] }) [13:13:39.263] } [13:13:39.263] }, args = future.call.arguments) [13:13:39.263] } [13:13:39.264] Tweak future expression to call with '...' arguments ... DONE [13:13:39.264] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:39.264] - packages: [1] 'listenv' [13:13:39.264] getGlobalsAndPackages() ... DONE [13:13:39.265] run() for 'Future' ... [13:13:39.265] - state: 'created' [13:13:39.265] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:13:39.266] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:39.266] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:39.266] - Field: 'label' [13:13:39.266] - Field: 'local' [13:13:39.266] - Field: 'owner' [13:13:39.266] - Field: 'envir' [13:13:39.267] - Field: 'packages' [13:13:39.267] - Field: 'gc' [13:13:39.267] - Field: 'conditions' [13:13:39.267] - Field: 'expr' [13:13:39.267] - Field: 'uuid' [13:13:39.268] - Field: 'seed' [13:13:39.268] - Field: 'version' [13:13:39.268] - Field: 'result' [13:13:39.268] - Field: 'asynchronous' [13:13:39.268] - Field: 'calls' [13:13:39.268] - Field: 'globals' [13:13:39.269] - Field: 'stdout' [13:13:39.269] - Field: 'earlySignal' [13:13:39.269] - Field: 'lazy' [13:13:39.269] - Field: 'state' [13:13:39.269] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:39.269] - Launch lazy future ... [13:13:39.270] Packages needed by the future expression (n = 1): 'listenv' [13:13:39.270] Packages needed by future strategies (n = 0): [13:13:39.270] { [13:13:39.270] { [13:13:39.270] { [13:13:39.270] ...future.startTime <- base::Sys.time() [13:13:39.270] { [13:13:39.270] { [13:13:39.270] { [13:13:39.270] { [13:13:39.270] base::local({ [13:13:39.270] has_future <- base::requireNamespace("future", [13:13:39.270] quietly = TRUE) [13:13:39.270] if (has_future) { [13:13:39.270] ns <- base::getNamespace("future") [13:13:39.270] version <- ns[[".package"]][["version"]] [13:13:39.270] if (is.null(version)) [13:13:39.270] version <- utils::packageVersion("future") [13:13:39.270] } [13:13:39.270] else { [13:13:39.270] version <- NULL [13:13:39.270] } [13:13:39.270] if (!has_future || version < "1.8.0") { [13:13:39.270] info <- base::c(r_version = base::gsub("R version ", [13:13:39.270] "", base::R.version$version.string), [13:13:39.270] platform = base::sprintf("%s (%s-bit)", [13:13:39.270] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:39.270] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:39.270] "release", "version")], collapse = " "), [13:13:39.270] hostname = base::Sys.info()[["nodename"]]) [13:13:39.270] info <- base::sprintf("%s: %s", base::names(info), [13:13:39.270] info) [13:13:39.270] info <- base::paste(info, collapse = "; ") [13:13:39.270] if (!has_future) { [13:13:39.270] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:39.270] info) [13:13:39.270] } [13:13:39.270] else { [13:13:39.270] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:39.270] info, version) [13:13:39.270] } [13:13:39.270] base::stop(msg) [13:13:39.270] } [13:13:39.270] }) [13:13:39.270] } [13:13:39.270] base::local({ [13:13:39.270] for (pkg in "listenv") { [13:13:39.270] base::loadNamespace(pkg) [13:13:39.270] base::library(pkg, character.only = TRUE) [13:13:39.270] } [13:13:39.270] }) [13:13:39.270] } [13:13:39.270] options(future.plan = NULL) [13:13:39.270] Sys.unsetenv("R_FUTURE_PLAN") [13:13:39.270] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:39.270] } [13:13:39.270] ...future.workdir <- getwd() [13:13:39.270] } [13:13:39.270] ...future.oldOptions <- base::as.list(base::.Options) [13:13:39.270] ...future.oldEnvVars <- base::Sys.getenv() [13:13:39.270] } [13:13:39.270] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:39.270] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:13:39.270] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:39.270] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:39.270] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:39.270] future.stdout.windows.reencode = NULL, width = 80L) [13:13:39.270] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:39.270] base::names(...future.oldOptions)) [13:13:39.270] } [13:13:39.270] if (FALSE) { [13:13:39.270] } [13:13:39.270] else { [13:13:39.270] if (TRUE) { [13:13:39.270] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:39.270] open = "w") [13:13:39.270] } [13:13:39.270] else { [13:13:39.270] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:39.270] windows = "NUL", "/dev/null"), open = "w") [13:13:39.270] } [13:13:39.270] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:39.270] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:39.270] base::sink(type = "output", split = FALSE) [13:13:39.270] base::close(...future.stdout) [13:13:39.270] }, add = TRUE) [13:13:39.270] } [13:13:39.270] ...future.frame <- base::sys.nframe() [13:13:39.270] ...future.conditions <- base::list() [13:13:39.270] ...future.rng <- base::globalenv()$.Random.seed [13:13:39.270] if (FALSE) { [13:13:39.270] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:39.270] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:39.270] } [13:13:39.270] ...future.result <- base::tryCatch({ [13:13:39.270] base::withCallingHandlers({ [13:13:39.270] ...future.value <- base::withVisible(base::local({ [13:13:39.270] do.call(function(...) { [13:13:39.270] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:39.270] if (!identical(...future.globals.maxSize.org, [13:13:39.270] ...future.globals.maxSize)) { [13:13:39.270] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:39.270] on.exit(options(oopts), add = TRUE) [13:13:39.270] } [13:13:39.270] { [13:13:39.270] lapply(seq_along(...future.elements_ii), [13:13:39.270] FUN = function(jj) { [13:13:39.270] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:39.270] ...future.FUN(...future.X_jj, ...) [13:13:39.270] }) [13:13:39.270] } [13:13:39.270] }, args = future.call.arguments) [13:13:39.270] })) [13:13:39.270] future::FutureResult(value = ...future.value$value, [13:13:39.270] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:39.270] ...future.rng), globalenv = if (FALSE) [13:13:39.270] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:39.270] ...future.globalenv.names)) [13:13:39.270] else NULL, started = ...future.startTime, version = "1.8") [13:13:39.270] }, condition = base::local({ [13:13:39.270] c <- base::c [13:13:39.270] inherits <- base::inherits [13:13:39.270] invokeRestart <- base::invokeRestart [13:13:39.270] length <- base::length [13:13:39.270] list <- base::list [13:13:39.270] seq.int <- base::seq.int [13:13:39.270] signalCondition <- base::signalCondition [13:13:39.270] sys.calls <- base::sys.calls [13:13:39.270] `[[` <- base::`[[` [13:13:39.270] `+` <- base::`+` [13:13:39.270] `<<-` <- base::`<<-` [13:13:39.270] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:39.270] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:39.270] 3L)] [13:13:39.270] } [13:13:39.270] function(cond) { [13:13:39.270] is_error <- inherits(cond, "error") [13:13:39.270] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:39.270] NULL) [13:13:39.270] if (is_error) { [13:13:39.270] sessionInformation <- function() { [13:13:39.270] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:39.270] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:39.270] search = base::search(), system = base::Sys.info()) [13:13:39.270] } [13:13:39.270] ...future.conditions[[length(...future.conditions) + [13:13:39.270] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:39.270] cond$call), session = sessionInformation(), [13:13:39.270] timestamp = base::Sys.time(), signaled = 0L) [13:13:39.270] signalCondition(cond) [13:13:39.270] } [13:13:39.270] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:39.270] "immediateCondition"))) { [13:13:39.270] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:39.270] ...future.conditions[[length(...future.conditions) + [13:13:39.270] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:39.270] if (TRUE && !signal) { [13:13:39.270] muffleCondition <- function (cond, pattern = "^muffle") [13:13:39.270] { [13:13:39.270] inherits <- base::inherits [13:13:39.270] invokeRestart <- base::invokeRestart [13:13:39.270] is.null <- base::is.null [13:13:39.270] muffled <- FALSE [13:13:39.270] if (inherits(cond, "message")) { [13:13:39.270] muffled <- grepl(pattern, "muffleMessage") [13:13:39.270] if (muffled) [13:13:39.270] invokeRestart("muffleMessage") [13:13:39.270] } [13:13:39.270] else if (inherits(cond, "warning")) { [13:13:39.270] muffled <- grepl(pattern, "muffleWarning") [13:13:39.270] if (muffled) [13:13:39.270] invokeRestart("muffleWarning") [13:13:39.270] } [13:13:39.270] else if (inherits(cond, "condition")) { [13:13:39.270] if (!is.null(pattern)) { [13:13:39.270] computeRestarts <- base::computeRestarts [13:13:39.270] grepl <- base::grepl [13:13:39.270] restarts <- computeRestarts(cond) [13:13:39.270] for (restart in restarts) { [13:13:39.270] name <- restart$name [13:13:39.270] if (is.null(name)) [13:13:39.270] next [13:13:39.270] if (!grepl(pattern, name)) [13:13:39.270] next [13:13:39.270] invokeRestart(restart) [13:13:39.270] muffled <- TRUE [13:13:39.270] break [13:13:39.270] } [13:13:39.270] } [13:13:39.270] } [13:13:39.270] invisible(muffled) [13:13:39.270] } [13:13:39.270] muffleCondition(cond, pattern = "^muffle") [13:13:39.270] } [13:13:39.270] } [13:13:39.270] else { [13:13:39.270] if (TRUE) { [13:13:39.270] muffleCondition <- function (cond, pattern = "^muffle") [13:13:39.270] { [13:13:39.270] inherits <- base::inherits [13:13:39.270] invokeRestart <- base::invokeRestart [13:13:39.270] is.null <- base::is.null [13:13:39.270] muffled <- FALSE [13:13:39.270] if (inherits(cond, "message")) { [13:13:39.270] muffled <- grepl(pattern, "muffleMessage") [13:13:39.270] if (muffled) [13:13:39.270] invokeRestart("muffleMessage") [13:13:39.270] } [13:13:39.270] else if (inherits(cond, "warning")) { [13:13:39.270] muffled <- grepl(pattern, "muffleWarning") [13:13:39.270] if (muffled) [13:13:39.270] invokeRestart("muffleWarning") [13:13:39.270] } [13:13:39.270] else if (inherits(cond, "condition")) { [13:13:39.270] if (!is.null(pattern)) { [13:13:39.270] computeRestarts <- base::computeRestarts [13:13:39.270] grepl <- base::grepl [13:13:39.270] restarts <- computeRestarts(cond) [13:13:39.270] for (restart in restarts) { [13:13:39.270] name <- restart$name [13:13:39.270] if (is.null(name)) [13:13:39.270] next [13:13:39.270] if (!grepl(pattern, name)) [13:13:39.270] next [13:13:39.270] invokeRestart(restart) [13:13:39.270] muffled <- TRUE [13:13:39.270] break [13:13:39.270] } [13:13:39.270] } [13:13:39.270] } [13:13:39.270] invisible(muffled) [13:13:39.270] } [13:13:39.270] muffleCondition(cond, pattern = "^muffle") [13:13:39.270] } [13:13:39.270] } [13:13:39.270] } [13:13:39.270] })) [13:13:39.270] }, error = function(ex) { [13:13:39.270] base::structure(base::list(value = NULL, visible = NULL, [13:13:39.270] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:39.270] ...future.rng), started = ...future.startTime, [13:13:39.270] finished = Sys.time(), session_uuid = NA_character_, [13:13:39.270] version = "1.8"), class = "FutureResult") [13:13:39.270] }, finally = { [13:13:39.270] if (!identical(...future.workdir, getwd())) [13:13:39.270] setwd(...future.workdir) [13:13:39.270] { [13:13:39.270] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:39.270] ...future.oldOptions$nwarnings <- NULL [13:13:39.270] } [13:13:39.270] base::options(...future.oldOptions) [13:13:39.270] if (.Platform$OS.type == "windows") { [13:13:39.270] old_names <- names(...future.oldEnvVars) [13:13:39.270] envs <- base::Sys.getenv() [13:13:39.270] names <- names(envs) [13:13:39.270] common <- intersect(names, old_names) [13:13:39.270] added <- setdiff(names, old_names) [13:13:39.270] removed <- setdiff(old_names, names) [13:13:39.270] changed <- common[...future.oldEnvVars[common] != [13:13:39.270] envs[common]] [13:13:39.270] NAMES <- toupper(changed) [13:13:39.270] args <- list() [13:13:39.270] for (kk in seq_along(NAMES)) { [13:13:39.270] name <- changed[[kk]] [13:13:39.270] NAME <- NAMES[[kk]] [13:13:39.270] if (name != NAME && is.element(NAME, old_names)) [13:13:39.270] next [13:13:39.270] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:39.270] } [13:13:39.270] NAMES <- toupper(added) [13:13:39.270] for (kk in seq_along(NAMES)) { [13:13:39.270] name <- added[[kk]] [13:13:39.270] NAME <- NAMES[[kk]] [13:13:39.270] if (name != NAME && is.element(NAME, old_names)) [13:13:39.270] next [13:13:39.270] args[[name]] <- "" [13:13:39.270] } [13:13:39.270] NAMES <- toupper(removed) [13:13:39.270] for (kk in seq_along(NAMES)) { [13:13:39.270] name <- removed[[kk]] [13:13:39.270] NAME <- NAMES[[kk]] [13:13:39.270] if (name != NAME && is.element(NAME, old_names)) [13:13:39.270] next [13:13:39.270] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:39.270] } [13:13:39.270] if (length(args) > 0) [13:13:39.270] base::do.call(base::Sys.setenv, args = args) [13:13:39.270] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:39.270] } [13:13:39.270] else { [13:13:39.270] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:39.270] } [13:13:39.270] { [13:13:39.270] if (base::length(...future.futureOptionsAdded) > [13:13:39.270] 0L) { [13:13:39.270] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:39.270] base::names(opts) <- ...future.futureOptionsAdded [13:13:39.270] base::options(opts) [13:13:39.270] } [13:13:39.270] { [13:13:39.270] { [13:13:39.270] NULL [13:13:39.270] RNGkind("Mersenne-Twister") [13:13:39.270] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:39.270] inherits = FALSE) [13:13:39.270] } [13:13:39.270] options(future.plan = NULL) [13:13:39.270] if (is.na(NA_character_)) [13:13:39.270] Sys.unsetenv("R_FUTURE_PLAN") [13:13:39.270] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:39.270] future::plan(list(function (..., envir = parent.frame()) [13:13:39.270] { [13:13:39.270] future <- SequentialFuture(..., envir = envir) [13:13:39.270] if (!future$lazy) [13:13:39.270] future <- run(future) [13:13:39.270] invisible(future) [13:13:39.270] }), .cleanup = FALSE, .init = FALSE) [13:13:39.270] } [13:13:39.270] } [13:13:39.270] } [13:13:39.270] }) [13:13:39.270] if (TRUE) { [13:13:39.270] base::sink(type = "output", split = FALSE) [13:13:39.270] if (TRUE) { [13:13:39.270] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:39.270] } [13:13:39.270] else { [13:13:39.270] ...future.result["stdout"] <- base::list(NULL) [13:13:39.270] } [13:13:39.270] base::close(...future.stdout) [13:13:39.270] ...future.stdout <- NULL [13:13:39.270] } [13:13:39.270] ...future.result$conditions <- ...future.conditions [13:13:39.270] ...future.result$finished <- base::Sys.time() [13:13:39.270] ...future.result [13:13:39.270] } [13:13:39.274] assign_globals() ... [13:13:39.275] List of 5 [13:13:39.275] $ ...future.FUN :function (x, ...) [13:13:39.275] $ future.call.arguments : list() [13:13:39.275] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:39.275] $ ...future.elements_ii :List of 1 [13:13:39.275] ..$ b:Classes 'listenv', 'environment' [13:13:39.275] $ ...future.seeds_ii : NULL [13:13:39.275] $ ...future.globals.maxSize: NULL [13:13:39.275] - attr(*, "where")=List of 5 [13:13:39.275] ..$ ...future.FUN : [13:13:39.275] ..$ future.call.arguments : [13:13:39.275] ..$ ...future.elements_ii : [13:13:39.275] ..$ ...future.seeds_ii : [13:13:39.275] ..$ ...future.globals.maxSize: [13:13:39.275] - attr(*, "resolved")= logi FALSE [13:13:39.275] - attr(*, "total_size")= num 4968 [13:13:39.275] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:39.275] - attr(*, "already-done")= logi TRUE [13:13:39.280] - copied '...future.FUN' to environment [13:13:39.280] - copied 'future.call.arguments' to environment [13:13:39.280] - copied '...future.elements_ii' to environment [13:13:39.281] - copied '...future.seeds_ii' to environment [13:13:39.281] - copied '...future.globals.maxSize' to environment [13:13:39.281] assign_globals() ... done [13:13:39.281] plan(): Setting new future strategy stack: [13:13:39.282] List of future strategies: [13:13:39.282] 1. sequential: [13:13:39.282] - args: function (..., envir = parent.frame(), workers = "") [13:13:39.282] - tweaked: FALSE [13:13:39.282] - call: NULL [13:13:39.282] plan(): nbrOfWorkers() = 1 [13:13:39.283] plan(): Setting new future strategy stack: [13:13:39.283] List of future strategies: [13:13:39.283] 1. sequential: [13:13:39.283] - args: function (..., envir = parent.frame(), workers = "") [13:13:39.283] - tweaked: FALSE [13:13:39.283] - call: plan(strategy) [13:13:39.284] plan(): nbrOfWorkers() = 1 [13:13:39.284] SequentialFuture started (and completed) [13:13:39.285] - Launch lazy future ... done [13:13:39.285] run() for 'SequentialFuture' ... done [13:13:39.285] Created future: [13:13:39.285] SequentialFuture: [13:13:39.285] Label: 'future_lapply-2' [13:13:39.285] Expression: [13:13:39.285] { [13:13:39.285] do.call(function(...) { [13:13:39.285] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:39.285] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:39.285] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:39.285] on.exit(options(oopts), add = TRUE) [13:13:39.285] } [13:13:39.285] { [13:13:39.285] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:39.285] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:39.285] ...future.FUN(...future.X_jj, ...) [13:13:39.285] }) [13:13:39.285] } [13:13:39.285] }, args = future.call.arguments) [13:13:39.285] } [13:13:39.285] Lazy evaluation: FALSE [13:13:39.285] Asynchronous evaluation: FALSE [13:13:39.285] Local evaluation: TRUE [13:13:39.285] Environment: R_GlobalEnv [13:13:39.285] Capture standard output: TRUE [13:13:39.285] Capture condition classes: 'condition' (excluding 'nothing') [13:13:39.285] 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) [13:13:39.285] Packages: 1 packages ('listenv') [13:13:39.285] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:39.285] Resolved: TRUE [13:13:39.285] Value: 464 bytes of class 'list' [13:13:39.285] Early signaling: FALSE [13:13:39.285] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:39.285] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:39.286] Chunk #2 of 2 ... DONE [13:13:39.287] Launching 2 futures (chunks) ... DONE [13:13:39.287] Resolving 2 futures (chunks) ... [13:13:39.287] resolve() on list ... [13:13:39.287] recursive: 0 [13:13:39.287] length: 2 [13:13:39.287] [13:13:39.288] resolved() for 'SequentialFuture' ... [13:13:39.288] - state: 'finished' [13:13:39.288] - run: TRUE [13:13:39.288] - result: 'FutureResult' [13:13:39.288] resolved() for 'SequentialFuture' ... done [13:13:39.288] Future #1 [13:13:39.289] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:39.289] - nx: 2 [13:13:39.289] - relay: TRUE [13:13:39.289] - stdout: TRUE [13:13:39.289] - signal: TRUE [13:13:39.289] - resignal: FALSE [13:13:39.290] - force: TRUE [13:13:39.290] - relayed: [n=2] FALSE, FALSE [13:13:39.290] - queued futures: [n=2] FALSE, FALSE [13:13:39.290] - until=1 [13:13:39.290] - relaying element #1 [13:13:39.290] - relayed: [n=2] TRUE, FALSE [13:13:39.291] - queued futures: [n=2] TRUE, FALSE [13:13:39.291] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:39.291] length: 1 (resolved future 1) [13:13:39.291] resolved() for 'SequentialFuture' ... [13:13:39.291] - state: 'finished' [13:13:39.292] - run: TRUE [13:13:39.292] - result: 'FutureResult' [13:13:39.292] resolved() for 'SequentialFuture' ... done [13:13:39.292] Future #2 [13:13:39.293] signalConditionsASAP(SequentialFuture, pos=2) ... [13:13:39.293] - nx: 2 [13:13:39.294] - relay: TRUE [13:13:39.294] - stdout: TRUE [13:13:39.294] - signal: TRUE [13:13:39.294] - resignal: FALSE [13:13:39.294] - force: TRUE [13:13:39.294] - relayed: [n=2] TRUE, FALSE [13:13:39.294] - queued futures: [n=2] TRUE, FALSE [13:13:39.295] - until=2 [13:13:39.295] - relaying element #2 [13:13:39.295] - relayed: [n=2] TRUE, TRUE [13:13:39.295] - queued futures: [n=2] TRUE, TRUE [13:13:39.295] signalConditionsASAP(SequentialFuture, pos=2) ... done [13:13:39.296] length: 0 (resolved future 2) [13:13:39.296] Relaying remaining futures [13:13:39.296] signalConditionsASAP(NULL, pos=0) ... [13:13:39.296] - nx: 2 [13:13:39.296] - relay: TRUE [13:13:39.296] - stdout: TRUE [13:13:39.296] - signal: TRUE [13:13:39.297] - resignal: FALSE [13:13:39.297] - force: TRUE [13:13:39.297] - relayed: [n=2] TRUE, TRUE [13:13:39.297] - queued futures: [n=2] TRUE, TRUE - flush all [13:13:39.297] - relayed: [n=2] TRUE, TRUE [13:13:39.297] - queued futures: [n=2] TRUE, TRUE [13:13:39.298] signalConditionsASAP(NULL, pos=0) ... done [13:13:39.298] resolve() on list ... DONE [13:13:39.298] - Number of value chunks collected: 2 [13:13:39.298] Resolving 2 futures (chunks) ... DONE [13:13:39.298] Reducing values from 2 chunks ... [13:13:39.299] - Number of values collected after concatenation: 2 [13:13:39.299] - Number of values expected: 2 [13:13:39.299] Reducing values from 2 chunks ... DONE [13:13:39.299] 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, ...) ... [13:13:39.301] future_lapply() ... [13:13:39.302] Number of chunks: 1 [13:13:39.302] getGlobalsAndPackagesXApply() ... [13:13:39.302] - future.globals: TRUE [13:13:39.302] getGlobalsAndPackages() ... [13:13:39.302] Searching for globals... [13:13:39.304] - globals found: [2] 'FUN', '.Internal' [13:13:39.304] Searching for globals ... DONE [13:13:39.304] Resolving globals: FALSE [13:13:39.305] The total size of the 1 globals is 2.13 KiB (2184 bytes) [13:13:39.305] 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') [13:13:39.305] - globals: [1] 'FUN' [13:13:39.305] [13:13:39.306] getGlobalsAndPackages() ... DONE [13:13:39.306] - globals found/used: [n=1] 'FUN' [13:13:39.306] - needed namespaces: [n=0] [13:13:39.306] Finding globals ... DONE [13:13:39.306] - use_args: TRUE [13:13:39.306] - Getting '...' globals ... [13:13:39.307] resolve() on list ... [13:13:39.307] recursive: 0 [13:13:39.307] length: 1 [13:13:39.307] elements: '...' [13:13:39.307] length: 0 (resolved future 1) [13:13:39.308] resolve() on list ... DONE [13:13:39.308] - '...' content: [n=1] 'length' [13:13:39.308] List of 1 [13:13:39.308] $ ...:List of 1 [13:13:39.308] ..$ length: int 2 [13:13:39.308] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:39.308] - attr(*, "where")=List of 1 [13:13:39.308] ..$ ...: [13:13:39.308] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:39.308] - attr(*, "resolved")= logi TRUE [13:13:39.308] - attr(*, "total_size")= num NA [13:13:39.311] - Getting '...' globals ... DONE [13:13:39.312] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:39.312] List of 2 [13:13:39.312] $ ...future.FUN:function (mode = "logical", length = 0L) [13:13:39.312] $ ... :List of 1 [13:13:39.312] ..$ length: int 2 [13:13:39.312] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:39.312] - attr(*, "where")=List of 2 [13:13:39.312] ..$ ...future.FUN: [13:13:39.312] ..$ ... : [13:13:39.312] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:39.312] - attr(*, "resolved")= logi FALSE [13:13:39.312] - attr(*, "total_size")= num 2240 [13:13:39.315] Packages to be attached in all futures: [n=0] [13:13:39.316] getGlobalsAndPackagesXApply() ... DONE [13:13:39.316] Number of futures (= number of chunks): 1 [13:13:39.316] Launching 1 futures (chunks) ... [13:13:39.316] Chunk #1 of 1 ... [13:13:39.316] - Finding globals in 'X' for chunk #1 ... [13:13:39.317] getGlobalsAndPackages() ... [13:13:39.317] Searching for globals... [13:13:39.318] [13:13:39.318] Searching for globals ... DONE [13:13:39.318] - globals: [0] [13:13:39.318] getGlobalsAndPackages() ... DONE [13:13:39.318] + additional globals found: [n=0] [13:13:39.318] + additional namespaces needed: [n=0] [13:13:39.319] - Finding globals in 'X' for chunk #1 ... DONE [13:13:39.319] - seeds: [13:13:39.319] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:39.319] getGlobalsAndPackages() ... [13:13:39.319] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:39.320] Resolving globals: FALSE [13:13:39.320] Tweak future expression to call with '...' arguments ... [13:13:39.320] { [13:13:39.320] do.call(function(...) { [13:13:39.320] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:39.320] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:39.320] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:39.320] on.exit(options(oopts), add = TRUE) [13:13:39.320] } [13:13:39.320] { [13:13:39.320] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:39.320] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:39.320] ...future.FUN(...future.X_jj, ...) [13:13:39.320] }) [13:13:39.320] } [13:13:39.320] }, args = future.call.arguments) [13:13:39.320] } [13:13:39.320] Tweak future expression to call with '...' arguments ... DONE [13:13:39.321] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:39.321] [13:13:39.321] getGlobalsAndPackages() ... DONE [13:13:39.321] run() for 'Future' ... [13:13:39.322] - state: 'created' [13:13:39.322] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:13:39.322] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:39.322] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:39.323] - Field: 'label' [13:13:39.323] - Field: 'local' [13:13:39.323] - Field: 'owner' [13:13:39.323] - Field: 'envir' [13:13:39.323] - Field: 'packages' [13:13:39.323] - Field: 'gc' [13:13:39.324] - Field: 'conditions' [13:13:39.324] - Field: 'expr' [13:13:39.324] - Field: 'uuid' [13:13:39.324] - Field: 'seed' [13:13:39.324] - Field: 'version' [13:13:39.324] - Field: 'result' [13:13:39.325] - Field: 'asynchronous' [13:13:39.325] - Field: 'calls' [13:13:39.325] - Field: 'globals' [13:13:39.325] - Field: 'stdout' [13:13:39.325] - Field: 'earlySignal' [13:13:39.326] - Field: 'lazy' [13:13:39.326] - Field: 'state' [13:13:39.326] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:39.326] - Launch lazy future ... [13:13:39.326] Packages needed by the future expression (n = 0): [13:13:39.326] Packages needed by future strategies (n = 0): [13:13:39.327] { [13:13:39.327] { [13:13:39.327] { [13:13:39.327] ...future.startTime <- base::Sys.time() [13:13:39.327] { [13:13:39.327] { [13:13:39.327] { [13:13:39.327] base::local({ [13:13:39.327] has_future <- base::requireNamespace("future", [13:13:39.327] quietly = TRUE) [13:13:39.327] if (has_future) { [13:13:39.327] ns <- base::getNamespace("future") [13:13:39.327] version <- ns[[".package"]][["version"]] [13:13:39.327] if (is.null(version)) [13:13:39.327] version <- utils::packageVersion("future") [13:13:39.327] } [13:13:39.327] else { [13:13:39.327] version <- NULL [13:13:39.327] } [13:13:39.327] if (!has_future || version < "1.8.0") { [13:13:39.327] info <- base::c(r_version = base::gsub("R version ", [13:13:39.327] "", base::R.version$version.string), [13:13:39.327] platform = base::sprintf("%s (%s-bit)", [13:13:39.327] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:39.327] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:39.327] "release", "version")], collapse = " "), [13:13:39.327] hostname = base::Sys.info()[["nodename"]]) [13:13:39.327] info <- base::sprintf("%s: %s", base::names(info), [13:13:39.327] info) [13:13:39.327] info <- base::paste(info, collapse = "; ") [13:13:39.327] if (!has_future) { [13:13:39.327] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:39.327] info) [13:13:39.327] } [13:13:39.327] else { [13:13:39.327] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:39.327] info, version) [13:13:39.327] } [13:13:39.327] base::stop(msg) [13:13:39.327] } [13:13:39.327] }) [13:13:39.327] } [13:13:39.327] options(future.plan = NULL) [13:13:39.327] Sys.unsetenv("R_FUTURE_PLAN") [13:13:39.327] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:39.327] } [13:13:39.327] ...future.workdir <- getwd() [13:13:39.327] } [13:13:39.327] ...future.oldOptions <- base::as.list(base::.Options) [13:13:39.327] ...future.oldEnvVars <- base::Sys.getenv() [13:13:39.327] } [13:13:39.327] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:39.327] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:39.327] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:39.327] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:39.327] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:39.327] future.stdout.windows.reencode = NULL, width = 80L) [13:13:39.327] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:39.327] base::names(...future.oldOptions)) [13:13:39.327] } [13:13:39.327] if (FALSE) { [13:13:39.327] } [13:13:39.327] else { [13:13:39.327] if (TRUE) { [13:13:39.327] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:39.327] open = "w") [13:13:39.327] } [13:13:39.327] else { [13:13:39.327] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:39.327] windows = "NUL", "/dev/null"), open = "w") [13:13:39.327] } [13:13:39.327] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:39.327] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:39.327] base::sink(type = "output", split = FALSE) [13:13:39.327] base::close(...future.stdout) [13:13:39.327] }, add = TRUE) [13:13:39.327] } [13:13:39.327] ...future.frame <- base::sys.nframe() [13:13:39.327] ...future.conditions <- base::list() [13:13:39.327] ...future.rng <- base::globalenv()$.Random.seed [13:13:39.327] if (FALSE) { [13:13:39.327] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:39.327] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:39.327] } [13:13:39.327] ...future.result <- base::tryCatch({ [13:13:39.327] base::withCallingHandlers({ [13:13:39.327] ...future.value <- base::withVisible(base::local({ [13:13:39.327] do.call(function(...) { [13:13:39.327] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:39.327] if (!identical(...future.globals.maxSize.org, [13:13:39.327] ...future.globals.maxSize)) { [13:13:39.327] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:39.327] on.exit(options(oopts), add = TRUE) [13:13:39.327] } [13:13:39.327] { [13:13:39.327] lapply(seq_along(...future.elements_ii), [13:13:39.327] FUN = function(jj) { [13:13:39.327] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:39.327] ...future.FUN(...future.X_jj, ...) [13:13:39.327] }) [13:13:39.327] } [13:13:39.327] }, args = future.call.arguments) [13:13:39.327] })) [13:13:39.327] future::FutureResult(value = ...future.value$value, [13:13:39.327] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:39.327] ...future.rng), globalenv = if (FALSE) [13:13:39.327] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:39.327] ...future.globalenv.names)) [13:13:39.327] else NULL, started = ...future.startTime, version = "1.8") [13:13:39.327] }, condition = base::local({ [13:13:39.327] c <- base::c [13:13:39.327] inherits <- base::inherits [13:13:39.327] invokeRestart <- base::invokeRestart [13:13:39.327] length <- base::length [13:13:39.327] list <- base::list [13:13:39.327] seq.int <- base::seq.int [13:13:39.327] signalCondition <- base::signalCondition [13:13:39.327] sys.calls <- base::sys.calls [13:13:39.327] `[[` <- base::`[[` [13:13:39.327] `+` <- base::`+` [13:13:39.327] `<<-` <- base::`<<-` [13:13:39.327] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:39.327] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:39.327] 3L)] [13:13:39.327] } [13:13:39.327] function(cond) { [13:13:39.327] is_error <- inherits(cond, "error") [13:13:39.327] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:39.327] NULL) [13:13:39.327] if (is_error) { [13:13:39.327] sessionInformation <- function() { [13:13:39.327] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:39.327] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:39.327] search = base::search(), system = base::Sys.info()) [13:13:39.327] } [13:13:39.327] ...future.conditions[[length(...future.conditions) + [13:13:39.327] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:39.327] cond$call), session = sessionInformation(), [13:13:39.327] timestamp = base::Sys.time(), signaled = 0L) [13:13:39.327] signalCondition(cond) [13:13:39.327] } [13:13:39.327] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:39.327] "immediateCondition"))) { [13:13:39.327] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:39.327] ...future.conditions[[length(...future.conditions) + [13:13:39.327] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:39.327] if (TRUE && !signal) { [13:13:39.327] muffleCondition <- function (cond, pattern = "^muffle") [13:13:39.327] { [13:13:39.327] inherits <- base::inherits [13:13:39.327] invokeRestart <- base::invokeRestart [13:13:39.327] is.null <- base::is.null [13:13:39.327] muffled <- FALSE [13:13:39.327] if (inherits(cond, "message")) { [13:13:39.327] muffled <- grepl(pattern, "muffleMessage") [13:13:39.327] if (muffled) [13:13:39.327] invokeRestart("muffleMessage") [13:13:39.327] } [13:13:39.327] else if (inherits(cond, "warning")) { [13:13:39.327] muffled <- grepl(pattern, "muffleWarning") [13:13:39.327] if (muffled) [13:13:39.327] invokeRestart("muffleWarning") [13:13:39.327] } [13:13:39.327] else if (inherits(cond, "condition")) { [13:13:39.327] if (!is.null(pattern)) { [13:13:39.327] computeRestarts <- base::computeRestarts [13:13:39.327] grepl <- base::grepl [13:13:39.327] restarts <- computeRestarts(cond) [13:13:39.327] for (restart in restarts) { [13:13:39.327] name <- restart$name [13:13:39.327] if (is.null(name)) [13:13:39.327] next [13:13:39.327] if (!grepl(pattern, name)) [13:13:39.327] next [13:13:39.327] invokeRestart(restart) [13:13:39.327] muffled <- TRUE [13:13:39.327] break [13:13:39.327] } [13:13:39.327] } [13:13:39.327] } [13:13:39.327] invisible(muffled) [13:13:39.327] } [13:13:39.327] muffleCondition(cond, pattern = "^muffle") [13:13:39.327] } [13:13:39.327] } [13:13:39.327] else { [13:13:39.327] if (TRUE) { [13:13:39.327] muffleCondition <- function (cond, pattern = "^muffle") [13:13:39.327] { [13:13:39.327] inherits <- base::inherits [13:13:39.327] invokeRestart <- base::invokeRestart [13:13:39.327] is.null <- base::is.null [13:13:39.327] muffled <- FALSE [13:13:39.327] if (inherits(cond, "message")) { [13:13:39.327] muffled <- grepl(pattern, "muffleMessage") [13:13:39.327] if (muffled) [13:13:39.327] invokeRestart("muffleMessage") [13:13:39.327] } [13:13:39.327] else if (inherits(cond, "warning")) { [13:13:39.327] muffled <- grepl(pattern, "muffleWarning") [13:13:39.327] if (muffled) [13:13:39.327] invokeRestart("muffleWarning") [13:13:39.327] } [13:13:39.327] else if (inherits(cond, "condition")) { [13:13:39.327] if (!is.null(pattern)) { [13:13:39.327] computeRestarts <- base::computeRestarts [13:13:39.327] grepl <- base::grepl [13:13:39.327] restarts <- computeRestarts(cond) [13:13:39.327] for (restart in restarts) { [13:13:39.327] name <- restart$name [13:13:39.327] if (is.null(name)) [13:13:39.327] next [13:13:39.327] if (!grepl(pattern, name)) [13:13:39.327] next [13:13:39.327] invokeRestart(restart) [13:13:39.327] muffled <- TRUE [13:13:39.327] break [13:13:39.327] } [13:13:39.327] } [13:13:39.327] } [13:13:39.327] invisible(muffled) [13:13:39.327] } [13:13:39.327] muffleCondition(cond, pattern = "^muffle") [13:13:39.327] } [13:13:39.327] } [13:13:39.327] } [13:13:39.327] })) [13:13:39.327] }, error = function(ex) { [13:13:39.327] base::structure(base::list(value = NULL, visible = NULL, [13:13:39.327] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:39.327] ...future.rng), started = ...future.startTime, [13:13:39.327] finished = Sys.time(), session_uuid = NA_character_, [13:13:39.327] version = "1.8"), class = "FutureResult") [13:13:39.327] }, finally = { [13:13:39.327] if (!identical(...future.workdir, getwd())) [13:13:39.327] setwd(...future.workdir) [13:13:39.327] { [13:13:39.327] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:39.327] ...future.oldOptions$nwarnings <- NULL [13:13:39.327] } [13:13:39.327] base::options(...future.oldOptions) [13:13:39.327] if (.Platform$OS.type == "windows") { [13:13:39.327] old_names <- names(...future.oldEnvVars) [13:13:39.327] envs <- base::Sys.getenv() [13:13:39.327] names <- names(envs) [13:13:39.327] common <- intersect(names, old_names) [13:13:39.327] added <- setdiff(names, old_names) [13:13:39.327] removed <- setdiff(old_names, names) [13:13:39.327] changed <- common[...future.oldEnvVars[common] != [13:13:39.327] envs[common]] [13:13:39.327] NAMES <- toupper(changed) [13:13:39.327] args <- list() [13:13:39.327] for (kk in seq_along(NAMES)) { [13:13:39.327] name <- changed[[kk]] [13:13:39.327] NAME <- NAMES[[kk]] [13:13:39.327] if (name != NAME && is.element(NAME, old_names)) [13:13:39.327] next [13:13:39.327] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:39.327] } [13:13:39.327] NAMES <- toupper(added) [13:13:39.327] for (kk in seq_along(NAMES)) { [13:13:39.327] name <- added[[kk]] [13:13:39.327] NAME <- NAMES[[kk]] [13:13:39.327] if (name != NAME && is.element(NAME, old_names)) [13:13:39.327] next [13:13:39.327] args[[name]] <- "" [13:13:39.327] } [13:13:39.327] NAMES <- toupper(removed) [13:13:39.327] for (kk in seq_along(NAMES)) { [13:13:39.327] name <- removed[[kk]] [13:13:39.327] NAME <- NAMES[[kk]] [13:13:39.327] if (name != NAME && is.element(NAME, old_names)) [13:13:39.327] next [13:13:39.327] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:39.327] } [13:13:39.327] if (length(args) > 0) [13:13:39.327] base::do.call(base::Sys.setenv, args = args) [13:13:39.327] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:39.327] } [13:13:39.327] else { [13:13:39.327] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:39.327] } [13:13:39.327] { [13:13:39.327] if (base::length(...future.futureOptionsAdded) > [13:13:39.327] 0L) { [13:13:39.327] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:39.327] base::names(opts) <- ...future.futureOptionsAdded [13:13:39.327] base::options(opts) [13:13:39.327] } [13:13:39.327] { [13:13:39.327] { [13:13:39.327] NULL [13:13:39.327] RNGkind("Mersenne-Twister") [13:13:39.327] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:39.327] inherits = FALSE) [13:13:39.327] } [13:13:39.327] options(future.plan = NULL) [13:13:39.327] if (is.na(NA_character_)) [13:13:39.327] Sys.unsetenv("R_FUTURE_PLAN") [13:13:39.327] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:39.327] future::plan(list(function (..., envir = parent.frame()) [13:13:39.327] { [13:13:39.327] future <- SequentialFuture(..., envir = envir) [13:13:39.327] if (!future$lazy) [13:13:39.327] future <- run(future) [13:13:39.327] invisible(future) [13:13:39.327] }), .cleanup = FALSE, .init = FALSE) [13:13:39.327] } [13:13:39.327] } [13:13:39.327] } [13:13:39.327] }) [13:13:39.327] if (TRUE) { [13:13:39.327] base::sink(type = "output", split = FALSE) [13:13:39.327] if (TRUE) { [13:13:39.327] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:39.327] } [13:13:39.327] else { [13:13:39.327] ...future.result["stdout"] <- base::list(NULL) [13:13:39.327] } [13:13:39.327] base::close(...future.stdout) [13:13:39.327] ...future.stdout <- NULL [13:13:39.327] } [13:13:39.327] ...future.result$conditions <- ...future.conditions [13:13:39.327] ...future.result$finished <- base::Sys.time() [13:13:39.327] ...future.result [13:13:39.327] } [13:13:39.331] assign_globals() ... [13:13:39.331] List of 5 [13:13:39.331] $ ...future.FUN :function (mode = "logical", length = 0L) [13:13:39.331] $ future.call.arguments :List of 1 [13:13:39.331] ..$ length: int 2 [13:13:39.331] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:39.331] $ ...future.elements_ii :List of 4 [13:13:39.331] ..$ a: chr "integer" [13:13:39.331] ..$ b: chr "numeric" [13:13:39.331] ..$ c: chr "character" [13:13:39.331] ..$ c: chr "list" [13:13:39.331] $ ...future.seeds_ii : NULL [13:13:39.331] $ ...future.globals.maxSize: NULL [13:13:39.331] - attr(*, "where")=List of 5 [13:13:39.331] ..$ ...future.FUN : [13:13:39.331] ..$ future.call.arguments : [13:13:39.331] ..$ ...future.elements_ii : [13:13:39.331] ..$ ...future.seeds_ii : [13:13:39.331] ..$ ...future.globals.maxSize: [13:13:39.331] - attr(*, "resolved")= logi FALSE [13:13:39.331] - attr(*, "total_size")= num 2240 [13:13:39.331] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:39.331] - attr(*, "already-done")= logi TRUE [13:13:39.338] - copied '...future.FUN' to environment [13:13:39.338] - copied 'future.call.arguments' to environment [13:13:39.338] - copied '...future.elements_ii' to environment [13:13:39.338] - copied '...future.seeds_ii' to environment [13:13:39.338] - copied '...future.globals.maxSize' to environment [13:13:39.339] assign_globals() ... done [13:13:39.339] plan(): Setting new future strategy stack: [13:13:39.339] List of future strategies: [13:13:39.339] 1. sequential: [13:13:39.339] - args: function (..., envir = parent.frame(), workers = "") [13:13:39.339] - tweaked: FALSE [13:13:39.339] - call: NULL [13:13:39.340] plan(): nbrOfWorkers() = 1 [13:13:39.341] plan(): Setting new future strategy stack: [13:13:39.341] List of future strategies: [13:13:39.341] 1. sequential: [13:13:39.341] - args: function (..., envir = parent.frame(), workers = "") [13:13:39.341] - tweaked: FALSE [13:13:39.341] - call: plan(strategy) [13:13:39.342] plan(): nbrOfWorkers() = 1 [13:13:39.342] SequentialFuture started (and completed) [13:13:39.342] - Launch lazy future ... done [13:13:39.342] run() for 'SequentialFuture' ... done [13:13:39.342] Created future: [13:13:39.343] SequentialFuture: [13:13:39.343] Label: 'future_lapply-1' [13:13:39.343] Expression: [13:13:39.343] { [13:13:39.343] do.call(function(...) { [13:13:39.343] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:39.343] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:39.343] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:39.343] on.exit(options(oopts), add = TRUE) [13:13:39.343] } [13:13:39.343] { [13:13:39.343] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:39.343] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:39.343] ...future.FUN(...future.X_jj, ...) [13:13:39.343] }) [13:13:39.343] } [13:13:39.343] }, args = future.call.arguments) [13:13:39.343] } [13:13:39.343] Lazy evaluation: FALSE [13:13:39.343] Asynchronous evaluation: FALSE [13:13:39.343] Local evaluation: TRUE [13:13:39.343] Environment: R_GlobalEnv [13:13:39.343] Capture standard output: TRUE [13:13:39.343] Capture condition classes: 'condition' (excluding 'nothing') [13:13:39.343] 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) [13:13:39.343] Packages: [13:13:39.343] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:39.343] Resolved: TRUE [13:13:39.343] Value: 240 bytes of class 'list' [13:13:39.343] Early signaling: FALSE [13:13:39.343] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:39.343] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:39.344] Chunk #1 of 1 ... DONE [13:13:39.344] Launching 1 futures (chunks) ... DONE [13:13:39.344] Resolving 1 futures (chunks) ... [13:13:39.344] resolve() on list ... [13:13:39.345] recursive: 0 [13:13:39.345] length: 1 [13:13:39.345] [13:13:39.345] resolved() for 'SequentialFuture' ... [13:13:39.345] - state: 'finished' [13:13:39.345] - run: TRUE [13:13:39.346] - result: 'FutureResult' [13:13:39.346] resolved() for 'SequentialFuture' ... done [13:13:39.346] Future #1 [13:13:39.347] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:39.347] - nx: 1 [13:13:39.347] - relay: TRUE [13:13:39.347] - stdout: TRUE [13:13:39.348] - signal: TRUE [13:13:39.348] - resignal: FALSE [13:13:39.348] - force: TRUE [13:13:39.348] - relayed: [n=1] FALSE [13:13:39.348] - queued futures: [n=1] FALSE [13:13:39.348] - until=1 [13:13:39.348] - relaying element #1 [13:13:39.349] - relayed: [n=1] TRUE [13:13:39.349] - queued futures: [n=1] TRUE [13:13:39.349] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:39.349] length: 0 (resolved future 1) [13:13:39.349] Relaying remaining futures [13:13:39.350] signalConditionsASAP(NULL, pos=0) ... [13:13:39.350] - nx: 1 [13:13:39.350] - relay: TRUE [13:13:39.350] - stdout: TRUE [13:13:39.350] - signal: TRUE [13:13:39.350] - resignal: FALSE [13:13:39.350] - force: TRUE [13:13:39.351] - relayed: [n=1] TRUE [13:13:39.351] - queued futures: [n=1] TRUE - flush all [13:13:39.351] - relayed: [n=1] TRUE [13:13:39.351] - queued futures: [n=1] TRUE [13:13:39.351] signalConditionsASAP(NULL, pos=0) ... done [13:13:39.351] resolve() on list ... DONE [13:13:39.352] - Number of value chunks collected: 1 [13:13:39.352] Resolving 1 futures (chunks) ... DONE [13:13:39.352] Reducing values from 1 chunks ... [13:13:39.352] - Number of values collected after concatenation: 4 [13:13:39.352] - Number of values expected: 4 [13:13:39.352] Reducing values from 1 chunks ... DONE [13:13:39.353] 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 [13:13:39.355] future_lapply() ... [13:13:39.356] Number of chunks: 1 [13:13:39.356] getGlobalsAndPackagesXApply() ... [13:13:39.356] - future.globals: TRUE [13:13:39.356] getGlobalsAndPackages() ... [13:13:39.356] Searching for globals... [13:13:39.358] - globals found: [2] 'FUN', '.Internal' [13:13:39.358] Searching for globals ... DONE [13:13:39.358] Resolving globals: FALSE [13:13:39.359] The total size of the 1 globals is 2.13 KiB (2184 bytes) [13:13:39.359] 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') [13:13:39.359] - globals: [1] 'FUN' [13:13:39.359] [13:13:39.360] getGlobalsAndPackages() ... DONE [13:13:39.360] - globals found/used: [n=1] 'FUN' [13:13:39.360] - needed namespaces: [n=0] [13:13:39.360] Finding globals ... DONE [13:13:39.360] - use_args: TRUE [13:13:39.360] - Getting '...' globals ... [13:13:39.361] resolve() on list ... [13:13:39.361] recursive: 0 [13:13:39.361] length: 1 [13:13:39.361] elements: '...' [13:13:39.361] length: 0 (resolved future 1) [13:13:39.362] resolve() on list ... DONE [13:13:39.362] - '...' content: [n=1] 'length' [13:13:39.362] List of 1 [13:13:39.362] $ ...:List of 1 [13:13:39.362] ..$ length: int 2 [13:13:39.362] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:39.362] - attr(*, "where")=List of 1 [13:13:39.362] ..$ ...: [13:13:39.362] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:39.362] - attr(*, "resolved")= logi TRUE [13:13:39.362] - attr(*, "total_size")= num NA [13:13:39.365] - Getting '...' globals ... DONE [13:13:39.366] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:39.366] List of 2 [13:13:39.366] $ ...future.FUN:function (mode = "logical", length = 0L) [13:13:39.366] $ ... :List of 1 [13:13:39.366] ..$ length: int 2 [13:13:39.366] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:39.366] - attr(*, "where")=List of 2 [13:13:39.366] ..$ ...future.FUN: [13:13:39.366] ..$ ... : [13:13:39.366] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:39.366] - attr(*, "resolved")= logi FALSE [13:13:39.366] - attr(*, "total_size")= num 2240 [13:13:39.369] Packages to be attached in all futures: [n=0] [13:13:39.370] getGlobalsAndPackagesXApply() ... DONE [13:13:39.370] Number of futures (= number of chunks): 1 [13:13:39.371] Launching 1 futures (chunks) ... [13:13:39.371] Chunk #1 of 1 ... [13:13:39.371] - Finding globals in 'X' for chunk #1 ... [13:13:39.371] getGlobalsAndPackages() ... [13:13:39.371] Searching for globals... [13:13:39.372] [13:13:39.372] Searching for globals ... DONE [13:13:39.372] - globals: [0] [13:13:39.372] getGlobalsAndPackages() ... DONE [13:13:39.372] + additional globals found: [n=0] [13:13:39.372] + additional namespaces needed: [n=0] [13:13:39.373] - Finding globals in 'X' for chunk #1 ... DONE [13:13:39.373] - seeds: [13:13:39.373] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:39.373] getGlobalsAndPackages() ... [13:13:39.373] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:39.373] Resolving globals: FALSE [13:13:39.374] Tweak future expression to call with '...' arguments ... [13:13:39.374] { [13:13:39.374] do.call(function(...) { [13:13:39.374] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:39.374] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:39.374] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:39.374] on.exit(options(oopts), add = TRUE) [13:13:39.374] } [13:13:39.374] { [13:13:39.374] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:39.374] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:39.374] ...future.FUN(...future.X_jj, ...) [13:13:39.374] }) [13:13:39.374] } [13:13:39.374] }, args = future.call.arguments) [13:13:39.374] } [13:13:39.374] Tweak future expression to call with '...' arguments ... DONE [13:13:39.375] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:39.375] [13:13:39.375] getGlobalsAndPackages() ... DONE [13:13:39.375] run() for 'Future' ... [13:13:39.376] - state: 'created' [13:13:39.376] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:13:39.376] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:39.376] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:39.377] - Field: 'label' [13:13:39.377] - Field: 'local' [13:13:39.377] - Field: 'owner' [13:13:39.377] - Field: 'envir' [13:13:39.377] - Field: 'packages' [13:13:39.377] - Field: 'gc' [13:13:39.378] - Field: 'conditions' [13:13:39.378] - Field: 'expr' [13:13:39.378] - Field: 'uuid' [13:13:39.378] - Field: 'seed' [13:13:39.378] - Field: 'version' [13:13:39.378] - Field: 'result' [13:13:39.379] - Field: 'asynchronous' [13:13:39.379] - Field: 'calls' [13:13:39.379] - Field: 'globals' [13:13:39.379] - Field: 'stdout' [13:13:39.379] - Field: 'earlySignal' [13:13:39.379] - Field: 'lazy' [13:13:39.380] - Field: 'state' [13:13:39.380] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:39.380] - Launch lazy future ... [13:13:39.380] Packages needed by the future expression (n = 0): [13:13:39.380] Packages needed by future strategies (n = 0): [13:13:39.381] { [13:13:39.381] { [13:13:39.381] { [13:13:39.381] ...future.startTime <- base::Sys.time() [13:13:39.381] { [13:13:39.381] { [13:13:39.381] { [13:13:39.381] base::local({ [13:13:39.381] has_future <- base::requireNamespace("future", [13:13:39.381] quietly = TRUE) [13:13:39.381] if (has_future) { [13:13:39.381] ns <- base::getNamespace("future") [13:13:39.381] version <- ns[[".package"]][["version"]] [13:13:39.381] if (is.null(version)) [13:13:39.381] version <- utils::packageVersion("future") [13:13:39.381] } [13:13:39.381] else { [13:13:39.381] version <- NULL [13:13:39.381] } [13:13:39.381] if (!has_future || version < "1.8.0") { [13:13:39.381] info <- base::c(r_version = base::gsub("R version ", [13:13:39.381] "", base::R.version$version.string), [13:13:39.381] platform = base::sprintf("%s (%s-bit)", [13:13:39.381] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:39.381] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:39.381] "release", "version")], collapse = " "), [13:13:39.381] hostname = base::Sys.info()[["nodename"]]) [13:13:39.381] info <- base::sprintf("%s: %s", base::names(info), [13:13:39.381] info) [13:13:39.381] info <- base::paste(info, collapse = "; ") [13:13:39.381] if (!has_future) { [13:13:39.381] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:39.381] info) [13:13:39.381] } [13:13:39.381] else { [13:13:39.381] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:39.381] info, version) [13:13:39.381] } [13:13:39.381] base::stop(msg) [13:13:39.381] } [13:13:39.381] }) [13:13:39.381] } [13:13:39.381] options(future.plan = NULL) [13:13:39.381] Sys.unsetenv("R_FUTURE_PLAN") [13:13:39.381] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:39.381] } [13:13:39.381] ...future.workdir <- getwd() [13:13:39.381] } [13:13:39.381] ...future.oldOptions <- base::as.list(base::.Options) [13:13:39.381] ...future.oldEnvVars <- base::Sys.getenv() [13:13:39.381] } [13:13:39.381] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:39.381] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:39.381] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:39.381] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:39.381] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:39.381] future.stdout.windows.reencode = NULL, width = 80L) [13:13:39.381] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:39.381] base::names(...future.oldOptions)) [13:13:39.381] } [13:13:39.381] if (FALSE) { [13:13:39.381] } [13:13:39.381] else { [13:13:39.381] if (TRUE) { [13:13:39.381] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:39.381] open = "w") [13:13:39.381] } [13:13:39.381] else { [13:13:39.381] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:39.381] windows = "NUL", "/dev/null"), open = "w") [13:13:39.381] } [13:13:39.381] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:39.381] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:39.381] base::sink(type = "output", split = FALSE) [13:13:39.381] base::close(...future.stdout) [13:13:39.381] }, add = TRUE) [13:13:39.381] } [13:13:39.381] ...future.frame <- base::sys.nframe() [13:13:39.381] ...future.conditions <- base::list() [13:13:39.381] ...future.rng <- base::globalenv()$.Random.seed [13:13:39.381] if (FALSE) { [13:13:39.381] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:39.381] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:39.381] } [13:13:39.381] ...future.result <- base::tryCatch({ [13:13:39.381] base::withCallingHandlers({ [13:13:39.381] ...future.value <- base::withVisible(base::local({ [13:13:39.381] do.call(function(...) { [13:13:39.381] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:39.381] if (!identical(...future.globals.maxSize.org, [13:13:39.381] ...future.globals.maxSize)) { [13:13:39.381] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:39.381] on.exit(options(oopts), add = TRUE) [13:13:39.381] } [13:13:39.381] { [13:13:39.381] lapply(seq_along(...future.elements_ii), [13:13:39.381] FUN = function(jj) { [13:13:39.381] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:39.381] ...future.FUN(...future.X_jj, ...) [13:13:39.381] }) [13:13:39.381] } [13:13:39.381] }, args = future.call.arguments) [13:13:39.381] })) [13:13:39.381] future::FutureResult(value = ...future.value$value, [13:13:39.381] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:39.381] ...future.rng), globalenv = if (FALSE) [13:13:39.381] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:39.381] ...future.globalenv.names)) [13:13:39.381] else NULL, started = ...future.startTime, version = "1.8") [13:13:39.381] }, condition = base::local({ [13:13:39.381] c <- base::c [13:13:39.381] inherits <- base::inherits [13:13:39.381] invokeRestart <- base::invokeRestart [13:13:39.381] length <- base::length [13:13:39.381] list <- base::list [13:13:39.381] seq.int <- base::seq.int [13:13:39.381] signalCondition <- base::signalCondition [13:13:39.381] sys.calls <- base::sys.calls [13:13:39.381] `[[` <- base::`[[` [13:13:39.381] `+` <- base::`+` [13:13:39.381] `<<-` <- base::`<<-` [13:13:39.381] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:39.381] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:39.381] 3L)] [13:13:39.381] } [13:13:39.381] function(cond) { [13:13:39.381] is_error <- inherits(cond, "error") [13:13:39.381] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:39.381] NULL) [13:13:39.381] if (is_error) { [13:13:39.381] sessionInformation <- function() { [13:13:39.381] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:39.381] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:39.381] search = base::search(), system = base::Sys.info()) [13:13:39.381] } [13:13:39.381] ...future.conditions[[length(...future.conditions) + [13:13:39.381] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:39.381] cond$call), session = sessionInformation(), [13:13:39.381] timestamp = base::Sys.time(), signaled = 0L) [13:13:39.381] signalCondition(cond) [13:13:39.381] } [13:13:39.381] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:39.381] "immediateCondition"))) { [13:13:39.381] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:39.381] ...future.conditions[[length(...future.conditions) + [13:13:39.381] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:39.381] if (TRUE && !signal) { [13:13:39.381] muffleCondition <- function (cond, pattern = "^muffle") [13:13:39.381] { [13:13:39.381] inherits <- base::inherits [13:13:39.381] invokeRestart <- base::invokeRestart [13:13:39.381] is.null <- base::is.null [13:13:39.381] muffled <- FALSE [13:13:39.381] if (inherits(cond, "message")) { [13:13:39.381] muffled <- grepl(pattern, "muffleMessage") [13:13:39.381] if (muffled) [13:13:39.381] invokeRestart("muffleMessage") [13:13:39.381] } [13:13:39.381] else if (inherits(cond, "warning")) { [13:13:39.381] muffled <- grepl(pattern, "muffleWarning") [13:13:39.381] if (muffled) [13:13:39.381] invokeRestart("muffleWarning") [13:13:39.381] } [13:13:39.381] else if (inherits(cond, "condition")) { [13:13:39.381] if (!is.null(pattern)) { [13:13:39.381] computeRestarts <- base::computeRestarts [13:13:39.381] grepl <- base::grepl [13:13:39.381] restarts <- computeRestarts(cond) [13:13:39.381] for (restart in restarts) { [13:13:39.381] name <- restart$name [13:13:39.381] if (is.null(name)) [13:13:39.381] next [13:13:39.381] if (!grepl(pattern, name)) [13:13:39.381] next [13:13:39.381] invokeRestart(restart) [13:13:39.381] muffled <- TRUE [13:13:39.381] break [13:13:39.381] } [13:13:39.381] } [13:13:39.381] } [13:13:39.381] invisible(muffled) [13:13:39.381] } [13:13:39.381] muffleCondition(cond, pattern = "^muffle") [13:13:39.381] } [13:13:39.381] } [13:13:39.381] else { [13:13:39.381] if (TRUE) { [13:13:39.381] muffleCondition <- function (cond, pattern = "^muffle") [13:13:39.381] { [13:13:39.381] inherits <- base::inherits [13:13:39.381] invokeRestart <- base::invokeRestart [13:13:39.381] is.null <- base::is.null [13:13:39.381] muffled <- FALSE [13:13:39.381] if (inherits(cond, "message")) { [13:13:39.381] muffled <- grepl(pattern, "muffleMessage") [13:13:39.381] if (muffled) [13:13:39.381] invokeRestart("muffleMessage") [13:13:39.381] } [13:13:39.381] else if (inherits(cond, "warning")) { [13:13:39.381] muffled <- grepl(pattern, "muffleWarning") [13:13:39.381] if (muffled) [13:13:39.381] invokeRestart("muffleWarning") [13:13:39.381] } [13:13:39.381] else if (inherits(cond, "condition")) { [13:13:39.381] if (!is.null(pattern)) { [13:13:39.381] computeRestarts <- base::computeRestarts [13:13:39.381] grepl <- base::grepl [13:13:39.381] restarts <- computeRestarts(cond) [13:13:39.381] for (restart in restarts) { [13:13:39.381] name <- restart$name [13:13:39.381] if (is.null(name)) [13:13:39.381] next [13:13:39.381] if (!grepl(pattern, name)) [13:13:39.381] next [13:13:39.381] invokeRestart(restart) [13:13:39.381] muffled <- TRUE [13:13:39.381] break [13:13:39.381] } [13:13:39.381] } [13:13:39.381] } [13:13:39.381] invisible(muffled) [13:13:39.381] } [13:13:39.381] muffleCondition(cond, pattern = "^muffle") [13:13:39.381] } [13:13:39.381] } [13:13:39.381] } [13:13:39.381] })) [13:13:39.381] }, error = function(ex) { [13:13:39.381] base::structure(base::list(value = NULL, visible = NULL, [13:13:39.381] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:39.381] ...future.rng), started = ...future.startTime, [13:13:39.381] finished = Sys.time(), session_uuid = NA_character_, [13:13:39.381] version = "1.8"), class = "FutureResult") [13:13:39.381] }, finally = { [13:13:39.381] if (!identical(...future.workdir, getwd())) [13:13:39.381] setwd(...future.workdir) [13:13:39.381] { [13:13:39.381] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:39.381] ...future.oldOptions$nwarnings <- NULL [13:13:39.381] } [13:13:39.381] base::options(...future.oldOptions) [13:13:39.381] if (.Platform$OS.type == "windows") { [13:13:39.381] old_names <- names(...future.oldEnvVars) [13:13:39.381] envs <- base::Sys.getenv() [13:13:39.381] names <- names(envs) [13:13:39.381] common <- intersect(names, old_names) [13:13:39.381] added <- setdiff(names, old_names) [13:13:39.381] removed <- setdiff(old_names, names) [13:13:39.381] changed <- common[...future.oldEnvVars[common] != [13:13:39.381] envs[common]] [13:13:39.381] NAMES <- toupper(changed) [13:13:39.381] args <- list() [13:13:39.381] for (kk in seq_along(NAMES)) { [13:13:39.381] name <- changed[[kk]] [13:13:39.381] NAME <- NAMES[[kk]] [13:13:39.381] if (name != NAME && is.element(NAME, old_names)) [13:13:39.381] next [13:13:39.381] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:39.381] } [13:13:39.381] NAMES <- toupper(added) [13:13:39.381] for (kk in seq_along(NAMES)) { [13:13:39.381] name <- added[[kk]] [13:13:39.381] NAME <- NAMES[[kk]] [13:13:39.381] if (name != NAME && is.element(NAME, old_names)) [13:13:39.381] next [13:13:39.381] args[[name]] <- "" [13:13:39.381] } [13:13:39.381] NAMES <- toupper(removed) [13:13:39.381] for (kk in seq_along(NAMES)) { [13:13:39.381] name <- removed[[kk]] [13:13:39.381] NAME <- NAMES[[kk]] [13:13:39.381] if (name != NAME && is.element(NAME, old_names)) [13:13:39.381] next [13:13:39.381] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:39.381] } [13:13:39.381] if (length(args) > 0) [13:13:39.381] base::do.call(base::Sys.setenv, args = args) [13:13:39.381] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:39.381] } [13:13:39.381] else { [13:13:39.381] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:39.381] } [13:13:39.381] { [13:13:39.381] if (base::length(...future.futureOptionsAdded) > [13:13:39.381] 0L) { [13:13:39.381] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:39.381] base::names(opts) <- ...future.futureOptionsAdded [13:13:39.381] base::options(opts) [13:13:39.381] } [13:13:39.381] { [13:13:39.381] { [13:13:39.381] NULL [13:13:39.381] RNGkind("Mersenne-Twister") [13:13:39.381] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:39.381] inherits = FALSE) [13:13:39.381] } [13:13:39.381] options(future.plan = NULL) [13:13:39.381] if (is.na(NA_character_)) [13:13:39.381] Sys.unsetenv("R_FUTURE_PLAN") [13:13:39.381] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:39.381] future::plan(list(function (..., envir = parent.frame()) [13:13:39.381] { [13:13:39.381] future <- SequentialFuture(..., envir = envir) [13:13:39.381] if (!future$lazy) [13:13:39.381] future <- run(future) [13:13:39.381] invisible(future) [13:13:39.381] }), .cleanup = FALSE, .init = FALSE) [13:13:39.381] } [13:13:39.381] } [13:13:39.381] } [13:13:39.381] }) [13:13:39.381] if (TRUE) { [13:13:39.381] base::sink(type = "output", split = FALSE) [13:13:39.381] if (TRUE) { [13:13:39.381] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:39.381] } [13:13:39.381] else { [13:13:39.381] ...future.result["stdout"] <- base::list(NULL) [13:13:39.381] } [13:13:39.381] base::close(...future.stdout) [13:13:39.381] ...future.stdout <- NULL [13:13:39.381] } [13:13:39.381] ...future.result$conditions <- ...future.conditions [13:13:39.381] ...future.result$finished <- base::Sys.time() [13:13:39.381] ...future.result [13:13:39.381] } [13:13:39.385] assign_globals() ... [13:13:39.385] List of 5 [13:13:39.385] $ ...future.FUN :function (mode = "logical", length = 0L) [13:13:39.385] $ future.call.arguments :List of 1 [13:13:39.385] ..$ length: int 2 [13:13:39.385] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:39.385] $ ...future.elements_ii :List of 4 [13:13:39.385] ..$ a: chr "integer" [13:13:39.385] ..$ b: chr "numeric" [13:13:39.385] ..$ c: chr "character" [13:13:39.385] ..$ c: chr "list" [13:13:39.385] $ ...future.seeds_ii : NULL [13:13:39.385] $ ...future.globals.maxSize: NULL [13:13:39.385] - attr(*, "where")=List of 5 [13:13:39.385] ..$ ...future.FUN : [13:13:39.385] ..$ future.call.arguments : [13:13:39.385] ..$ ...future.elements_ii : [13:13:39.385] ..$ ...future.seeds_ii : [13:13:39.385] ..$ ...future.globals.maxSize: [13:13:39.385] - attr(*, "resolved")= logi FALSE [13:13:39.385] - attr(*, "total_size")= num 2240 [13:13:39.385] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:39.385] - attr(*, "already-done")= logi TRUE [13:13:39.392] - copied '...future.FUN' to environment [13:13:39.392] - copied 'future.call.arguments' to environment [13:13:39.392] - copied '...future.elements_ii' to environment [13:13:39.392] - copied '...future.seeds_ii' to environment [13:13:39.393] - copied '...future.globals.maxSize' to environment [13:13:39.393] assign_globals() ... done [13:13:39.393] plan(): Setting new future strategy stack: [13:13:39.393] List of future strategies: [13:13:39.393] 1. sequential: [13:13:39.393] - args: function (..., envir = parent.frame(), workers = "") [13:13:39.393] - tweaked: FALSE [13:13:39.393] - call: NULL [13:13:39.394] plan(): nbrOfWorkers() = 1 [13:13:39.395] plan(): Setting new future strategy stack: [13:13:39.395] List of future strategies: [13:13:39.395] 1. sequential: [13:13:39.395] - args: function (..., envir = parent.frame(), workers = "") [13:13:39.395] - tweaked: FALSE [13:13:39.395] - call: plan(strategy) [13:13:39.396] plan(): nbrOfWorkers() = 1 [13:13:39.396] SequentialFuture started (and completed) [13:13:39.396] - Launch lazy future ... done [13:13:39.396] run() for 'SequentialFuture' ... done [13:13:39.397] Created future: [13:13:39.397] SequentialFuture: [13:13:39.397] Label: 'future_lapply-1' [13:13:39.397] Expression: [13:13:39.397] { [13:13:39.397] do.call(function(...) { [13:13:39.397] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:39.397] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:39.397] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:39.397] on.exit(options(oopts), add = TRUE) [13:13:39.397] } [13:13:39.397] { [13:13:39.397] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:39.397] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:39.397] ...future.FUN(...future.X_jj, ...) [13:13:39.397] }) [13:13:39.397] } [13:13:39.397] }, args = future.call.arguments) [13:13:39.397] } [13:13:39.397] Lazy evaluation: FALSE [13:13:39.397] Asynchronous evaluation: FALSE [13:13:39.397] Local evaluation: TRUE [13:13:39.397] Environment: R_GlobalEnv [13:13:39.397] Capture standard output: TRUE [13:13:39.397] Capture condition classes: 'condition' (excluding 'nothing') [13:13:39.397] 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) [13:13:39.397] Packages: [13:13:39.397] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:39.397] Resolved: TRUE [13:13:39.397] Value: 240 bytes of class 'list' [13:13:39.397] Early signaling: FALSE [13:13:39.397] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:39.397] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:39.398] Chunk #1 of 1 ... DONE [13:13:39.398] Launching 1 futures (chunks) ... DONE [13:13:39.398] Resolving 1 futures (chunks) ... [13:13:39.399] resolve() on list ... [13:13:39.399] recursive: 0 [13:13:39.399] length: 1 [13:13:39.399] [13:13:39.400] resolved() for 'SequentialFuture' ... [13:13:39.400] - state: 'finished' [13:13:39.400] - run: TRUE [13:13:39.401] - result: 'FutureResult' [13:13:39.401] resolved() for 'SequentialFuture' ... done [13:13:39.401] Future #1 [13:13:39.401] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:39.401] - nx: 1 [13:13:39.401] - relay: TRUE [13:13:39.402] - stdout: TRUE [13:13:39.402] - signal: TRUE [13:13:39.402] - resignal: FALSE [13:13:39.402] - force: TRUE [13:13:39.402] - relayed: [n=1] FALSE [13:13:39.402] - queued futures: [n=1] FALSE [13:13:39.402] - until=1 [13:13:39.403] - relaying element #1 [13:13:39.403] - relayed: [n=1] TRUE [13:13:39.403] - queued futures: [n=1] TRUE [13:13:39.403] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:39.403] length: 0 (resolved future 1) [13:13:39.404] Relaying remaining futures [13:13:39.404] signalConditionsASAP(NULL, pos=0) ... [13:13:39.404] - nx: 1 [13:13:39.404] - relay: TRUE [13:13:39.404] - stdout: TRUE [13:13:39.404] - signal: TRUE [13:13:39.404] - resignal: FALSE [13:13:39.405] - force: TRUE [13:13:39.405] - relayed: [n=1] TRUE [13:13:39.405] - queued futures: [n=1] TRUE - flush all [13:13:39.405] - relayed: [n=1] TRUE [13:13:39.405] - queued futures: [n=1] TRUE [13:13:39.405] signalConditionsASAP(NULL, pos=0) ... done [13:13:39.406] resolve() on list ... DONE [13:13:39.406] - Number of value chunks collected: 1 [13:13:39.406] Resolving 1 futures (chunks) ... DONE [13:13:39.406] Reducing values from 1 chunks ... [13:13:39.406] - Number of values collected after concatenation: 4 [13:13:39.406] - Number of values expected: 4 [13:13:39.407] Reducing values from 1 chunks ... DONE [13:13:39.407] 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, ...) ... [13:13:39.409] future_lapply() ... [13:13:39.410] Number of chunks: 1 [13:13:39.410] getGlobalsAndPackagesXApply() ... [13:13:39.410] - future.globals: TRUE [13:13:39.411] getGlobalsAndPackages() ... [13:13:39.411] Searching for globals... [13:13:39.412] - globals found: [2] 'FUN', '.Internal' [13:13:39.412] Searching for globals ... DONE [13:13:39.413] Resolving globals: FALSE [13:13:39.413] The total size of the 1 globals is 2.13 KiB (2184 bytes) [13:13:39.414] 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') [13:13:39.414] - globals: [1] 'FUN' [13:13:39.414] [13:13:39.414] getGlobalsAndPackages() ... DONE [13:13:39.414] - globals found/used: [n=1] 'FUN' [13:13:39.414] - needed namespaces: [n=0] [13:13:39.415] Finding globals ... DONE [13:13:39.415] - use_args: TRUE [13:13:39.415] - Getting '...' globals ... [13:13:39.415] resolve() on list ... [13:13:39.415] recursive: 0 [13:13:39.416] length: 1 [13:13:39.416] elements: '...' [13:13:39.416] length: 0 (resolved future 1) [13:13:39.416] resolve() on list ... DONE [13:13:39.416] - '...' content: [n=1] 'length' [13:13:39.416] List of 1 [13:13:39.416] $ ...:List of 1 [13:13:39.416] ..$ length: int 2 [13:13:39.416] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:39.416] - attr(*, "where")=List of 1 [13:13:39.416] ..$ ...: [13:13:39.416] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:39.416] - attr(*, "resolved")= logi TRUE [13:13:39.416] - attr(*, "total_size")= num NA [13:13:39.420] - Getting '...' globals ... DONE [13:13:39.420] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:39.420] List of 2 [13:13:39.420] $ ...future.FUN:function (mode = "logical", length = 0L) [13:13:39.420] $ ... :List of 1 [13:13:39.420] ..$ length: int 2 [13:13:39.420] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:39.420] - attr(*, "where")=List of 2 [13:13:39.420] ..$ ...future.FUN: [13:13:39.420] ..$ ... : [13:13:39.420] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:39.420] - attr(*, "resolved")= logi FALSE [13:13:39.420] - attr(*, "total_size")= num 2240 [13:13:39.425] Packages to be attached in all futures: [n=0] [13:13:39.425] getGlobalsAndPackagesXApply() ... DONE [13:13:39.425] Number of futures (= number of chunks): 1 [13:13:39.425] Launching 1 futures (chunks) ... [13:13:39.425] Chunk #1 of 1 ... [13:13:39.426] - Finding globals in 'X' for chunk #1 ... [13:13:39.426] getGlobalsAndPackages() ... [13:13:39.426] Searching for globals... [13:13:39.426] [13:13:39.426] Searching for globals ... DONE [13:13:39.427] - globals: [0] [13:13:39.427] getGlobalsAndPackages() ... DONE [13:13:39.427] + additional globals found: [n=0] [13:13:39.427] + additional namespaces needed: [n=0] [13:13:39.427] - Finding globals in 'X' for chunk #1 ... DONE [13:13:39.427] - seeds: [13:13:39.427] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:39.428] getGlobalsAndPackages() ... [13:13:39.428] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:39.428] Resolving globals: FALSE [13:13:39.428] Tweak future expression to call with '...' arguments ... [13:13:39.428] { [13:13:39.428] do.call(function(...) { [13:13:39.428] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:39.428] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:39.428] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:39.428] on.exit(options(oopts), add = TRUE) [13:13:39.428] } [13:13:39.428] { [13:13:39.428] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:39.428] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:39.428] ...future.FUN(...future.X_jj, ...) [13:13:39.428] }) [13:13:39.428] } [13:13:39.428] }, args = future.call.arguments) [13:13:39.428] } [13:13:39.429] Tweak future expression to call with '...' arguments ... DONE [13:13:39.429] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:39.430] [13:13:39.430] getGlobalsAndPackages() ... DONE [13:13:39.430] run() for 'Future' ... [13:13:39.430] - state: 'created' [13:13:39.430] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:13:39.431] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:39.431] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:39.431] - Field: 'label' [13:13:39.431] - Field: 'local' [13:13:39.431] - Field: 'owner' [13:13:39.432] - Field: 'envir' [13:13:39.432] - Field: 'packages' [13:13:39.432] - Field: 'gc' [13:13:39.432] - Field: 'conditions' [13:13:39.432] - Field: 'expr' [13:13:39.433] - Field: 'uuid' [13:13:39.433] - Field: 'seed' [13:13:39.433] - Field: 'version' [13:13:39.433] - Field: 'result' [13:13:39.433] - Field: 'asynchronous' [13:13:39.433] - Field: 'calls' [13:13:39.434] - Field: 'globals' [13:13:39.434] - Field: 'stdout' [13:13:39.434] - Field: 'earlySignal' [13:13:39.434] - Field: 'lazy' [13:13:39.434] - Field: 'state' [13:13:39.434] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:39.435] - Launch lazy future ... [13:13:39.435] Packages needed by the future expression (n = 0): [13:13:39.435] Packages needed by future strategies (n = 0): [13:13:39.435] { [13:13:39.435] { [13:13:39.435] { [13:13:39.435] ...future.startTime <- base::Sys.time() [13:13:39.435] { [13:13:39.435] { [13:13:39.435] { [13:13:39.435] base::local({ [13:13:39.435] has_future <- base::requireNamespace("future", [13:13:39.435] quietly = TRUE) [13:13:39.435] if (has_future) { [13:13:39.435] ns <- base::getNamespace("future") [13:13:39.435] version <- ns[[".package"]][["version"]] [13:13:39.435] if (is.null(version)) [13:13:39.435] version <- utils::packageVersion("future") [13:13:39.435] } [13:13:39.435] else { [13:13:39.435] version <- NULL [13:13:39.435] } [13:13:39.435] if (!has_future || version < "1.8.0") { [13:13:39.435] info <- base::c(r_version = base::gsub("R version ", [13:13:39.435] "", base::R.version$version.string), [13:13:39.435] platform = base::sprintf("%s (%s-bit)", [13:13:39.435] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:39.435] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:39.435] "release", "version")], collapse = " "), [13:13:39.435] hostname = base::Sys.info()[["nodename"]]) [13:13:39.435] info <- base::sprintf("%s: %s", base::names(info), [13:13:39.435] info) [13:13:39.435] info <- base::paste(info, collapse = "; ") [13:13:39.435] if (!has_future) { [13:13:39.435] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:39.435] info) [13:13:39.435] } [13:13:39.435] else { [13:13:39.435] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:39.435] info, version) [13:13:39.435] } [13:13:39.435] base::stop(msg) [13:13:39.435] } [13:13:39.435] }) [13:13:39.435] } [13:13:39.435] options(future.plan = NULL) [13:13:39.435] Sys.unsetenv("R_FUTURE_PLAN") [13:13:39.435] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:39.435] } [13:13:39.435] ...future.workdir <- getwd() [13:13:39.435] } [13:13:39.435] ...future.oldOptions <- base::as.list(base::.Options) [13:13:39.435] ...future.oldEnvVars <- base::Sys.getenv() [13:13:39.435] } [13:13:39.435] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:39.435] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:39.435] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:39.435] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:39.435] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:39.435] future.stdout.windows.reencode = NULL, width = 80L) [13:13:39.435] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:39.435] base::names(...future.oldOptions)) [13:13:39.435] } [13:13:39.435] if (FALSE) { [13:13:39.435] } [13:13:39.435] else { [13:13:39.435] if (TRUE) { [13:13:39.435] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:39.435] open = "w") [13:13:39.435] } [13:13:39.435] else { [13:13:39.435] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:39.435] windows = "NUL", "/dev/null"), open = "w") [13:13:39.435] } [13:13:39.435] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:39.435] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:39.435] base::sink(type = "output", split = FALSE) [13:13:39.435] base::close(...future.stdout) [13:13:39.435] }, add = TRUE) [13:13:39.435] } [13:13:39.435] ...future.frame <- base::sys.nframe() [13:13:39.435] ...future.conditions <- base::list() [13:13:39.435] ...future.rng <- base::globalenv()$.Random.seed [13:13:39.435] if (FALSE) { [13:13:39.435] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:39.435] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:39.435] } [13:13:39.435] ...future.result <- base::tryCatch({ [13:13:39.435] base::withCallingHandlers({ [13:13:39.435] ...future.value <- base::withVisible(base::local({ [13:13:39.435] do.call(function(...) { [13:13:39.435] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:39.435] if (!identical(...future.globals.maxSize.org, [13:13:39.435] ...future.globals.maxSize)) { [13:13:39.435] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:39.435] on.exit(options(oopts), add = TRUE) [13:13:39.435] } [13:13:39.435] { [13:13:39.435] lapply(seq_along(...future.elements_ii), [13:13:39.435] FUN = function(jj) { [13:13:39.435] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:39.435] ...future.FUN(...future.X_jj, ...) [13:13:39.435] }) [13:13:39.435] } [13:13:39.435] }, args = future.call.arguments) [13:13:39.435] })) [13:13:39.435] future::FutureResult(value = ...future.value$value, [13:13:39.435] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:39.435] ...future.rng), globalenv = if (FALSE) [13:13:39.435] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:39.435] ...future.globalenv.names)) [13:13:39.435] else NULL, started = ...future.startTime, version = "1.8") [13:13:39.435] }, condition = base::local({ [13:13:39.435] c <- base::c [13:13:39.435] inherits <- base::inherits [13:13:39.435] invokeRestart <- base::invokeRestart [13:13:39.435] length <- base::length [13:13:39.435] list <- base::list [13:13:39.435] seq.int <- base::seq.int [13:13:39.435] signalCondition <- base::signalCondition [13:13:39.435] sys.calls <- base::sys.calls [13:13:39.435] `[[` <- base::`[[` [13:13:39.435] `+` <- base::`+` [13:13:39.435] `<<-` <- base::`<<-` [13:13:39.435] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:39.435] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:39.435] 3L)] [13:13:39.435] } [13:13:39.435] function(cond) { [13:13:39.435] is_error <- inherits(cond, "error") [13:13:39.435] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:39.435] NULL) [13:13:39.435] if (is_error) { [13:13:39.435] sessionInformation <- function() { [13:13:39.435] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:39.435] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:39.435] search = base::search(), system = base::Sys.info()) [13:13:39.435] } [13:13:39.435] ...future.conditions[[length(...future.conditions) + [13:13:39.435] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:39.435] cond$call), session = sessionInformation(), [13:13:39.435] timestamp = base::Sys.time(), signaled = 0L) [13:13:39.435] signalCondition(cond) [13:13:39.435] } [13:13:39.435] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:39.435] "immediateCondition"))) { [13:13:39.435] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:39.435] ...future.conditions[[length(...future.conditions) + [13:13:39.435] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:39.435] if (TRUE && !signal) { [13:13:39.435] muffleCondition <- function (cond, pattern = "^muffle") [13:13:39.435] { [13:13:39.435] inherits <- base::inherits [13:13:39.435] invokeRestart <- base::invokeRestart [13:13:39.435] is.null <- base::is.null [13:13:39.435] muffled <- FALSE [13:13:39.435] if (inherits(cond, "message")) { [13:13:39.435] muffled <- grepl(pattern, "muffleMessage") [13:13:39.435] if (muffled) [13:13:39.435] invokeRestart("muffleMessage") [13:13:39.435] } [13:13:39.435] else if (inherits(cond, "warning")) { [13:13:39.435] muffled <- grepl(pattern, "muffleWarning") [13:13:39.435] if (muffled) [13:13:39.435] invokeRestart("muffleWarning") [13:13:39.435] } [13:13:39.435] else if (inherits(cond, "condition")) { [13:13:39.435] if (!is.null(pattern)) { [13:13:39.435] computeRestarts <- base::computeRestarts [13:13:39.435] grepl <- base::grepl [13:13:39.435] restarts <- computeRestarts(cond) [13:13:39.435] for (restart in restarts) { [13:13:39.435] name <- restart$name [13:13:39.435] if (is.null(name)) [13:13:39.435] next [13:13:39.435] if (!grepl(pattern, name)) [13:13:39.435] next [13:13:39.435] invokeRestart(restart) [13:13:39.435] muffled <- TRUE [13:13:39.435] break [13:13:39.435] } [13:13:39.435] } [13:13:39.435] } [13:13:39.435] invisible(muffled) [13:13:39.435] } [13:13:39.435] muffleCondition(cond, pattern = "^muffle") [13:13:39.435] } [13:13:39.435] } [13:13:39.435] else { [13:13:39.435] if (TRUE) { [13:13:39.435] muffleCondition <- function (cond, pattern = "^muffle") [13:13:39.435] { [13:13:39.435] inherits <- base::inherits [13:13:39.435] invokeRestart <- base::invokeRestart [13:13:39.435] is.null <- base::is.null [13:13:39.435] muffled <- FALSE [13:13:39.435] if (inherits(cond, "message")) { [13:13:39.435] muffled <- grepl(pattern, "muffleMessage") [13:13:39.435] if (muffled) [13:13:39.435] invokeRestart("muffleMessage") [13:13:39.435] } [13:13:39.435] else if (inherits(cond, "warning")) { [13:13:39.435] muffled <- grepl(pattern, "muffleWarning") [13:13:39.435] if (muffled) [13:13:39.435] invokeRestart("muffleWarning") [13:13:39.435] } [13:13:39.435] else if (inherits(cond, "condition")) { [13:13:39.435] if (!is.null(pattern)) { [13:13:39.435] computeRestarts <- base::computeRestarts [13:13:39.435] grepl <- base::grepl [13:13:39.435] restarts <- computeRestarts(cond) [13:13:39.435] for (restart in restarts) { [13:13:39.435] name <- restart$name [13:13:39.435] if (is.null(name)) [13:13:39.435] next [13:13:39.435] if (!grepl(pattern, name)) [13:13:39.435] next [13:13:39.435] invokeRestart(restart) [13:13:39.435] muffled <- TRUE [13:13:39.435] break [13:13:39.435] } [13:13:39.435] } [13:13:39.435] } [13:13:39.435] invisible(muffled) [13:13:39.435] } [13:13:39.435] muffleCondition(cond, pattern = "^muffle") [13:13:39.435] } [13:13:39.435] } [13:13:39.435] } [13:13:39.435] })) [13:13:39.435] }, error = function(ex) { [13:13:39.435] base::structure(base::list(value = NULL, visible = NULL, [13:13:39.435] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:39.435] ...future.rng), started = ...future.startTime, [13:13:39.435] finished = Sys.time(), session_uuid = NA_character_, [13:13:39.435] version = "1.8"), class = "FutureResult") [13:13:39.435] }, finally = { [13:13:39.435] if (!identical(...future.workdir, getwd())) [13:13:39.435] setwd(...future.workdir) [13:13:39.435] { [13:13:39.435] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:39.435] ...future.oldOptions$nwarnings <- NULL [13:13:39.435] } [13:13:39.435] base::options(...future.oldOptions) [13:13:39.435] if (.Platform$OS.type == "windows") { [13:13:39.435] old_names <- names(...future.oldEnvVars) [13:13:39.435] envs <- base::Sys.getenv() [13:13:39.435] names <- names(envs) [13:13:39.435] common <- intersect(names, old_names) [13:13:39.435] added <- setdiff(names, old_names) [13:13:39.435] removed <- setdiff(old_names, names) [13:13:39.435] changed <- common[...future.oldEnvVars[common] != [13:13:39.435] envs[common]] [13:13:39.435] NAMES <- toupper(changed) [13:13:39.435] args <- list() [13:13:39.435] for (kk in seq_along(NAMES)) { [13:13:39.435] name <- changed[[kk]] [13:13:39.435] NAME <- NAMES[[kk]] [13:13:39.435] if (name != NAME && is.element(NAME, old_names)) [13:13:39.435] next [13:13:39.435] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:39.435] } [13:13:39.435] NAMES <- toupper(added) [13:13:39.435] for (kk in seq_along(NAMES)) { [13:13:39.435] name <- added[[kk]] [13:13:39.435] NAME <- NAMES[[kk]] [13:13:39.435] if (name != NAME && is.element(NAME, old_names)) [13:13:39.435] next [13:13:39.435] args[[name]] <- "" [13:13:39.435] } [13:13:39.435] NAMES <- toupper(removed) [13:13:39.435] for (kk in seq_along(NAMES)) { [13:13:39.435] name <- removed[[kk]] [13:13:39.435] NAME <- NAMES[[kk]] [13:13:39.435] if (name != NAME && is.element(NAME, old_names)) [13:13:39.435] next [13:13:39.435] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:39.435] } [13:13:39.435] if (length(args) > 0) [13:13:39.435] base::do.call(base::Sys.setenv, args = args) [13:13:39.435] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:39.435] } [13:13:39.435] else { [13:13:39.435] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:39.435] } [13:13:39.435] { [13:13:39.435] if (base::length(...future.futureOptionsAdded) > [13:13:39.435] 0L) { [13:13:39.435] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:39.435] base::names(opts) <- ...future.futureOptionsAdded [13:13:39.435] base::options(opts) [13:13:39.435] } [13:13:39.435] { [13:13:39.435] { [13:13:39.435] NULL [13:13:39.435] RNGkind("Mersenne-Twister") [13:13:39.435] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:39.435] inherits = FALSE) [13:13:39.435] } [13:13:39.435] options(future.plan = NULL) [13:13:39.435] if (is.na(NA_character_)) [13:13:39.435] Sys.unsetenv("R_FUTURE_PLAN") [13:13:39.435] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:39.435] future::plan(list(function (..., envir = parent.frame()) [13:13:39.435] { [13:13:39.435] future <- SequentialFuture(..., envir = envir) [13:13:39.435] if (!future$lazy) [13:13:39.435] future <- run(future) [13:13:39.435] invisible(future) [13:13:39.435] }), .cleanup = FALSE, .init = FALSE) [13:13:39.435] } [13:13:39.435] } [13:13:39.435] } [13:13:39.435] }) [13:13:39.435] if (TRUE) { [13:13:39.435] base::sink(type = "output", split = FALSE) [13:13:39.435] if (TRUE) { [13:13:39.435] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:39.435] } [13:13:39.435] else { [13:13:39.435] ...future.result["stdout"] <- base::list(NULL) [13:13:39.435] } [13:13:39.435] base::close(...future.stdout) [13:13:39.435] ...future.stdout <- NULL [13:13:39.435] } [13:13:39.435] ...future.result$conditions <- ...future.conditions [13:13:39.435] ...future.result$finished <- base::Sys.time() [13:13:39.435] ...future.result [13:13:39.435] } [13:13:39.439] assign_globals() ... [13:13:39.439] List of 5 [13:13:39.439] $ ...future.FUN :function (mode = "logical", length = 0L) [13:13:39.439] $ future.call.arguments :List of 1 [13:13:39.439] ..$ length: int 2 [13:13:39.439] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:39.439] $ ...future.elements_ii :List of 4 [13:13:39.439] ..$ a: chr "integer" [13:13:39.439] ..$ b: chr "numeric" [13:13:39.439] ..$ c: chr "character" [13:13:39.439] ..$ c: chr "list" [13:13:39.439] $ ...future.seeds_ii : NULL [13:13:39.439] $ ...future.globals.maxSize: NULL [13:13:39.439] - attr(*, "where")=List of 5 [13:13:39.439] ..$ ...future.FUN : [13:13:39.439] ..$ future.call.arguments : [13:13:39.439] ..$ ...future.elements_ii : [13:13:39.439] ..$ ...future.seeds_ii : [13:13:39.439] ..$ ...future.globals.maxSize: [13:13:39.439] - attr(*, "resolved")= logi FALSE [13:13:39.439] - attr(*, "total_size")= num 2240 [13:13:39.439] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:39.439] - attr(*, "already-done")= logi TRUE [13:13:39.446] - copied '...future.FUN' to environment [13:13:39.446] - copied 'future.call.arguments' to environment [13:13:39.446] - copied '...future.elements_ii' to environment [13:13:39.447] - copied '...future.seeds_ii' to environment [13:13:39.447] - copied '...future.globals.maxSize' to environment [13:13:39.447] assign_globals() ... done [13:13:39.447] plan(): Setting new future strategy stack: [13:13:39.447] List of future strategies: [13:13:39.447] 1. sequential: [13:13:39.447] - args: function (..., envir = parent.frame(), workers = "") [13:13:39.447] - tweaked: FALSE [13:13:39.447] - call: NULL [13:13:39.448] plan(): nbrOfWorkers() = 1 [13:13:39.449] plan(): Setting new future strategy stack: [13:13:39.449] List of future strategies: [13:13:39.449] 1. sequential: [13:13:39.449] - args: function (..., envir = parent.frame(), workers = "") [13:13:39.449] - tweaked: FALSE [13:13:39.449] - call: plan(strategy) [13:13:39.450] plan(): nbrOfWorkers() = 1 [13:13:39.450] SequentialFuture started (and completed) [13:13:39.450] - Launch lazy future ... done [13:13:39.451] run() for 'SequentialFuture' ... done [13:13:39.451] Created future: [13:13:39.451] SequentialFuture: [13:13:39.451] Label: 'future_lapply-1' [13:13:39.451] Expression: [13:13:39.451] { [13:13:39.451] do.call(function(...) { [13:13:39.451] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:39.451] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:39.451] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:39.451] on.exit(options(oopts), add = TRUE) [13:13:39.451] } [13:13:39.451] { [13:13:39.451] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:39.451] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:39.451] ...future.FUN(...future.X_jj, ...) [13:13:39.451] }) [13:13:39.451] } [13:13:39.451] }, args = future.call.arguments) [13:13:39.451] } [13:13:39.451] Lazy evaluation: FALSE [13:13:39.451] Asynchronous evaluation: FALSE [13:13:39.451] Local evaluation: TRUE [13:13:39.451] Environment: R_GlobalEnv [13:13:39.451] Capture standard output: TRUE [13:13:39.451] Capture condition classes: 'condition' (excluding 'nothing') [13:13:39.451] 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) [13:13:39.451] Packages: [13:13:39.451] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:39.451] Resolved: TRUE [13:13:39.451] Value: 240 bytes of class 'list' [13:13:39.451] Early signaling: FALSE [13:13:39.451] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:39.451] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:39.453] Chunk #1 of 1 ... DONE [13:13:39.453] Launching 1 futures (chunks) ... DONE [13:13:39.453] Resolving 1 futures (chunks) ... [13:13:39.454] resolve() on list ... [13:13:39.454] recursive: 0 [13:13:39.454] length: 1 [13:13:39.454] [13:13:39.454] resolved() for 'SequentialFuture' ... [13:13:39.454] - state: 'finished' [13:13:39.455] - run: TRUE [13:13:39.455] - result: 'FutureResult' [13:13:39.455] resolved() for 'SequentialFuture' ... done [13:13:39.455] Future #1 [13:13:39.455] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:39.455] - nx: 1 [13:13:39.456] - relay: TRUE [13:13:39.456] - stdout: TRUE [13:13:39.456] - signal: TRUE [13:13:39.456] - resignal: FALSE [13:13:39.456] - force: TRUE [13:13:39.456] - relayed: [n=1] FALSE [13:13:39.456] - queued futures: [n=1] FALSE [13:13:39.457] - until=1 [13:13:39.457] - relaying element #1 [13:13:39.457] - relayed: [n=1] TRUE [13:13:39.457] - queued futures: [n=1] TRUE [13:13:39.457] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:39.458] length: 0 (resolved future 1) [13:13:39.458] Relaying remaining futures [13:13:39.458] signalConditionsASAP(NULL, pos=0) ... [13:13:39.458] - nx: 1 [13:13:39.458] - relay: TRUE [13:13:39.458] - stdout: TRUE [13:13:39.458] - signal: TRUE [13:13:39.459] - resignal: FALSE [13:13:39.459] - force: TRUE [13:13:39.459] - relayed: [n=1] TRUE [13:13:39.459] - queued futures: [n=1] TRUE - flush all [13:13:39.459] - relayed: [n=1] TRUE [13:13:39.459] - queued futures: [n=1] TRUE [13:13:39.460] signalConditionsASAP(NULL, pos=0) ... done [13:13:39.460] resolve() on list ... DONE [13:13:39.460] - Number of value chunks collected: 1 [13:13:39.460] Resolving 1 futures (chunks) ... DONE [13:13:39.460] Reducing values from 1 chunks ... [13:13:39.460] - Number of values collected after concatenation: 4 [13:13:39.461] - Number of values expected: 4 [13:13:39.461] Reducing values from 1 chunks ... DONE [13:13:39.461] future_lapply() ... DONE List of 1 $ y:List of 4 ..$ a: int [1:2] 0 0 ..$ b: num [1:2] 0 0 ..$ c: chr [1:2] "" "" ..$ c:List of 2 .. ..$ : NULL .. ..$ : NULL - future_lapply(x, FUN = future:::hpaste, ...) ... [13:13:39.463] future_lapply() ... [13:13:39.472] Number of chunks: 1 [13:13:39.472] getGlobalsAndPackagesXApply() ... [13:13:39.472] - future.globals: TRUE [13:13:39.472] getGlobalsAndPackages() ... [13:13:39.473] Searching for globals... [13:13:39.483] - globals found: [22] 'FUN', 'if', 'missing', 'is.finite', '{', 'is.null', '<-', 'paste', 'length', '==', 'return', '>', '+', '[', 'seq_len', 'rev', 'c', '&&', '!', ':', '(', '-' [13:13:39.483] Searching for globals ... DONE [13:13:39.483] Resolving globals: FALSE [13:13:39.484] The total size of the 1 globals is 69.62 KiB (71288 bytes) [13:13:39.485] 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') [13:13:39.485] - globals: [1] 'FUN' [13:13:39.485] - packages: [1] 'future' [13:13:39.485] getGlobalsAndPackages() ... DONE [13:13:39.485] - globals found/used: [n=1] 'FUN' [13:13:39.486] - needed namespaces: [n=1] 'future' [13:13:39.486] Finding globals ... DONE [13:13:39.486] - use_args: TRUE [13:13:39.486] - Getting '...' globals ... [13:13:39.487] resolve() on list ... [13:13:39.487] recursive: 0 [13:13:39.487] length: 1 [13:13:39.487] elements: '...' [13:13:39.487] length: 0 (resolved future 1) [13:13:39.487] resolve() on list ... DONE [13:13:39.487] - '...' content: [n=2] 'collapse', 'maxHead' [13:13:39.488] List of 1 [13:13:39.488] $ ...:List of 2 [13:13:39.488] ..$ collapse: chr "; " [13:13:39.488] ..$ maxHead : int 3 [13:13:39.488] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:39.488] - attr(*, "where")=List of 1 [13:13:39.488] ..$ ...: [13:13:39.488] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:39.488] - attr(*, "resolved")= logi TRUE [13:13:39.488] - attr(*, "total_size")= num NA [13:13:39.491] - Getting '...' globals ... DONE [13:13:39.492] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:39.492] List of 2 [13:13:39.492] $ ...future.FUN:function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [13:13:39.492] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [13:13:39.492] $ ... :List of 2 [13:13:39.492] ..$ collapse: chr "; " [13:13:39.492] ..$ maxHead : int 3 [13:13:39.492] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:39.492] - attr(*, "where")=List of 2 [13:13:39.492] ..$ ...future.FUN: [13:13:39.492] ..$ ... : [13:13:39.492] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:39.492] - attr(*, "resolved")= logi FALSE [13:13:39.492] - attr(*, "total_size")= num 71456 [13:13:39.497] Packages to be attached in all futures: [n=1] 'future' [13:13:39.497] getGlobalsAndPackagesXApply() ... DONE [13:13:39.497] Number of futures (= number of chunks): 1 [13:13:39.497] Launching 1 futures (chunks) ... [13:13:39.497] Chunk #1 of 1 ... [13:13:39.498] - Finding globals in 'X' for chunk #1 ... [13:13:39.498] getGlobalsAndPackages() ... [13:13:39.498] Searching for globals... [13:13:39.498] [13:13:39.498] Searching for globals ... DONE [13:13:39.498] - globals: [0] [13:13:39.499] getGlobalsAndPackages() ... DONE [13:13:39.499] + additional globals found: [n=0] [13:13:39.499] + additional namespaces needed: [n=0] [13:13:39.499] - Finding globals in 'X' for chunk #1 ... DONE [13:13:39.499] - seeds: [13:13:39.499] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:39.500] getGlobalsAndPackages() ... [13:13:39.500] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:39.500] Resolving globals: FALSE [13:13:39.500] Tweak future expression to call with '...' arguments ... [13:13:39.500] { [13:13:39.500] do.call(function(...) { [13:13:39.500] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:39.500] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:39.500] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:39.500] on.exit(options(oopts), add = TRUE) [13:13:39.500] } [13:13:39.500] { [13:13:39.500] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:39.500] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:39.500] ...future.FUN(...future.X_jj, ...) [13:13:39.500] }) [13:13:39.500] } [13:13:39.500] }, args = future.call.arguments) [13:13:39.500] } [13:13:39.501] Tweak future expression to call with '...' arguments ... DONE [13:13:39.501] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:39.501] - packages: [1] 'future' [13:13:39.502] getGlobalsAndPackages() ... DONE [13:13:39.502] run() for 'Future' ... [13:13:39.502] - state: 'created' [13:13:39.502] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:13:39.503] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:39.503] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:39.503] - Field: 'label' [13:13:39.503] - Field: 'local' [13:13:39.503] - Field: 'owner' [13:13:39.504] - Field: 'envir' [13:13:39.504] - Field: 'packages' [13:13:39.504] - Field: 'gc' [13:13:39.504] - Field: 'conditions' [13:13:39.504] - Field: 'expr' [13:13:39.504] - Field: 'uuid' [13:13:39.505] - Field: 'seed' [13:13:39.505] - Field: 'version' [13:13:39.505] - Field: 'result' [13:13:39.505] - Field: 'asynchronous' [13:13:39.505] - Field: 'calls' [13:13:39.505] - Field: 'globals' [13:13:39.506] - Field: 'stdout' [13:13:39.506] - Field: 'earlySignal' [13:13:39.506] - Field: 'lazy' [13:13:39.506] - Field: 'state' [13:13:39.506] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:39.506] - Launch lazy future ... [13:13:39.507] Packages needed by the future expression (n = 1): 'future' [13:13:39.507] Packages needed by future strategies (n = 0): [13:13:39.507] { [13:13:39.507] { [13:13:39.507] { [13:13:39.507] ...future.startTime <- base::Sys.time() [13:13:39.507] { [13:13:39.507] { [13:13:39.507] { [13:13:39.507] { [13:13:39.507] base::local({ [13:13:39.507] has_future <- base::requireNamespace("future", [13:13:39.507] quietly = TRUE) [13:13:39.507] if (has_future) { [13:13:39.507] ns <- base::getNamespace("future") [13:13:39.507] version <- ns[[".package"]][["version"]] [13:13:39.507] if (is.null(version)) [13:13:39.507] version <- utils::packageVersion("future") [13:13:39.507] } [13:13:39.507] else { [13:13:39.507] version <- NULL [13:13:39.507] } [13:13:39.507] if (!has_future || version < "1.8.0") { [13:13:39.507] info <- base::c(r_version = base::gsub("R version ", [13:13:39.507] "", base::R.version$version.string), [13:13:39.507] platform = base::sprintf("%s (%s-bit)", [13:13:39.507] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:39.507] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:39.507] "release", "version")], collapse = " "), [13:13:39.507] hostname = base::Sys.info()[["nodename"]]) [13:13:39.507] info <- base::sprintf("%s: %s", base::names(info), [13:13:39.507] info) [13:13:39.507] info <- base::paste(info, collapse = "; ") [13:13:39.507] if (!has_future) { [13:13:39.507] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:39.507] info) [13:13:39.507] } [13:13:39.507] else { [13:13:39.507] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:39.507] info, version) [13:13:39.507] } [13:13:39.507] base::stop(msg) [13:13:39.507] } [13:13:39.507] }) [13:13:39.507] } [13:13:39.507] base::local({ [13:13:39.507] for (pkg in "future") { [13:13:39.507] base::loadNamespace(pkg) [13:13:39.507] base::library(pkg, character.only = TRUE) [13:13:39.507] } [13:13:39.507] }) [13:13:39.507] } [13:13:39.507] options(future.plan = NULL) [13:13:39.507] Sys.unsetenv("R_FUTURE_PLAN") [13:13:39.507] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:39.507] } [13:13:39.507] ...future.workdir <- getwd() [13:13:39.507] } [13:13:39.507] ...future.oldOptions <- base::as.list(base::.Options) [13:13:39.507] ...future.oldEnvVars <- base::Sys.getenv() [13:13:39.507] } [13:13:39.507] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:39.507] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:39.507] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:39.507] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:39.507] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:39.507] future.stdout.windows.reencode = NULL, width = 80L) [13:13:39.507] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:39.507] base::names(...future.oldOptions)) [13:13:39.507] } [13:13:39.507] if (FALSE) { [13:13:39.507] } [13:13:39.507] else { [13:13:39.507] if (TRUE) { [13:13:39.507] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:39.507] open = "w") [13:13:39.507] } [13:13:39.507] else { [13:13:39.507] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:39.507] windows = "NUL", "/dev/null"), open = "w") [13:13:39.507] } [13:13:39.507] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:39.507] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:39.507] base::sink(type = "output", split = FALSE) [13:13:39.507] base::close(...future.stdout) [13:13:39.507] }, add = TRUE) [13:13:39.507] } [13:13:39.507] ...future.frame <- base::sys.nframe() [13:13:39.507] ...future.conditions <- base::list() [13:13:39.507] ...future.rng <- base::globalenv()$.Random.seed [13:13:39.507] if (FALSE) { [13:13:39.507] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:39.507] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:39.507] } [13:13:39.507] ...future.result <- base::tryCatch({ [13:13:39.507] base::withCallingHandlers({ [13:13:39.507] ...future.value <- base::withVisible(base::local({ [13:13:39.507] do.call(function(...) { [13:13:39.507] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:39.507] if (!identical(...future.globals.maxSize.org, [13:13:39.507] ...future.globals.maxSize)) { [13:13:39.507] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:39.507] on.exit(options(oopts), add = TRUE) [13:13:39.507] } [13:13:39.507] { [13:13:39.507] lapply(seq_along(...future.elements_ii), [13:13:39.507] FUN = function(jj) { [13:13:39.507] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:39.507] ...future.FUN(...future.X_jj, ...) [13:13:39.507] }) [13:13:39.507] } [13:13:39.507] }, args = future.call.arguments) [13:13:39.507] })) [13:13:39.507] future::FutureResult(value = ...future.value$value, [13:13:39.507] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:39.507] ...future.rng), globalenv = if (FALSE) [13:13:39.507] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:39.507] ...future.globalenv.names)) [13:13:39.507] else NULL, started = ...future.startTime, version = "1.8") [13:13:39.507] }, condition = base::local({ [13:13:39.507] c <- base::c [13:13:39.507] inherits <- base::inherits [13:13:39.507] invokeRestart <- base::invokeRestart [13:13:39.507] length <- base::length [13:13:39.507] list <- base::list [13:13:39.507] seq.int <- base::seq.int [13:13:39.507] signalCondition <- base::signalCondition [13:13:39.507] sys.calls <- base::sys.calls [13:13:39.507] `[[` <- base::`[[` [13:13:39.507] `+` <- base::`+` [13:13:39.507] `<<-` <- base::`<<-` [13:13:39.507] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:39.507] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:39.507] 3L)] [13:13:39.507] } [13:13:39.507] function(cond) { [13:13:39.507] is_error <- inherits(cond, "error") [13:13:39.507] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:39.507] NULL) [13:13:39.507] if (is_error) { [13:13:39.507] sessionInformation <- function() { [13:13:39.507] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:39.507] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:39.507] search = base::search(), system = base::Sys.info()) [13:13:39.507] } [13:13:39.507] ...future.conditions[[length(...future.conditions) + [13:13:39.507] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:39.507] cond$call), session = sessionInformation(), [13:13:39.507] timestamp = base::Sys.time(), signaled = 0L) [13:13:39.507] signalCondition(cond) [13:13:39.507] } [13:13:39.507] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:39.507] "immediateCondition"))) { [13:13:39.507] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:39.507] ...future.conditions[[length(...future.conditions) + [13:13:39.507] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:39.507] if (TRUE && !signal) { [13:13:39.507] muffleCondition <- function (cond, pattern = "^muffle") [13:13:39.507] { [13:13:39.507] inherits <- base::inherits [13:13:39.507] invokeRestart <- base::invokeRestart [13:13:39.507] is.null <- base::is.null [13:13:39.507] muffled <- FALSE [13:13:39.507] if (inherits(cond, "message")) { [13:13:39.507] muffled <- grepl(pattern, "muffleMessage") [13:13:39.507] if (muffled) [13:13:39.507] invokeRestart("muffleMessage") [13:13:39.507] } [13:13:39.507] else if (inherits(cond, "warning")) { [13:13:39.507] muffled <- grepl(pattern, "muffleWarning") [13:13:39.507] if (muffled) [13:13:39.507] invokeRestart("muffleWarning") [13:13:39.507] } [13:13:39.507] else if (inherits(cond, "condition")) { [13:13:39.507] if (!is.null(pattern)) { [13:13:39.507] computeRestarts <- base::computeRestarts [13:13:39.507] grepl <- base::grepl [13:13:39.507] restarts <- computeRestarts(cond) [13:13:39.507] for (restart in restarts) { [13:13:39.507] name <- restart$name [13:13:39.507] if (is.null(name)) [13:13:39.507] next [13:13:39.507] if (!grepl(pattern, name)) [13:13:39.507] next [13:13:39.507] invokeRestart(restart) [13:13:39.507] muffled <- TRUE [13:13:39.507] break [13:13:39.507] } [13:13:39.507] } [13:13:39.507] } [13:13:39.507] invisible(muffled) [13:13:39.507] } [13:13:39.507] muffleCondition(cond, pattern = "^muffle") [13:13:39.507] } [13:13:39.507] } [13:13:39.507] else { [13:13:39.507] if (TRUE) { [13:13:39.507] muffleCondition <- function (cond, pattern = "^muffle") [13:13:39.507] { [13:13:39.507] inherits <- base::inherits [13:13:39.507] invokeRestart <- base::invokeRestart [13:13:39.507] is.null <- base::is.null [13:13:39.507] muffled <- FALSE [13:13:39.507] if (inherits(cond, "message")) { [13:13:39.507] muffled <- grepl(pattern, "muffleMessage") [13:13:39.507] if (muffled) [13:13:39.507] invokeRestart("muffleMessage") [13:13:39.507] } [13:13:39.507] else if (inherits(cond, "warning")) { [13:13:39.507] muffled <- grepl(pattern, "muffleWarning") [13:13:39.507] if (muffled) [13:13:39.507] invokeRestart("muffleWarning") [13:13:39.507] } [13:13:39.507] else if (inherits(cond, "condition")) { [13:13:39.507] if (!is.null(pattern)) { [13:13:39.507] computeRestarts <- base::computeRestarts [13:13:39.507] grepl <- base::grepl [13:13:39.507] restarts <- computeRestarts(cond) [13:13:39.507] for (restart in restarts) { [13:13:39.507] name <- restart$name [13:13:39.507] if (is.null(name)) [13:13:39.507] next [13:13:39.507] if (!grepl(pattern, name)) [13:13:39.507] next [13:13:39.507] invokeRestart(restart) [13:13:39.507] muffled <- TRUE [13:13:39.507] break [13:13:39.507] } [13:13:39.507] } [13:13:39.507] } [13:13:39.507] invisible(muffled) [13:13:39.507] } [13:13:39.507] muffleCondition(cond, pattern = "^muffle") [13:13:39.507] } [13:13:39.507] } [13:13:39.507] } [13:13:39.507] })) [13:13:39.507] }, error = function(ex) { [13:13:39.507] base::structure(base::list(value = NULL, visible = NULL, [13:13:39.507] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:39.507] ...future.rng), started = ...future.startTime, [13:13:39.507] finished = Sys.time(), session_uuid = NA_character_, [13:13:39.507] version = "1.8"), class = "FutureResult") [13:13:39.507] }, finally = { [13:13:39.507] if (!identical(...future.workdir, getwd())) [13:13:39.507] setwd(...future.workdir) [13:13:39.507] { [13:13:39.507] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:39.507] ...future.oldOptions$nwarnings <- NULL [13:13:39.507] } [13:13:39.507] base::options(...future.oldOptions) [13:13:39.507] if (.Platform$OS.type == "windows") { [13:13:39.507] old_names <- names(...future.oldEnvVars) [13:13:39.507] envs <- base::Sys.getenv() [13:13:39.507] names <- names(envs) [13:13:39.507] common <- intersect(names, old_names) [13:13:39.507] added <- setdiff(names, old_names) [13:13:39.507] removed <- setdiff(old_names, names) [13:13:39.507] changed <- common[...future.oldEnvVars[common] != [13:13:39.507] envs[common]] [13:13:39.507] NAMES <- toupper(changed) [13:13:39.507] args <- list() [13:13:39.507] for (kk in seq_along(NAMES)) { [13:13:39.507] name <- changed[[kk]] [13:13:39.507] NAME <- NAMES[[kk]] [13:13:39.507] if (name != NAME && is.element(NAME, old_names)) [13:13:39.507] next [13:13:39.507] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:39.507] } [13:13:39.507] NAMES <- toupper(added) [13:13:39.507] for (kk in seq_along(NAMES)) { [13:13:39.507] name <- added[[kk]] [13:13:39.507] NAME <- NAMES[[kk]] [13:13:39.507] if (name != NAME && is.element(NAME, old_names)) [13:13:39.507] next [13:13:39.507] args[[name]] <- "" [13:13:39.507] } [13:13:39.507] NAMES <- toupper(removed) [13:13:39.507] for (kk in seq_along(NAMES)) { [13:13:39.507] name <- removed[[kk]] [13:13:39.507] NAME <- NAMES[[kk]] [13:13:39.507] if (name != NAME && is.element(NAME, old_names)) [13:13:39.507] next [13:13:39.507] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:39.507] } [13:13:39.507] if (length(args) > 0) [13:13:39.507] base::do.call(base::Sys.setenv, args = args) [13:13:39.507] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:39.507] } [13:13:39.507] else { [13:13:39.507] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:39.507] } [13:13:39.507] { [13:13:39.507] if (base::length(...future.futureOptionsAdded) > [13:13:39.507] 0L) { [13:13:39.507] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:39.507] base::names(opts) <- ...future.futureOptionsAdded [13:13:39.507] base::options(opts) [13:13:39.507] } [13:13:39.507] { [13:13:39.507] { [13:13:39.507] NULL [13:13:39.507] RNGkind("Mersenne-Twister") [13:13:39.507] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:39.507] inherits = FALSE) [13:13:39.507] } [13:13:39.507] options(future.plan = NULL) [13:13:39.507] if (is.na(NA_character_)) [13:13:39.507] Sys.unsetenv("R_FUTURE_PLAN") [13:13:39.507] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:39.507] future::plan(list(function (..., envir = parent.frame()) [13:13:39.507] { [13:13:39.507] future <- SequentialFuture(..., envir = envir) [13:13:39.507] if (!future$lazy) [13:13:39.507] future <- run(future) [13:13:39.507] invisible(future) [13:13:39.507] }), .cleanup = FALSE, .init = FALSE) [13:13:39.507] } [13:13:39.507] } [13:13:39.507] } [13:13:39.507] }) [13:13:39.507] if (TRUE) { [13:13:39.507] base::sink(type = "output", split = FALSE) [13:13:39.507] if (TRUE) { [13:13:39.507] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:39.507] } [13:13:39.507] else { [13:13:39.507] ...future.result["stdout"] <- base::list(NULL) [13:13:39.507] } [13:13:39.507] base::close(...future.stdout) [13:13:39.507] ...future.stdout <- NULL [13:13:39.507] } [13:13:39.507] ...future.result$conditions <- ...future.conditions [13:13:39.507] ...future.result$finished <- base::Sys.time() [13:13:39.507] ...future.result [13:13:39.507] } [13:13:39.511] assign_globals() ... [13:13:39.512] List of 5 [13:13:39.512] $ ...future.FUN :function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [13:13:39.512] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [13:13:39.512] $ future.call.arguments :List of 2 [13:13:39.512] ..$ collapse: chr "; " [13:13:39.512] ..$ maxHead : int 3 [13:13:39.512] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:39.512] $ ...future.elements_ii :List of 1 [13:13:39.512] ..$ a: Named chr [1:101] "hello" "1" "2" "3" ... [13:13:39.512] .. ..- attr(*, "names")= chr [1:101] "" "b1" "b2" "b3" ... [13:13:39.512] $ ...future.seeds_ii : NULL [13:13:39.512] $ ...future.globals.maxSize: NULL [13:13:39.512] - attr(*, "where")=List of 5 [13:13:39.512] ..$ ...future.FUN : [13:13:39.512] ..$ future.call.arguments : [13:13:39.512] ..$ ...future.elements_ii : [13:13:39.512] ..$ ...future.seeds_ii : [13:13:39.512] ..$ ...future.globals.maxSize: [13:13:39.512] - attr(*, "resolved")= logi FALSE [13:13:39.512] - attr(*, "total_size")= num 71456 [13:13:39.512] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:39.512] - attr(*, "already-done")= logi TRUE [13:13:39.518] - copied '...future.FUN' to environment [13:13:39.518] - copied 'future.call.arguments' to environment [13:13:39.518] - copied '...future.elements_ii' to environment [13:13:39.519] - copied '...future.seeds_ii' to environment [13:13:39.519] - copied '...future.globals.maxSize' to environment [13:13:39.519] assign_globals() ... done [13:13:39.520] plan(): Setting new future strategy stack: [13:13:39.520] List of future strategies: [13:13:39.520] 1. sequential: [13:13:39.520] - args: function (..., envir = parent.frame(), workers = "") [13:13:39.520] - tweaked: FALSE [13:13:39.520] - call: NULL [13:13:39.520] plan(): nbrOfWorkers() = 1 [13:13:39.521] plan(): Setting new future strategy stack: [13:13:39.522] List of future strategies: [13:13:39.522] 1. sequential: [13:13:39.522] - args: function (..., envir = parent.frame(), workers = "") [13:13:39.522] - tweaked: FALSE [13:13:39.522] - call: plan(strategy) [13:13:39.522] plan(): nbrOfWorkers() = 1 [13:13:39.523] SequentialFuture started (and completed) [13:13:39.523] - Launch lazy future ... done [13:13:39.523] run() for 'SequentialFuture' ... done [13:13:39.524] Created future: [13:13:39.524] SequentialFuture: [13:13:39.524] Label: 'future_lapply-1' [13:13:39.524] Expression: [13:13:39.524] { [13:13:39.524] do.call(function(...) { [13:13:39.524] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:39.524] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:39.524] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:39.524] on.exit(options(oopts), add = TRUE) [13:13:39.524] } [13:13:39.524] { [13:13:39.524] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:39.524] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:39.524] ...future.FUN(...future.X_jj, ...) [13:13:39.524] }) [13:13:39.524] } [13:13:39.524] }, args = future.call.arguments) [13:13:39.524] } [13:13:39.524] Lazy evaluation: FALSE [13:13:39.524] Asynchronous evaluation: FALSE [13:13:39.524] Local evaluation: TRUE [13:13:39.524] Environment: R_GlobalEnv [13:13:39.524] Capture standard output: TRUE [13:13:39.524] Capture condition classes: 'condition' (excluding 'nothing') [13:13:39.524] 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) [13:13:39.524] Packages: 1 packages ('future') [13:13:39.524] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:39.524] Resolved: TRUE [13:13:39.524] Value: 136 bytes of class 'list' [13:13:39.524] Early signaling: FALSE [13:13:39.524] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:39.524] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:39.525] Chunk #1 of 1 ... DONE [13:13:39.526] Launching 1 futures (chunks) ... DONE [13:13:39.526] Resolving 1 futures (chunks) ... [13:13:39.526] resolve() on list ... [13:13:39.526] recursive: 0 [13:13:39.526] length: 1 [13:13:39.526] [13:13:39.527] resolved() for 'SequentialFuture' ... [13:13:39.527] - state: 'finished' [13:13:39.527] - run: TRUE [13:13:39.527] - result: 'FutureResult' [13:13:39.527] resolved() for 'SequentialFuture' ... done [13:13:39.527] Future #1 [13:13:39.528] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:39.528] - nx: 1 [13:13:39.528] - relay: TRUE [13:13:39.528] - stdout: TRUE [13:13:39.528] - signal: TRUE [13:13:39.528] - resignal: FALSE [13:13:39.529] - force: TRUE [13:13:39.529] - relayed: [n=1] FALSE [13:13:39.529] - queued futures: [n=1] FALSE [13:13:39.529] - until=1 [13:13:39.529] - relaying element #1 [13:13:39.529] - relayed: [n=1] TRUE [13:13:39.530] - queued futures: [n=1] TRUE [13:13:39.530] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:39.530] length: 0 (resolved future 1) [13:13:39.530] Relaying remaining futures [13:13:39.530] signalConditionsASAP(NULL, pos=0) ... [13:13:39.530] - nx: 1 [13:13:39.531] - relay: TRUE [13:13:39.531] - stdout: TRUE [13:13:39.531] - signal: TRUE [13:13:39.531] - resignal: FALSE [13:13:39.531] - force: TRUE [13:13:39.531] - relayed: [n=1] TRUE [13:13:39.531] - queued futures: [n=1] TRUE - flush all [13:13:39.532] - relayed: [n=1] TRUE [13:13:39.532] - queued futures: [n=1] TRUE [13:13:39.532] signalConditionsASAP(NULL, pos=0) ... done [13:13:39.532] resolve() on list ... DONE [13:13:39.533] - Number of value chunks collected: 1 [13:13:39.533] Resolving 1 futures (chunks) ... DONE [13:13:39.533] Reducing values from 1 chunks ... [13:13:39.533] - Number of values collected after concatenation: 1 [13:13:39.533] - Number of values expected: 1 [13:13:39.533] Reducing values from 1 chunks ... DONE [13:13:39.533] future_lapply() ... DONE List of 1 $ y:List of 1 ..$ a: chr "hello; 1; 2; ...; 100" - future_lapply(x, FUN = listenv::listenv, ...) ... [13:13:39.535] future_lapply() ... [13:13:39.535] Number of chunks: 1 [13:13:39.535] getGlobalsAndPackagesXApply() ... [13:13:39.536] - future.globals: TRUE [13:13:39.536] getGlobalsAndPackages() ... [13:13:39.536] Searching for globals... [13:13:39.537] - globals found: [4] 'FUN', '{', 'get', 'parent.env' [13:13:39.538] Searching for globals ... DONE [13:13:39.538] Resolving globals: FALSE [13:13:39.538] The total size of the 1 globals is 4.85 KiB (4968 bytes) [13:13:39.539] 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') [13:13:39.539] - globals: [1] 'FUN' [13:13:39.539] - packages: [1] 'listenv' [13:13:39.539] getGlobalsAndPackages() ... DONE [13:13:39.539] - globals found/used: [n=1] 'FUN' [13:13:39.540] - needed namespaces: [n=1] 'listenv' [13:13:39.540] Finding globals ... DONE [13:13:39.540] - use_args: TRUE [13:13:39.540] - Getting '...' globals ... [13:13:39.540] resolve() on list ... [13:13:39.541] recursive: 0 [13:13:39.541] length: 1 [13:13:39.541] elements: '...' [13:13:39.541] length: 0 (resolved future 1) [13:13:39.541] resolve() on list ... DONE [13:13:39.541] - '...' content: [n=0] [13:13:39.542] List of 1 [13:13:39.542] $ ...: list() [13:13:39.542] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:39.542] - attr(*, "where")=List of 1 [13:13:39.542] ..$ ...: [13:13:39.542] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:39.542] - attr(*, "resolved")= logi TRUE [13:13:39.542] - attr(*, "total_size")= num NA [13:13:39.544] - Getting '...' globals ... DONE [13:13:39.545] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:39.545] List of 2 [13:13:39.545] $ ...future.FUN:function (x, ...) [13:13:39.545] $ ... : list() [13:13:39.545] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:39.545] - attr(*, "where")=List of 2 [13:13:39.545] ..$ ...future.FUN: [13:13:39.545] ..$ ... : [13:13:39.545] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:39.545] - attr(*, "resolved")= logi FALSE [13:13:39.545] - attr(*, "total_size")= num 4968 [13:13:39.549] Packages to be attached in all futures: [n=1] 'listenv' [13:13:39.549] getGlobalsAndPackagesXApply() ... DONE [13:13:39.549] Number of futures (= number of chunks): 1 [13:13:39.549] Launching 1 futures (chunks) ... [13:13:39.550] Chunk #1 of 1 ... [13:13:39.550] - Finding globals in 'X' for chunk #1 ... [13:13:39.550] getGlobalsAndPackages() ... [13:13:39.550] Searching for globals... [13:13:39.551] [13:13:39.551] Searching for globals ... DONE [13:13:39.551] - globals: [0] [13:13:39.551] getGlobalsAndPackages() ... DONE [13:13:39.551] + additional globals found: [n=0] [13:13:39.552] + additional namespaces needed: [n=0] [13:13:39.552] - Finding globals in 'X' for chunk #1 ... DONE [13:13:39.552] - seeds: [13:13:39.552] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:39.552] getGlobalsAndPackages() ... [13:13:39.552] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:39.553] Resolving globals: FALSE [13:13:39.553] Tweak future expression to call with '...' arguments ... [13:13:39.553] { [13:13:39.553] do.call(function(...) { [13:13:39.553] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:39.553] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:39.553] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:39.553] on.exit(options(oopts), add = TRUE) [13:13:39.553] } [13:13:39.553] { [13:13:39.553] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:39.553] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:39.553] ...future.FUN(...future.X_jj, ...) [13:13:39.553] }) [13:13:39.553] } [13:13:39.553] }, args = future.call.arguments) [13:13:39.553] } [13:13:39.553] Tweak future expression to call with '...' arguments ... DONE [13:13:39.554] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:39.554] - packages: [1] 'listenv' [13:13:39.554] getGlobalsAndPackages() ... DONE [13:13:39.555] run() for 'Future' ... [13:13:39.555] - state: 'created' [13:13:39.555] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:13:39.555] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:39.556] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:39.556] - Field: 'label' [13:13:39.556] - Field: 'local' [13:13:39.556] - Field: 'owner' [13:13:39.556] - Field: 'envir' [13:13:39.556] - Field: 'packages' [13:13:39.557] - Field: 'gc' [13:13:39.557] - Field: 'conditions' [13:13:39.557] - Field: 'expr' [13:13:39.557] - Field: 'uuid' [13:13:39.557] - Field: 'seed' [13:13:39.557] - Field: 'version' [13:13:39.558] - Field: 'result' [13:13:39.558] - Field: 'asynchronous' [13:13:39.558] - Field: 'calls' [13:13:39.558] - Field: 'globals' [13:13:39.558] - Field: 'stdout' [13:13:39.558] - Field: 'earlySignal' [13:13:39.559] - Field: 'lazy' [13:13:39.559] - Field: 'state' [13:13:39.559] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:39.559] - Launch lazy future ... [13:13:39.559] Packages needed by the future expression (n = 1): 'listenv' [13:13:39.560] Packages needed by future strategies (n = 0): [13:13:39.560] { [13:13:39.560] { [13:13:39.560] { [13:13:39.560] ...future.startTime <- base::Sys.time() [13:13:39.560] { [13:13:39.560] { [13:13:39.560] { [13:13:39.560] { [13:13:39.560] base::local({ [13:13:39.560] has_future <- base::requireNamespace("future", [13:13:39.560] quietly = TRUE) [13:13:39.560] if (has_future) { [13:13:39.560] ns <- base::getNamespace("future") [13:13:39.560] version <- ns[[".package"]][["version"]] [13:13:39.560] if (is.null(version)) [13:13:39.560] version <- utils::packageVersion("future") [13:13:39.560] } [13:13:39.560] else { [13:13:39.560] version <- NULL [13:13:39.560] } [13:13:39.560] if (!has_future || version < "1.8.0") { [13:13:39.560] info <- base::c(r_version = base::gsub("R version ", [13:13:39.560] "", base::R.version$version.string), [13:13:39.560] platform = base::sprintf("%s (%s-bit)", [13:13:39.560] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:39.560] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:39.560] "release", "version")], collapse = " "), [13:13:39.560] hostname = base::Sys.info()[["nodename"]]) [13:13:39.560] info <- base::sprintf("%s: %s", base::names(info), [13:13:39.560] info) [13:13:39.560] info <- base::paste(info, collapse = "; ") [13:13:39.560] if (!has_future) { [13:13:39.560] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:39.560] info) [13:13:39.560] } [13:13:39.560] else { [13:13:39.560] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:39.560] info, version) [13:13:39.560] } [13:13:39.560] base::stop(msg) [13:13:39.560] } [13:13:39.560] }) [13:13:39.560] } [13:13:39.560] base::local({ [13:13:39.560] for (pkg in "listenv") { [13:13:39.560] base::loadNamespace(pkg) [13:13:39.560] base::library(pkg, character.only = TRUE) [13:13:39.560] } [13:13:39.560] }) [13:13:39.560] } [13:13:39.560] options(future.plan = NULL) [13:13:39.560] Sys.unsetenv("R_FUTURE_PLAN") [13:13:39.560] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:39.560] } [13:13:39.560] ...future.workdir <- getwd() [13:13:39.560] } [13:13:39.560] ...future.oldOptions <- base::as.list(base::.Options) [13:13:39.560] ...future.oldEnvVars <- base::Sys.getenv() [13:13:39.560] } [13:13:39.560] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:39.560] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:39.560] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:39.560] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:39.560] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:39.560] future.stdout.windows.reencode = NULL, width = 80L) [13:13:39.560] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:39.560] base::names(...future.oldOptions)) [13:13:39.560] } [13:13:39.560] if (FALSE) { [13:13:39.560] } [13:13:39.560] else { [13:13:39.560] if (TRUE) { [13:13:39.560] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:39.560] open = "w") [13:13:39.560] } [13:13:39.560] else { [13:13:39.560] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:39.560] windows = "NUL", "/dev/null"), open = "w") [13:13:39.560] } [13:13:39.560] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:39.560] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:39.560] base::sink(type = "output", split = FALSE) [13:13:39.560] base::close(...future.stdout) [13:13:39.560] }, add = TRUE) [13:13:39.560] } [13:13:39.560] ...future.frame <- base::sys.nframe() [13:13:39.560] ...future.conditions <- base::list() [13:13:39.560] ...future.rng <- base::globalenv()$.Random.seed [13:13:39.560] if (FALSE) { [13:13:39.560] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:39.560] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:39.560] } [13:13:39.560] ...future.result <- base::tryCatch({ [13:13:39.560] base::withCallingHandlers({ [13:13:39.560] ...future.value <- base::withVisible(base::local({ [13:13:39.560] do.call(function(...) { [13:13:39.560] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:39.560] if (!identical(...future.globals.maxSize.org, [13:13:39.560] ...future.globals.maxSize)) { [13:13:39.560] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:39.560] on.exit(options(oopts), add = TRUE) [13:13:39.560] } [13:13:39.560] { [13:13:39.560] lapply(seq_along(...future.elements_ii), [13:13:39.560] FUN = function(jj) { [13:13:39.560] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:39.560] ...future.FUN(...future.X_jj, ...) [13:13:39.560] }) [13:13:39.560] } [13:13:39.560] }, args = future.call.arguments) [13:13:39.560] })) [13:13:39.560] future::FutureResult(value = ...future.value$value, [13:13:39.560] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:39.560] ...future.rng), globalenv = if (FALSE) [13:13:39.560] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:39.560] ...future.globalenv.names)) [13:13:39.560] else NULL, started = ...future.startTime, version = "1.8") [13:13:39.560] }, condition = base::local({ [13:13:39.560] c <- base::c [13:13:39.560] inherits <- base::inherits [13:13:39.560] invokeRestart <- base::invokeRestart [13:13:39.560] length <- base::length [13:13:39.560] list <- base::list [13:13:39.560] seq.int <- base::seq.int [13:13:39.560] signalCondition <- base::signalCondition [13:13:39.560] sys.calls <- base::sys.calls [13:13:39.560] `[[` <- base::`[[` [13:13:39.560] `+` <- base::`+` [13:13:39.560] `<<-` <- base::`<<-` [13:13:39.560] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:39.560] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:39.560] 3L)] [13:13:39.560] } [13:13:39.560] function(cond) { [13:13:39.560] is_error <- inherits(cond, "error") [13:13:39.560] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:39.560] NULL) [13:13:39.560] if (is_error) { [13:13:39.560] sessionInformation <- function() { [13:13:39.560] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:39.560] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:39.560] search = base::search(), system = base::Sys.info()) [13:13:39.560] } [13:13:39.560] ...future.conditions[[length(...future.conditions) + [13:13:39.560] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:39.560] cond$call), session = sessionInformation(), [13:13:39.560] timestamp = base::Sys.time(), signaled = 0L) [13:13:39.560] signalCondition(cond) [13:13:39.560] } [13:13:39.560] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:39.560] "immediateCondition"))) { [13:13:39.560] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:39.560] ...future.conditions[[length(...future.conditions) + [13:13:39.560] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:39.560] if (TRUE && !signal) { [13:13:39.560] muffleCondition <- function (cond, pattern = "^muffle") [13:13:39.560] { [13:13:39.560] inherits <- base::inherits [13:13:39.560] invokeRestart <- base::invokeRestart [13:13:39.560] is.null <- base::is.null [13:13:39.560] muffled <- FALSE [13:13:39.560] if (inherits(cond, "message")) { [13:13:39.560] muffled <- grepl(pattern, "muffleMessage") [13:13:39.560] if (muffled) [13:13:39.560] invokeRestart("muffleMessage") [13:13:39.560] } [13:13:39.560] else if (inherits(cond, "warning")) { [13:13:39.560] muffled <- grepl(pattern, "muffleWarning") [13:13:39.560] if (muffled) [13:13:39.560] invokeRestart("muffleWarning") [13:13:39.560] } [13:13:39.560] else if (inherits(cond, "condition")) { [13:13:39.560] if (!is.null(pattern)) { [13:13:39.560] computeRestarts <- base::computeRestarts [13:13:39.560] grepl <- base::grepl [13:13:39.560] restarts <- computeRestarts(cond) [13:13:39.560] for (restart in restarts) { [13:13:39.560] name <- restart$name [13:13:39.560] if (is.null(name)) [13:13:39.560] next [13:13:39.560] if (!grepl(pattern, name)) [13:13:39.560] next [13:13:39.560] invokeRestart(restart) [13:13:39.560] muffled <- TRUE [13:13:39.560] break [13:13:39.560] } [13:13:39.560] } [13:13:39.560] } [13:13:39.560] invisible(muffled) [13:13:39.560] } [13:13:39.560] muffleCondition(cond, pattern = "^muffle") [13:13:39.560] } [13:13:39.560] } [13:13:39.560] else { [13:13:39.560] if (TRUE) { [13:13:39.560] muffleCondition <- function (cond, pattern = "^muffle") [13:13:39.560] { [13:13:39.560] inherits <- base::inherits [13:13:39.560] invokeRestart <- base::invokeRestart [13:13:39.560] is.null <- base::is.null [13:13:39.560] muffled <- FALSE [13:13:39.560] if (inherits(cond, "message")) { [13:13:39.560] muffled <- grepl(pattern, "muffleMessage") [13:13:39.560] if (muffled) [13:13:39.560] invokeRestart("muffleMessage") [13:13:39.560] } [13:13:39.560] else if (inherits(cond, "warning")) { [13:13:39.560] muffled <- grepl(pattern, "muffleWarning") [13:13:39.560] if (muffled) [13:13:39.560] invokeRestart("muffleWarning") [13:13:39.560] } [13:13:39.560] else if (inherits(cond, "condition")) { [13:13:39.560] if (!is.null(pattern)) { [13:13:39.560] computeRestarts <- base::computeRestarts [13:13:39.560] grepl <- base::grepl [13:13:39.560] restarts <- computeRestarts(cond) [13:13:39.560] for (restart in restarts) { [13:13:39.560] name <- restart$name [13:13:39.560] if (is.null(name)) [13:13:39.560] next [13:13:39.560] if (!grepl(pattern, name)) [13:13:39.560] next [13:13:39.560] invokeRestart(restart) [13:13:39.560] muffled <- TRUE [13:13:39.560] break [13:13:39.560] } [13:13:39.560] } [13:13:39.560] } [13:13:39.560] invisible(muffled) [13:13:39.560] } [13:13:39.560] muffleCondition(cond, pattern = "^muffle") [13:13:39.560] } [13:13:39.560] } [13:13:39.560] } [13:13:39.560] })) [13:13:39.560] }, error = function(ex) { [13:13:39.560] base::structure(base::list(value = NULL, visible = NULL, [13:13:39.560] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:39.560] ...future.rng), started = ...future.startTime, [13:13:39.560] finished = Sys.time(), session_uuid = NA_character_, [13:13:39.560] version = "1.8"), class = "FutureResult") [13:13:39.560] }, finally = { [13:13:39.560] if (!identical(...future.workdir, getwd())) [13:13:39.560] setwd(...future.workdir) [13:13:39.560] { [13:13:39.560] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:39.560] ...future.oldOptions$nwarnings <- NULL [13:13:39.560] } [13:13:39.560] base::options(...future.oldOptions) [13:13:39.560] if (.Platform$OS.type == "windows") { [13:13:39.560] old_names <- names(...future.oldEnvVars) [13:13:39.560] envs <- base::Sys.getenv() [13:13:39.560] names <- names(envs) [13:13:39.560] common <- intersect(names, old_names) [13:13:39.560] added <- setdiff(names, old_names) [13:13:39.560] removed <- setdiff(old_names, names) [13:13:39.560] changed <- common[...future.oldEnvVars[common] != [13:13:39.560] envs[common]] [13:13:39.560] NAMES <- toupper(changed) [13:13:39.560] args <- list() [13:13:39.560] for (kk in seq_along(NAMES)) { [13:13:39.560] name <- changed[[kk]] [13:13:39.560] NAME <- NAMES[[kk]] [13:13:39.560] if (name != NAME && is.element(NAME, old_names)) [13:13:39.560] next [13:13:39.560] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:39.560] } [13:13:39.560] NAMES <- toupper(added) [13:13:39.560] for (kk in seq_along(NAMES)) { [13:13:39.560] name <- added[[kk]] [13:13:39.560] NAME <- NAMES[[kk]] [13:13:39.560] if (name != NAME && is.element(NAME, old_names)) [13:13:39.560] next [13:13:39.560] args[[name]] <- "" [13:13:39.560] } [13:13:39.560] NAMES <- toupper(removed) [13:13:39.560] for (kk in seq_along(NAMES)) { [13:13:39.560] name <- removed[[kk]] [13:13:39.560] NAME <- NAMES[[kk]] [13:13:39.560] if (name != NAME && is.element(NAME, old_names)) [13:13:39.560] next [13:13:39.560] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:39.560] } [13:13:39.560] if (length(args) > 0) [13:13:39.560] base::do.call(base::Sys.setenv, args = args) [13:13:39.560] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:39.560] } [13:13:39.560] else { [13:13:39.560] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:39.560] } [13:13:39.560] { [13:13:39.560] if (base::length(...future.futureOptionsAdded) > [13:13:39.560] 0L) { [13:13:39.560] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:39.560] base::names(opts) <- ...future.futureOptionsAdded [13:13:39.560] base::options(opts) [13:13:39.560] } [13:13:39.560] { [13:13:39.560] { [13:13:39.560] NULL [13:13:39.560] RNGkind("Mersenne-Twister") [13:13:39.560] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:39.560] inherits = FALSE) [13:13:39.560] } [13:13:39.560] options(future.plan = NULL) [13:13:39.560] if (is.na(NA_character_)) [13:13:39.560] Sys.unsetenv("R_FUTURE_PLAN") [13:13:39.560] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:39.560] future::plan(list(function (..., envir = parent.frame()) [13:13:39.560] { [13:13:39.560] future <- SequentialFuture(..., envir = envir) [13:13:39.560] if (!future$lazy) [13:13:39.560] future <- run(future) [13:13:39.560] invisible(future) [13:13:39.560] }), .cleanup = FALSE, .init = FALSE) [13:13:39.560] } [13:13:39.560] } [13:13:39.560] } [13:13:39.560] }) [13:13:39.560] if (TRUE) { [13:13:39.560] base::sink(type = "output", split = FALSE) [13:13:39.560] if (TRUE) { [13:13:39.560] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:39.560] } [13:13:39.560] else { [13:13:39.560] ...future.result["stdout"] <- base::list(NULL) [13:13:39.560] } [13:13:39.560] base::close(...future.stdout) [13:13:39.560] ...future.stdout <- NULL [13:13:39.560] } [13:13:39.560] ...future.result$conditions <- ...future.conditions [13:13:39.560] ...future.result$finished <- base::Sys.time() [13:13:39.560] ...future.result [13:13:39.560] } [13:13:39.564] assign_globals() ... [13:13:39.564] List of 5 [13:13:39.564] $ ...future.FUN :function (x, ...) [13:13:39.564] $ future.call.arguments : list() [13:13:39.564] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:39.564] $ ...future.elements_ii :List of 2 [13:13:39.564] ..$ a:Classes 'listenv', 'environment' [13:13:39.564] ..$ b:Classes 'listenv', 'environment' [13:13:39.564] $ ...future.seeds_ii : NULL [13:13:39.564] $ ...future.globals.maxSize: NULL [13:13:39.564] - attr(*, "where")=List of 5 [13:13:39.564] ..$ ...future.FUN : [13:13:39.564] ..$ future.call.arguments : [13:13:39.564] ..$ ...future.elements_ii : [13:13:39.564] ..$ ...future.seeds_ii : [13:13:39.564] ..$ ...future.globals.maxSize: [13:13:39.564] - attr(*, "resolved")= logi FALSE [13:13:39.564] - attr(*, "total_size")= num 4968 [13:13:39.564] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:39.564] - attr(*, "already-done")= logi TRUE [13:13:39.570] - copied '...future.FUN' to environment [13:13:39.570] - copied 'future.call.arguments' to environment [13:13:39.570] - copied '...future.elements_ii' to environment [13:13:39.570] - copied '...future.seeds_ii' to environment [13:13:39.571] - copied '...future.globals.maxSize' to environment [13:13:39.571] assign_globals() ... done [13:13:39.571] plan(): Setting new future strategy stack: [13:13:39.572] List of future strategies: [13:13:39.572] 1. sequential: [13:13:39.572] - args: function (..., envir = parent.frame(), workers = "") [13:13:39.572] - tweaked: FALSE [13:13:39.572] - call: NULL [13:13:39.572] plan(): nbrOfWorkers() = 1 [13:13:39.573] plan(): Setting new future strategy stack: [13:13:39.573] List of future strategies: [13:13:39.573] 1. sequential: [13:13:39.573] - args: function (..., envir = parent.frame(), workers = "") [13:13:39.573] - tweaked: FALSE [13:13:39.573] - call: plan(strategy) [13:13:39.574] plan(): nbrOfWorkers() = 1 [13:13:39.574] SequentialFuture started (and completed) [13:13:39.575] - Launch lazy future ... done [13:13:39.575] run() for 'SequentialFuture' ... done [13:13:39.575] Created future: [13:13:39.575] SequentialFuture: [13:13:39.575] Label: 'future_lapply-1' [13:13:39.575] Expression: [13:13:39.575] { [13:13:39.575] do.call(function(...) { [13:13:39.575] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:39.575] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:39.575] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:39.575] on.exit(options(oopts), add = TRUE) [13:13:39.575] } [13:13:39.575] { [13:13:39.575] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:39.575] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:39.575] ...future.FUN(...future.X_jj, ...) [13:13:39.575] }) [13:13:39.575] } [13:13:39.575] }, args = future.call.arguments) [13:13:39.575] } [13:13:39.575] Lazy evaluation: FALSE [13:13:39.575] Asynchronous evaluation: FALSE [13:13:39.575] Local evaluation: TRUE [13:13:39.575] Environment: R_GlobalEnv [13:13:39.575] Capture standard output: TRUE [13:13:39.575] Capture condition classes: 'condition' (excluding 'nothing') [13:13:39.575] 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) [13:13:39.575] Packages: 1 packages ('listenv') [13:13:39.575] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:39.575] Resolved: TRUE [13:13:39.575] Value: 800 bytes of class 'list' [13:13:39.575] Early signaling: FALSE [13:13:39.575] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:39.575] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:39.577] Chunk #1 of 1 ... DONE [13:13:39.577] Launching 1 futures (chunks) ... DONE [13:13:39.578] Resolving 1 futures (chunks) ... [13:13:39.578] resolve() on list ... [13:13:39.578] recursive: 0 [13:13:39.578] length: 1 [13:13:39.578] [13:13:39.578] resolved() for 'SequentialFuture' ... [13:13:39.579] - state: 'finished' [13:13:39.579] - run: TRUE [13:13:39.579] - result: 'FutureResult' [13:13:39.579] resolved() for 'SequentialFuture' ... done [13:13:39.579] Future #1 [13:13:39.580] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:39.580] - nx: 1 [13:13:39.580] - relay: TRUE [13:13:39.580] - stdout: TRUE [13:13:39.580] - signal: TRUE [13:13:39.580] - resignal: FALSE [13:13:39.580] - force: TRUE [13:13:39.581] - relayed: [n=1] FALSE [13:13:39.581] - queued futures: [n=1] FALSE [13:13:39.581] - until=1 [13:13:39.581] - relaying element #1 [13:13:39.581] - relayed: [n=1] TRUE [13:13:39.582] - queued futures: [n=1] TRUE [13:13:39.582] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:39.582] length: 0 (resolved future 1) [13:13:39.582] Relaying remaining futures [13:13:39.582] signalConditionsASAP(NULL, pos=0) ... [13:13:39.582] - nx: 1 [13:13:39.582] - relay: TRUE [13:13:39.583] - stdout: TRUE [13:13:39.583] - signal: TRUE [13:13:39.583] - resignal: FALSE [13:13:39.583] - force: TRUE [13:13:39.583] - relayed: [n=1] TRUE [13:13:39.583] - queued futures: [n=1] TRUE - flush all [13:13:39.584] - relayed: [n=1] TRUE [13:13:39.584] - queued futures: [n=1] TRUE [13:13:39.584] signalConditionsASAP(NULL, pos=0) ... done [13:13:39.584] resolve() on list ... DONE [13:13:39.584] - Number of value chunks collected: 1 [13:13:39.584] Resolving 1 futures (chunks) ... DONE [13:13:39.585] Reducing values from 1 chunks ... [13:13:39.585] - Number of values collected after concatenation: 2 [13:13:39.585] - Number of values expected: 2 [13:13:39.585] Reducing values from 1 chunks ... DONE [13:13:39.585] 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, ...) ... [13:13:39.587] future_lapply() ... [13:13:39.588] Number of chunks: 1 [13:13:39.588] Index remapping (attribute 'ordering'): [n = 4] 4, 2, 1, 3 [13:13:39.588] getGlobalsAndPackagesXApply() ... [13:13:39.589] - future.globals: TRUE [13:13:39.589] getGlobalsAndPackages() ... [13:13:39.589] Searching for globals... [13:13:39.590] - globals found: [2] 'FUN', '.Internal' [13:13:39.590] Searching for globals ... DONE [13:13:39.591] Resolving globals: FALSE [13:13:39.591] The total size of the 1 globals is 2.13 KiB (2184 bytes) [13:13:39.591] 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') [13:13:39.592] - globals: [1] 'FUN' [13:13:39.592] [13:13:39.592] getGlobalsAndPackages() ... DONE [13:13:39.592] - globals found/used: [n=1] 'FUN' [13:13:39.592] - needed namespaces: [n=0] [13:13:39.592] Finding globals ... DONE [13:13:39.593] - use_args: TRUE [13:13:39.593] - Getting '...' globals ... [13:13:39.593] resolve() on list ... [13:13:39.593] recursive: 0 [13:13:39.593] length: 1 [13:13:39.594] elements: '...' [13:13:39.594] length: 0 (resolved future 1) [13:13:39.594] resolve() on list ... DONE [13:13:39.594] - '...' content: [n=1] 'length' [13:13:39.594] List of 1 [13:13:39.594] $ ...:List of 1 [13:13:39.594] ..$ length: int 2 [13:13:39.594] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:39.594] - attr(*, "where")=List of 1 [13:13:39.594] ..$ ...: [13:13:39.594] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:39.594] - attr(*, "resolved")= logi TRUE [13:13:39.594] - attr(*, "total_size")= num NA [13:13:39.598] - Getting '...' globals ... DONE [13:13:39.598] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:39.598] List of 2 [13:13:39.598] $ ...future.FUN:function (mode = "logical", length = 0L) [13:13:39.598] $ ... :List of 1 [13:13:39.598] ..$ length: int 2 [13:13:39.598] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:39.598] - attr(*, "where")=List of 2 [13:13:39.598] ..$ ...future.FUN: [13:13:39.598] ..$ ... : [13:13:39.598] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:39.598] - attr(*, "resolved")= logi FALSE [13:13:39.598] - attr(*, "total_size")= num 2240 [13:13:39.603] Packages to be attached in all futures: [n=0] [13:13:39.603] getGlobalsAndPackagesXApply() ... DONE [13:13:39.603] Number of futures (= number of chunks): 1 [13:13:39.603] Launching 1 futures (chunks) ... [13:13:39.603] Chunk #1 of 1 ... [13:13:39.604] - Finding globals in 'X' for chunk #1 ... [13:13:39.604] getGlobalsAndPackages() ... [13:13:39.604] Searching for globals... [13:13:39.604] [13:13:39.604] Searching for globals ... DONE [13:13:39.605] - globals: [0] [13:13:39.605] getGlobalsAndPackages() ... DONE [13:13:39.605] + additional globals found: [n=0] [13:13:39.605] + additional namespaces needed: [n=0] [13:13:39.605] - Finding globals in 'X' for chunk #1 ... DONE [13:13:39.605] - seeds: [13:13:39.605] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:39.606] getGlobalsAndPackages() ... [13:13:39.606] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:39.606] Resolving globals: FALSE [13:13:39.606] Tweak future expression to call with '...' arguments ... [13:13:39.606] { [13:13:39.606] do.call(function(...) { [13:13:39.606] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:39.606] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:39.606] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:39.606] on.exit(options(oopts), add = TRUE) [13:13:39.606] } [13:13:39.606] { [13:13:39.606] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:39.606] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:39.606] ...future.FUN(...future.X_jj, ...) [13:13:39.606] }) [13:13:39.606] } [13:13:39.606] }, args = future.call.arguments) [13:13:39.606] } [13:13:39.607] Tweak future expression to call with '...' arguments ... DONE [13:13:39.607] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:39.607] [13:13:39.608] getGlobalsAndPackages() ... DONE [13:13:39.608] run() for 'Future' ... [13:13:39.608] - state: 'created' [13:13:39.608] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:13:39.609] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:39.609] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:39.609] - Field: 'label' [13:13:39.609] - Field: 'local' [13:13:39.609] - Field: 'owner' [13:13:39.610] - Field: 'envir' [13:13:39.610] - Field: 'packages' [13:13:39.610] - Field: 'gc' [13:13:39.610] - Field: 'conditions' [13:13:39.610] - Field: 'expr' [13:13:39.610] - Field: 'uuid' [13:13:39.611] - Field: 'seed' [13:13:39.611] - Field: 'version' [13:13:39.611] - Field: 'result' [13:13:39.611] - Field: 'asynchronous' [13:13:39.611] - Field: 'calls' [13:13:39.611] - Field: 'globals' [13:13:39.612] - Field: 'stdout' [13:13:39.612] - Field: 'earlySignal' [13:13:39.612] - Field: 'lazy' [13:13:39.612] - Field: 'state' [13:13:39.612] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:39.612] - Launch lazy future ... [13:13:39.613] Packages needed by the future expression (n = 0): [13:13:39.613] Packages needed by future strategies (n = 0): [13:13:39.613] { [13:13:39.613] { [13:13:39.613] { [13:13:39.613] ...future.startTime <- base::Sys.time() [13:13:39.613] { [13:13:39.613] { [13:13:39.613] { [13:13:39.613] base::local({ [13:13:39.613] has_future <- base::requireNamespace("future", [13:13:39.613] quietly = TRUE) [13:13:39.613] if (has_future) { [13:13:39.613] ns <- base::getNamespace("future") [13:13:39.613] version <- ns[[".package"]][["version"]] [13:13:39.613] if (is.null(version)) [13:13:39.613] version <- utils::packageVersion("future") [13:13:39.613] } [13:13:39.613] else { [13:13:39.613] version <- NULL [13:13:39.613] } [13:13:39.613] if (!has_future || version < "1.8.0") { [13:13:39.613] info <- base::c(r_version = base::gsub("R version ", [13:13:39.613] "", base::R.version$version.string), [13:13:39.613] platform = base::sprintf("%s (%s-bit)", [13:13:39.613] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:39.613] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:39.613] "release", "version")], collapse = " "), [13:13:39.613] hostname = base::Sys.info()[["nodename"]]) [13:13:39.613] info <- base::sprintf("%s: %s", base::names(info), [13:13:39.613] info) [13:13:39.613] info <- base::paste(info, collapse = "; ") [13:13:39.613] if (!has_future) { [13:13:39.613] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:39.613] info) [13:13:39.613] } [13:13:39.613] else { [13:13:39.613] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:39.613] info, version) [13:13:39.613] } [13:13:39.613] base::stop(msg) [13:13:39.613] } [13:13:39.613] }) [13:13:39.613] } [13:13:39.613] options(future.plan = NULL) [13:13:39.613] Sys.unsetenv("R_FUTURE_PLAN") [13:13:39.613] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:39.613] } [13:13:39.613] ...future.workdir <- getwd() [13:13:39.613] } [13:13:39.613] ...future.oldOptions <- base::as.list(base::.Options) [13:13:39.613] ...future.oldEnvVars <- base::Sys.getenv() [13:13:39.613] } [13:13:39.613] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:39.613] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:39.613] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:39.613] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:39.613] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:39.613] future.stdout.windows.reencode = NULL, width = 80L) [13:13:39.613] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:39.613] base::names(...future.oldOptions)) [13:13:39.613] } [13:13:39.613] if (FALSE) { [13:13:39.613] } [13:13:39.613] else { [13:13:39.613] if (TRUE) { [13:13:39.613] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:39.613] open = "w") [13:13:39.613] } [13:13:39.613] else { [13:13:39.613] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:39.613] windows = "NUL", "/dev/null"), open = "w") [13:13:39.613] } [13:13:39.613] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:39.613] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:39.613] base::sink(type = "output", split = FALSE) [13:13:39.613] base::close(...future.stdout) [13:13:39.613] }, add = TRUE) [13:13:39.613] } [13:13:39.613] ...future.frame <- base::sys.nframe() [13:13:39.613] ...future.conditions <- base::list() [13:13:39.613] ...future.rng <- base::globalenv()$.Random.seed [13:13:39.613] if (FALSE) { [13:13:39.613] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:39.613] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:39.613] } [13:13:39.613] ...future.result <- base::tryCatch({ [13:13:39.613] base::withCallingHandlers({ [13:13:39.613] ...future.value <- base::withVisible(base::local({ [13:13:39.613] do.call(function(...) { [13:13:39.613] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:39.613] if (!identical(...future.globals.maxSize.org, [13:13:39.613] ...future.globals.maxSize)) { [13:13:39.613] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:39.613] on.exit(options(oopts), add = TRUE) [13:13:39.613] } [13:13:39.613] { [13:13:39.613] lapply(seq_along(...future.elements_ii), [13:13:39.613] FUN = function(jj) { [13:13:39.613] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:39.613] ...future.FUN(...future.X_jj, ...) [13:13:39.613] }) [13:13:39.613] } [13:13:39.613] }, args = future.call.arguments) [13:13:39.613] })) [13:13:39.613] future::FutureResult(value = ...future.value$value, [13:13:39.613] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:39.613] ...future.rng), globalenv = if (FALSE) [13:13:39.613] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:39.613] ...future.globalenv.names)) [13:13:39.613] else NULL, started = ...future.startTime, version = "1.8") [13:13:39.613] }, condition = base::local({ [13:13:39.613] c <- base::c [13:13:39.613] inherits <- base::inherits [13:13:39.613] invokeRestart <- base::invokeRestart [13:13:39.613] length <- base::length [13:13:39.613] list <- base::list [13:13:39.613] seq.int <- base::seq.int [13:13:39.613] signalCondition <- base::signalCondition [13:13:39.613] sys.calls <- base::sys.calls [13:13:39.613] `[[` <- base::`[[` [13:13:39.613] `+` <- base::`+` [13:13:39.613] `<<-` <- base::`<<-` [13:13:39.613] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:39.613] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:39.613] 3L)] [13:13:39.613] } [13:13:39.613] function(cond) { [13:13:39.613] is_error <- inherits(cond, "error") [13:13:39.613] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:39.613] NULL) [13:13:39.613] if (is_error) { [13:13:39.613] sessionInformation <- function() { [13:13:39.613] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:39.613] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:39.613] search = base::search(), system = base::Sys.info()) [13:13:39.613] } [13:13:39.613] ...future.conditions[[length(...future.conditions) + [13:13:39.613] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:39.613] cond$call), session = sessionInformation(), [13:13:39.613] timestamp = base::Sys.time(), signaled = 0L) [13:13:39.613] signalCondition(cond) [13:13:39.613] } [13:13:39.613] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:39.613] "immediateCondition"))) { [13:13:39.613] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:39.613] ...future.conditions[[length(...future.conditions) + [13:13:39.613] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:39.613] if (TRUE && !signal) { [13:13:39.613] muffleCondition <- function (cond, pattern = "^muffle") [13:13:39.613] { [13:13:39.613] inherits <- base::inherits [13:13:39.613] invokeRestart <- base::invokeRestart [13:13:39.613] is.null <- base::is.null [13:13:39.613] muffled <- FALSE [13:13:39.613] if (inherits(cond, "message")) { [13:13:39.613] muffled <- grepl(pattern, "muffleMessage") [13:13:39.613] if (muffled) [13:13:39.613] invokeRestart("muffleMessage") [13:13:39.613] } [13:13:39.613] else if (inherits(cond, "warning")) { [13:13:39.613] muffled <- grepl(pattern, "muffleWarning") [13:13:39.613] if (muffled) [13:13:39.613] invokeRestart("muffleWarning") [13:13:39.613] } [13:13:39.613] else if (inherits(cond, "condition")) { [13:13:39.613] if (!is.null(pattern)) { [13:13:39.613] computeRestarts <- base::computeRestarts [13:13:39.613] grepl <- base::grepl [13:13:39.613] restarts <- computeRestarts(cond) [13:13:39.613] for (restart in restarts) { [13:13:39.613] name <- restart$name [13:13:39.613] if (is.null(name)) [13:13:39.613] next [13:13:39.613] if (!grepl(pattern, name)) [13:13:39.613] next [13:13:39.613] invokeRestart(restart) [13:13:39.613] muffled <- TRUE [13:13:39.613] break [13:13:39.613] } [13:13:39.613] } [13:13:39.613] } [13:13:39.613] invisible(muffled) [13:13:39.613] } [13:13:39.613] muffleCondition(cond, pattern = "^muffle") [13:13:39.613] } [13:13:39.613] } [13:13:39.613] else { [13:13:39.613] if (TRUE) { [13:13:39.613] muffleCondition <- function (cond, pattern = "^muffle") [13:13:39.613] { [13:13:39.613] inherits <- base::inherits [13:13:39.613] invokeRestart <- base::invokeRestart [13:13:39.613] is.null <- base::is.null [13:13:39.613] muffled <- FALSE [13:13:39.613] if (inherits(cond, "message")) { [13:13:39.613] muffled <- grepl(pattern, "muffleMessage") [13:13:39.613] if (muffled) [13:13:39.613] invokeRestart("muffleMessage") [13:13:39.613] } [13:13:39.613] else if (inherits(cond, "warning")) { [13:13:39.613] muffled <- grepl(pattern, "muffleWarning") [13:13:39.613] if (muffled) [13:13:39.613] invokeRestart("muffleWarning") [13:13:39.613] } [13:13:39.613] else if (inherits(cond, "condition")) { [13:13:39.613] if (!is.null(pattern)) { [13:13:39.613] computeRestarts <- base::computeRestarts [13:13:39.613] grepl <- base::grepl [13:13:39.613] restarts <- computeRestarts(cond) [13:13:39.613] for (restart in restarts) { [13:13:39.613] name <- restart$name [13:13:39.613] if (is.null(name)) [13:13:39.613] next [13:13:39.613] if (!grepl(pattern, name)) [13:13:39.613] next [13:13:39.613] invokeRestart(restart) [13:13:39.613] muffled <- TRUE [13:13:39.613] break [13:13:39.613] } [13:13:39.613] } [13:13:39.613] } [13:13:39.613] invisible(muffled) [13:13:39.613] } [13:13:39.613] muffleCondition(cond, pattern = "^muffle") [13:13:39.613] } [13:13:39.613] } [13:13:39.613] } [13:13:39.613] })) [13:13:39.613] }, error = function(ex) { [13:13:39.613] base::structure(base::list(value = NULL, visible = NULL, [13:13:39.613] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:39.613] ...future.rng), started = ...future.startTime, [13:13:39.613] finished = Sys.time(), session_uuid = NA_character_, [13:13:39.613] version = "1.8"), class = "FutureResult") [13:13:39.613] }, finally = { [13:13:39.613] if (!identical(...future.workdir, getwd())) [13:13:39.613] setwd(...future.workdir) [13:13:39.613] { [13:13:39.613] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:39.613] ...future.oldOptions$nwarnings <- NULL [13:13:39.613] } [13:13:39.613] base::options(...future.oldOptions) [13:13:39.613] if (.Platform$OS.type == "windows") { [13:13:39.613] old_names <- names(...future.oldEnvVars) [13:13:39.613] envs <- base::Sys.getenv() [13:13:39.613] names <- names(envs) [13:13:39.613] common <- intersect(names, old_names) [13:13:39.613] added <- setdiff(names, old_names) [13:13:39.613] removed <- setdiff(old_names, names) [13:13:39.613] changed <- common[...future.oldEnvVars[common] != [13:13:39.613] envs[common]] [13:13:39.613] NAMES <- toupper(changed) [13:13:39.613] args <- list() [13:13:39.613] for (kk in seq_along(NAMES)) { [13:13:39.613] name <- changed[[kk]] [13:13:39.613] NAME <- NAMES[[kk]] [13:13:39.613] if (name != NAME && is.element(NAME, old_names)) [13:13:39.613] next [13:13:39.613] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:39.613] } [13:13:39.613] NAMES <- toupper(added) [13:13:39.613] for (kk in seq_along(NAMES)) { [13:13:39.613] name <- added[[kk]] [13:13:39.613] NAME <- NAMES[[kk]] [13:13:39.613] if (name != NAME && is.element(NAME, old_names)) [13:13:39.613] next [13:13:39.613] args[[name]] <- "" [13:13:39.613] } [13:13:39.613] NAMES <- toupper(removed) [13:13:39.613] for (kk in seq_along(NAMES)) { [13:13:39.613] name <- removed[[kk]] [13:13:39.613] NAME <- NAMES[[kk]] [13:13:39.613] if (name != NAME && is.element(NAME, old_names)) [13:13:39.613] next [13:13:39.613] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:39.613] } [13:13:39.613] if (length(args) > 0) [13:13:39.613] base::do.call(base::Sys.setenv, args = args) [13:13:39.613] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:39.613] } [13:13:39.613] else { [13:13:39.613] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:39.613] } [13:13:39.613] { [13:13:39.613] if (base::length(...future.futureOptionsAdded) > [13:13:39.613] 0L) { [13:13:39.613] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:39.613] base::names(opts) <- ...future.futureOptionsAdded [13:13:39.613] base::options(opts) [13:13:39.613] } [13:13:39.613] { [13:13:39.613] { [13:13:39.613] NULL [13:13:39.613] RNGkind("Mersenne-Twister") [13:13:39.613] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:39.613] inherits = FALSE) [13:13:39.613] } [13:13:39.613] options(future.plan = NULL) [13:13:39.613] if (is.na(NA_character_)) [13:13:39.613] Sys.unsetenv("R_FUTURE_PLAN") [13:13:39.613] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:39.613] future::plan(list(function (..., envir = parent.frame()) [13:13:39.613] { [13:13:39.613] future <- SequentialFuture(..., envir = envir) [13:13:39.613] if (!future$lazy) [13:13:39.613] future <- run(future) [13:13:39.613] invisible(future) [13:13:39.613] }), .cleanup = FALSE, .init = FALSE) [13:13:39.613] } [13:13:39.613] } [13:13:39.613] } [13:13:39.613] }) [13:13:39.613] if (TRUE) { [13:13:39.613] base::sink(type = "output", split = FALSE) [13:13:39.613] if (TRUE) { [13:13:39.613] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:39.613] } [13:13:39.613] else { [13:13:39.613] ...future.result["stdout"] <- base::list(NULL) [13:13:39.613] } [13:13:39.613] base::close(...future.stdout) [13:13:39.613] ...future.stdout <- NULL [13:13:39.613] } [13:13:39.613] ...future.result$conditions <- ...future.conditions [13:13:39.613] ...future.result$finished <- base::Sys.time() [13:13:39.613] ...future.result [13:13:39.613] } [13:13:39.617] assign_globals() ... [13:13:39.617] List of 5 [13:13:39.617] $ ...future.FUN :function (mode = "logical", length = 0L) [13:13:39.617] $ future.call.arguments :List of 1 [13:13:39.617] ..$ length: int 2 [13:13:39.617] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:39.617] $ ...future.elements_ii :List of 4 [13:13:39.617] ..$ c: chr "list" [13:13:39.617] ..$ b: chr "numeric" [13:13:39.617] ..$ a: chr "integer" [13:13:39.617] ..$ c: chr "character" [13:13:39.617] $ ...future.seeds_ii : NULL [13:13:39.617] $ ...future.globals.maxSize: NULL [13:13:39.617] - attr(*, "where")=List of 5 [13:13:39.617] ..$ ...future.FUN : [13:13:39.617] ..$ future.call.arguments : [13:13:39.617] ..$ ...future.elements_ii : [13:13:39.617] ..$ ...future.seeds_ii : [13:13:39.617] ..$ ...future.globals.maxSize: [13:13:39.617] - attr(*, "resolved")= logi FALSE [13:13:39.617] - attr(*, "total_size")= num 2240 [13:13:39.617] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:39.617] - attr(*, "already-done")= logi TRUE [13:13:39.624] - copied '...future.FUN' to environment [13:13:39.624] - copied 'future.call.arguments' to environment [13:13:39.625] - copied '...future.elements_ii' to environment [13:13:39.625] - copied '...future.seeds_ii' to environment [13:13:39.625] - copied '...future.globals.maxSize' to environment [13:13:39.625] assign_globals() ... done [13:13:39.626] plan(): Setting new future strategy stack: [13:13:39.626] List of future strategies: [13:13:39.626] 1. sequential: [13:13:39.626] - args: function (..., envir = parent.frame(), workers = "") [13:13:39.626] - tweaked: FALSE [13:13:39.626] - call: NULL [13:13:39.627] plan(): nbrOfWorkers() = 1 [13:13:39.628] plan(): Setting new future strategy stack: [13:13:39.628] List of future strategies: [13:13:39.628] 1. sequential: [13:13:39.628] - args: function (..., envir = parent.frame(), workers = "") [13:13:39.628] - tweaked: FALSE [13:13:39.628] - call: plan(strategy) [13:13:39.629] plan(): nbrOfWorkers() = 1 [13:13:39.629] SequentialFuture started (and completed) [13:13:39.629] - Launch lazy future ... done [13:13:39.629] run() for 'SequentialFuture' ... done [13:13:39.630] Created future: [13:13:39.630] SequentialFuture: [13:13:39.630] Label: 'future_lapply-1' [13:13:39.630] Expression: [13:13:39.630] { [13:13:39.630] do.call(function(...) { [13:13:39.630] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:39.630] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:39.630] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:39.630] on.exit(options(oopts), add = TRUE) [13:13:39.630] } [13:13:39.630] { [13:13:39.630] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:39.630] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:39.630] ...future.FUN(...future.X_jj, ...) [13:13:39.630] }) [13:13:39.630] } [13:13:39.630] }, args = future.call.arguments) [13:13:39.630] } [13:13:39.630] Lazy evaluation: FALSE [13:13:39.630] Asynchronous evaluation: FALSE [13:13:39.630] Local evaluation: TRUE [13:13:39.630] Environment: R_GlobalEnv [13:13:39.630] Capture standard output: TRUE [13:13:39.630] Capture condition classes: 'condition' (excluding 'nothing') [13:13:39.630] 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) [13:13:39.630] Packages: [13:13:39.630] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:39.630] Resolved: TRUE [13:13:39.630] Value: 240 bytes of class 'list' [13:13:39.630] Early signaling: FALSE [13:13:39.630] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:39.630] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:39.631] Chunk #1 of 1 ... DONE [13:13:39.631] Launching 1 futures (chunks) ... DONE [13:13:39.632] Resolving 1 futures (chunks) ... [13:13:39.632] resolve() on list ... [13:13:39.632] recursive: 0 [13:13:39.632] length: 1 [13:13:39.632] [13:13:39.632] resolved() for 'SequentialFuture' ... [13:13:39.633] - state: 'finished' [13:13:39.633] - run: TRUE [13:13:39.633] - result: 'FutureResult' [13:13:39.633] resolved() for 'SequentialFuture' ... done [13:13:39.633] Future #1 [13:13:39.633] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:39.634] - nx: 1 [13:13:39.634] - relay: TRUE [13:13:39.634] - stdout: TRUE [13:13:39.634] - signal: TRUE [13:13:39.634] - resignal: FALSE [13:13:39.634] - force: TRUE [13:13:39.635] - relayed: [n=1] FALSE [13:13:39.635] - queued futures: [n=1] FALSE [13:13:39.635] - until=1 [13:13:39.635] - relaying element #1 [13:13:39.635] - relayed: [n=1] TRUE [13:13:39.635] - queued futures: [n=1] TRUE [13:13:39.636] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:39.636] length: 0 (resolved future 1) [13:13:39.636] Relaying remaining futures [13:13:39.636] signalConditionsASAP(NULL, pos=0) ... [13:13:39.636] - nx: 1 [13:13:39.636] - relay: TRUE [13:13:39.637] - stdout: TRUE [13:13:39.637] - signal: TRUE [13:13:39.637] - resignal: FALSE [13:13:39.637] - force: TRUE [13:13:39.637] - relayed: [n=1] TRUE [13:13:39.637] - queued futures: [n=1] TRUE - flush all [13:13:39.638] - relayed: [n=1] TRUE [13:13:39.638] - queued futures: [n=1] TRUE [13:13:39.638] signalConditionsASAP(NULL, pos=0) ... done [13:13:39.638] resolve() on list ... DONE [13:13:39.638] - Number of value chunks collected: 1 [13:13:39.638] Resolving 1 futures (chunks) ... DONE [13:13:39.639] Reducing values from 1 chunks ... [13:13:39.639] - Number of values collected after concatenation: 4 [13:13:39.639] - Number of values expected: 4 [13:13:39.639] Reverse index remapping (attribute 'ordering'): [n = 4] 3, 2, 4, 1 [13:13:39.639] Reducing values from 1 chunks ... DONE [13:13:39.639] 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 [13:13:39.642] future_lapply() ... [13:13:39.643] Number of chunks: 1 [13:13:39.643] Index remapping (attribute 'ordering'): [n = 4] 3, 2, 1, 4 [13:13:39.643] getGlobalsAndPackagesXApply() ... [13:13:39.643] - future.globals: TRUE [13:13:39.643] getGlobalsAndPackages() ... [13:13:39.643] Searching for globals... [13:13:39.645] - globals found: [2] 'FUN', '.Internal' [13:13:39.645] Searching for globals ... DONE [13:13:39.645] Resolving globals: FALSE [13:13:39.646] The total size of the 1 globals is 2.13 KiB (2184 bytes) [13:13:39.646] 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') [13:13:39.646] - globals: [1] 'FUN' [13:13:39.646] [13:13:39.647] getGlobalsAndPackages() ... DONE [13:13:39.647] - globals found/used: [n=1] 'FUN' [13:13:39.647] - needed namespaces: [n=0] [13:13:39.647] Finding globals ... DONE [13:13:39.647] - use_args: TRUE [13:13:39.647] - Getting '...' globals ... [13:13:39.648] resolve() on list ... [13:13:39.648] recursive: 0 [13:13:39.648] length: 1 [13:13:39.648] elements: '...' [13:13:39.648] length: 0 (resolved future 1) [13:13:39.649] resolve() on list ... DONE [13:13:39.649] - '...' content: [n=1] 'length' [13:13:39.649] List of 1 [13:13:39.649] $ ...:List of 1 [13:13:39.649] ..$ length: int 2 [13:13:39.649] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:39.649] - attr(*, "where")=List of 1 [13:13:39.649] ..$ ...: [13:13:39.649] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:39.649] - attr(*, "resolved")= logi TRUE [13:13:39.649] - attr(*, "total_size")= num NA [13:13:39.653] - Getting '...' globals ... DONE [13:13:39.653] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:39.654] List of 2 [13:13:39.654] $ ...future.FUN:function (mode = "logical", length = 0L) [13:13:39.654] $ ... :List of 1 [13:13:39.654] ..$ length: int 2 [13:13:39.654] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:39.654] - attr(*, "where")=List of 2 [13:13:39.654] ..$ ...future.FUN: [13:13:39.654] ..$ ... : [13:13:39.654] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:39.654] - attr(*, "resolved")= logi FALSE [13:13:39.654] - attr(*, "total_size")= num 2240 [13:13:39.657] Packages to be attached in all futures: [n=0] [13:13:39.657] getGlobalsAndPackagesXApply() ... DONE [13:13:39.658] Number of futures (= number of chunks): 1 [13:13:39.658] Launching 1 futures (chunks) ... [13:13:39.658] Chunk #1 of 1 ... [13:13:39.658] - Finding globals in 'X' for chunk #1 ... [13:13:39.658] getGlobalsAndPackages() ... [13:13:39.659] Searching for globals... [13:13:39.659] [13:13:39.659] Searching for globals ... DONE [13:13:39.659] - globals: [0] [13:13:39.659] getGlobalsAndPackages() ... DONE [13:13:39.659] + additional globals found: [n=0] [13:13:39.660] + additional namespaces needed: [n=0] [13:13:39.660] - Finding globals in 'X' for chunk #1 ... DONE [13:13:39.660] - seeds: [13:13:39.660] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:39.660] getGlobalsAndPackages() ... [13:13:39.660] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:39.661] Resolving globals: FALSE [13:13:39.661] Tweak future expression to call with '...' arguments ... [13:13:39.661] { [13:13:39.661] do.call(function(...) { [13:13:39.661] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:39.661] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:39.661] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:39.661] on.exit(options(oopts), add = TRUE) [13:13:39.661] } [13:13:39.661] { [13:13:39.661] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:39.661] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:39.661] ...future.FUN(...future.X_jj, ...) [13:13:39.661] }) [13:13:39.661] } [13:13:39.661] }, args = future.call.arguments) [13:13:39.661] } [13:13:39.661] Tweak future expression to call with '...' arguments ... DONE [13:13:39.662] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:39.662] [13:13:39.662] getGlobalsAndPackages() ... DONE [13:13:39.662] run() for 'Future' ... [13:13:39.663] - state: 'created' [13:13:39.663] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:13:39.663] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:39.663] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:39.664] - Field: 'label' [13:13:39.664] - Field: 'local' [13:13:39.664] - Field: 'owner' [13:13:39.664] - Field: 'envir' [13:13:39.664] - Field: 'packages' [13:13:39.665] - Field: 'gc' [13:13:39.665] - Field: 'conditions' [13:13:39.665] - Field: 'expr' [13:13:39.665] - Field: 'uuid' [13:13:39.665] - Field: 'seed' [13:13:39.665] - Field: 'version' [13:13:39.666] - Field: 'result' [13:13:39.666] - Field: 'asynchronous' [13:13:39.666] - Field: 'calls' [13:13:39.666] - Field: 'globals' [13:13:39.666] - Field: 'stdout' [13:13:39.666] - Field: 'earlySignal' [13:13:39.667] - Field: 'lazy' [13:13:39.667] - Field: 'state' [13:13:39.667] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:39.667] - Launch lazy future ... [13:13:39.667] Packages needed by the future expression (n = 0): [13:13:39.667] Packages needed by future strategies (n = 0): [13:13:39.668] { [13:13:39.668] { [13:13:39.668] { [13:13:39.668] ...future.startTime <- base::Sys.time() [13:13:39.668] { [13:13:39.668] { [13:13:39.668] { [13:13:39.668] base::local({ [13:13:39.668] has_future <- base::requireNamespace("future", [13:13:39.668] quietly = TRUE) [13:13:39.668] if (has_future) { [13:13:39.668] ns <- base::getNamespace("future") [13:13:39.668] version <- ns[[".package"]][["version"]] [13:13:39.668] if (is.null(version)) [13:13:39.668] version <- utils::packageVersion("future") [13:13:39.668] } [13:13:39.668] else { [13:13:39.668] version <- NULL [13:13:39.668] } [13:13:39.668] if (!has_future || version < "1.8.0") { [13:13:39.668] info <- base::c(r_version = base::gsub("R version ", [13:13:39.668] "", base::R.version$version.string), [13:13:39.668] platform = base::sprintf("%s (%s-bit)", [13:13:39.668] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:39.668] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:39.668] "release", "version")], collapse = " "), [13:13:39.668] hostname = base::Sys.info()[["nodename"]]) [13:13:39.668] info <- base::sprintf("%s: %s", base::names(info), [13:13:39.668] info) [13:13:39.668] info <- base::paste(info, collapse = "; ") [13:13:39.668] if (!has_future) { [13:13:39.668] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:39.668] info) [13:13:39.668] } [13:13:39.668] else { [13:13:39.668] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:39.668] info, version) [13:13:39.668] } [13:13:39.668] base::stop(msg) [13:13:39.668] } [13:13:39.668] }) [13:13:39.668] } [13:13:39.668] options(future.plan = NULL) [13:13:39.668] Sys.unsetenv("R_FUTURE_PLAN") [13:13:39.668] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:39.668] } [13:13:39.668] ...future.workdir <- getwd() [13:13:39.668] } [13:13:39.668] ...future.oldOptions <- base::as.list(base::.Options) [13:13:39.668] ...future.oldEnvVars <- base::Sys.getenv() [13:13:39.668] } [13:13:39.668] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:39.668] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:39.668] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:39.668] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:39.668] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:39.668] future.stdout.windows.reencode = NULL, width = 80L) [13:13:39.668] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:39.668] base::names(...future.oldOptions)) [13:13:39.668] } [13:13:39.668] if (FALSE) { [13:13:39.668] } [13:13:39.668] else { [13:13:39.668] if (TRUE) { [13:13:39.668] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:39.668] open = "w") [13:13:39.668] } [13:13:39.668] else { [13:13:39.668] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:39.668] windows = "NUL", "/dev/null"), open = "w") [13:13:39.668] } [13:13:39.668] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:39.668] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:39.668] base::sink(type = "output", split = FALSE) [13:13:39.668] base::close(...future.stdout) [13:13:39.668] }, add = TRUE) [13:13:39.668] } [13:13:39.668] ...future.frame <- base::sys.nframe() [13:13:39.668] ...future.conditions <- base::list() [13:13:39.668] ...future.rng <- base::globalenv()$.Random.seed [13:13:39.668] if (FALSE) { [13:13:39.668] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:39.668] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:39.668] } [13:13:39.668] ...future.result <- base::tryCatch({ [13:13:39.668] base::withCallingHandlers({ [13:13:39.668] ...future.value <- base::withVisible(base::local({ [13:13:39.668] do.call(function(...) { [13:13:39.668] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:39.668] if (!identical(...future.globals.maxSize.org, [13:13:39.668] ...future.globals.maxSize)) { [13:13:39.668] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:39.668] on.exit(options(oopts), add = TRUE) [13:13:39.668] } [13:13:39.668] { [13:13:39.668] lapply(seq_along(...future.elements_ii), [13:13:39.668] FUN = function(jj) { [13:13:39.668] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:39.668] ...future.FUN(...future.X_jj, ...) [13:13:39.668] }) [13:13:39.668] } [13:13:39.668] }, args = future.call.arguments) [13:13:39.668] })) [13:13:39.668] future::FutureResult(value = ...future.value$value, [13:13:39.668] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:39.668] ...future.rng), globalenv = if (FALSE) [13:13:39.668] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:39.668] ...future.globalenv.names)) [13:13:39.668] else NULL, started = ...future.startTime, version = "1.8") [13:13:39.668] }, condition = base::local({ [13:13:39.668] c <- base::c [13:13:39.668] inherits <- base::inherits [13:13:39.668] invokeRestart <- base::invokeRestart [13:13:39.668] length <- base::length [13:13:39.668] list <- base::list [13:13:39.668] seq.int <- base::seq.int [13:13:39.668] signalCondition <- base::signalCondition [13:13:39.668] sys.calls <- base::sys.calls [13:13:39.668] `[[` <- base::`[[` [13:13:39.668] `+` <- base::`+` [13:13:39.668] `<<-` <- base::`<<-` [13:13:39.668] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:39.668] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:39.668] 3L)] [13:13:39.668] } [13:13:39.668] function(cond) { [13:13:39.668] is_error <- inherits(cond, "error") [13:13:39.668] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:39.668] NULL) [13:13:39.668] if (is_error) { [13:13:39.668] sessionInformation <- function() { [13:13:39.668] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:39.668] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:39.668] search = base::search(), system = base::Sys.info()) [13:13:39.668] } [13:13:39.668] ...future.conditions[[length(...future.conditions) + [13:13:39.668] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:39.668] cond$call), session = sessionInformation(), [13:13:39.668] timestamp = base::Sys.time(), signaled = 0L) [13:13:39.668] signalCondition(cond) [13:13:39.668] } [13:13:39.668] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:39.668] "immediateCondition"))) { [13:13:39.668] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:39.668] ...future.conditions[[length(...future.conditions) + [13:13:39.668] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:39.668] if (TRUE && !signal) { [13:13:39.668] muffleCondition <- function (cond, pattern = "^muffle") [13:13:39.668] { [13:13:39.668] inherits <- base::inherits [13:13:39.668] invokeRestart <- base::invokeRestart [13:13:39.668] is.null <- base::is.null [13:13:39.668] muffled <- FALSE [13:13:39.668] if (inherits(cond, "message")) { [13:13:39.668] muffled <- grepl(pattern, "muffleMessage") [13:13:39.668] if (muffled) [13:13:39.668] invokeRestart("muffleMessage") [13:13:39.668] } [13:13:39.668] else if (inherits(cond, "warning")) { [13:13:39.668] muffled <- grepl(pattern, "muffleWarning") [13:13:39.668] if (muffled) [13:13:39.668] invokeRestart("muffleWarning") [13:13:39.668] } [13:13:39.668] else if (inherits(cond, "condition")) { [13:13:39.668] if (!is.null(pattern)) { [13:13:39.668] computeRestarts <- base::computeRestarts [13:13:39.668] grepl <- base::grepl [13:13:39.668] restarts <- computeRestarts(cond) [13:13:39.668] for (restart in restarts) { [13:13:39.668] name <- restart$name [13:13:39.668] if (is.null(name)) [13:13:39.668] next [13:13:39.668] if (!grepl(pattern, name)) [13:13:39.668] next [13:13:39.668] invokeRestart(restart) [13:13:39.668] muffled <- TRUE [13:13:39.668] break [13:13:39.668] } [13:13:39.668] } [13:13:39.668] } [13:13:39.668] invisible(muffled) [13:13:39.668] } [13:13:39.668] muffleCondition(cond, pattern = "^muffle") [13:13:39.668] } [13:13:39.668] } [13:13:39.668] else { [13:13:39.668] if (TRUE) { [13:13:39.668] muffleCondition <- function (cond, pattern = "^muffle") [13:13:39.668] { [13:13:39.668] inherits <- base::inherits [13:13:39.668] invokeRestart <- base::invokeRestart [13:13:39.668] is.null <- base::is.null [13:13:39.668] muffled <- FALSE [13:13:39.668] if (inherits(cond, "message")) { [13:13:39.668] muffled <- grepl(pattern, "muffleMessage") [13:13:39.668] if (muffled) [13:13:39.668] invokeRestart("muffleMessage") [13:13:39.668] } [13:13:39.668] else if (inherits(cond, "warning")) { [13:13:39.668] muffled <- grepl(pattern, "muffleWarning") [13:13:39.668] if (muffled) [13:13:39.668] invokeRestart("muffleWarning") [13:13:39.668] } [13:13:39.668] else if (inherits(cond, "condition")) { [13:13:39.668] if (!is.null(pattern)) { [13:13:39.668] computeRestarts <- base::computeRestarts [13:13:39.668] grepl <- base::grepl [13:13:39.668] restarts <- computeRestarts(cond) [13:13:39.668] for (restart in restarts) { [13:13:39.668] name <- restart$name [13:13:39.668] if (is.null(name)) [13:13:39.668] next [13:13:39.668] if (!grepl(pattern, name)) [13:13:39.668] next [13:13:39.668] invokeRestart(restart) [13:13:39.668] muffled <- TRUE [13:13:39.668] break [13:13:39.668] } [13:13:39.668] } [13:13:39.668] } [13:13:39.668] invisible(muffled) [13:13:39.668] } [13:13:39.668] muffleCondition(cond, pattern = "^muffle") [13:13:39.668] } [13:13:39.668] } [13:13:39.668] } [13:13:39.668] })) [13:13:39.668] }, error = function(ex) { [13:13:39.668] base::structure(base::list(value = NULL, visible = NULL, [13:13:39.668] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:39.668] ...future.rng), started = ...future.startTime, [13:13:39.668] finished = Sys.time(), session_uuid = NA_character_, [13:13:39.668] version = "1.8"), class = "FutureResult") [13:13:39.668] }, finally = { [13:13:39.668] if (!identical(...future.workdir, getwd())) [13:13:39.668] setwd(...future.workdir) [13:13:39.668] { [13:13:39.668] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:39.668] ...future.oldOptions$nwarnings <- NULL [13:13:39.668] } [13:13:39.668] base::options(...future.oldOptions) [13:13:39.668] if (.Platform$OS.type == "windows") { [13:13:39.668] old_names <- names(...future.oldEnvVars) [13:13:39.668] envs <- base::Sys.getenv() [13:13:39.668] names <- names(envs) [13:13:39.668] common <- intersect(names, old_names) [13:13:39.668] added <- setdiff(names, old_names) [13:13:39.668] removed <- setdiff(old_names, names) [13:13:39.668] changed <- common[...future.oldEnvVars[common] != [13:13:39.668] envs[common]] [13:13:39.668] NAMES <- toupper(changed) [13:13:39.668] args <- list() [13:13:39.668] for (kk in seq_along(NAMES)) { [13:13:39.668] name <- changed[[kk]] [13:13:39.668] NAME <- NAMES[[kk]] [13:13:39.668] if (name != NAME && is.element(NAME, old_names)) [13:13:39.668] next [13:13:39.668] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:39.668] } [13:13:39.668] NAMES <- toupper(added) [13:13:39.668] for (kk in seq_along(NAMES)) { [13:13:39.668] name <- added[[kk]] [13:13:39.668] NAME <- NAMES[[kk]] [13:13:39.668] if (name != NAME && is.element(NAME, old_names)) [13:13:39.668] next [13:13:39.668] args[[name]] <- "" [13:13:39.668] } [13:13:39.668] NAMES <- toupper(removed) [13:13:39.668] for (kk in seq_along(NAMES)) { [13:13:39.668] name <- removed[[kk]] [13:13:39.668] NAME <- NAMES[[kk]] [13:13:39.668] if (name != NAME && is.element(NAME, old_names)) [13:13:39.668] next [13:13:39.668] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:39.668] } [13:13:39.668] if (length(args) > 0) [13:13:39.668] base::do.call(base::Sys.setenv, args = args) [13:13:39.668] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:39.668] } [13:13:39.668] else { [13:13:39.668] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:39.668] } [13:13:39.668] { [13:13:39.668] if (base::length(...future.futureOptionsAdded) > [13:13:39.668] 0L) { [13:13:39.668] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:39.668] base::names(opts) <- ...future.futureOptionsAdded [13:13:39.668] base::options(opts) [13:13:39.668] } [13:13:39.668] { [13:13:39.668] { [13:13:39.668] NULL [13:13:39.668] RNGkind("Mersenne-Twister") [13:13:39.668] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:39.668] inherits = FALSE) [13:13:39.668] } [13:13:39.668] options(future.plan = NULL) [13:13:39.668] if (is.na(NA_character_)) [13:13:39.668] Sys.unsetenv("R_FUTURE_PLAN") [13:13:39.668] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:39.668] future::plan(list(function (..., envir = parent.frame()) [13:13:39.668] { [13:13:39.668] future <- SequentialFuture(..., envir = envir) [13:13:39.668] if (!future$lazy) [13:13:39.668] future <- run(future) [13:13:39.668] invisible(future) [13:13:39.668] }), .cleanup = FALSE, .init = FALSE) [13:13:39.668] } [13:13:39.668] } [13:13:39.668] } [13:13:39.668] }) [13:13:39.668] if (TRUE) { [13:13:39.668] base::sink(type = "output", split = FALSE) [13:13:39.668] if (TRUE) { [13:13:39.668] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:39.668] } [13:13:39.668] else { [13:13:39.668] ...future.result["stdout"] <- base::list(NULL) [13:13:39.668] } [13:13:39.668] base::close(...future.stdout) [13:13:39.668] ...future.stdout <- NULL [13:13:39.668] } [13:13:39.668] ...future.result$conditions <- ...future.conditions [13:13:39.668] ...future.result$finished <- base::Sys.time() [13:13:39.668] ...future.result [13:13:39.668] } [13:13:39.672] assign_globals() ... [13:13:39.672] List of 5 [13:13:39.672] $ ...future.FUN :function (mode = "logical", length = 0L) [13:13:39.672] $ future.call.arguments :List of 1 [13:13:39.672] ..$ length: int 2 [13:13:39.672] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:39.672] $ ...future.elements_ii :List of 4 [13:13:39.672] ..$ c: chr "character" [13:13:39.672] ..$ b: chr "numeric" [13:13:39.672] ..$ a: chr "integer" [13:13:39.672] ..$ c: chr "list" [13:13:39.672] $ ...future.seeds_ii : NULL [13:13:39.672] $ ...future.globals.maxSize: NULL [13:13:39.672] - attr(*, "where")=List of 5 [13:13:39.672] ..$ ...future.FUN : [13:13:39.672] ..$ future.call.arguments : [13:13:39.672] ..$ ...future.elements_ii : [13:13:39.672] ..$ ...future.seeds_ii : [13:13:39.672] ..$ ...future.globals.maxSize: [13:13:39.672] - attr(*, "resolved")= logi FALSE [13:13:39.672] - attr(*, "total_size")= num 2240 [13:13:39.672] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:39.672] - attr(*, "already-done")= logi TRUE [13:13:39.680] - copied '...future.FUN' to environment [13:13:39.681] - copied 'future.call.arguments' to environment [13:13:39.681] - copied '...future.elements_ii' to environment [13:13:39.681] - copied '...future.seeds_ii' to environment [13:13:39.681] - copied '...future.globals.maxSize' to environment [13:13:39.681] assign_globals() ... done [13:13:39.682] plan(): Setting new future strategy stack: [13:13:39.682] List of future strategies: [13:13:39.682] 1. sequential: [13:13:39.682] - args: function (..., envir = parent.frame(), workers = "") [13:13:39.682] - tweaked: FALSE [13:13:39.682] - call: NULL [13:13:39.682] plan(): nbrOfWorkers() = 1 [13:13:39.683] plan(): Setting new future strategy stack: [13:13:39.684] List of future strategies: [13:13:39.684] 1. sequential: [13:13:39.684] - args: function (..., envir = parent.frame(), workers = "") [13:13:39.684] - tweaked: FALSE [13:13:39.684] - call: plan(strategy) [13:13:39.684] plan(): nbrOfWorkers() = 1 [13:13:39.685] SequentialFuture started (and completed) [13:13:39.685] - Launch lazy future ... done [13:13:39.685] run() for 'SequentialFuture' ... done [13:13:39.685] Created future: [13:13:39.685] SequentialFuture: [13:13:39.685] Label: 'future_lapply-1' [13:13:39.685] Expression: [13:13:39.685] { [13:13:39.685] do.call(function(...) { [13:13:39.685] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:39.685] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:39.685] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:39.685] on.exit(options(oopts), add = TRUE) [13:13:39.685] } [13:13:39.685] { [13:13:39.685] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:39.685] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:39.685] ...future.FUN(...future.X_jj, ...) [13:13:39.685] }) [13:13:39.685] } [13:13:39.685] }, args = future.call.arguments) [13:13:39.685] } [13:13:39.685] Lazy evaluation: FALSE [13:13:39.685] Asynchronous evaluation: FALSE [13:13:39.685] Local evaluation: TRUE [13:13:39.685] Environment: R_GlobalEnv [13:13:39.685] Capture standard output: TRUE [13:13:39.685] Capture condition classes: 'condition' (excluding 'nothing') [13:13:39.685] 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) [13:13:39.685] Packages: [13:13:39.685] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:39.685] Resolved: TRUE [13:13:39.685] Value: 240 bytes of class 'list' [13:13:39.685] Early signaling: FALSE [13:13:39.685] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:39.685] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:39.687] Chunk #1 of 1 ... DONE [13:13:39.687] Launching 1 futures (chunks) ... DONE [13:13:39.687] Resolving 1 futures (chunks) ... [13:13:39.687] resolve() on list ... [13:13:39.687] recursive: 0 [13:13:39.687] length: 1 [13:13:39.687] [13:13:39.688] resolved() for 'SequentialFuture' ... [13:13:39.688] - state: 'finished' [13:13:39.688] - run: TRUE [13:13:39.688] - result: 'FutureResult' [13:13:39.688] resolved() for 'SequentialFuture' ... done [13:13:39.689] Future #1 [13:13:39.689] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:39.689] - nx: 1 [13:13:39.689] - relay: TRUE [13:13:39.689] - stdout: TRUE [13:13:39.689] - signal: TRUE [13:13:39.690] - resignal: FALSE [13:13:39.690] - force: TRUE [13:13:39.690] - relayed: [n=1] FALSE [13:13:39.690] - queued futures: [n=1] FALSE [13:13:39.690] - until=1 [13:13:39.690] - relaying element #1 [13:13:39.691] - relayed: [n=1] TRUE [13:13:39.691] - queued futures: [n=1] TRUE [13:13:39.691] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:39.691] length: 0 (resolved future 1) [13:13:39.691] Relaying remaining futures [13:13:39.691] signalConditionsASAP(NULL, pos=0) ... [13:13:39.691] - nx: 1 [13:13:39.692] - relay: TRUE [13:13:39.692] - stdout: TRUE [13:13:39.692] - signal: TRUE [13:13:39.692] - resignal: FALSE [13:13:39.692] - force: TRUE [13:13:39.692] - relayed: [n=1] TRUE [13:13:39.692] - queued futures: [n=1] TRUE - flush all [13:13:39.693] - relayed: [n=1] TRUE [13:13:39.693] - queued futures: [n=1] TRUE [13:13:39.693] signalConditionsASAP(NULL, pos=0) ... done [13:13:39.693] resolve() on list ... DONE [13:13:39.693] - Number of value chunks collected: 1 [13:13:39.694] Resolving 1 futures (chunks) ... DONE [13:13:39.694] Reducing values from 1 chunks ... [13:13:39.694] - Number of values collected after concatenation: 4 [13:13:39.694] - Number of values expected: 4 [13:13:39.694] Reverse index remapping (attribute 'ordering'): [n = 4] 3, 2, 1, 4 [13:13:39.694] Reducing values from 1 chunks ... DONE [13:13:39.695] 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, ...) ... [13:13:39.697] future_lapply() ... [13:13:39.698] Number of chunks: 1 [13:13:39.698] Index remapping (attribute 'ordering'): [n = 4] 2, 1, 4, 3 [13:13:39.698] getGlobalsAndPackagesXApply() ... [13:13:39.698] - future.globals: TRUE [13:13:39.699] getGlobalsAndPackages() ... [13:13:39.699] Searching for globals... [13:13:39.700] - globals found: [2] 'FUN', '.Internal' [13:13:39.700] Searching for globals ... DONE [13:13:39.700] Resolving globals: FALSE [13:13:39.701] The total size of the 1 globals is 2.13 KiB (2184 bytes) [13:13:39.701] 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') [13:13:39.701] - globals: [1] 'FUN' [13:13:39.702] [13:13:39.702] getGlobalsAndPackages() ... DONE [13:13:39.702] - globals found/used: [n=1] 'FUN' [13:13:39.702] - needed namespaces: [n=0] [13:13:39.702] Finding globals ... DONE [13:13:39.702] - use_args: TRUE [13:13:39.703] - Getting '...' globals ... [13:13:39.704] resolve() on list ... [13:13:39.704] recursive: 0 [13:13:39.704] length: 1 [13:13:39.704] elements: '...' [13:13:39.704] length: 0 (resolved future 1) [13:13:39.705] resolve() on list ... DONE [13:13:39.705] - '...' content: [n=1] 'length' [13:13:39.705] List of 1 [13:13:39.705] $ ...:List of 1 [13:13:39.705] ..$ length: int 2 [13:13:39.705] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:39.705] - attr(*, "where")=List of 1 [13:13:39.705] ..$ ...: [13:13:39.705] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:39.705] - attr(*, "resolved")= logi TRUE [13:13:39.705] - attr(*, "total_size")= num NA [13:13:39.708] - Getting '...' globals ... DONE [13:13:39.709] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:39.709] List of 2 [13:13:39.709] $ ...future.FUN:function (mode = "logical", length = 0L) [13:13:39.709] $ ... :List of 1 [13:13:39.709] ..$ length: int 2 [13:13:39.709] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:39.709] - attr(*, "where")=List of 2 [13:13:39.709] ..$ ...future.FUN: [13:13:39.709] ..$ ... : [13:13:39.709] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:39.709] - attr(*, "resolved")= logi FALSE [13:13:39.709] - attr(*, "total_size")= num 2240 [13:13:39.712] Packages to be attached in all futures: [n=0] [13:13:39.713] getGlobalsAndPackagesXApply() ... DONE [13:13:39.713] Number of futures (= number of chunks): 1 [13:13:39.713] Launching 1 futures (chunks) ... [13:13:39.713] Chunk #1 of 1 ... [13:13:39.713] - Finding globals in 'X' for chunk #1 ... [13:13:39.714] getGlobalsAndPackages() ... [13:13:39.714] Searching for globals... [13:13:39.714] [13:13:39.714] Searching for globals ... DONE [13:13:39.714] - globals: [0] [13:13:39.715] getGlobalsAndPackages() ... DONE [13:13:39.715] + additional globals found: [n=0] [13:13:39.715] + additional namespaces needed: [n=0] [13:13:39.715] - Finding globals in 'X' for chunk #1 ... DONE [13:13:39.715] - seeds: [13:13:39.715] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:39.715] getGlobalsAndPackages() ... [13:13:39.716] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:39.716] Resolving globals: FALSE [13:13:39.716] Tweak future expression to call with '...' arguments ... [13:13:39.716] { [13:13:39.716] do.call(function(...) { [13:13:39.716] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:39.716] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:39.716] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:39.716] on.exit(options(oopts), add = TRUE) [13:13:39.716] } [13:13:39.716] { [13:13:39.716] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:39.716] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:39.716] ...future.FUN(...future.X_jj, ...) [13:13:39.716] }) [13:13:39.716] } [13:13:39.716] }, args = future.call.arguments) [13:13:39.716] } [13:13:39.717] Tweak future expression to call with '...' arguments ... DONE [13:13:39.717] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:39.717] [13:13:39.717] getGlobalsAndPackages() ... DONE [13:13:39.718] run() for 'Future' ... [13:13:39.718] - state: 'created' [13:13:39.718] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:13:39.718] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:39.719] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:39.719] - Field: 'label' [13:13:39.719] - Field: 'local' [13:13:39.719] - Field: 'owner' [13:13:39.719] - Field: 'envir' [13:13:39.720] - Field: 'packages' [13:13:39.720] - Field: 'gc' [13:13:39.720] - Field: 'conditions' [13:13:39.720] - Field: 'expr' [13:13:39.720] - Field: 'uuid' [13:13:39.720] - Field: 'seed' [13:13:39.721] - Field: 'version' [13:13:39.721] - Field: 'result' [13:13:39.721] - Field: 'asynchronous' [13:13:39.721] - Field: 'calls' [13:13:39.721] - Field: 'globals' [13:13:39.721] - Field: 'stdout' [13:13:39.722] - Field: 'earlySignal' [13:13:39.722] - Field: 'lazy' [13:13:39.722] - Field: 'state' [13:13:39.722] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:39.722] - Launch lazy future ... [13:13:39.722] Packages needed by the future expression (n = 0): [13:13:39.723] Packages needed by future strategies (n = 0): [13:13:39.723] { [13:13:39.723] { [13:13:39.723] { [13:13:39.723] ...future.startTime <- base::Sys.time() [13:13:39.723] { [13:13:39.723] { [13:13:39.723] { [13:13:39.723] base::local({ [13:13:39.723] has_future <- base::requireNamespace("future", [13:13:39.723] quietly = TRUE) [13:13:39.723] if (has_future) { [13:13:39.723] ns <- base::getNamespace("future") [13:13:39.723] version <- ns[[".package"]][["version"]] [13:13:39.723] if (is.null(version)) [13:13:39.723] version <- utils::packageVersion("future") [13:13:39.723] } [13:13:39.723] else { [13:13:39.723] version <- NULL [13:13:39.723] } [13:13:39.723] if (!has_future || version < "1.8.0") { [13:13:39.723] info <- base::c(r_version = base::gsub("R version ", [13:13:39.723] "", base::R.version$version.string), [13:13:39.723] platform = base::sprintf("%s (%s-bit)", [13:13:39.723] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:39.723] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:39.723] "release", "version")], collapse = " "), [13:13:39.723] hostname = base::Sys.info()[["nodename"]]) [13:13:39.723] info <- base::sprintf("%s: %s", base::names(info), [13:13:39.723] info) [13:13:39.723] info <- base::paste(info, collapse = "; ") [13:13:39.723] if (!has_future) { [13:13:39.723] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:39.723] info) [13:13:39.723] } [13:13:39.723] else { [13:13:39.723] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:39.723] info, version) [13:13:39.723] } [13:13:39.723] base::stop(msg) [13:13:39.723] } [13:13:39.723] }) [13:13:39.723] } [13:13:39.723] options(future.plan = NULL) [13:13:39.723] Sys.unsetenv("R_FUTURE_PLAN") [13:13:39.723] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:39.723] } [13:13:39.723] ...future.workdir <- getwd() [13:13:39.723] } [13:13:39.723] ...future.oldOptions <- base::as.list(base::.Options) [13:13:39.723] ...future.oldEnvVars <- base::Sys.getenv() [13:13:39.723] } [13:13:39.723] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:39.723] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:39.723] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:39.723] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:39.723] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:39.723] future.stdout.windows.reencode = NULL, width = 80L) [13:13:39.723] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:39.723] base::names(...future.oldOptions)) [13:13:39.723] } [13:13:39.723] if (FALSE) { [13:13:39.723] } [13:13:39.723] else { [13:13:39.723] if (TRUE) { [13:13:39.723] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:39.723] open = "w") [13:13:39.723] } [13:13:39.723] else { [13:13:39.723] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:39.723] windows = "NUL", "/dev/null"), open = "w") [13:13:39.723] } [13:13:39.723] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:39.723] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:39.723] base::sink(type = "output", split = FALSE) [13:13:39.723] base::close(...future.stdout) [13:13:39.723] }, add = TRUE) [13:13:39.723] } [13:13:39.723] ...future.frame <- base::sys.nframe() [13:13:39.723] ...future.conditions <- base::list() [13:13:39.723] ...future.rng <- base::globalenv()$.Random.seed [13:13:39.723] if (FALSE) { [13:13:39.723] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:39.723] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:39.723] } [13:13:39.723] ...future.result <- base::tryCatch({ [13:13:39.723] base::withCallingHandlers({ [13:13:39.723] ...future.value <- base::withVisible(base::local({ [13:13:39.723] do.call(function(...) { [13:13:39.723] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:39.723] if (!identical(...future.globals.maxSize.org, [13:13:39.723] ...future.globals.maxSize)) { [13:13:39.723] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:39.723] on.exit(options(oopts), add = TRUE) [13:13:39.723] } [13:13:39.723] { [13:13:39.723] lapply(seq_along(...future.elements_ii), [13:13:39.723] FUN = function(jj) { [13:13:39.723] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:39.723] ...future.FUN(...future.X_jj, ...) [13:13:39.723] }) [13:13:39.723] } [13:13:39.723] }, args = future.call.arguments) [13:13:39.723] })) [13:13:39.723] future::FutureResult(value = ...future.value$value, [13:13:39.723] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:39.723] ...future.rng), globalenv = if (FALSE) [13:13:39.723] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:39.723] ...future.globalenv.names)) [13:13:39.723] else NULL, started = ...future.startTime, version = "1.8") [13:13:39.723] }, condition = base::local({ [13:13:39.723] c <- base::c [13:13:39.723] inherits <- base::inherits [13:13:39.723] invokeRestart <- base::invokeRestart [13:13:39.723] length <- base::length [13:13:39.723] list <- base::list [13:13:39.723] seq.int <- base::seq.int [13:13:39.723] signalCondition <- base::signalCondition [13:13:39.723] sys.calls <- base::sys.calls [13:13:39.723] `[[` <- base::`[[` [13:13:39.723] `+` <- base::`+` [13:13:39.723] `<<-` <- base::`<<-` [13:13:39.723] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:39.723] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:39.723] 3L)] [13:13:39.723] } [13:13:39.723] function(cond) { [13:13:39.723] is_error <- inherits(cond, "error") [13:13:39.723] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:39.723] NULL) [13:13:39.723] if (is_error) { [13:13:39.723] sessionInformation <- function() { [13:13:39.723] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:39.723] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:39.723] search = base::search(), system = base::Sys.info()) [13:13:39.723] } [13:13:39.723] ...future.conditions[[length(...future.conditions) + [13:13:39.723] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:39.723] cond$call), session = sessionInformation(), [13:13:39.723] timestamp = base::Sys.time(), signaled = 0L) [13:13:39.723] signalCondition(cond) [13:13:39.723] } [13:13:39.723] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:39.723] "immediateCondition"))) { [13:13:39.723] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:39.723] ...future.conditions[[length(...future.conditions) + [13:13:39.723] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:39.723] if (TRUE && !signal) { [13:13:39.723] muffleCondition <- function (cond, pattern = "^muffle") [13:13:39.723] { [13:13:39.723] inherits <- base::inherits [13:13:39.723] invokeRestart <- base::invokeRestart [13:13:39.723] is.null <- base::is.null [13:13:39.723] muffled <- FALSE [13:13:39.723] if (inherits(cond, "message")) { [13:13:39.723] muffled <- grepl(pattern, "muffleMessage") [13:13:39.723] if (muffled) [13:13:39.723] invokeRestart("muffleMessage") [13:13:39.723] } [13:13:39.723] else if (inherits(cond, "warning")) { [13:13:39.723] muffled <- grepl(pattern, "muffleWarning") [13:13:39.723] if (muffled) [13:13:39.723] invokeRestart("muffleWarning") [13:13:39.723] } [13:13:39.723] else if (inherits(cond, "condition")) { [13:13:39.723] if (!is.null(pattern)) { [13:13:39.723] computeRestarts <- base::computeRestarts [13:13:39.723] grepl <- base::grepl [13:13:39.723] restarts <- computeRestarts(cond) [13:13:39.723] for (restart in restarts) { [13:13:39.723] name <- restart$name [13:13:39.723] if (is.null(name)) [13:13:39.723] next [13:13:39.723] if (!grepl(pattern, name)) [13:13:39.723] next [13:13:39.723] invokeRestart(restart) [13:13:39.723] muffled <- TRUE [13:13:39.723] break [13:13:39.723] } [13:13:39.723] } [13:13:39.723] } [13:13:39.723] invisible(muffled) [13:13:39.723] } [13:13:39.723] muffleCondition(cond, pattern = "^muffle") [13:13:39.723] } [13:13:39.723] } [13:13:39.723] else { [13:13:39.723] if (TRUE) { [13:13:39.723] muffleCondition <- function (cond, pattern = "^muffle") [13:13:39.723] { [13:13:39.723] inherits <- base::inherits [13:13:39.723] invokeRestart <- base::invokeRestart [13:13:39.723] is.null <- base::is.null [13:13:39.723] muffled <- FALSE [13:13:39.723] if (inherits(cond, "message")) { [13:13:39.723] muffled <- grepl(pattern, "muffleMessage") [13:13:39.723] if (muffled) [13:13:39.723] invokeRestart("muffleMessage") [13:13:39.723] } [13:13:39.723] else if (inherits(cond, "warning")) { [13:13:39.723] muffled <- grepl(pattern, "muffleWarning") [13:13:39.723] if (muffled) [13:13:39.723] invokeRestart("muffleWarning") [13:13:39.723] } [13:13:39.723] else if (inherits(cond, "condition")) { [13:13:39.723] if (!is.null(pattern)) { [13:13:39.723] computeRestarts <- base::computeRestarts [13:13:39.723] grepl <- base::grepl [13:13:39.723] restarts <- computeRestarts(cond) [13:13:39.723] for (restart in restarts) { [13:13:39.723] name <- restart$name [13:13:39.723] if (is.null(name)) [13:13:39.723] next [13:13:39.723] if (!grepl(pattern, name)) [13:13:39.723] next [13:13:39.723] invokeRestart(restart) [13:13:39.723] muffled <- TRUE [13:13:39.723] break [13:13:39.723] } [13:13:39.723] } [13:13:39.723] } [13:13:39.723] invisible(muffled) [13:13:39.723] } [13:13:39.723] muffleCondition(cond, pattern = "^muffle") [13:13:39.723] } [13:13:39.723] } [13:13:39.723] } [13:13:39.723] })) [13:13:39.723] }, error = function(ex) { [13:13:39.723] base::structure(base::list(value = NULL, visible = NULL, [13:13:39.723] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:39.723] ...future.rng), started = ...future.startTime, [13:13:39.723] finished = Sys.time(), session_uuid = NA_character_, [13:13:39.723] version = "1.8"), class = "FutureResult") [13:13:39.723] }, finally = { [13:13:39.723] if (!identical(...future.workdir, getwd())) [13:13:39.723] setwd(...future.workdir) [13:13:39.723] { [13:13:39.723] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:39.723] ...future.oldOptions$nwarnings <- NULL [13:13:39.723] } [13:13:39.723] base::options(...future.oldOptions) [13:13:39.723] if (.Platform$OS.type == "windows") { [13:13:39.723] old_names <- names(...future.oldEnvVars) [13:13:39.723] envs <- base::Sys.getenv() [13:13:39.723] names <- names(envs) [13:13:39.723] common <- intersect(names, old_names) [13:13:39.723] added <- setdiff(names, old_names) [13:13:39.723] removed <- setdiff(old_names, names) [13:13:39.723] changed <- common[...future.oldEnvVars[common] != [13:13:39.723] envs[common]] [13:13:39.723] NAMES <- toupper(changed) [13:13:39.723] args <- list() [13:13:39.723] for (kk in seq_along(NAMES)) { [13:13:39.723] name <- changed[[kk]] [13:13:39.723] NAME <- NAMES[[kk]] [13:13:39.723] if (name != NAME && is.element(NAME, old_names)) [13:13:39.723] next [13:13:39.723] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:39.723] } [13:13:39.723] NAMES <- toupper(added) [13:13:39.723] for (kk in seq_along(NAMES)) { [13:13:39.723] name <- added[[kk]] [13:13:39.723] NAME <- NAMES[[kk]] [13:13:39.723] if (name != NAME && is.element(NAME, old_names)) [13:13:39.723] next [13:13:39.723] args[[name]] <- "" [13:13:39.723] } [13:13:39.723] NAMES <- toupper(removed) [13:13:39.723] for (kk in seq_along(NAMES)) { [13:13:39.723] name <- removed[[kk]] [13:13:39.723] NAME <- NAMES[[kk]] [13:13:39.723] if (name != NAME && is.element(NAME, old_names)) [13:13:39.723] next [13:13:39.723] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:39.723] } [13:13:39.723] if (length(args) > 0) [13:13:39.723] base::do.call(base::Sys.setenv, args = args) [13:13:39.723] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:39.723] } [13:13:39.723] else { [13:13:39.723] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:39.723] } [13:13:39.723] { [13:13:39.723] if (base::length(...future.futureOptionsAdded) > [13:13:39.723] 0L) { [13:13:39.723] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:39.723] base::names(opts) <- ...future.futureOptionsAdded [13:13:39.723] base::options(opts) [13:13:39.723] } [13:13:39.723] { [13:13:39.723] { [13:13:39.723] NULL [13:13:39.723] RNGkind("Mersenne-Twister") [13:13:39.723] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:39.723] inherits = FALSE) [13:13:39.723] } [13:13:39.723] options(future.plan = NULL) [13:13:39.723] if (is.na(NA_character_)) [13:13:39.723] Sys.unsetenv("R_FUTURE_PLAN") [13:13:39.723] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:39.723] future::plan(list(function (..., envir = parent.frame()) [13:13:39.723] { [13:13:39.723] future <- SequentialFuture(..., envir = envir) [13:13:39.723] if (!future$lazy) [13:13:39.723] future <- run(future) [13:13:39.723] invisible(future) [13:13:39.723] }), .cleanup = FALSE, .init = FALSE) [13:13:39.723] } [13:13:39.723] } [13:13:39.723] } [13:13:39.723] }) [13:13:39.723] if (TRUE) { [13:13:39.723] base::sink(type = "output", split = FALSE) [13:13:39.723] if (TRUE) { [13:13:39.723] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:39.723] } [13:13:39.723] else { [13:13:39.723] ...future.result["stdout"] <- base::list(NULL) [13:13:39.723] } [13:13:39.723] base::close(...future.stdout) [13:13:39.723] ...future.stdout <- NULL [13:13:39.723] } [13:13:39.723] ...future.result$conditions <- ...future.conditions [13:13:39.723] ...future.result$finished <- base::Sys.time() [13:13:39.723] ...future.result [13:13:39.723] } [13:13:39.727] assign_globals() ... [13:13:39.727] List of 5 [13:13:39.727] $ ...future.FUN :function (mode = "logical", length = 0L) [13:13:39.727] $ future.call.arguments :List of 1 [13:13:39.727] ..$ length: int 2 [13:13:39.727] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:39.727] $ ...future.elements_ii :List of 4 [13:13:39.727] ..$ b: chr "numeric" [13:13:39.727] ..$ a: chr "integer" [13:13:39.727] ..$ c: chr "list" [13:13:39.727] ..$ c: chr "character" [13:13:39.727] $ ...future.seeds_ii : NULL [13:13:39.727] $ ...future.globals.maxSize: NULL [13:13:39.727] - attr(*, "where")=List of 5 [13:13:39.727] ..$ ...future.FUN : [13:13:39.727] ..$ future.call.arguments : [13:13:39.727] ..$ ...future.elements_ii : [13:13:39.727] ..$ ...future.seeds_ii : [13:13:39.727] ..$ ...future.globals.maxSize: [13:13:39.727] - attr(*, "resolved")= logi FALSE [13:13:39.727] - attr(*, "total_size")= num 2240 [13:13:39.727] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:39.727] - attr(*, "already-done")= logi TRUE [13:13:39.735] - copied '...future.FUN' to environment [13:13:39.735] - copied 'future.call.arguments' to environment [13:13:39.735] - copied '...future.elements_ii' to environment [13:13:39.736] - copied '...future.seeds_ii' to environment [13:13:39.736] - copied '...future.globals.maxSize' to environment [13:13:39.736] assign_globals() ... done [13:13:39.736] plan(): Setting new future strategy stack: [13:13:39.736] List of future strategies: [13:13:39.736] 1. sequential: [13:13:39.736] - args: function (..., envir = parent.frame(), workers = "") [13:13:39.736] - tweaked: FALSE [13:13:39.736] - call: NULL [13:13:39.737] plan(): nbrOfWorkers() = 1 [13:13:39.738] plan(): Setting new future strategy stack: [13:13:39.738] List of future strategies: [13:13:39.738] 1. sequential: [13:13:39.738] - args: function (..., envir = parent.frame(), workers = "") [13:13:39.738] - tweaked: FALSE [13:13:39.738] - call: plan(strategy) [13:13:39.739] plan(): nbrOfWorkers() = 1 [13:13:39.739] SequentialFuture started (and completed) [13:13:39.739] - Launch lazy future ... done [13:13:39.740] run() for 'SequentialFuture' ... done [13:13:39.740] Created future: [13:13:39.740] SequentialFuture: [13:13:39.740] Label: 'future_lapply-1' [13:13:39.740] Expression: [13:13:39.740] { [13:13:39.740] do.call(function(...) { [13:13:39.740] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:39.740] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:39.740] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:39.740] on.exit(options(oopts), add = TRUE) [13:13:39.740] } [13:13:39.740] { [13:13:39.740] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:39.740] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:39.740] ...future.FUN(...future.X_jj, ...) [13:13:39.740] }) [13:13:39.740] } [13:13:39.740] }, args = future.call.arguments) [13:13:39.740] } [13:13:39.740] Lazy evaluation: FALSE [13:13:39.740] Asynchronous evaluation: FALSE [13:13:39.740] Local evaluation: TRUE [13:13:39.740] Environment: R_GlobalEnv [13:13:39.740] Capture standard output: TRUE [13:13:39.740] Capture condition classes: 'condition' (excluding 'nothing') [13:13:39.740] 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) [13:13:39.740] Packages: [13:13:39.740] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:39.740] Resolved: TRUE [13:13:39.740] Value: 240 bytes of class 'list' [13:13:39.740] Early signaling: FALSE [13:13:39.740] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:39.740] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:39.741] Chunk #1 of 1 ... DONE [13:13:39.741] Launching 1 futures (chunks) ... DONE [13:13:39.742] Resolving 1 futures (chunks) ... [13:13:39.742] resolve() on list ... [13:13:39.742] recursive: 0 [13:13:39.742] length: 1 [13:13:39.742] [13:13:39.742] resolved() for 'SequentialFuture' ... [13:13:39.743] - state: 'finished' [13:13:39.743] - run: TRUE [13:13:39.743] - result: 'FutureResult' [13:13:39.743] resolved() for 'SequentialFuture' ... done [13:13:39.743] Future #1 [13:13:39.743] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:39.744] - nx: 1 [13:13:39.744] - relay: TRUE [13:13:39.744] - stdout: TRUE [13:13:39.744] - signal: TRUE [13:13:39.744] - resignal: FALSE [13:13:39.744] - force: TRUE [13:13:39.745] - relayed: [n=1] FALSE [13:13:39.745] - queued futures: [n=1] FALSE [13:13:39.745] - until=1 [13:13:39.745] - relaying element #1 [13:13:39.745] - relayed: [n=1] TRUE [13:13:39.745] - queued futures: [n=1] TRUE [13:13:39.746] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:39.746] length: 0 (resolved future 1) [13:13:39.746] Relaying remaining futures [13:13:39.746] signalConditionsASAP(NULL, pos=0) ... [13:13:39.746] - nx: 1 [13:13:39.746] - relay: TRUE [13:13:39.747] - stdout: TRUE [13:13:39.747] - signal: TRUE [13:13:39.747] - resignal: FALSE [13:13:39.747] - force: TRUE [13:13:39.747] - relayed: [n=1] TRUE [13:13:39.747] - queued futures: [n=1] TRUE - flush all [13:13:39.748] - relayed: [n=1] TRUE [13:13:39.748] - queued futures: [n=1] TRUE [13:13:39.748] signalConditionsASAP(NULL, pos=0) ... done [13:13:39.748] resolve() on list ... DONE [13:13:39.748] - Number of value chunks collected: 1 [13:13:39.748] Resolving 1 futures (chunks) ... DONE [13:13:39.749] Reducing values from 1 chunks ... [13:13:39.749] - Number of values collected after concatenation: 4 [13:13:39.749] - Number of values expected: 4 [13:13:39.749] Reverse index remapping (attribute 'ordering'): [n = 4] 2, 1, 4, 3 [13:13:39.749] Reducing values from 1 chunks ... DONE [13:13:39.749] 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, ...) ... [13:13:39.752] future_lapply() ... [13:13:39.761] Number of chunks: 1 [13:13:39.761] getGlobalsAndPackagesXApply() ... [13:13:39.762] - future.globals: TRUE [13:13:39.762] getGlobalsAndPackages() ... [13:13:39.762] Searching for globals... [13:13:39.771] - globals found: [22] 'FUN', 'if', 'missing', 'is.finite', '{', 'is.null', '<-', 'paste', 'length', '==', 'return', '>', '+', '[', 'seq_len', 'rev', 'c', '&&', '!', ':', '(', '-' [13:13:39.772] Searching for globals ... DONE [13:13:39.772] Resolving globals: FALSE [13:13:39.773] The total size of the 1 globals is 69.62 KiB (71288 bytes) [13:13:39.773] 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') [13:13:39.774] - globals: [1] 'FUN' [13:13:39.774] - packages: [1] 'future' [13:13:39.774] getGlobalsAndPackages() ... DONE [13:13:39.774] - globals found/used: [n=1] 'FUN' [13:13:39.774] - needed namespaces: [n=1] 'future' [13:13:39.774] Finding globals ... DONE [13:13:39.775] - use_args: TRUE [13:13:39.775] - Getting '...' globals ... [13:13:39.775] resolve() on list ... [13:13:39.775] recursive: 0 [13:13:39.775] length: 1 [13:13:39.776] elements: '...' [13:13:39.777] length: 0 (resolved future 1) [13:13:39.777] resolve() on list ... DONE [13:13:39.777] - '...' content: [n=2] 'collapse', 'maxHead' [13:13:39.777] List of 1 [13:13:39.777] $ ...:List of 2 [13:13:39.777] ..$ collapse: chr "; " [13:13:39.777] ..$ maxHead : int 3 [13:13:39.777] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:39.777] - attr(*, "where")=List of 1 [13:13:39.777] ..$ ...: [13:13:39.777] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:39.777] - attr(*, "resolved")= logi TRUE [13:13:39.777] - attr(*, "total_size")= num NA [13:13:39.781] - Getting '...' globals ... DONE [13:13:39.781] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:39.781] List of 2 [13:13:39.781] $ ...future.FUN:function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [13:13:39.781] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [13:13:39.781] $ ... :List of 2 [13:13:39.781] ..$ collapse: chr "; " [13:13:39.781] ..$ maxHead : int 3 [13:13:39.781] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:39.781] - attr(*, "where")=List of 2 [13:13:39.781] ..$ ...future.FUN: [13:13:39.781] ..$ ... : [13:13:39.781] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:39.781] - attr(*, "resolved")= logi FALSE [13:13:39.781] - attr(*, "total_size")= num 71456 [13:13:39.785] Packages to be attached in all futures: [n=1] 'future' [13:13:39.786] getGlobalsAndPackagesXApply() ... DONE [13:13:39.786] Number of futures (= number of chunks): 1 [13:13:39.786] Launching 1 futures (chunks) ... [13:13:39.786] Chunk #1 of 1 ... [13:13:39.786] - Finding globals in 'X' for chunk #1 ... [13:13:39.786] getGlobalsAndPackages() ... [13:13:39.787] Searching for globals... [13:13:39.787] [13:13:39.787] Searching for globals ... DONE [13:13:39.787] - globals: [0] [13:13:39.787] getGlobalsAndPackages() ... DONE [13:13:39.788] + additional globals found: [n=0] [13:13:39.788] + additional namespaces needed: [n=0] [13:13:39.788] - Finding globals in 'X' for chunk #1 ... DONE [13:13:39.788] - seeds: [13:13:39.789] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:39.789] getGlobalsAndPackages() ... [13:13:39.789] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:39.789] Resolving globals: FALSE [13:13:39.790] Tweak future expression to call with '...' arguments ... [13:13:39.790] { [13:13:39.790] do.call(function(...) { [13:13:39.790] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:39.790] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:39.790] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:39.790] on.exit(options(oopts), add = TRUE) [13:13:39.790] } [13:13:39.790] { [13:13:39.790] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:39.790] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:39.790] ...future.FUN(...future.X_jj, ...) [13:13:39.790] }) [13:13:39.790] } [13:13:39.790] }, args = future.call.arguments) [13:13:39.790] } [13:13:39.790] Tweak future expression to call with '...' arguments ... DONE [13:13:39.791] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:39.791] - packages: [1] 'future' [13:13:39.791] getGlobalsAndPackages() ... DONE [13:13:39.791] run() for 'Future' ... [13:13:39.792] - state: 'created' [13:13:39.792] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:13:39.792] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:39.792] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:39.793] - Field: 'label' [13:13:39.793] - Field: 'local' [13:13:39.793] - Field: 'owner' [13:13:39.793] - Field: 'envir' [13:13:39.793] - Field: 'packages' [13:13:39.793] - Field: 'gc' [13:13:39.794] - Field: 'conditions' [13:13:39.794] - Field: 'expr' [13:13:39.794] - Field: 'uuid' [13:13:39.794] - Field: 'seed' [13:13:39.794] - Field: 'version' [13:13:39.794] - Field: 'result' [13:13:39.795] - Field: 'asynchronous' [13:13:39.795] - Field: 'calls' [13:13:39.795] - Field: 'globals' [13:13:39.795] - Field: 'stdout' [13:13:39.795] - Field: 'earlySignal' [13:13:39.795] - Field: 'lazy' [13:13:39.796] - Field: 'state' [13:13:39.796] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:39.796] - Launch lazy future ... [13:13:39.796] Packages needed by the future expression (n = 1): 'future' [13:13:39.796] Packages needed by future strategies (n = 0): [13:13:39.797] { [13:13:39.797] { [13:13:39.797] { [13:13:39.797] ...future.startTime <- base::Sys.time() [13:13:39.797] { [13:13:39.797] { [13:13:39.797] { [13:13:39.797] { [13:13:39.797] base::local({ [13:13:39.797] has_future <- base::requireNamespace("future", [13:13:39.797] quietly = TRUE) [13:13:39.797] if (has_future) { [13:13:39.797] ns <- base::getNamespace("future") [13:13:39.797] version <- ns[[".package"]][["version"]] [13:13:39.797] if (is.null(version)) [13:13:39.797] version <- utils::packageVersion("future") [13:13:39.797] } [13:13:39.797] else { [13:13:39.797] version <- NULL [13:13:39.797] } [13:13:39.797] if (!has_future || version < "1.8.0") { [13:13:39.797] info <- base::c(r_version = base::gsub("R version ", [13:13:39.797] "", base::R.version$version.string), [13:13:39.797] platform = base::sprintf("%s (%s-bit)", [13:13:39.797] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:39.797] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:39.797] "release", "version")], collapse = " "), [13:13:39.797] hostname = base::Sys.info()[["nodename"]]) [13:13:39.797] info <- base::sprintf("%s: %s", base::names(info), [13:13:39.797] info) [13:13:39.797] info <- base::paste(info, collapse = "; ") [13:13:39.797] if (!has_future) { [13:13:39.797] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:39.797] info) [13:13:39.797] } [13:13:39.797] else { [13:13:39.797] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:39.797] info, version) [13:13:39.797] } [13:13:39.797] base::stop(msg) [13:13:39.797] } [13:13:39.797] }) [13:13:39.797] } [13:13:39.797] base::local({ [13:13:39.797] for (pkg in "future") { [13:13:39.797] base::loadNamespace(pkg) [13:13:39.797] base::library(pkg, character.only = TRUE) [13:13:39.797] } [13:13:39.797] }) [13:13:39.797] } [13:13:39.797] options(future.plan = NULL) [13:13:39.797] Sys.unsetenv("R_FUTURE_PLAN") [13:13:39.797] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:39.797] } [13:13:39.797] ...future.workdir <- getwd() [13:13:39.797] } [13:13:39.797] ...future.oldOptions <- base::as.list(base::.Options) [13:13:39.797] ...future.oldEnvVars <- base::Sys.getenv() [13:13:39.797] } [13:13:39.797] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:39.797] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:39.797] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:39.797] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:39.797] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:39.797] future.stdout.windows.reencode = NULL, width = 80L) [13:13:39.797] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:39.797] base::names(...future.oldOptions)) [13:13:39.797] } [13:13:39.797] if (FALSE) { [13:13:39.797] } [13:13:39.797] else { [13:13:39.797] if (TRUE) { [13:13:39.797] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:39.797] open = "w") [13:13:39.797] } [13:13:39.797] else { [13:13:39.797] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:39.797] windows = "NUL", "/dev/null"), open = "w") [13:13:39.797] } [13:13:39.797] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:39.797] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:39.797] base::sink(type = "output", split = FALSE) [13:13:39.797] base::close(...future.stdout) [13:13:39.797] }, add = TRUE) [13:13:39.797] } [13:13:39.797] ...future.frame <- base::sys.nframe() [13:13:39.797] ...future.conditions <- base::list() [13:13:39.797] ...future.rng <- base::globalenv()$.Random.seed [13:13:39.797] if (FALSE) { [13:13:39.797] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:39.797] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:39.797] } [13:13:39.797] ...future.result <- base::tryCatch({ [13:13:39.797] base::withCallingHandlers({ [13:13:39.797] ...future.value <- base::withVisible(base::local({ [13:13:39.797] do.call(function(...) { [13:13:39.797] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:39.797] if (!identical(...future.globals.maxSize.org, [13:13:39.797] ...future.globals.maxSize)) { [13:13:39.797] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:39.797] on.exit(options(oopts), add = TRUE) [13:13:39.797] } [13:13:39.797] { [13:13:39.797] lapply(seq_along(...future.elements_ii), [13:13:39.797] FUN = function(jj) { [13:13:39.797] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:39.797] ...future.FUN(...future.X_jj, ...) [13:13:39.797] }) [13:13:39.797] } [13:13:39.797] }, args = future.call.arguments) [13:13:39.797] })) [13:13:39.797] future::FutureResult(value = ...future.value$value, [13:13:39.797] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:39.797] ...future.rng), globalenv = if (FALSE) [13:13:39.797] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:39.797] ...future.globalenv.names)) [13:13:39.797] else NULL, started = ...future.startTime, version = "1.8") [13:13:39.797] }, condition = base::local({ [13:13:39.797] c <- base::c [13:13:39.797] inherits <- base::inherits [13:13:39.797] invokeRestart <- base::invokeRestart [13:13:39.797] length <- base::length [13:13:39.797] list <- base::list [13:13:39.797] seq.int <- base::seq.int [13:13:39.797] signalCondition <- base::signalCondition [13:13:39.797] sys.calls <- base::sys.calls [13:13:39.797] `[[` <- base::`[[` [13:13:39.797] `+` <- base::`+` [13:13:39.797] `<<-` <- base::`<<-` [13:13:39.797] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:39.797] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:39.797] 3L)] [13:13:39.797] } [13:13:39.797] function(cond) { [13:13:39.797] is_error <- inherits(cond, "error") [13:13:39.797] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:39.797] NULL) [13:13:39.797] if (is_error) { [13:13:39.797] sessionInformation <- function() { [13:13:39.797] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:39.797] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:39.797] search = base::search(), system = base::Sys.info()) [13:13:39.797] } [13:13:39.797] ...future.conditions[[length(...future.conditions) + [13:13:39.797] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:39.797] cond$call), session = sessionInformation(), [13:13:39.797] timestamp = base::Sys.time(), signaled = 0L) [13:13:39.797] signalCondition(cond) [13:13:39.797] } [13:13:39.797] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:39.797] "immediateCondition"))) { [13:13:39.797] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:39.797] ...future.conditions[[length(...future.conditions) + [13:13:39.797] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:39.797] if (TRUE && !signal) { [13:13:39.797] muffleCondition <- function (cond, pattern = "^muffle") [13:13:39.797] { [13:13:39.797] inherits <- base::inherits [13:13:39.797] invokeRestart <- base::invokeRestart [13:13:39.797] is.null <- base::is.null [13:13:39.797] muffled <- FALSE [13:13:39.797] if (inherits(cond, "message")) { [13:13:39.797] muffled <- grepl(pattern, "muffleMessage") [13:13:39.797] if (muffled) [13:13:39.797] invokeRestart("muffleMessage") [13:13:39.797] } [13:13:39.797] else if (inherits(cond, "warning")) { [13:13:39.797] muffled <- grepl(pattern, "muffleWarning") [13:13:39.797] if (muffled) [13:13:39.797] invokeRestart("muffleWarning") [13:13:39.797] } [13:13:39.797] else if (inherits(cond, "condition")) { [13:13:39.797] if (!is.null(pattern)) { [13:13:39.797] computeRestarts <- base::computeRestarts [13:13:39.797] grepl <- base::grepl [13:13:39.797] restarts <- computeRestarts(cond) [13:13:39.797] for (restart in restarts) { [13:13:39.797] name <- restart$name [13:13:39.797] if (is.null(name)) [13:13:39.797] next [13:13:39.797] if (!grepl(pattern, name)) [13:13:39.797] next [13:13:39.797] invokeRestart(restart) [13:13:39.797] muffled <- TRUE [13:13:39.797] break [13:13:39.797] } [13:13:39.797] } [13:13:39.797] } [13:13:39.797] invisible(muffled) [13:13:39.797] } [13:13:39.797] muffleCondition(cond, pattern = "^muffle") [13:13:39.797] } [13:13:39.797] } [13:13:39.797] else { [13:13:39.797] if (TRUE) { [13:13:39.797] muffleCondition <- function (cond, pattern = "^muffle") [13:13:39.797] { [13:13:39.797] inherits <- base::inherits [13:13:39.797] invokeRestart <- base::invokeRestart [13:13:39.797] is.null <- base::is.null [13:13:39.797] muffled <- FALSE [13:13:39.797] if (inherits(cond, "message")) { [13:13:39.797] muffled <- grepl(pattern, "muffleMessage") [13:13:39.797] if (muffled) [13:13:39.797] invokeRestart("muffleMessage") [13:13:39.797] } [13:13:39.797] else if (inherits(cond, "warning")) { [13:13:39.797] muffled <- grepl(pattern, "muffleWarning") [13:13:39.797] if (muffled) [13:13:39.797] invokeRestart("muffleWarning") [13:13:39.797] } [13:13:39.797] else if (inherits(cond, "condition")) { [13:13:39.797] if (!is.null(pattern)) { [13:13:39.797] computeRestarts <- base::computeRestarts [13:13:39.797] grepl <- base::grepl [13:13:39.797] restarts <- computeRestarts(cond) [13:13:39.797] for (restart in restarts) { [13:13:39.797] name <- restart$name [13:13:39.797] if (is.null(name)) [13:13:39.797] next [13:13:39.797] if (!grepl(pattern, name)) [13:13:39.797] next [13:13:39.797] invokeRestart(restart) [13:13:39.797] muffled <- TRUE [13:13:39.797] break [13:13:39.797] } [13:13:39.797] } [13:13:39.797] } [13:13:39.797] invisible(muffled) [13:13:39.797] } [13:13:39.797] muffleCondition(cond, pattern = "^muffle") [13:13:39.797] } [13:13:39.797] } [13:13:39.797] } [13:13:39.797] })) [13:13:39.797] }, error = function(ex) { [13:13:39.797] base::structure(base::list(value = NULL, visible = NULL, [13:13:39.797] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:39.797] ...future.rng), started = ...future.startTime, [13:13:39.797] finished = Sys.time(), session_uuid = NA_character_, [13:13:39.797] version = "1.8"), class = "FutureResult") [13:13:39.797] }, finally = { [13:13:39.797] if (!identical(...future.workdir, getwd())) [13:13:39.797] setwd(...future.workdir) [13:13:39.797] { [13:13:39.797] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:39.797] ...future.oldOptions$nwarnings <- NULL [13:13:39.797] } [13:13:39.797] base::options(...future.oldOptions) [13:13:39.797] if (.Platform$OS.type == "windows") { [13:13:39.797] old_names <- names(...future.oldEnvVars) [13:13:39.797] envs <- base::Sys.getenv() [13:13:39.797] names <- names(envs) [13:13:39.797] common <- intersect(names, old_names) [13:13:39.797] added <- setdiff(names, old_names) [13:13:39.797] removed <- setdiff(old_names, names) [13:13:39.797] changed <- common[...future.oldEnvVars[common] != [13:13:39.797] envs[common]] [13:13:39.797] NAMES <- toupper(changed) [13:13:39.797] args <- list() [13:13:39.797] for (kk in seq_along(NAMES)) { [13:13:39.797] name <- changed[[kk]] [13:13:39.797] NAME <- NAMES[[kk]] [13:13:39.797] if (name != NAME && is.element(NAME, old_names)) [13:13:39.797] next [13:13:39.797] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:39.797] } [13:13:39.797] NAMES <- toupper(added) [13:13:39.797] for (kk in seq_along(NAMES)) { [13:13:39.797] name <- added[[kk]] [13:13:39.797] NAME <- NAMES[[kk]] [13:13:39.797] if (name != NAME && is.element(NAME, old_names)) [13:13:39.797] next [13:13:39.797] args[[name]] <- "" [13:13:39.797] } [13:13:39.797] NAMES <- toupper(removed) [13:13:39.797] for (kk in seq_along(NAMES)) { [13:13:39.797] name <- removed[[kk]] [13:13:39.797] NAME <- NAMES[[kk]] [13:13:39.797] if (name != NAME && is.element(NAME, old_names)) [13:13:39.797] next [13:13:39.797] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:39.797] } [13:13:39.797] if (length(args) > 0) [13:13:39.797] base::do.call(base::Sys.setenv, args = args) [13:13:39.797] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:39.797] } [13:13:39.797] else { [13:13:39.797] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:39.797] } [13:13:39.797] { [13:13:39.797] if (base::length(...future.futureOptionsAdded) > [13:13:39.797] 0L) { [13:13:39.797] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:39.797] base::names(opts) <- ...future.futureOptionsAdded [13:13:39.797] base::options(opts) [13:13:39.797] } [13:13:39.797] { [13:13:39.797] { [13:13:39.797] NULL [13:13:39.797] RNGkind("Mersenne-Twister") [13:13:39.797] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:39.797] inherits = FALSE) [13:13:39.797] } [13:13:39.797] options(future.plan = NULL) [13:13:39.797] if (is.na(NA_character_)) [13:13:39.797] Sys.unsetenv("R_FUTURE_PLAN") [13:13:39.797] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:39.797] future::plan(list(function (..., envir = parent.frame()) [13:13:39.797] { [13:13:39.797] future <- SequentialFuture(..., envir = envir) [13:13:39.797] if (!future$lazy) [13:13:39.797] future <- run(future) [13:13:39.797] invisible(future) [13:13:39.797] }), .cleanup = FALSE, .init = FALSE) [13:13:39.797] } [13:13:39.797] } [13:13:39.797] } [13:13:39.797] }) [13:13:39.797] if (TRUE) { [13:13:39.797] base::sink(type = "output", split = FALSE) [13:13:39.797] if (TRUE) { [13:13:39.797] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:39.797] } [13:13:39.797] else { [13:13:39.797] ...future.result["stdout"] <- base::list(NULL) [13:13:39.797] } [13:13:39.797] base::close(...future.stdout) [13:13:39.797] ...future.stdout <- NULL [13:13:39.797] } [13:13:39.797] ...future.result$conditions <- ...future.conditions [13:13:39.797] ...future.result$finished <- base::Sys.time() [13:13:39.797] ...future.result [13:13:39.797] } [13:13:39.801] assign_globals() ... [13:13:39.801] List of 5 [13:13:39.801] $ ...future.FUN :function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [13:13:39.801] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [13:13:39.801] $ future.call.arguments :List of 2 [13:13:39.801] ..$ collapse: chr "; " [13:13:39.801] ..$ maxHead : int 3 [13:13:39.801] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:39.801] $ ...future.elements_ii :List of 1 [13:13:39.801] ..$ a: Named chr [1:101] "hello" "1" "2" "3" ... [13:13:39.801] .. ..- attr(*, "names")= chr [1:101] "" "b1" "b2" "b3" ... [13:13:39.801] $ ...future.seeds_ii : NULL [13:13:39.801] $ ...future.globals.maxSize: NULL [13:13:39.801] - attr(*, "where")=List of 5 [13:13:39.801] ..$ ...future.FUN : [13:13:39.801] ..$ future.call.arguments : [13:13:39.801] ..$ ...future.elements_ii : [13:13:39.801] ..$ ...future.seeds_ii : [13:13:39.801] ..$ ...future.globals.maxSize: [13:13:39.801] - attr(*, "resolved")= logi FALSE [13:13:39.801] - attr(*, "total_size")= num 71456 [13:13:39.801] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:39.801] - attr(*, "already-done")= logi TRUE [13:13:39.809] - copied '...future.FUN' to environment [13:13:39.809] - copied 'future.call.arguments' to environment [13:13:39.809] - copied '...future.elements_ii' to environment [13:13:39.809] - copied '...future.seeds_ii' to environment [13:13:39.810] - copied '...future.globals.maxSize' to environment [13:13:39.810] assign_globals() ... done [13:13:39.810] plan(): Setting new future strategy stack: [13:13:39.810] List of future strategies: [13:13:39.810] 1. sequential: [13:13:39.810] - args: function (..., envir = parent.frame(), workers = "") [13:13:39.810] - tweaked: FALSE [13:13:39.810] - call: NULL [13:13:39.811] plan(): nbrOfWorkers() = 1 [13:13:39.812] plan(): Setting new future strategy stack: [13:13:39.812] List of future strategies: [13:13:39.812] 1. sequential: [13:13:39.812] - args: function (..., envir = parent.frame(), workers = "") [13:13:39.812] - tweaked: FALSE [13:13:39.812] - call: plan(strategy) [13:13:39.813] plan(): nbrOfWorkers() = 1 [13:13:39.813] SequentialFuture started (and completed) [13:13:39.813] - Launch lazy future ... done [13:13:39.814] run() for 'SequentialFuture' ... done [13:13:39.814] Created future: [13:13:39.814] SequentialFuture: [13:13:39.814] Label: 'future_lapply-1' [13:13:39.814] Expression: [13:13:39.814] { [13:13:39.814] do.call(function(...) { [13:13:39.814] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:39.814] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:39.814] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:39.814] on.exit(options(oopts), add = TRUE) [13:13:39.814] } [13:13:39.814] { [13:13:39.814] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:39.814] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:39.814] ...future.FUN(...future.X_jj, ...) [13:13:39.814] }) [13:13:39.814] } [13:13:39.814] }, args = future.call.arguments) [13:13:39.814] } [13:13:39.814] Lazy evaluation: FALSE [13:13:39.814] Asynchronous evaluation: FALSE [13:13:39.814] Local evaluation: TRUE [13:13:39.814] Environment: R_GlobalEnv [13:13:39.814] Capture standard output: TRUE [13:13:39.814] Capture condition classes: 'condition' (excluding 'nothing') [13:13:39.814] 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) [13:13:39.814] Packages: 1 packages ('future') [13:13:39.814] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:39.814] Resolved: TRUE [13:13:39.814] Value: 136 bytes of class 'list' [13:13:39.814] Early signaling: FALSE [13:13:39.814] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:39.814] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:39.815] Chunk #1 of 1 ... DONE [13:13:39.815] Launching 1 futures (chunks) ... DONE [13:13:39.816] Resolving 1 futures (chunks) ... [13:13:39.816] resolve() on list ... [13:13:39.816] recursive: 0 [13:13:39.816] length: 1 [13:13:39.816] [13:13:39.816] resolved() for 'SequentialFuture' ... [13:13:39.817] - state: 'finished' [13:13:39.817] - run: TRUE [13:13:39.817] - result: 'FutureResult' [13:13:39.817] resolved() for 'SequentialFuture' ... done [13:13:39.817] Future #1 [13:13:39.818] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:39.818] - nx: 1 [13:13:39.818] - relay: TRUE [13:13:39.818] - stdout: TRUE [13:13:39.818] - signal: TRUE [13:13:39.818] - resignal: FALSE [13:13:39.818] - force: TRUE [13:13:39.819] - relayed: [n=1] FALSE [13:13:39.819] - queued futures: [n=1] FALSE [13:13:39.819] - until=1 [13:13:39.819] - relaying element #1 [13:13:39.819] - relayed: [n=1] TRUE [13:13:39.819] - queued futures: [n=1] TRUE [13:13:39.820] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:39.820] length: 0 (resolved future 1) [13:13:39.820] Relaying remaining futures [13:13:39.820] signalConditionsASAP(NULL, pos=0) ... [13:13:39.820] - nx: 1 [13:13:39.820] - relay: TRUE [13:13:39.821] - stdout: TRUE [13:13:39.821] - signal: TRUE [13:13:39.821] - resignal: FALSE [13:13:39.821] - force: TRUE [13:13:39.821] - relayed: [n=1] TRUE [13:13:39.821] - queued futures: [n=1] TRUE - flush all [13:13:39.822] - relayed: [n=1] TRUE [13:13:39.822] - queued futures: [n=1] TRUE [13:13:39.822] signalConditionsASAP(NULL, pos=0) ... done [13:13:39.822] resolve() on list ... DONE [13:13:39.822] - Number of value chunks collected: 1 [13:13:39.822] Resolving 1 futures (chunks) ... DONE [13:13:39.823] Reducing values from 1 chunks ... [13:13:39.823] - Number of values collected after concatenation: 1 [13:13:39.823] - Number of values expected: 1 [13:13:39.823] Reducing values from 1 chunks ... DONE [13:13:39.823] future_lapply() ... DONE List of 1 $ y:List of 1 ..$ a: chr "hello; 1; 2; ...; 100" - future_lapply(x, FUN = listenv::listenv, ...) ... [13:13:39.824] future_lapply() ... [13:13:39.825] Number of chunks: 1 [13:13:39.825] Index remapping (attribute 'ordering'): [n = 2] 2, 1 [13:13:39.825] getGlobalsAndPackagesXApply() ... [13:13:39.826] - future.globals: TRUE [13:13:39.826] getGlobalsAndPackages() ... [13:13:39.826] Searching for globals... [13:13:39.827] - globals found: [4] 'FUN', '{', 'get', 'parent.env' [13:13:39.827] Searching for globals ... DONE [13:13:39.828] Resolving globals: FALSE [13:13:39.828] The total size of the 1 globals is 4.85 KiB (4968 bytes) [13:13:39.829] 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') [13:13:39.830] - globals: [1] 'FUN' [13:13:39.830] - packages: [1] 'listenv' [13:13:39.830] getGlobalsAndPackages() ... DONE [13:13:39.830] - globals found/used: [n=1] 'FUN' [13:13:39.830] - needed namespaces: [n=1] 'listenv' [13:13:39.830] Finding globals ... DONE [13:13:39.831] - use_args: TRUE [13:13:39.831] - Getting '...' globals ... [13:13:39.831] resolve() on list ... [13:13:39.831] recursive: 0 [13:13:39.832] length: 1 [13:13:39.832] elements: '...' [13:13:39.832] length: 0 (resolved future 1) [13:13:39.832] resolve() on list ... DONE [13:13:39.832] - '...' content: [n=0] [13:13:39.832] List of 1 [13:13:39.832] $ ...: list() [13:13:39.832] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:39.832] - attr(*, "where")=List of 1 [13:13:39.832] ..$ ...: [13:13:39.832] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:39.832] - attr(*, "resolved")= logi TRUE [13:13:39.832] - attr(*, "total_size")= num NA [13:13:39.835] - Getting '...' globals ... DONE [13:13:39.836] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:39.836] List of 2 [13:13:39.836] $ ...future.FUN:function (x, ...) [13:13:39.836] $ ... : list() [13:13:39.836] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:39.836] - attr(*, "where")=List of 2 [13:13:39.836] ..$ ...future.FUN: [13:13:39.836] ..$ ... : [13:13:39.836] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:39.836] - attr(*, "resolved")= logi FALSE [13:13:39.836] - attr(*, "total_size")= num 4968 [13:13:39.839] Packages to be attached in all futures: [n=1] 'listenv' [13:13:39.839] getGlobalsAndPackagesXApply() ... DONE [13:13:39.839] Number of futures (= number of chunks): 1 [13:13:39.840] Launching 1 futures (chunks) ... [13:13:39.840] Chunk #1 of 1 ... [13:13:39.840] - Finding globals in 'X' for chunk #1 ... [13:13:39.840] getGlobalsAndPackages() ... [13:13:39.840] Searching for globals... [13:13:39.841] [13:13:39.841] Searching for globals ... DONE [13:13:39.841] - globals: [0] [13:13:39.841] getGlobalsAndPackages() ... DONE [13:13:39.842] + additional globals found: [n=0] [13:13:39.842] + additional namespaces needed: [n=0] [13:13:39.842] - Finding globals in 'X' for chunk #1 ... DONE [13:13:39.842] - seeds: [13:13:39.842] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:39.842] getGlobalsAndPackages() ... [13:13:39.843] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:39.843] Resolving globals: FALSE [13:13:39.843] Tweak future expression to call with '...' arguments ... [13:13:39.843] { [13:13:39.843] do.call(function(...) { [13:13:39.843] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:39.843] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:39.843] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:39.843] on.exit(options(oopts), add = TRUE) [13:13:39.843] } [13:13:39.843] { [13:13:39.843] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:39.843] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:39.843] ...future.FUN(...future.X_jj, ...) [13:13:39.843] }) [13:13:39.843] } [13:13:39.843] }, args = future.call.arguments) [13:13:39.843] } [13:13:39.844] Tweak future expression to call with '...' arguments ... DONE [13:13:39.844] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:39.844] - packages: [1] 'listenv' [13:13:39.844] getGlobalsAndPackages() ... DONE [13:13:39.845] run() for 'Future' ... [13:13:39.845] - state: 'created' [13:13:39.845] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:13:39.846] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:39.846] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:39.846] - Field: 'label' [13:13:39.846] - Field: 'local' [13:13:39.846] - Field: 'owner' [13:13:39.846] - Field: 'envir' [13:13:39.847] - Field: 'packages' [13:13:39.847] - Field: 'gc' [13:13:39.847] - Field: 'conditions' [13:13:39.847] - Field: 'expr' [13:13:39.847] - Field: 'uuid' [13:13:39.847] - Field: 'seed' [13:13:39.848] - Field: 'version' [13:13:39.848] - Field: 'result' [13:13:39.848] - Field: 'asynchronous' [13:13:39.848] - Field: 'calls' [13:13:39.848] - Field: 'globals' [13:13:39.848] - Field: 'stdout' [13:13:39.849] - Field: 'earlySignal' [13:13:39.849] - Field: 'lazy' [13:13:39.849] - Field: 'state' [13:13:39.849] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:39.849] - Launch lazy future ... [13:13:39.850] Packages needed by the future expression (n = 1): 'listenv' [13:13:39.850] Packages needed by future strategies (n = 0): [13:13:39.850] { [13:13:39.850] { [13:13:39.850] { [13:13:39.850] ...future.startTime <- base::Sys.time() [13:13:39.850] { [13:13:39.850] { [13:13:39.850] { [13:13:39.850] { [13:13:39.850] base::local({ [13:13:39.850] has_future <- base::requireNamespace("future", [13:13:39.850] quietly = TRUE) [13:13:39.850] if (has_future) { [13:13:39.850] ns <- base::getNamespace("future") [13:13:39.850] version <- ns[[".package"]][["version"]] [13:13:39.850] if (is.null(version)) [13:13:39.850] version <- utils::packageVersion("future") [13:13:39.850] } [13:13:39.850] else { [13:13:39.850] version <- NULL [13:13:39.850] } [13:13:39.850] if (!has_future || version < "1.8.0") { [13:13:39.850] info <- base::c(r_version = base::gsub("R version ", [13:13:39.850] "", base::R.version$version.string), [13:13:39.850] platform = base::sprintf("%s (%s-bit)", [13:13:39.850] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:39.850] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:39.850] "release", "version")], collapse = " "), [13:13:39.850] hostname = base::Sys.info()[["nodename"]]) [13:13:39.850] info <- base::sprintf("%s: %s", base::names(info), [13:13:39.850] info) [13:13:39.850] info <- base::paste(info, collapse = "; ") [13:13:39.850] if (!has_future) { [13:13:39.850] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:39.850] info) [13:13:39.850] } [13:13:39.850] else { [13:13:39.850] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:39.850] info, version) [13:13:39.850] } [13:13:39.850] base::stop(msg) [13:13:39.850] } [13:13:39.850] }) [13:13:39.850] } [13:13:39.850] base::local({ [13:13:39.850] for (pkg in "listenv") { [13:13:39.850] base::loadNamespace(pkg) [13:13:39.850] base::library(pkg, character.only = TRUE) [13:13:39.850] } [13:13:39.850] }) [13:13:39.850] } [13:13:39.850] options(future.plan = NULL) [13:13:39.850] Sys.unsetenv("R_FUTURE_PLAN") [13:13:39.850] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:39.850] } [13:13:39.850] ...future.workdir <- getwd() [13:13:39.850] } [13:13:39.850] ...future.oldOptions <- base::as.list(base::.Options) [13:13:39.850] ...future.oldEnvVars <- base::Sys.getenv() [13:13:39.850] } [13:13:39.850] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:39.850] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:39.850] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:39.850] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:39.850] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:39.850] future.stdout.windows.reencode = NULL, width = 80L) [13:13:39.850] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:39.850] base::names(...future.oldOptions)) [13:13:39.850] } [13:13:39.850] if (FALSE) { [13:13:39.850] } [13:13:39.850] else { [13:13:39.850] if (TRUE) { [13:13:39.850] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:39.850] open = "w") [13:13:39.850] } [13:13:39.850] else { [13:13:39.850] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:39.850] windows = "NUL", "/dev/null"), open = "w") [13:13:39.850] } [13:13:39.850] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:39.850] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:39.850] base::sink(type = "output", split = FALSE) [13:13:39.850] base::close(...future.stdout) [13:13:39.850] }, add = TRUE) [13:13:39.850] } [13:13:39.850] ...future.frame <- base::sys.nframe() [13:13:39.850] ...future.conditions <- base::list() [13:13:39.850] ...future.rng <- base::globalenv()$.Random.seed [13:13:39.850] if (FALSE) { [13:13:39.850] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:39.850] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:39.850] } [13:13:39.850] ...future.result <- base::tryCatch({ [13:13:39.850] base::withCallingHandlers({ [13:13:39.850] ...future.value <- base::withVisible(base::local({ [13:13:39.850] do.call(function(...) { [13:13:39.850] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:39.850] if (!identical(...future.globals.maxSize.org, [13:13:39.850] ...future.globals.maxSize)) { [13:13:39.850] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:39.850] on.exit(options(oopts), add = TRUE) [13:13:39.850] } [13:13:39.850] { [13:13:39.850] lapply(seq_along(...future.elements_ii), [13:13:39.850] FUN = function(jj) { [13:13:39.850] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:39.850] ...future.FUN(...future.X_jj, ...) [13:13:39.850] }) [13:13:39.850] } [13:13:39.850] }, args = future.call.arguments) [13:13:39.850] })) [13:13:39.850] future::FutureResult(value = ...future.value$value, [13:13:39.850] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:39.850] ...future.rng), globalenv = if (FALSE) [13:13:39.850] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:39.850] ...future.globalenv.names)) [13:13:39.850] else NULL, started = ...future.startTime, version = "1.8") [13:13:39.850] }, condition = base::local({ [13:13:39.850] c <- base::c [13:13:39.850] inherits <- base::inherits [13:13:39.850] invokeRestart <- base::invokeRestart [13:13:39.850] length <- base::length [13:13:39.850] list <- base::list [13:13:39.850] seq.int <- base::seq.int [13:13:39.850] signalCondition <- base::signalCondition [13:13:39.850] sys.calls <- base::sys.calls [13:13:39.850] `[[` <- base::`[[` [13:13:39.850] `+` <- base::`+` [13:13:39.850] `<<-` <- base::`<<-` [13:13:39.850] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:39.850] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:39.850] 3L)] [13:13:39.850] } [13:13:39.850] function(cond) { [13:13:39.850] is_error <- inherits(cond, "error") [13:13:39.850] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:39.850] NULL) [13:13:39.850] if (is_error) { [13:13:39.850] sessionInformation <- function() { [13:13:39.850] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:39.850] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:39.850] search = base::search(), system = base::Sys.info()) [13:13:39.850] } [13:13:39.850] ...future.conditions[[length(...future.conditions) + [13:13:39.850] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:39.850] cond$call), session = sessionInformation(), [13:13:39.850] timestamp = base::Sys.time(), signaled = 0L) [13:13:39.850] signalCondition(cond) [13:13:39.850] } [13:13:39.850] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:39.850] "immediateCondition"))) { [13:13:39.850] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:39.850] ...future.conditions[[length(...future.conditions) + [13:13:39.850] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:39.850] if (TRUE && !signal) { [13:13:39.850] muffleCondition <- function (cond, pattern = "^muffle") [13:13:39.850] { [13:13:39.850] inherits <- base::inherits [13:13:39.850] invokeRestart <- base::invokeRestart [13:13:39.850] is.null <- base::is.null [13:13:39.850] muffled <- FALSE [13:13:39.850] if (inherits(cond, "message")) { [13:13:39.850] muffled <- grepl(pattern, "muffleMessage") [13:13:39.850] if (muffled) [13:13:39.850] invokeRestart("muffleMessage") [13:13:39.850] } [13:13:39.850] else if (inherits(cond, "warning")) { [13:13:39.850] muffled <- grepl(pattern, "muffleWarning") [13:13:39.850] if (muffled) [13:13:39.850] invokeRestart("muffleWarning") [13:13:39.850] } [13:13:39.850] else if (inherits(cond, "condition")) { [13:13:39.850] if (!is.null(pattern)) { [13:13:39.850] computeRestarts <- base::computeRestarts [13:13:39.850] grepl <- base::grepl [13:13:39.850] restarts <- computeRestarts(cond) [13:13:39.850] for (restart in restarts) { [13:13:39.850] name <- restart$name [13:13:39.850] if (is.null(name)) [13:13:39.850] next [13:13:39.850] if (!grepl(pattern, name)) [13:13:39.850] next [13:13:39.850] invokeRestart(restart) [13:13:39.850] muffled <- TRUE [13:13:39.850] break [13:13:39.850] } [13:13:39.850] } [13:13:39.850] } [13:13:39.850] invisible(muffled) [13:13:39.850] } [13:13:39.850] muffleCondition(cond, pattern = "^muffle") [13:13:39.850] } [13:13:39.850] } [13:13:39.850] else { [13:13:39.850] if (TRUE) { [13:13:39.850] muffleCondition <- function (cond, pattern = "^muffle") [13:13:39.850] { [13:13:39.850] inherits <- base::inherits [13:13:39.850] invokeRestart <- base::invokeRestart [13:13:39.850] is.null <- base::is.null [13:13:39.850] muffled <- FALSE [13:13:39.850] if (inherits(cond, "message")) { [13:13:39.850] muffled <- grepl(pattern, "muffleMessage") [13:13:39.850] if (muffled) [13:13:39.850] invokeRestart("muffleMessage") [13:13:39.850] } [13:13:39.850] else if (inherits(cond, "warning")) { [13:13:39.850] muffled <- grepl(pattern, "muffleWarning") [13:13:39.850] if (muffled) [13:13:39.850] invokeRestart("muffleWarning") [13:13:39.850] } [13:13:39.850] else if (inherits(cond, "condition")) { [13:13:39.850] if (!is.null(pattern)) { [13:13:39.850] computeRestarts <- base::computeRestarts [13:13:39.850] grepl <- base::grepl [13:13:39.850] restarts <- computeRestarts(cond) [13:13:39.850] for (restart in restarts) { [13:13:39.850] name <- restart$name [13:13:39.850] if (is.null(name)) [13:13:39.850] next [13:13:39.850] if (!grepl(pattern, name)) [13:13:39.850] next [13:13:39.850] invokeRestart(restart) [13:13:39.850] muffled <- TRUE [13:13:39.850] break [13:13:39.850] } [13:13:39.850] } [13:13:39.850] } [13:13:39.850] invisible(muffled) [13:13:39.850] } [13:13:39.850] muffleCondition(cond, pattern = "^muffle") [13:13:39.850] } [13:13:39.850] } [13:13:39.850] } [13:13:39.850] })) [13:13:39.850] }, error = function(ex) { [13:13:39.850] base::structure(base::list(value = NULL, visible = NULL, [13:13:39.850] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:39.850] ...future.rng), started = ...future.startTime, [13:13:39.850] finished = Sys.time(), session_uuid = NA_character_, [13:13:39.850] version = "1.8"), class = "FutureResult") [13:13:39.850] }, finally = { [13:13:39.850] if (!identical(...future.workdir, getwd())) [13:13:39.850] setwd(...future.workdir) [13:13:39.850] { [13:13:39.850] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:39.850] ...future.oldOptions$nwarnings <- NULL [13:13:39.850] } [13:13:39.850] base::options(...future.oldOptions) [13:13:39.850] if (.Platform$OS.type == "windows") { [13:13:39.850] old_names <- names(...future.oldEnvVars) [13:13:39.850] envs <- base::Sys.getenv() [13:13:39.850] names <- names(envs) [13:13:39.850] common <- intersect(names, old_names) [13:13:39.850] added <- setdiff(names, old_names) [13:13:39.850] removed <- setdiff(old_names, names) [13:13:39.850] changed <- common[...future.oldEnvVars[common] != [13:13:39.850] envs[common]] [13:13:39.850] NAMES <- toupper(changed) [13:13:39.850] args <- list() [13:13:39.850] for (kk in seq_along(NAMES)) { [13:13:39.850] name <- changed[[kk]] [13:13:39.850] NAME <- NAMES[[kk]] [13:13:39.850] if (name != NAME && is.element(NAME, old_names)) [13:13:39.850] next [13:13:39.850] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:39.850] } [13:13:39.850] NAMES <- toupper(added) [13:13:39.850] for (kk in seq_along(NAMES)) { [13:13:39.850] name <- added[[kk]] [13:13:39.850] NAME <- NAMES[[kk]] [13:13:39.850] if (name != NAME && is.element(NAME, old_names)) [13:13:39.850] next [13:13:39.850] args[[name]] <- "" [13:13:39.850] } [13:13:39.850] NAMES <- toupper(removed) [13:13:39.850] for (kk in seq_along(NAMES)) { [13:13:39.850] name <- removed[[kk]] [13:13:39.850] NAME <- NAMES[[kk]] [13:13:39.850] if (name != NAME && is.element(NAME, old_names)) [13:13:39.850] next [13:13:39.850] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:39.850] } [13:13:39.850] if (length(args) > 0) [13:13:39.850] base::do.call(base::Sys.setenv, args = args) [13:13:39.850] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:39.850] } [13:13:39.850] else { [13:13:39.850] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:39.850] } [13:13:39.850] { [13:13:39.850] if (base::length(...future.futureOptionsAdded) > [13:13:39.850] 0L) { [13:13:39.850] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:39.850] base::names(opts) <- ...future.futureOptionsAdded [13:13:39.850] base::options(opts) [13:13:39.850] } [13:13:39.850] { [13:13:39.850] { [13:13:39.850] NULL [13:13:39.850] RNGkind("Mersenne-Twister") [13:13:39.850] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:39.850] inherits = FALSE) [13:13:39.850] } [13:13:39.850] options(future.plan = NULL) [13:13:39.850] if (is.na(NA_character_)) [13:13:39.850] Sys.unsetenv("R_FUTURE_PLAN") [13:13:39.850] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:39.850] future::plan(list(function (..., envir = parent.frame()) [13:13:39.850] { [13:13:39.850] future <- SequentialFuture(..., envir = envir) [13:13:39.850] if (!future$lazy) [13:13:39.850] future <- run(future) [13:13:39.850] invisible(future) [13:13:39.850] }), .cleanup = FALSE, .init = FALSE) [13:13:39.850] } [13:13:39.850] } [13:13:39.850] } [13:13:39.850] }) [13:13:39.850] if (TRUE) { [13:13:39.850] base::sink(type = "output", split = FALSE) [13:13:39.850] if (TRUE) { [13:13:39.850] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:39.850] } [13:13:39.850] else { [13:13:39.850] ...future.result["stdout"] <- base::list(NULL) [13:13:39.850] } [13:13:39.850] base::close(...future.stdout) [13:13:39.850] ...future.stdout <- NULL [13:13:39.850] } [13:13:39.850] ...future.result$conditions <- ...future.conditions [13:13:39.850] ...future.result$finished <- base::Sys.time() [13:13:39.850] ...future.result [13:13:39.850] } [13:13:39.854] assign_globals() ... [13:13:39.854] List of 5 [13:13:39.854] $ ...future.FUN :function (x, ...) [13:13:39.854] $ future.call.arguments : list() [13:13:39.854] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:39.854] $ ...future.elements_ii :List of 2 [13:13:39.854] ..$ b:Classes 'listenv', 'environment' [13:13:39.854] ..$ a:Classes 'listenv', 'environment' [13:13:39.854] $ ...future.seeds_ii : NULL [13:13:39.854] $ ...future.globals.maxSize: NULL [13:13:39.854] - attr(*, "where")=List of 5 [13:13:39.854] ..$ ...future.FUN : [13:13:39.854] ..$ future.call.arguments : [13:13:39.854] ..$ ...future.elements_ii : [13:13:39.854] ..$ ...future.seeds_ii : [13:13:39.854] ..$ ...future.globals.maxSize: [13:13:39.854] - attr(*, "resolved")= logi FALSE [13:13:39.854] - attr(*, "total_size")= num 4968 [13:13:39.854] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:39.854] - attr(*, "already-done")= logi TRUE [13:13:39.861] - copied '...future.FUN' to environment [13:13:39.861] - copied 'future.call.arguments' to environment [13:13:39.862] - copied '...future.elements_ii' to environment [13:13:39.862] - copied '...future.seeds_ii' to environment [13:13:39.862] - copied '...future.globals.maxSize' to environment [13:13:39.862] assign_globals() ... done [13:13:39.863] plan(): Setting new future strategy stack: [13:13:39.863] List of future strategies: [13:13:39.863] 1. sequential: [13:13:39.863] - args: function (..., envir = parent.frame(), workers = "") [13:13:39.863] - tweaked: FALSE [13:13:39.863] - call: NULL [13:13:39.863] plan(): nbrOfWorkers() = 1 [13:13:39.865] plan(): Setting new future strategy stack: [13:13:39.865] List of future strategies: [13:13:39.865] 1. sequential: [13:13:39.865] - args: function (..., envir = parent.frame(), workers = "") [13:13:39.865] - tweaked: FALSE [13:13:39.865] - call: plan(strategy) [13:13:39.865] plan(): nbrOfWorkers() = 1 [13:13:39.866] SequentialFuture started (and completed) [13:13:39.866] - Launch lazy future ... done [13:13:39.866] run() for 'SequentialFuture' ... done [13:13:39.866] Created future: [13:13:39.866] SequentialFuture: [13:13:39.866] Label: 'future_lapply-1' [13:13:39.866] Expression: [13:13:39.866] { [13:13:39.866] do.call(function(...) { [13:13:39.866] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:39.866] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:39.866] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:39.866] on.exit(options(oopts), add = TRUE) [13:13:39.866] } [13:13:39.866] { [13:13:39.866] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:39.866] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:39.866] ...future.FUN(...future.X_jj, ...) [13:13:39.866] }) [13:13:39.866] } [13:13:39.866] }, args = future.call.arguments) [13:13:39.866] } [13:13:39.866] Lazy evaluation: FALSE [13:13:39.866] Asynchronous evaluation: FALSE [13:13:39.866] Local evaluation: TRUE [13:13:39.866] Environment: R_GlobalEnv [13:13:39.866] Capture standard output: TRUE [13:13:39.866] Capture condition classes: 'condition' (excluding 'nothing') [13:13:39.866] 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) [13:13:39.866] Packages: 1 packages ('listenv') [13:13:39.866] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:39.866] Resolved: TRUE [13:13:39.866] Value: 800 bytes of class 'list' [13:13:39.866] Early signaling: FALSE [13:13:39.866] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:39.866] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:39.868] Chunk #1 of 1 ... DONE [13:13:39.868] Launching 1 futures (chunks) ... DONE [13:13:39.868] Resolving 1 futures (chunks) ... [13:13:39.868] resolve() on list ... [13:13:39.868] recursive: 0 [13:13:39.869] length: 1 [13:13:39.869] [13:13:39.869] resolved() for 'SequentialFuture' ... [13:13:39.869] - state: 'finished' [13:13:39.869] - run: TRUE [13:13:39.869] - result: 'FutureResult' [13:13:39.870] resolved() for 'SequentialFuture' ... done [13:13:39.870] Future #1 [13:13:39.870] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:39.870] - nx: 1 [13:13:39.870] - relay: TRUE [13:13:39.871] - stdout: TRUE [13:13:39.871] - signal: TRUE [13:13:39.871] - resignal: FALSE [13:13:39.871] - force: TRUE [13:13:39.871] - relayed: [n=1] FALSE [13:13:39.871] - queued futures: [n=1] FALSE [13:13:39.871] - until=1 [13:13:39.872] - relaying element #1 [13:13:39.872] - relayed: [n=1] TRUE [13:13:39.872] - queued futures: [n=1] TRUE [13:13:39.872] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:39.872] length: 0 (resolved future 1) [13:13:39.873] Relaying remaining futures [13:13:39.873] signalConditionsASAP(NULL, pos=0) ... [13:13:39.873] - nx: 1 [13:13:39.873] - relay: TRUE [13:13:39.873] - stdout: TRUE [13:13:39.873] - signal: TRUE [13:13:39.873] - resignal: FALSE [13:13:39.874] - force: TRUE [13:13:39.874] - relayed: [n=1] TRUE [13:13:39.874] - queued futures: [n=1] TRUE - flush all [13:13:39.874] - relayed: [n=1] TRUE [13:13:39.874] - queued futures: [n=1] TRUE [13:13:39.874] signalConditionsASAP(NULL, pos=0) ... done [13:13:39.875] resolve() on list ... DONE [13:13:39.875] - Number of value chunks collected: 1 [13:13:39.875] Resolving 1 futures (chunks) ... DONE [13:13:39.875] Reducing values from 1 chunks ... [13:13:39.875] - Number of values collected after concatenation: 2 [13:13:39.875] - Number of values expected: 2 [13:13:39.876] Reverse index remapping (attribute 'ordering'): [n = 2] 2, 1 [13:13:39.876] Reducing values from 1 chunks ... DONE [13:13:39.876] 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, ...) ... [13:13:39.878] future_lapply() ... [13:13:39.879] Number of chunks: 1 [13:13:39.879] Index remapping (attribute 'ordering'): [n = 4] 4, 3, 2, 1 [13:13:39.879] getGlobalsAndPackagesXApply() ... [13:13:39.879] - future.globals: TRUE [13:13:39.879] getGlobalsAndPackages() ... [13:13:39.879] Searching for globals... [13:13:39.882] - globals found: [2] 'FUN', '.Internal' [13:13:39.882] Searching for globals ... DONE [13:13:39.882] Resolving globals: FALSE [13:13:39.882] The total size of the 1 globals is 2.13 KiB (2184 bytes) [13:13:39.883] 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') [13:13:39.883] - globals: [1] 'FUN' [13:13:39.883] [13:13:39.883] getGlobalsAndPackages() ... DONE [13:13:39.884] - globals found/used: [n=1] 'FUN' [13:13:39.884] - needed namespaces: [n=0] [13:13:39.884] Finding globals ... DONE [13:13:39.884] - use_args: TRUE [13:13:39.884] - Getting '...' globals ... [13:13:39.885] resolve() on list ... [13:13:39.885] recursive: 0 [13:13:39.885] length: 1 [13:13:39.885] elements: '...' [13:13:39.885] length: 0 (resolved future 1) [13:13:39.885] resolve() on list ... DONE [13:13:39.886] - '...' content: [n=1] 'length' [13:13:39.886] List of 1 [13:13:39.886] $ ...:List of 1 [13:13:39.886] ..$ length: int 2 [13:13:39.886] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:39.886] - attr(*, "where")=List of 1 [13:13:39.886] ..$ ...: [13:13:39.886] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:39.886] - attr(*, "resolved")= logi TRUE [13:13:39.886] - attr(*, "total_size")= num NA [13:13:39.889] - Getting '...' globals ... DONE [13:13:39.889] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:39.890] List of 2 [13:13:39.890] $ ...future.FUN:function (mode = "logical", length = 0L) [13:13:39.890] $ ... :List of 1 [13:13:39.890] ..$ length: int 2 [13:13:39.890] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:39.890] - attr(*, "where")=List of 2 [13:13:39.890] ..$ ...future.FUN: [13:13:39.890] ..$ ... : [13:13:39.890] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:39.890] - attr(*, "resolved")= logi FALSE [13:13:39.890] - attr(*, "total_size")= num 2240 [13:13:39.893] Packages to be attached in all futures: [n=0] [13:13:39.893] getGlobalsAndPackagesXApply() ... DONE [13:13:39.894] Number of futures (= number of chunks): 1 [13:13:39.894] Launching 1 futures (chunks) ... [13:13:39.894] Chunk #1 of 1 ... [13:13:39.894] - Finding globals in 'X' for chunk #1 ... [13:13:39.894] getGlobalsAndPackages() ... [13:13:39.895] Searching for globals... [13:13:39.895] [13:13:39.895] Searching for globals ... DONE [13:13:39.895] - globals: [0] [13:13:39.895] getGlobalsAndPackages() ... DONE [13:13:39.896] + additional globals found: [n=0] [13:13:39.896] + additional namespaces needed: [n=0] [13:13:39.896] - Finding globals in 'X' for chunk #1 ... DONE [13:13:39.896] - seeds: [13:13:39.896] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:39.896] getGlobalsAndPackages() ... [13:13:39.896] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:39.897] Resolving globals: FALSE [13:13:39.897] Tweak future expression to call with '...' arguments ... [13:13:39.897] { [13:13:39.897] do.call(function(...) { [13:13:39.897] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:39.897] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:39.897] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:39.897] on.exit(options(oopts), add = TRUE) [13:13:39.897] } [13:13:39.897] { [13:13:39.897] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:39.897] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:39.897] ...future.FUN(...future.X_jj, ...) [13:13:39.897] }) [13:13:39.897] } [13:13:39.897] }, args = future.call.arguments) [13:13:39.897] } [13:13:39.897] Tweak future expression to call with '...' arguments ... DONE [13:13:39.898] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:39.898] [13:13:39.898] getGlobalsAndPackages() ... DONE [13:13:39.899] run() for 'Future' ... [13:13:39.899] - state: 'created' [13:13:39.899] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:13:39.899] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:39.900] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:39.900] - Field: 'label' [13:13:39.900] - Field: 'local' [13:13:39.900] - Field: 'owner' [13:13:39.900] - Field: 'envir' [13:13:39.900] - Field: 'packages' [13:13:39.901] - Field: 'gc' [13:13:39.901] - Field: 'conditions' [13:13:39.901] - Field: 'expr' [13:13:39.901] - Field: 'uuid' [13:13:39.901] - Field: 'seed' [13:13:39.901] - Field: 'version' [13:13:39.902] - Field: 'result' [13:13:39.902] - Field: 'asynchronous' [13:13:39.902] - Field: 'calls' [13:13:39.902] - Field: 'globals' [13:13:39.902] - Field: 'stdout' [13:13:39.902] - Field: 'earlySignal' [13:13:39.903] - Field: 'lazy' [13:13:39.903] - Field: 'state' [13:13:39.903] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:39.903] - Launch lazy future ... [13:13:39.903] Packages needed by the future expression (n = 0): [13:13:39.904] Packages needed by future strategies (n = 0): [13:13:39.905] { [13:13:39.905] { [13:13:39.905] { [13:13:39.905] ...future.startTime <- base::Sys.time() [13:13:39.905] { [13:13:39.905] { [13:13:39.905] { [13:13:39.905] base::local({ [13:13:39.905] has_future <- base::requireNamespace("future", [13:13:39.905] quietly = TRUE) [13:13:39.905] if (has_future) { [13:13:39.905] ns <- base::getNamespace("future") [13:13:39.905] version <- ns[[".package"]][["version"]] [13:13:39.905] if (is.null(version)) [13:13:39.905] version <- utils::packageVersion("future") [13:13:39.905] } [13:13:39.905] else { [13:13:39.905] version <- NULL [13:13:39.905] } [13:13:39.905] if (!has_future || version < "1.8.0") { [13:13:39.905] info <- base::c(r_version = base::gsub("R version ", [13:13:39.905] "", base::R.version$version.string), [13:13:39.905] platform = base::sprintf("%s (%s-bit)", [13:13:39.905] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:39.905] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:39.905] "release", "version")], collapse = " "), [13:13:39.905] hostname = base::Sys.info()[["nodename"]]) [13:13:39.905] info <- base::sprintf("%s: %s", base::names(info), [13:13:39.905] info) [13:13:39.905] info <- base::paste(info, collapse = "; ") [13:13:39.905] if (!has_future) { [13:13:39.905] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:39.905] info) [13:13:39.905] } [13:13:39.905] else { [13:13:39.905] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:39.905] info, version) [13:13:39.905] } [13:13:39.905] base::stop(msg) [13:13:39.905] } [13:13:39.905] }) [13:13:39.905] } [13:13:39.905] options(future.plan = NULL) [13:13:39.905] Sys.unsetenv("R_FUTURE_PLAN") [13:13:39.905] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:39.905] } [13:13:39.905] ...future.workdir <- getwd() [13:13:39.905] } [13:13:39.905] ...future.oldOptions <- base::as.list(base::.Options) [13:13:39.905] ...future.oldEnvVars <- base::Sys.getenv() [13:13:39.905] } [13:13:39.905] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:39.905] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:39.905] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:39.905] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:39.905] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:39.905] future.stdout.windows.reencode = NULL, width = 80L) [13:13:39.905] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:39.905] base::names(...future.oldOptions)) [13:13:39.905] } [13:13:39.905] if (FALSE) { [13:13:39.905] } [13:13:39.905] else { [13:13:39.905] if (TRUE) { [13:13:39.905] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:39.905] open = "w") [13:13:39.905] } [13:13:39.905] else { [13:13:39.905] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:39.905] windows = "NUL", "/dev/null"), open = "w") [13:13:39.905] } [13:13:39.905] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:39.905] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:39.905] base::sink(type = "output", split = FALSE) [13:13:39.905] base::close(...future.stdout) [13:13:39.905] }, add = TRUE) [13:13:39.905] } [13:13:39.905] ...future.frame <- base::sys.nframe() [13:13:39.905] ...future.conditions <- base::list() [13:13:39.905] ...future.rng <- base::globalenv()$.Random.seed [13:13:39.905] if (FALSE) { [13:13:39.905] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:39.905] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:39.905] } [13:13:39.905] ...future.result <- base::tryCatch({ [13:13:39.905] base::withCallingHandlers({ [13:13:39.905] ...future.value <- base::withVisible(base::local({ [13:13:39.905] do.call(function(...) { [13:13:39.905] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:39.905] if (!identical(...future.globals.maxSize.org, [13:13:39.905] ...future.globals.maxSize)) { [13:13:39.905] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:39.905] on.exit(options(oopts), add = TRUE) [13:13:39.905] } [13:13:39.905] { [13:13:39.905] lapply(seq_along(...future.elements_ii), [13:13:39.905] FUN = function(jj) { [13:13:39.905] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:39.905] ...future.FUN(...future.X_jj, ...) [13:13:39.905] }) [13:13:39.905] } [13:13:39.905] }, args = future.call.arguments) [13:13:39.905] })) [13:13:39.905] future::FutureResult(value = ...future.value$value, [13:13:39.905] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:39.905] ...future.rng), globalenv = if (FALSE) [13:13:39.905] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:39.905] ...future.globalenv.names)) [13:13:39.905] else NULL, started = ...future.startTime, version = "1.8") [13:13:39.905] }, condition = base::local({ [13:13:39.905] c <- base::c [13:13:39.905] inherits <- base::inherits [13:13:39.905] invokeRestart <- base::invokeRestart [13:13:39.905] length <- base::length [13:13:39.905] list <- base::list [13:13:39.905] seq.int <- base::seq.int [13:13:39.905] signalCondition <- base::signalCondition [13:13:39.905] sys.calls <- base::sys.calls [13:13:39.905] `[[` <- base::`[[` [13:13:39.905] `+` <- base::`+` [13:13:39.905] `<<-` <- base::`<<-` [13:13:39.905] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:39.905] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:39.905] 3L)] [13:13:39.905] } [13:13:39.905] function(cond) { [13:13:39.905] is_error <- inherits(cond, "error") [13:13:39.905] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:39.905] NULL) [13:13:39.905] if (is_error) { [13:13:39.905] sessionInformation <- function() { [13:13:39.905] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:39.905] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:39.905] search = base::search(), system = base::Sys.info()) [13:13:39.905] } [13:13:39.905] ...future.conditions[[length(...future.conditions) + [13:13:39.905] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:39.905] cond$call), session = sessionInformation(), [13:13:39.905] timestamp = base::Sys.time(), signaled = 0L) [13:13:39.905] signalCondition(cond) [13:13:39.905] } [13:13:39.905] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:39.905] "immediateCondition"))) { [13:13:39.905] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:39.905] ...future.conditions[[length(...future.conditions) + [13:13:39.905] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:39.905] if (TRUE && !signal) { [13:13:39.905] muffleCondition <- function (cond, pattern = "^muffle") [13:13:39.905] { [13:13:39.905] inherits <- base::inherits [13:13:39.905] invokeRestart <- base::invokeRestart [13:13:39.905] is.null <- base::is.null [13:13:39.905] muffled <- FALSE [13:13:39.905] if (inherits(cond, "message")) { [13:13:39.905] muffled <- grepl(pattern, "muffleMessage") [13:13:39.905] if (muffled) [13:13:39.905] invokeRestart("muffleMessage") [13:13:39.905] } [13:13:39.905] else if (inherits(cond, "warning")) { [13:13:39.905] muffled <- grepl(pattern, "muffleWarning") [13:13:39.905] if (muffled) [13:13:39.905] invokeRestart("muffleWarning") [13:13:39.905] } [13:13:39.905] else if (inherits(cond, "condition")) { [13:13:39.905] if (!is.null(pattern)) { [13:13:39.905] computeRestarts <- base::computeRestarts [13:13:39.905] grepl <- base::grepl [13:13:39.905] restarts <- computeRestarts(cond) [13:13:39.905] for (restart in restarts) { [13:13:39.905] name <- restart$name [13:13:39.905] if (is.null(name)) [13:13:39.905] next [13:13:39.905] if (!grepl(pattern, name)) [13:13:39.905] next [13:13:39.905] invokeRestart(restart) [13:13:39.905] muffled <- TRUE [13:13:39.905] break [13:13:39.905] } [13:13:39.905] } [13:13:39.905] } [13:13:39.905] invisible(muffled) [13:13:39.905] } [13:13:39.905] muffleCondition(cond, pattern = "^muffle") [13:13:39.905] } [13:13:39.905] } [13:13:39.905] else { [13:13:39.905] if (TRUE) { [13:13:39.905] muffleCondition <- function (cond, pattern = "^muffle") [13:13:39.905] { [13:13:39.905] inherits <- base::inherits [13:13:39.905] invokeRestart <- base::invokeRestart [13:13:39.905] is.null <- base::is.null [13:13:39.905] muffled <- FALSE [13:13:39.905] if (inherits(cond, "message")) { [13:13:39.905] muffled <- grepl(pattern, "muffleMessage") [13:13:39.905] if (muffled) [13:13:39.905] invokeRestart("muffleMessage") [13:13:39.905] } [13:13:39.905] else if (inherits(cond, "warning")) { [13:13:39.905] muffled <- grepl(pattern, "muffleWarning") [13:13:39.905] if (muffled) [13:13:39.905] invokeRestart("muffleWarning") [13:13:39.905] } [13:13:39.905] else if (inherits(cond, "condition")) { [13:13:39.905] if (!is.null(pattern)) { [13:13:39.905] computeRestarts <- base::computeRestarts [13:13:39.905] grepl <- base::grepl [13:13:39.905] restarts <- computeRestarts(cond) [13:13:39.905] for (restart in restarts) { [13:13:39.905] name <- restart$name [13:13:39.905] if (is.null(name)) [13:13:39.905] next [13:13:39.905] if (!grepl(pattern, name)) [13:13:39.905] next [13:13:39.905] invokeRestart(restart) [13:13:39.905] muffled <- TRUE [13:13:39.905] break [13:13:39.905] } [13:13:39.905] } [13:13:39.905] } [13:13:39.905] invisible(muffled) [13:13:39.905] } [13:13:39.905] muffleCondition(cond, pattern = "^muffle") [13:13:39.905] } [13:13:39.905] } [13:13:39.905] } [13:13:39.905] })) [13:13:39.905] }, error = function(ex) { [13:13:39.905] base::structure(base::list(value = NULL, visible = NULL, [13:13:39.905] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:39.905] ...future.rng), started = ...future.startTime, [13:13:39.905] finished = Sys.time(), session_uuid = NA_character_, [13:13:39.905] version = "1.8"), class = "FutureResult") [13:13:39.905] }, finally = { [13:13:39.905] if (!identical(...future.workdir, getwd())) [13:13:39.905] setwd(...future.workdir) [13:13:39.905] { [13:13:39.905] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:39.905] ...future.oldOptions$nwarnings <- NULL [13:13:39.905] } [13:13:39.905] base::options(...future.oldOptions) [13:13:39.905] if (.Platform$OS.type == "windows") { [13:13:39.905] old_names <- names(...future.oldEnvVars) [13:13:39.905] envs <- base::Sys.getenv() [13:13:39.905] names <- names(envs) [13:13:39.905] common <- intersect(names, old_names) [13:13:39.905] added <- setdiff(names, old_names) [13:13:39.905] removed <- setdiff(old_names, names) [13:13:39.905] changed <- common[...future.oldEnvVars[common] != [13:13:39.905] envs[common]] [13:13:39.905] NAMES <- toupper(changed) [13:13:39.905] args <- list() [13:13:39.905] for (kk in seq_along(NAMES)) { [13:13:39.905] name <- changed[[kk]] [13:13:39.905] NAME <- NAMES[[kk]] [13:13:39.905] if (name != NAME && is.element(NAME, old_names)) [13:13:39.905] next [13:13:39.905] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:39.905] } [13:13:39.905] NAMES <- toupper(added) [13:13:39.905] for (kk in seq_along(NAMES)) { [13:13:39.905] name <- added[[kk]] [13:13:39.905] NAME <- NAMES[[kk]] [13:13:39.905] if (name != NAME && is.element(NAME, old_names)) [13:13:39.905] next [13:13:39.905] args[[name]] <- "" [13:13:39.905] } [13:13:39.905] NAMES <- toupper(removed) [13:13:39.905] for (kk in seq_along(NAMES)) { [13:13:39.905] name <- removed[[kk]] [13:13:39.905] NAME <- NAMES[[kk]] [13:13:39.905] if (name != NAME && is.element(NAME, old_names)) [13:13:39.905] next [13:13:39.905] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:39.905] } [13:13:39.905] if (length(args) > 0) [13:13:39.905] base::do.call(base::Sys.setenv, args = args) [13:13:39.905] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:39.905] } [13:13:39.905] else { [13:13:39.905] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:39.905] } [13:13:39.905] { [13:13:39.905] if (base::length(...future.futureOptionsAdded) > [13:13:39.905] 0L) { [13:13:39.905] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:39.905] base::names(opts) <- ...future.futureOptionsAdded [13:13:39.905] base::options(opts) [13:13:39.905] } [13:13:39.905] { [13:13:39.905] { [13:13:39.905] NULL [13:13:39.905] RNGkind("Mersenne-Twister") [13:13:39.905] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:39.905] inherits = FALSE) [13:13:39.905] } [13:13:39.905] options(future.plan = NULL) [13:13:39.905] if (is.na(NA_character_)) [13:13:39.905] Sys.unsetenv("R_FUTURE_PLAN") [13:13:39.905] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:39.905] future::plan(list(function (..., envir = parent.frame()) [13:13:39.905] { [13:13:39.905] future <- SequentialFuture(..., envir = envir) [13:13:39.905] if (!future$lazy) [13:13:39.905] future <- run(future) [13:13:39.905] invisible(future) [13:13:39.905] }), .cleanup = FALSE, .init = FALSE) [13:13:39.905] } [13:13:39.905] } [13:13:39.905] } [13:13:39.905] }) [13:13:39.905] if (TRUE) { [13:13:39.905] base::sink(type = "output", split = FALSE) [13:13:39.905] if (TRUE) { [13:13:39.905] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:39.905] } [13:13:39.905] else { [13:13:39.905] ...future.result["stdout"] <- base::list(NULL) [13:13:39.905] } [13:13:39.905] base::close(...future.stdout) [13:13:39.905] ...future.stdout <- NULL [13:13:39.905] } [13:13:39.905] ...future.result$conditions <- ...future.conditions [13:13:39.905] ...future.result$finished <- base::Sys.time() [13:13:39.905] ...future.result [13:13:39.905] } [13:13:39.909] assign_globals() ... [13:13:39.909] List of 5 [13:13:39.909] $ ...future.FUN :function (mode = "logical", length = 0L) [13:13:39.909] $ future.call.arguments :List of 1 [13:13:39.909] ..$ length: int 2 [13:13:39.909] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:39.909] $ ...future.elements_ii :List of 4 [13:13:39.909] ..$ c: chr "list" [13:13:39.909] ..$ c: chr "character" [13:13:39.909] ..$ b: chr "numeric" [13:13:39.909] ..$ a: chr "integer" [13:13:39.909] $ ...future.seeds_ii : NULL [13:13:39.909] $ ...future.globals.maxSize: NULL [13:13:39.909] - attr(*, "where")=List of 5 [13:13:39.909] ..$ ...future.FUN : [13:13:39.909] ..$ future.call.arguments : [13:13:39.909] ..$ ...future.elements_ii : [13:13:39.909] ..$ ...future.seeds_ii : [13:13:39.909] ..$ ...future.globals.maxSize: [13:13:39.909] - attr(*, "resolved")= logi FALSE [13:13:39.909] - attr(*, "total_size")= num 2240 [13:13:39.909] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:39.909] - attr(*, "already-done")= logi TRUE [13:13:39.916] - copied '...future.FUN' to environment [13:13:39.916] - copied 'future.call.arguments' to environment [13:13:39.916] - copied '...future.elements_ii' to environment [13:13:39.916] - copied '...future.seeds_ii' to environment [13:13:39.917] - copied '...future.globals.maxSize' to environment [13:13:39.917] assign_globals() ... done [13:13:39.917] plan(): Setting new future strategy stack: [13:13:39.917] List of future strategies: [13:13:39.917] 1. sequential: [13:13:39.917] - args: function (..., envir = parent.frame(), workers = "") [13:13:39.917] - tweaked: FALSE [13:13:39.917] - call: NULL [13:13:39.918] plan(): nbrOfWorkers() = 1 [13:13:39.919] plan(): Setting new future strategy stack: [13:13:39.919] List of future strategies: [13:13:39.919] 1. sequential: [13:13:39.919] - args: function (..., envir = parent.frame(), workers = "") [13:13:39.919] - tweaked: FALSE [13:13:39.919] - call: plan(strategy) [13:13:39.920] plan(): nbrOfWorkers() = 1 [13:13:39.920] SequentialFuture started (and completed) [13:13:39.920] - Launch lazy future ... done [13:13:39.920] run() for 'SequentialFuture' ... done [13:13:39.921] Created future: [13:13:39.921] SequentialFuture: [13:13:39.921] Label: 'future_lapply-1' [13:13:39.921] Expression: [13:13:39.921] { [13:13:39.921] do.call(function(...) { [13:13:39.921] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:39.921] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:39.921] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:39.921] on.exit(options(oopts), add = TRUE) [13:13:39.921] } [13:13:39.921] { [13:13:39.921] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:39.921] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:39.921] ...future.FUN(...future.X_jj, ...) [13:13:39.921] }) [13:13:39.921] } [13:13:39.921] }, args = future.call.arguments) [13:13:39.921] } [13:13:39.921] Lazy evaluation: FALSE [13:13:39.921] Asynchronous evaluation: FALSE [13:13:39.921] Local evaluation: TRUE [13:13:39.921] Environment: R_GlobalEnv [13:13:39.921] Capture standard output: TRUE [13:13:39.921] Capture condition classes: 'condition' (excluding 'nothing') [13:13:39.921] 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) [13:13:39.921] Packages: [13:13:39.921] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:39.921] Resolved: TRUE [13:13:39.921] Value: 240 bytes of class 'list' [13:13:39.921] Early signaling: FALSE [13:13:39.921] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:39.921] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:39.922] Chunk #1 of 1 ... DONE [13:13:39.922] Launching 1 futures (chunks) ... DONE [13:13:39.922] Resolving 1 futures (chunks) ... [13:13:39.922] resolve() on list ... [13:13:39.923] recursive: 0 [13:13:39.923] length: 1 [13:13:39.923] [13:13:39.923] resolved() for 'SequentialFuture' ... [13:13:39.923] - state: 'finished' [13:13:39.923] - run: TRUE [13:13:39.924] - result: 'FutureResult' [13:13:39.924] resolved() for 'SequentialFuture' ... done [13:13:39.924] Future #1 [13:13:39.924] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:39.924] - nx: 1 [13:13:39.924] - relay: TRUE [13:13:39.925] - stdout: TRUE [13:13:39.925] - signal: TRUE [13:13:39.925] - resignal: FALSE [13:13:39.925] - force: TRUE [13:13:39.925] - relayed: [n=1] FALSE [13:13:39.925] - queued futures: [n=1] FALSE [13:13:39.926] - until=1 [13:13:39.926] - relaying element #1 [13:13:39.926] - relayed: [n=1] TRUE [13:13:39.926] - queued futures: [n=1] TRUE [13:13:39.926] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:39.926] length: 0 (resolved future 1) [13:13:39.927] Relaying remaining futures [13:13:39.927] signalConditionsASAP(NULL, pos=0) ... [13:13:39.927] - nx: 1 [13:13:39.927] - relay: TRUE [13:13:39.927] - stdout: TRUE [13:13:39.927] - signal: TRUE [13:13:39.927] - resignal: FALSE [13:13:39.928] - force: TRUE [13:13:39.928] - relayed: [n=1] TRUE [13:13:39.928] - queued futures: [n=1] TRUE - flush all [13:13:39.928] - relayed: [n=1] TRUE [13:13:39.928] - queued futures: [n=1] TRUE [13:13:39.929] signalConditionsASAP(NULL, pos=0) ... done [13:13:39.929] resolve() on list ... DONE [13:13:39.929] - Number of value chunks collected: 1 [13:13:39.929] Resolving 1 futures (chunks) ... DONE [13:13:39.929] Reducing values from 1 chunks ... [13:13:39.929] - Number of values collected after concatenation: 4 [13:13:39.930] - Number of values expected: 4 [13:13:39.930] Reverse index remapping (attribute 'ordering'): [n = 4] 4, 3, 2, 1 [13:13:39.930] Reducing values from 1 chunks ... DONE [13:13:39.930] future_lapply() ... DONE List of 1 $ y:List of 4 ..$ a: int [1:2] 0 0 ..$ b: num [1:2] 0 0 ..$ c: chr [1:2] "" "" ..$ c:List of 2 .. ..$ : NULL .. ..$ : NULL [13:13:39.934] future_lapply() ... [13:13:39.934] Number of chunks: 1 [13:13:39.934] Index remapping (attribute 'ordering'): [n = 4] 4, 3, 2, 1 [13:13:39.935] getGlobalsAndPackagesXApply() ... [13:13:39.935] - future.globals: TRUE [13:13:39.935] getGlobalsAndPackages() ... [13:13:39.935] Searching for globals... [13:13:39.936] - globals found: [2] 'FUN', '.Internal' [13:13:39.937] Searching for globals ... DONE [13:13:39.937] Resolving globals: FALSE [13:13:39.937] The total size of the 1 globals is 2.13 KiB (2184 bytes) [13:13:39.938] 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') [13:13:39.938] - globals: [1] 'FUN' [13:13:39.938] [13:13:39.938] getGlobalsAndPackages() ... DONE [13:13:39.938] - globals found/used: [n=1] 'FUN' [13:13:39.939] - needed namespaces: [n=0] [13:13:39.939] Finding globals ... DONE [13:13:39.939] - use_args: TRUE [13:13:39.939] - Getting '...' globals ... [13:13:39.939] resolve() on list ... [13:13:39.940] recursive: 0 [13:13:39.940] length: 1 [13:13:39.940] elements: '...' [13:13:39.940] length: 0 (resolved future 1) [13:13:39.940] resolve() on list ... DONE [13:13:39.940] - '...' content: [n=1] 'length' [13:13:39.941] List of 1 [13:13:39.941] $ ...:List of 1 [13:13:39.941] ..$ length: int 2 [13:13:39.941] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:39.941] - attr(*, "where")=List of 1 [13:13:39.941] ..$ ...: [13:13:39.941] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:39.941] - attr(*, "resolved")= logi TRUE [13:13:39.941] - attr(*, "total_size")= num NA [13:13:39.944] - Getting '...' globals ... DONE [13:13:39.944] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:39.944] List of 2 [13:13:39.944] $ ...future.FUN:function (mode = "logical", length = 0L) [13:13:39.944] $ ... :List of 1 [13:13:39.944] ..$ length: int 2 [13:13:39.944] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:39.944] - attr(*, "where")=List of 2 [13:13:39.944] ..$ ...future.FUN: [13:13:39.944] ..$ ... : [13:13:39.944] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:39.944] - attr(*, "resolved")= logi FALSE [13:13:39.944] - attr(*, "total_size")= num 2240 [13:13:39.948] Packages to be attached in all futures: [n=0] [13:13:39.948] getGlobalsAndPackagesXApply() ... DONE [13:13:39.948] Number of futures (= number of chunks): 1 [13:13:39.949] Launching 1 futures (chunks) ... [13:13:39.949] Chunk #1 of 1 ... [13:13:39.949] - Finding globals in 'X' for chunk #1 ... [13:13:39.949] getGlobalsAndPackages() ... [13:13:39.949] Searching for globals... [13:13:39.950] [13:13:39.950] Searching for globals ... DONE [13:13:39.950] - globals: [0] [13:13:39.950] getGlobalsAndPackages() ... DONE [13:13:39.950] + additional globals found: [n=0] [13:13:39.950] + additional namespaces needed: [n=0] [13:13:39.951] - Finding globals in 'X' for chunk #1 ... DONE [13:13:39.951] - seeds: [13:13:39.951] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:39.951] getGlobalsAndPackages() ... [13:13:39.951] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:39.951] Resolving globals: FALSE [13:13:39.952] Tweak future expression to call with '...' arguments ... [13:13:39.952] { [13:13:39.952] do.call(function(...) { [13:13:39.952] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:39.952] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:39.952] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:39.952] on.exit(options(oopts), add = TRUE) [13:13:39.952] } [13:13:39.952] { [13:13:39.952] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:39.952] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:39.952] ...future.FUN(...future.X_jj, ...) [13:13:39.952] }) [13:13:39.952] } [13:13:39.952] }, args = future.call.arguments) [13:13:39.952] } [13:13:39.952] Tweak future expression to call with '...' arguments ... DONE [13:13:39.953] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:39.953] [13:13:39.953] getGlobalsAndPackages() ... DONE [13:13:39.954] run() for 'Future' ... [13:13:39.954] - state: 'created' [13:13:39.955] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:13:39.955] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:39.955] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:39.955] - Field: 'label' [13:13:39.955] - Field: 'local' [13:13:39.956] - Field: 'owner' [13:13:39.956] - Field: 'envir' [13:13:39.956] - Field: 'packages' [13:13:39.956] - Field: 'gc' [13:13:39.956] - Field: 'conditions' [13:13:39.957] - Field: 'expr' [13:13:39.957] - Field: 'uuid' [13:13:39.957] - Field: 'seed' [13:13:39.957] - Field: 'version' [13:13:39.957] - Field: 'result' [13:13:39.957] - Field: 'asynchronous' [13:13:39.958] - Field: 'calls' [13:13:39.958] - Field: 'globals' [13:13:39.958] - Field: 'stdout' [13:13:39.958] - Field: 'earlySignal' [13:13:39.958] - Field: 'lazy' [13:13:39.958] - Field: 'state' [13:13:39.959] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:39.959] - Launch lazy future ... [13:13:39.959] Packages needed by the future expression (n = 0): [13:13:39.959] Packages needed by future strategies (n = 0): [13:13:39.960] { [13:13:39.960] { [13:13:39.960] { [13:13:39.960] ...future.startTime <- base::Sys.time() [13:13:39.960] { [13:13:39.960] { [13:13:39.960] { [13:13:39.960] base::local({ [13:13:39.960] has_future <- base::requireNamespace("future", [13:13:39.960] quietly = TRUE) [13:13:39.960] if (has_future) { [13:13:39.960] ns <- base::getNamespace("future") [13:13:39.960] version <- ns[[".package"]][["version"]] [13:13:39.960] if (is.null(version)) [13:13:39.960] version <- utils::packageVersion("future") [13:13:39.960] } [13:13:39.960] else { [13:13:39.960] version <- NULL [13:13:39.960] } [13:13:39.960] if (!has_future || version < "1.8.0") { [13:13:39.960] info <- base::c(r_version = base::gsub("R version ", [13:13:39.960] "", base::R.version$version.string), [13:13:39.960] platform = base::sprintf("%s (%s-bit)", [13:13:39.960] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:39.960] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:39.960] "release", "version")], collapse = " "), [13:13:39.960] hostname = base::Sys.info()[["nodename"]]) [13:13:39.960] info <- base::sprintf("%s: %s", base::names(info), [13:13:39.960] info) [13:13:39.960] info <- base::paste(info, collapse = "; ") [13:13:39.960] if (!has_future) { [13:13:39.960] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:39.960] info) [13:13:39.960] } [13:13:39.960] else { [13:13:39.960] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:39.960] info, version) [13:13:39.960] } [13:13:39.960] base::stop(msg) [13:13:39.960] } [13:13:39.960] }) [13:13:39.960] } [13:13:39.960] options(future.plan = NULL) [13:13:39.960] Sys.unsetenv("R_FUTURE_PLAN") [13:13:39.960] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:39.960] } [13:13:39.960] ...future.workdir <- getwd() [13:13:39.960] } [13:13:39.960] ...future.oldOptions <- base::as.list(base::.Options) [13:13:39.960] ...future.oldEnvVars <- base::Sys.getenv() [13:13:39.960] } [13:13:39.960] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:39.960] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:39.960] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:39.960] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:39.960] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:39.960] future.stdout.windows.reencode = NULL, width = 80L) [13:13:39.960] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:39.960] base::names(...future.oldOptions)) [13:13:39.960] } [13:13:39.960] if (FALSE) { [13:13:39.960] } [13:13:39.960] else { [13:13:39.960] if (TRUE) { [13:13:39.960] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:39.960] open = "w") [13:13:39.960] } [13:13:39.960] else { [13:13:39.960] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:39.960] windows = "NUL", "/dev/null"), open = "w") [13:13:39.960] } [13:13:39.960] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:39.960] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:39.960] base::sink(type = "output", split = FALSE) [13:13:39.960] base::close(...future.stdout) [13:13:39.960] }, add = TRUE) [13:13:39.960] } [13:13:39.960] ...future.frame <- base::sys.nframe() [13:13:39.960] ...future.conditions <- base::list() [13:13:39.960] ...future.rng <- base::globalenv()$.Random.seed [13:13:39.960] if (FALSE) { [13:13:39.960] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:39.960] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:39.960] } [13:13:39.960] ...future.result <- base::tryCatch({ [13:13:39.960] base::withCallingHandlers({ [13:13:39.960] ...future.value <- base::withVisible(base::local({ [13:13:39.960] do.call(function(...) { [13:13:39.960] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:39.960] if (!identical(...future.globals.maxSize.org, [13:13:39.960] ...future.globals.maxSize)) { [13:13:39.960] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:39.960] on.exit(options(oopts), add = TRUE) [13:13:39.960] } [13:13:39.960] { [13:13:39.960] lapply(seq_along(...future.elements_ii), [13:13:39.960] FUN = function(jj) { [13:13:39.960] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:39.960] ...future.FUN(...future.X_jj, ...) [13:13:39.960] }) [13:13:39.960] } [13:13:39.960] }, args = future.call.arguments) [13:13:39.960] })) [13:13:39.960] future::FutureResult(value = ...future.value$value, [13:13:39.960] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:39.960] ...future.rng), globalenv = if (FALSE) [13:13:39.960] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:39.960] ...future.globalenv.names)) [13:13:39.960] else NULL, started = ...future.startTime, version = "1.8") [13:13:39.960] }, condition = base::local({ [13:13:39.960] c <- base::c [13:13:39.960] inherits <- base::inherits [13:13:39.960] invokeRestart <- base::invokeRestart [13:13:39.960] length <- base::length [13:13:39.960] list <- base::list [13:13:39.960] seq.int <- base::seq.int [13:13:39.960] signalCondition <- base::signalCondition [13:13:39.960] sys.calls <- base::sys.calls [13:13:39.960] `[[` <- base::`[[` [13:13:39.960] `+` <- base::`+` [13:13:39.960] `<<-` <- base::`<<-` [13:13:39.960] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:39.960] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:39.960] 3L)] [13:13:39.960] } [13:13:39.960] function(cond) { [13:13:39.960] is_error <- inherits(cond, "error") [13:13:39.960] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:39.960] NULL) [13:13:39.960] if (is_error) { [13:13:39.960] sessionInformation <- function() { [13:13:39.960] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:39.960] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:39.960] search = base::search(), system = base::Sys.info()) [13:13:39.960] } [13:13:39.960] ...future.conditions[[length(...future.conditions) + [13:13:39.960] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:39.960] cond$call), session = sessionInformation(), [13:13:39.960] timestamp = base::Sys.time(), signaled = 0L) [13:13:39.960] signalCondition(cond) [13:13:39.960] } [13:13:39.960] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:39.960] "immediateCondition"))) { [13:13:39.960] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:39.960] ...future.conditions[[length(...future.conditions) + [13:13:39.960] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:39.960] if (TRUE && !signal) { [13:13:39.960] muffleCondition <- function (cond, pattern = "^muffle") [13:13:39.960] { [13:13:39.960] inherits <- base::inherits [13:13:39.960] invokeRestart <- base::invokeRestart [13:13:39.960] is.null <- base::is.null [13:13:39.960] muffled <- FALSE [13:13:39.960] if (inherits(cond, "message")) { [13:13:39.960] muffled <- grepl(pattern, "muffleMessage") [13:13:39.960] if (muffled) [13:13:39.960] invokeRestart("muffleMessage") [13:13:39.960] } [13:13:39.960] else if (inherits(cond, "warning")) { [13:13:39.960] muffled <- grepl(pattern, "muffleWarning") [13:13:39.960] if (muffled) [13:13:39.960] invokeRestart("muffleWarning") [13:13:39.960] } [13:13:39.960] else if (inherits(cond, "condition")) { [13:13:39.960] if (!is.null(pattern)) { [13:13:39.960] computeRestarts <- base::computeRestarts [13:13:39.960] grepl <- base::grepl [13:13:39.960] restarts <- computeRestarts(cond) [13:13:39.960] for (restart in restarts) { [13:13:39.960] name <- restart$name [13:13:39.960] if (is.null(name)) [13:13:39.960] next [13:13:39.960] if (!grepl(pattern, name)) [13:13:39.960] next [13:13:39.960] invokeRestart(restart) [13:13:39.960] muffled <- TRUE [13:13:39.960] break [13:13:39.960] } [13:13:39.960] } [13:13:39.960] } [13:13:39.960] invisible(muffled) [13:13:39.960] } [13:13:39.960] muffleCondition(cond, pattern = "^muffle") [13:13:39.960] } [13:13:39.960] } [13:13:39.960] else { [13:13:39.960] if (TRUE) { [13:13:39.960] muffleCondition <- function (cond, pattern = "^muffle") [13:13:39.960] { [13:13:39.960] inherits <- base::inherits [13:13:39.960] invokeRestart <- base::invokeRestart [13:13:39.960] is.null <- base::is.null [13:13:39.960] muffled <- FALSE [13:13:39.960] if (inherits(cond, "message")) { [13:13:39.960] muffled <- grepl(pattern, "muffleMessage") [13:13:39.960] if (muffled) [13:13:39.960] invokeRestart("muffleMessage") [13:13:39.960] } [13:13:39.960] else if (inherits(cond, "warning")) { [13:13:39.960] muffled <- grepl(pattern, "muffleWarning") [13:13:39.960] if (muffled) [13:13:39.960] invokeRestart("muffleWarning") [13:13:39.960] } [13:13:39.960] else if (inherits(cond, "condition")) { [13:13:39.960] if (!is.null(pattern)) { [13:13:39.960] computeRestarts <- base::computeRestarts [13:13:39.960] grepl <- base::grepl [13:13:39.960] restarts <- computeRestarts(cond) [13:13:39.960] for (restart in restarts) { [13:13:39.960] name <- restart$name [13:13:39.960] if (is.null(name)) [13:13:39.960] next [13:13:39.960] if (!grepl(pattern, name)) [13:13:39.960] next [13:13:39.960] invokeRestart(restart) [13:13:39.960] muffled <- TRUE [13:13:39.960] break [13:13:39.960] } [13:13:39.960] } [13:13:39.960] } [13:13:39.960] invisible(muffled) [13:13:39.960] } [13:13:39.960] muffleCondition(cond, pattern = "^muffle") [13:13:39.960] } [13:13:39.960] } [13:13:39.960] } [13:13:39.960] })) [13:13:39.960] }, error = function(ex) { [13:13:39.960] base::structure(base::list(value = NULL, visible = NULL, [13:13:39.960] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:39.960] ...future.rng), started = ...future.startTime, [13:13:39.960] finished = Sys.time(), session_uuid = NA_character_, [13:13:39.960] version = "1.8"), class = "FutureResult") [13:13:39.960] }, finally = { [13:13:39.960] if (!identical(...future.workdir, getwd())) [13:13:39.960] setwd(...future.workdir) [13:13:39.960] { [13:13:39.960] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:39.960] ...future.oldOptions$nwarnings <- NULL [13:13:39.960] } [13:13:39.960] base::options(...future.oldOptions) [13:13:39.960] if (.Platform$OS.type == "windows") { [13:13:39.960] old_names <- names(...future.oldEnvVars) [13:13:39.960] envs <- base::Sys.getenv() [13:13:39.960] names <- names(envs) [13:13:39.960] common <- intersect(names, old_names) [13:13:39.960] added <- setdiff(names, old_names) [13:13:39.960] removed <- setdiff(old_names, names) [13:13:39.960] changed <- common[...future.oldEnvVars[common] != [13:13:39.960] envs[common]] [13:13:39.960] NAMES <- toupper(changed) [13:13:39.960] args <- list() [13:13:39.960] for (kk in seq_along(NAMES)) { [13:13:39.960] name <- changed[[kk]] [13:13:39.960] NAME <- NAMES[[kk]] [13:13:39.960] if (name != NAME && is.element(NAME, old_names)) [13:13:39.960] next [13:13:39.960] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:39.960] } [13:13:39.960] NAMES <- toupper(added) [13:13:39.960] for (kk in seq_along(NAMES)) { [13:13:39.960] name <- added[[kk]] [13:13:39.960] NAME <- NAMES[[kk]] [13:13:39.960] if (name != NAME && is.element(NAME, old_names)) [13:13:39.960] next [13:13:39.960] args[[name]] <- "" [13:13:39.960] } [13:13:39.960] NAMES <- toupper(removed) [13:13:39.960] for (kk in seq_along(NAMES)) { [13:13:39.960] name <- removed[[kk]] [13:13:39.960] NAME <- NAMES[[kk]] [13:13:39.960] if (name != NAME && is.element(NAME, old_names)) [13:13:39.960] next [13:13:39.960] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:39.960] } [13:13:39.960] if (length(args) > 0) [13:13:39.960] base::do.call(base::Sys.setenv, args = args) [13:13:39.960] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:39.960] } [13:13:39.960] else { [13:13:39.960] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:39.960] } [13:13:39.960] { [13:13:39.960] if (base::length(...future.futureOptionsAdded) > [13:13:39.960] 0L) { [13:13:39.960] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:39.960] base::names(opts) <- ...future.futureOptionsAdded [13:13:39.960] base::options(opts) [13:13:39.960] } [13:13:39.960] { [13:13:39.960] { [13:13:39.960] NULL [13:13:39.960] RNGkind("Mersenne-Twister") [13:13:39.960] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:39.960] inherits = FALSE) [13:13:39.960] } [13:13:39.960] options(future.plan = NULL) [13:13:39.960] if (is.na(NA_character_)) [13:13:39.960] Sys.unsetenv("R_FUTURE_PLAN") [13:13:39.960] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:39.960] future::plan(list(function (..., envir = parent.frame()) [13:13:39.960] { [13:13:39.960] future <- SequentialFuture(..., envir = envir) [13:13:39.960] if (!future$lazy) [13:13:39.960] future <- run(future) [13:13:39.960] invisible(future) [13:13:39.960] }), .cleanup = FALSE, .init = FALSE) [13:13:39.960] } [13:13:39.960] } [13:13:39.960] } [13:13:39.960] }) [13:13:39.960] if (TRUE) { [13:13:39.960] base::sink(type = "output", split = FALSE) [13:13:39.960] if (TRUE) { [13:13:39.960] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:39.960] } [13:13:39.960] else { [13:13:39.960] ...future.result["stdout"] <- base::list(NULL) [13:13:39.960] } [13:13:39.960] base::close(...future.stdout) [13:13:39.960] ...future.stdout <- NULL [13:13:39.960] } [13:13:39.960] ...future.result$conditions <- ...future.conditions [13:13:39.960] ...future.result$finished <- base::Sys.time() [13:13:39.960] ...future.result [13:13:39.960] } [13:13:39.964] assign_globals() ... [13:13:39.964] List of 5 [13:13:39.964] $ ...future.FUN :function (mode = "logical", length = 0L) [13:13:39.964] $ future.call.arguments :List of 1 [13:13:39.964] ..$ length: int 2 [13:13:39.964] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:39.964] $ ...future.elements_ii :List of 4 [13:13:39.964] ..$ c: chr "list" [13:13:39.964] ..$ c: chr "character" [13:13:39.964] ..$ b: chr "numeric" [13:13:39.964] ..$ a: chr "integer" [13:13:39.964] $ ...future.seeds_ii : NULL [13:13:39.964] $ ...future.globals.maxSize: NULL [13:13:39.964] - attr(*, "where")=List of 5 [13:13:39.964] ..$ ...future.FUN : [13:13:39.964] ..$ future.call.arguments : [13:13:39.964] ..$ ...future.elements_ii : [13:13:39.964] ..$ ...future.seeds_ii : [13:13:39.964] ..$ ...future.globals.maxSize: [13:13:39.964] - attr(*, "resolved")= logi FALSE [13:13:39.964] - attr(*, "total_size")= num 2240 [13:13:39.964] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:39.964] - attr(*, "already-done")= logi TRUE [13:13:39.970] - copied '...future.FUN' to environment [13:13:39.971] - copied 'future.call.arguments' to environment [13:13:39.971] - copied '...future.elements_ii' to environment [13:13:39.971] - copied '...future.seeds_ii' to environment [13:13:39.971] - copied '...future.globals.maxSize' to environment [13:13:39.971] assign_globals() ... done [13:13:39.972] plan(): Setting new future strategy stack: [13:13:39.972] List of future strategies: [13:13:39.972] 1. sequential: [13:13:39.972] - args: function (..., envir = parent.frame(), workers = "") [13:13:39.972] - tweaked: FALSE [13:13:39.972] - call: NULL [13:13:39.972] plan(): nbrOfWorkers() = 1 [13:13:39.974] plan(): Setting new future strategy stack: [13:13:39.974] List of future strategies: [13:13:39.974] 1. sequential: [13:13:39.974] - args: function (..., envir = parent.frame(), workers = "") [13:13:39.974] - tweaked: FALSE [13:13:39.974] - call: plan(strategy) [13:13:39.974] plan(): nbrOfWorkers() = 1 [13:13:39.975] SequentialFuture started (and completed) [13:13:39.975] - Launch lazy future ... done [13:13:39.975] run() for 'SequentialFuture' ... done [13:13:39.975] Created future: [13:13:39.975] SequentialFuture: [13:13:39.975] Label: 'future_lapply-1' [13:13:39.975] Expression: [13:13:39.975] { [13:13:39.975] do.call(function(...) { [13:13:39.975] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:39.975] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:39.975] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:39.975] on.exit(options(oopts), add = TRUE) [13:13:39.975] } [13:13:39.975] { [13:13:39.975] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:39.975] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:39.975] ...future.FUN(...future.X_jj, ...) [13:13:39.975] }) [13:13:39.975] } [13:13:39.975] }, args = future.call.arguments) [13:13:39.975] } [13:13:39.975] Lazy evaluation: FALSE [13:13:39.975] Asynchronous evaluation: FALSE [13:13:39.975] Local evaluation: TRUE [13:13:39.975] Environment: R_GlobalEnv [13:13:39.975] Capture standard output: TRUE [13:13:39.975] Capture condition classes: 'condition' (excluding 'nothing') [13:13:39.975] 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) [13:13:39.975] Packages: [13:13:39.975] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:39.975] Resolved: TRUE [13:13:39.975] Value: 240 bytes of class 'list' [13:13:39.975] Early signaling: FALSE [13:13:39.975] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:39.975] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:39.977] Chunk #1 of 1 ... DONE [13:13:39.977] Launching 1 futures (chunks) ... DONE [13:13:39.977] Resolving 1 futures (chunks) ... [13:13:39.977] resolve() on list ... [13:13:39.977] recursive: 0 [13:13:39.978] length: 1 [13:13:39.978] [13:13:39.978] resolved() for 'SequentialFuture' ... [13:13:39.978] - state: 'finished' [13:13:39.978] - run: TRUE [13:13:39.978] - result: 'FutureResult' [13:13:39.979] resolved() for 'SequentialFuture' ... done [13:13:39.979] Future #1 [13:13:39.979] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:39.979] - nx: 1 [13:13:39.979] - relay: TRUE [13:13:39.979] - stdout: TRUE [13:13:39.980] - signal: TRUE [13:13:39.980] - resignal: FALSE [13:13:39.980] - force: TRUE [13:13:39.981] - relayed: [n=1] FALSE [13:13:39.981] - queued futures: [n=1] FALSE [13:13:39.981] - until=1 [13:13:39.981] - relaying element #1 [13:13:39.982] - relayed: [n=1] TRUE [13:13:39.982] - queued futures: [n=1] TRUE [13:13:39.982] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:39.982] length: 0 (resolved future 1) [13:13:39.982] Relaying remaining futures [13:13:39.983] signalConditionsASAP(NULL, pos=0) ... [13:13:39.983] - nx: 1 [13:13:39.983] - relay: TRUE [13:13:39.983] - stdout: TRUE [13:13:39.983] - signal: TRUE [13:13:39.983] - resignal: FALSE [13:13:39.983] - force: TRUE [13:13:39.984] - relayed: [n=1] TRUE [13:13:39.984] - queued futures: [n=1] TRUE - flush all [13:13:39.984] - relayed: [n=1] TRUE [13:13:39.984] - queued futures: [n=1] TRUE [13:13:39.984] signalConditionsASAP(NULL, pos=0) ... done [13:13:39.985] resolve() on list ... DONE [13:13:39.985] - Number of value chunks collected: 1 [13:13:39.985] Resolving 1 futures (chunks) ... DONE [13:13:39.985] Reducing values from 1 chunks ... [13:13:39.985] - Number of values collected after concatenation: 4 [13:13:39.985] - Number of values expected: 4 [13:13:39.986] Reverse index remapping (attribute 'ordering'): [n = 4] 4, 3, 2, 1 [13:13:39.986] Reducing values from 1 chunks ... DONE [13:13:39.986] 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, ...) ... [13:13:39.988] future_lapply() ... [13:13:39.989] Number of chunks: 1 [13:13:39.989] Index remapping (attribute 'ordering'): [n = 4] 4, 3, 2, 1 [13:13:39.990] getGlobalsAndPackagesXApply() ... [13:13:39.990] - future.globals: TRUE [13:13:39.990] getGlobalsAndPackages() ... [13:13:39.990] Searching for globals... [13:13:39.991] - globals found: [2] 'FUN', '.Internal' [13:13:39.992] Searching for globals ... DONE [13:13:39.992] Resolving globals: FALSE [13:13:39.992] The total size of the 1 globals is 2.13 KiB (2184 bytes) [13:13:39.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') [13:13:39.993] - globals: [1] 'FUN' [13:13:39.993] [13:13:39.993] getGlobalsAndPackages() ... DONE [13:13:39.993] - globals found/used: [n=1] 'FUN' [13:13:39.993] - needed namespaces: [n=0] [13:13:39.994] Finding globals ... DONE [13:13:39.994] - use_args: TRUE [13:13:39.994] - Getting '...' globals ... [13:13:39.994] resolve() on list ... [13:13:39.994] recursive: 0 [13:13:39.995] length: 1 [13:13:39.995] elements: '...' [13:13:39.995] length: 0 (resolved future 1) [13:13:39.995] resolve() on list ... DONE [13:13:39.995] - '...' content: [n=1] 'length' [13:13:39.995] List of 1 [13:13:39.995] $ ...:List of 1 [13:13:39.995] ..$ length: int 2 [13:13:39.995] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:39.995] - attr(*, "where")=List of 1 [13:13:39.995] ..$ ...: [13:13:39.995] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:39.995] - attr(*, "resolved")= logi TRUE [13:13:39.995] - attr(*, "total_size")= num NA [13:13:39.999] - Getting '...' globals ... DONE [13:13:39.999] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:39.999] List of 2 [13:13:39.999] $ ...future.FUN:function (mode = "logical", length = 0L) [13:13:39.999] $ ... :List of 1 [13:13:39.999] ..$ length: int 2 [13:13:39.999] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:39.999] - attr(*, "where")=List of 2 [13:13:39.999] ..$ ...future.FUN: [13:13:39.999] ..$ ... : [13:13:39.999] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:39.999] - attr(*, "resolved")= logi FALSE [13:13:39.999] - attr(*, "total_size")= num 2240 [13:13:40.004] Packages to be attached in all futures: [n=0] [13:13:40.004] getGlobalsAndPackagesXApply() ... DONE [13:13:40.004] Number of futures (= number of chunks): 1 [13:13:40.005] Launching 1 futures (chunks) ... [13:13:40.005] Chunk #1 of 1 ... [13:13:40.005] - Finding globals in 'X' for chunk #1 ... [13:13:40.005] getGlobalsAndPackages() ... [13:13:40.005] Searching for globals... [13:13:40.006] [13:13:40.006] Searching for globals ... DONE [13:13:40.006] - globals: [0] [13:13:40.006] getGlobalsAndPackages() ... DONE [13:13:40.006] + additional globals found: [n=0] [13:13:40.006] + additional namespaces needed: [n=0] [13:13:40.006] - Finding globals in 'X' for chunk #1 ... DONE [13:13:40.007] - seeds: [13:13:40.007] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:40.007] getGlobalsAndPackages() ... [13:13:40.007] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:40.007] Resolving globals: FALSE [13:13:40.007] Tweak future expression to call with '...' arguments ... [13:13:40.008] { [13:13:40.008] do.call(function(...) { [13:13:40.008] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:40.008] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:40.008] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:40.008] on.exit(options(oopts), add = TRUE) [13:13:40.008] } [13:13:40.008] { [13:13:40.008] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:40.008] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:40.008] ...future.FUN(...future.X_jj, ...) [13:13:40.008] }) [13:13:40.008] } [13:13:40.008] }, args = future.call.arguments) [13:13:40.008] } [13:13:40.008] Tweak future expression to call with '...' arguments ... DONE [13:13:40.009] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:40.009] [13:13:40.009] getGlobalsAndPackages() ... DONE [13:13:40.009] run() for 'Future' ... [13:13:40.009] - state: 'created' [13:13:40.010] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:13:40.010] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:40.010] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:40.010] - Field: 'label' [13:13:40.011] - Field: 'local' [13:13:40.011] - Field: 'owner' [13:13:40.011] - Field: 'envir' [13:13:40.011] - Field: 'packages' [13:13:40.011] - Field: 'gc' [13:13:40.011] - Field: 'conditions' [13:13:40.012] - Field: 'expr' [13:13:40.012] - Field: 'uuid' [13:13:40.012] - Field: 'seed' [13:13:40.012] - Field: 'version' [13:13:40.012] - Field: 'result' [13:13:40.012] - Field: 'asynchronous' [13:13:40.013] - Field: 'calls' [13:13:40.013] - Field: 'globals' [13:13:40.013] - Field: 'stdout' [13:13:40.013] - Field: 'earlySignal' [13:13:40.013] - Field: 'lazy' [13:13:40.013] - Field: 'state' [13:13:40.014] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:40.014] - Launch lazy future ... [13:13:40.014] Packages needed by the future expression (n = 0): [13:13:40.014] Packages needed by future strategies (n = 0): [13:13:40.015] { [13:13:40.015] { [13:13:40.015] { [13:13:40.015] ...future.startTime <- base::Sys.time() [13:13:40.015] { [13:13:40.015] { [13:13:40.015] { [13:13:40.015] base::local({ [13:13:40.015] has_future <- base::requireNamespace("future", [13:13:40.015] quietly = TRUE) [13:13:40.015] if (has_future) { [13:13:40.015] ns <- base::getNamespace("future") [13:13:40.015] version <- ns[[".package"]][["version"]] [13:13:40.015] if (is.null(version)) [13:13:40.015] version <- utils::packageVersion("future") [13:13:40.015] } [13:13:40.015] else { [13:13:40.015] version <- NULL [13:13:40.015] } [13:13:40.015] if (!has_future || version < "1.8.0") { [13:13:40.015] info <- base::c(r_version = base::gsub("R version ", [13:13:40.015] "", base::R.version$version.string), [13:13:40.015] platform = base::sprintf("%s (%s-bit)", [13:13:40.015] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:40.015] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:40.015] "release", "version")], collapse = " "), [13:13:40.015] hostname = base::Sys.info()[["nodename"]]) [13:13:40.015] info <- base::sprintf("%s: %s", base::names(info), [13:13:40.015] info) [13:13:40.015] info <- base::paste(info, collapse = "; ") [13:13:40.015] if (!has_future) { [13:13:40.015] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:40.015] info) [13:13:40.015] } [13:13:40.015] else { [13:13:40.015] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:40.015] info, version) [13:13:40.015] } [13:13:40.015] base::stop(msg) [13:13:40.015] } [13:13:40.015] }) [13:13:40.015] } [13:13:40.015] options(future.plan = NULL) [13:13:40.015] Sys.unsetenv("R_FUTURE_PLAN") [13:13:40.015] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:40.015] } [13:13:40.015] ...future.workdir <- getwd() [13:13:40.015] } [13:13:40.015] ...future.oldOptions <- base::as.list(base::.Options) [13:13:40.015] ...future.oldEnvVars <- base::Sys.getenv() [13:13:40.015] } [13:13:40.015] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:40.015] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:40.015] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:40.015] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:40.015] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:40.015] future.stdout.windows.reencode = NULL, width = 80L) [13:13:40.015] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:40.015] base::names(...future.oldOptions)) [13:13:40.015] } [13:13:40.015] if (FALSE) { [13:13:40.015] } [13:13:40.015] else { [13:13:40.015] if (TRUE) { [13:13:40.015] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:40.015] open = "w") [13:13:40.015] } [13:13:40.015] else { [13:13:40.015] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:40.015] windows = "NUL", "/dev/null"), open = "w") [13:13:40.015] } [13:13:40.015] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:40.015] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:40.015] base::sink(type = "output", split = FALSE) [13:13:40.015] base::close(...future.stdout) [13:13:40.015] }, add = TRUE) [13:13:40.015] } [13:13:40.015] ...future.frame <- base::sys.nframe() [13:13:40.015] ...future.conditions <- base::list() [13:13:40.015] ...future.rng <- base::globalenv()$.Random.seed [13:13:40.015] if (FALSE) { [13:13:40.015] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:40.015] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:40.015] } [13:13:40.015] ...future.result <- base::tryCatch({ [13:13:40.015] base::withCallingHandlers({ [13:13:40.015] ...future.value <- base::withVisible(base::local({ [13:13:40.015] do.call(function(...) { [13:13:40.015] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:40.015] if (!identical(...future.globals.maxSize.org, [13:13:40.015] ...future.globals.maxSize)) { [13:13:40.015] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:40.015] on.exit(options(oopts), add = TRUE) [13:13:40.015] } [13:13:40.015] { [13:13:40.015] lapply(seq_along(...future.elements_ii), [13:13:40.015] FUN = function(jj) { [13:13:40.015] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:40.015] ...future.FUN(...future.X_jj, ...) [13:13:40.015] }) [13:13:40.015] } [13:13:40.015] }, args = future.call.arguments) [13:13:40.015] })) [13:13:40.015] future::FutureResult(value = ...future.value$value, [13:13:40.015] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:40.015] ...future.rng), globalenv = if (FALSE) [13:13:40.015] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:40.015] ...future.globalenv.names)) [13:13:40.015] else NULL, started = ...future.startTime, version = "1.8") [13:13:40.015] }, condition = base::local({ [13:13:40.015] c <- base::c [13:13:40.015] inherits <- base::inherits [13:13:40.015] invokeRestart <- base::invokeRestart [13:13:40.015] length <- base::length [13:13:40.015] list <- base::list [13:13:40.015] seq.int <- base::seq.int [13:13:40.015] signalCondition <- base::signalCondition [13:13:40.015] sys.calls <- base::sys.calls [13:13:40.015] `[[` <- base::`[[` [13:13:40.015] `+` <- base::`+` [13:13:40.015] `<<-` <- base::`<<-` [13:13:40.015] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:40.015] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:40.015] 3L)] [13:13:40.015] } [13:13:40.015] function(cond) { [13:13:40.015] is_error <- inherits(cond, "error") [13:13:40.015] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:40.015] NULL) [13:13:40.015] if (is_error) { [13:13:40.015] sessionInformation <- function() { [13:13:40.015] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:40.015] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:40.015] search = base::search(), system = base::Sys.info()) [13:13:40.015] } [13:13:40.015] ...future.conditions[[length(...future.conditions) + [13:13:40.015] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:40.015] cond$call), session = sessionInformation(), [13:13:40.015] timestamp = base::Sys.time(), signaled = 0L) [13:13:40.015] signalCondition(cond) [13:13:40.015] } [13:13:40.015] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:40.015] "immediateCondition"))) { [13:13:40.015] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:40.015] ...future.conditions[[length(...future.conditions) + [13:13:40.015] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:40.015] if (TRUE && !signal) { [13:13:40.015] muffleCondition <- function (cond, pattern = "^muffle") [13:13:40.015] { [13:13:40.015] inherits <- base::inherits [13:13:40.015] invokeRestart <- base::invokeRestart [13:13:40.015] is.null <- base::is.null [13:13:40.015] muffled <- FALSE [13:13:40.015] if (inherits(cond, "message")) { [13:13:40.015] muffled <- grepl(pattern, "muffleMessage") [13:13:40.015] if (muffled) [13:13:40.015] invokeRestart("muffleMessage") [13:13:40.015] } [13:13:40.015] else if (inherits(cond, "warning")) { [13:13:40.015] muffled <- grepl(pattern, "muffleWarning") [13:13:40.015] if (muffled) [13:13:40.015] invokeRestart("muffleWarning") [13:13:40.015] } [13:13:40.015] else if (inherits(cond, "condition")) { [13:13:40.015] if (!is.null(pattern)) { [13:13:40.015] computeRestarts <- base::computeRestarts [13:13:40.015] grepl <- base::grepl [13:13:40.015] restarts <- computeRestarts(cond) [13:13:40.015] for (restart in restarts) { [13:13:40.015] name <- restart$name [13:13:40.015] if (is.null(name)) [13:13:40.015] next [13:13:40.015] if (!grepl(pattern, name)) [13:13:40.015] next [13:13:40.015] invokeRestart(restart) [13:13:40.015] muffled <- TRUE [13:13:40.015] break [13:13:40.015] } [13:13:40.015] } [13:13:40.015] } [13:13:40.015] invisible(muffled) [13:13:40.015] } [13:13:40.015] muffleCondition(cond, pattern = "^muffle") [13:13:40.015] } [13:13:40.015] } [13:13:40.015] else { [13:13:40.015] if (TRUE) { [13:13:40.015] muffleCondition <- function (cond, pattern = "^muffle") [13:13:40.015] { [13:13:40.015] inherits <- base::inherits [13:13:40.015] invokeRestart <- base::invokeRestart [13:13:40.015] is.null <- base::is.null [13:13:40.015] muffled <- FALSE [13:13:40.015] if (inherits(cond, "message")) { [13:13:40.015] muffled <- grepl(pattern, "muffleMessage") [13:13:40.015] if (muffled) [13:13:40.015] invokeRestart("muffleMessage") [13:13:40.015] } [13:13:40.015] else if (inherits(cond, "warning")) { [13:13:40.015] muffled <- grepl(pattern, "muffleWarning") [13:13:40.015] if (muffled) [13:13:40.015] invokeRestart("muffleWarning") [13:13:40.015] } [13:13:40.015] else if (inherits(cond, "condition")) { [13:13:40.015] if (!is.null(pattern)) { [13:13:40.015] computeRestarts <- base::computeRestarts [13:13:40.015] grepl <- base::grepl [13:13:40.015] restarts <- computeRestarts(cond) [13:13:40.015] for (restart in restarts) { [13:13:40.015] name <- restart$name [13:13:40.015] if (is.null(name)) [13:13:40.015] next [13:13:40.015] if (!grepl(pattern, name)) [13:13:40.015] next [13:13:40.015] invokeRestart(restart) [13:13:40.015] muffled <- TRUE [13:13:40.015] break [13:13:40.015] } [13:13:40.015] } [13:13:40.015] } [13:13:40.015] invisible(muffled) [13:13:40.015] } [13:13:40.015] muffleCondition(cond, pattern = "^muffle") [13:13:40.015] } [13:13:40.015] } [13:13:40.015] } [13:13:40.015] })) [13:13:40.015] }, error = function(ex) { [13:13:40.015] base::structure(base::list(value = NULL, visible = NULL, [13:13:40.015] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:40.015] ...future.rng), started = ...future.startTime, [13:13:40.015] finished = Sys.time(), session_uuid = NA_character_, [13:13:40.015] version = "1.8"), class = "FutureResult") [13:13:40.015] }, finally = { [13:13:40.015] if (!identical(...future.workdir, getwd())) [13:13:40.015] setwd(...future.workdir) [13:13:40.015] { [13:13:40.015] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:40.015] ...future.oldOptions$nwarnings <- NULL [13:13:40.015] } [13:13:40.015] base::options(...future.oldOptions) [13:13:40.015] if (.Platform$OS.type == "windows") { [13:13:40.015] old_names <- names(...future.oldEnvVars) [13:13:40.015] envs <- base::Sys.getenv() [13:13:40.015] names <- names(envs) [13:13:40.015] common <- intersect(names, old_names) [13:13:40.015] added <- setdiff(names, old_names) [13:13:40.015] removed <- setdiff(old_names, names) [13:13:40.015] changed <- common[...future.oldEnvVars[common] != [13:13:40.015] envs[common]] [13:13:40.015] NAMES <- toupper(changed) [13:13:40.015] args <- list() [13:13:40.015] for (kk in seq_along(NAMES)) { [13:13:40.015] name <- changed[[kk]] [13:13:40.015] NAME <- NAMES[[kk]] [13:13:40.015] if (name != NAME && is.element(NAME, old_names)) [13:13:40.015] next [13:13:40.015] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:40.015] } [13:13:40.015] NAMES <- toupper(added) [13:13:40.015] for (kk in seq_along(NAMES)) { [13:13:40.015] name <- added[[kk]] [13:13:40.015] NAME <- NAMES[[kk]] [13:13:40.015] if (name != NAME && is.element(NAME, old_names)) [13:13:40.015] next [13:13:40.015] args[[name]] <- "" [13:13:40.015] } [13:13:40.015] NAMES <- toupper(removed) [13:13:40.015] for (kk in seq_along(NAMES)) { [13:13:40.015] name <- removed[[kk]] [13:13:40.015] NAME <- NAMES[[kk]] [13:13:40.015] if (name != NAME && is.element(NAME, old_names)) [13:13:40.015] next [13:13:40.015] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:40.015] } [13:13:40.015] if (length(args) > 0) [13:13:40.015] base::do.call(base::Sys.setenv, args = args) [13:13:40.015] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:40.015] } [13:13:40.015] else { [13:13:40.015] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:40.015] } [13:13:40.015] { [13:13:40.015] if (base::length(...future.futureOptionsAdded) > [13:13:40.015] 0L) { [13:13:40.015] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:40.015] base::names(opts) <- ...future.futureOptionsAdded [13:13:40.015] base::options(opts) [13:13:40.015] } [13:13:40.015] { [13:13:40.015] { [13:13:40.015] NULL [13:13:40.015] RNGkind("Mersenne-Twister") [13:13:40.015] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:40.015] inherits = FALSE) [13:13:40.015] } [13:13:40.015] options(future.plan = NULL) [13:13:40.015] if (is.na(NA_character_)) [13:13:40.015] Sys.unsetenv("R_FUTURE_PLAN") [13:13:40.015] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:40.015] future::plan(list(function (..., envir = parent.frame()) [13:13:40.015] { [13:13:40.015] future <- SequentialFuture(..., envir = envir) [13:13:40.015] if (!future$lazy) [13:13:40.015] future <- run(future) [13:13:40.015] invisible(future) [13:13:40.015] }), .cleanup = FALSE, .init = FALSE) [13:13:40.015] } [13:13:40.015] } [13:13:40.015] } [13:13:40.015] }) [13:13:40.015] if (TRUE) { [13:13:40.015] base::sink(type = "output", split = FALSE) [13:13:40.015] if (TRUE) { [13:13:40.015] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:40.015] } [13:13:40.015] else { [13:13:40.015] ...future.result["stdout"] <- base::list(NULL) [13:13:40.015] } [13:13:40.015] base::close(...future.stdout) [13:13:40.015] ...future.stdout <- NULL [13:13:40.015] } [13:13:40.015] ...future.result$conditions <- ...future.conditions [13:13:40.015] ...future.result$finished <- base::Sys.time() [13:13:40.015] ...future.result [13:13:40.015] } [13:13:40.019] assign_globals() ... [13:13:40.019] List of 5 [13:13:40.019] $ ...future.FUN :function (mode = "logical", length = 0L) [13:13:40.019] $ future.call.arguments :List of 1 [13:13:40.019] ..$ length: int 2 [13:13:40.019] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:40.019] $ ...future.elements_ii :List of 4 [13:13:40.019] ..$ c: chr "list" [13:13:40.019] ..$ c: chr "character" [13:13:40.019] ..$ b: chr "numeric" [13:13:40.019] ..$ a: chr "integer" [13:13:40.019] $ ...future.seeds_ii : NULL [13:13:40.019] $ ...future.globals.maxSize: NULL [13:13:40.019] - attr(*, "where")=List of 5 [13:13:40.019] ..$ ...future.FUN : [13:13:40.019] ..$ future.call.arguments : [13:13:40.019] ..$ ...future.elements_ii : [13:13:40.019] ..$ ...future.seeds_ii : [13:13:40.019] ..$ ...future.globals.maxSize: [13:13:40.019] - attr(*, "resolved")= logi FALSE [13:13:40.019] - attr(*, "total_size")= num 2240 [13:13:40.019] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:40.019] - attr(*, "already-done")= logi TRUE [13:13:40.026] - copied '...future.FUN' to environment [13:13:40.026] - copied 'future.call.arguments' to environment [13:13:40.026] - copied '...future.elements_ii' to environment [13:13:40.026] - copied '...future.seeds_ii' to environment [13:13:40.026] - copied '...future.globals.maxSize' to environment [13:13:40.026] assign_globals() ... done [13:13:40.027] plan(): Setting new future strategy stack: [13:13:40.027] List of future strategies: [13:13:40.027] 1. sequential: [13:13:40.027] - args: function (..., envir = parent.frame(), workers = "") [13:13:40.027] - tweaked: FALSE [13:13:40.027] - call: NULL [13:13:40.028] plan(): nbrOfWorkers() = 1 [13:13:40.030] plan(): Setting new future strategy stack: [13:13:40.030] List of future strategies: [13:13:40.030] 1. sequential: [13:13:40.030] - args: function (..., envir = parent.frame(), workers = "") [13:13:40.030] - tweaked: FALSE [13:13:40.030] - call: plan(strategy) [13:13:40.031] plan(): nbrOfWorkers() = 1 [13:13:40.031] SequentialFuture started (and completed) [13:13:40.031] - Launch lazy future ... done [13:13:40.031] run() for 'SequentialFuture' ... done [13:13:40.032] Created future: [13:13:40.032] SequentialFuture: [13:13:40.032] Label: 'future_lapply-1' [13:13:40.032] Expression: [13:13:40.032] { [13:13:40.032] do.call(function(...) { [13:13:40.032] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:40.032] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:40.032] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:40.032] on.exit(options(oopts), add = TRUE) [13:13:40.032] } [13:13:40.032] { [13:13:40.032] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:40.032] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:40.032] ...future.FUN(...future.X_jj, ...) [13:13:40.032] }) [13:13:40.032] } [13:13:40.032] }, args = future.call.arguments) [13:13:40.032] } [13:13:40.032] Lazy evaluation: FALSE [13:13:40.032] Asynchronous evaluation: FALSE [13:13:40.032] Local evaluation: TRUE [13:13:40.032] Environment: R_GlobalEnv [13:13:40.032] Capture standard output: TRUE [13:13:40.032] Capture condition classes: 'condition' (excluding 'nothing') [13:13:40.032] 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) [13:13:40.032] Packages: [13:13:40.032] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:40.032] Resolved: TRUE [13:13:40.032] Value: 240 bytes of class 'list' [13:13:40.032] Early signaling: FALSE [13:13:40.032] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:40.032] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:40.033] Chunk #1 of 1 ... DONE [13:13:40.033] Launching 1 futures (chunks) ... DONE [13:13:40.033] Resolving 1 futures (chunks) ... [13:13:40.034] resolve() on list ... [13:13:40.034] recursive: 0 [13:13:40.034] length: 1 [13:13:40.034] [13:13:40.034] resolved() for 'SequentialFuture' ... [13:13:40.034] - state: 'finished' [13:13:40.035] - run: TRUE [13:13:40.035] - result: 'FutureResult' [13:13:40.035] resolved() for 'SequentialFuture' ... done [13:13:40.035] Future #1 [13:13:40.035] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:40.036] - nx: 1 [13:13:40.036] - relay: TRUE [13:13:40.036] - stdout: TRUE [13:13:40.036] - signal: TRUE [13:13:40.036] - resignal: FALSE [13:13:40.036] - force: TRUE [13:13:40.036] - relayed: [n=1] FALSE [13:13:40.037] - queued futures: [n=1] FALSE [13:13:40.037] - until=1 [13:13:40.037] - relaying element #1 [13:13:40.037] - relayed: [n=1] TRUE [13:13:40.037] - queued futures: [n=1] TRUE [13:13:40.038] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:40.038] length: 0 (resolved future 1) [13:13:40.038] Relaying remaining futures [13:13:40.038] signalConditionsASAP(NULL, pos=0) ... [13:13:40.038] - nx: 1 [13:13:40.038] - relay: TRUE [13:13:40.038] - stdout: TRUE [13:13:40.039] - signal: TRUE [13:13:40.039] - resignal: FALSE [13:13:40.039] - force: TRUE [13:13:40.039] - relayed: [n=1] TRUE [13:13:40.039] - queued futures: [n=1] TRUE - flush all [13:13:40.039] - relayed: [n=1] TRUE [13:13:40.040] - queued futures: [n=1] TRUE [13:13:40.040] signalConditionsASAP(NULL, pos=0) ... done [13:13:40.040] resolve() on list ... DONE [13:13:40.040] - Number of value chunks collected: 1 [13:13:40.040] Resolving 1 futures (chunks) ... DONE [13:13:40.040] Reducing values from 1 chunks ... [13:13:40.041] - Number of values collected after concatenation: 4 [13:13:40.041] - Number of values expected: 4 [13:13:40.041] Reverse index remapping (attribute 'ordering'): [n = 4] 4, 3, 2, 1 [13:13:40.041] Reducing values from 1 chunks ... DONE [13:13:40.041] 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, ...) ... [13:13:40.044] future_lapply() ... [13:13:40.052] Number of chunks: 1 [13:13:40.053] getGlobalsAndPackagesXApply() ... [13:13:40.053] - future.globals: TRUE [13:13:40.054] getGlobalsAndPackages() ... [13:13:40.054] Searching for globals... [13:13:40.063] - globals found: [22] 'FUN', 'if', 'missing', 'is.finite', '{', 'is.null', '<-', 'paste', 'length', '==', 'return', '>', '+', '[', 'seq_len', 'rev', 'c', '&&', '!', ':', '(', '-' [13:13:40.064] Searching for globals ... DONE [13:13:40.064] Resolving globals: FALSE [13:13:40.065] The total size of the 1 globals is 69.62 KiB (71288 bytes) [13:13:40.065] 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') [13:13:40.066] - globals: [1] 'FUN' [13:13:40.066] - packages: [1] 'future' [13:13:40.066] getGlobalsAndPackages() ... DONE [13:13:40.066] - globals found/used: [n=1] 'FUN' [13:13:40.066] - needed namespaces: [n=1] 'future' [13:13:40.066] Finding globals ... DONE [13:13:40.067] - use_args: TRUE [13:13:40.067] - Getting '...' globals ... [13:13:40.067] resolve() on list ... [13:13:40.067] recursive: 0 [13:13:40.067] length: 1 [13:13:40.068] elements: '...' [13:13:40.068] length: 0 (resolved future 1) [13:13:40.068] resolve() on list ... DONE [13:13:40.068] - '...' content: [n=2] 'collapse', 'maxHead' [13:13:40.068] List of 1 [13:13:40.068] $ ...:List of 2 [13:13:40.068] ..$ collapse: chr "; " [13:13:40.068] ..$ maxHead : int 3 [13:13:40.068] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:40.068] - attr(*, "where")=List of 1 [13:13:40.068] ..$ ...: [13:13:40.068] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:40.068] - attr(*, "resolved")= logi TRUE [13:13:40.068] - attr(*, "total_size")= num NA [13:13:40.072] - Getting '...' globals ... DONE [13:13:40.072] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:40.072] List of 2 [13:13:40.072] $ ...future.FUN:function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [13:13:40.072] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [13:13:40.072] $ ... :List of 2 [13:13:40.072] ..$ collapse: chr "; " [13:13:40.072] ..$ maxHead : int 3 [13:13:40.072] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:40.072] - attr(*, "where")=List of 2 [13:13:40.072] ..$ ...future.FUN: [13:13:40.072] ..$ ... : [13:13:40.072] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:40.072] - attr(*, "resolved")= logi FALSE [13:13:40.072] - attr(*, "total_size")= num 71456 [13:13:40.077] Packages to be attached in all futures: [n=1] 'future' [13:13:40.078] getGlobalsAndPackagesXApply() ... DONE [13:13:40.078] Number of futures (= number of chunks): 1 [13:13:40.078] Launching 1 futures (chunks) ... [13:13:40.078] Chunk #1 of 1 ... [13:13:40.078] - Finding globals in 'X' for chunk #1 ... [13:13:40.079] getGlobalsAndPackages() ... [13:13:40.079] Searching for globals... [13:13:40.079] [13:13:40.079] Searching for globals ... DONE [13:13:40.079] - globals: [0] [13:13:40.079] getGlobalsAndPackages() ... DONE [13:13:40.080] + additional globals found: [n=0] [13:13:40.080] + additional namespaces needed: [n=0] [13:13:40.080] - Finding globals in 'X' for chunk #1 ... DONE [13:13:40.080] - seeds: [13:13:40.080] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:40.080] getGlobalsAndPackages() ... [13:13:40.081] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:40.081] Resolving globals: FALSE [13:13:40.081] Tweak future expression to call with '...' arguments ... [13:13:40.081] { [13:13:40.081] do.call(function(...) { [13:13:40.081] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:40.081] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:40.081] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:40.081] on.exit(options(oopts), add = TRUE) [13:13:40.081] } [13:13:40.081] { [13:13:40.081] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:40.081] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:40.081] ...future.FUN(...future.X_jj, ...) [13:13:40.081] }) [13:13:40.081] } [13:13:40.081] }, args = future.call.arguments) [13:13:40.081] } [13:13:40.082] Tweak future expression to call with '...' arguments ... DONE [13:13:40.082] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:40.082] - packages: [1] 'future' [13:13:40.082] getGlobalsAndPackages() ... DONE [13:13:40.083] run() for 'Future' ... [13:13:40.083] - state: 'created' [13:13:40.083] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:13:40.084] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:40.084] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:40.084] - Field: 'label' [13:13:40.084] - Field: 'local' [13:13:40.084] - Field: 'owner' [13:13:40.084] - Field: 'envir' [13:13:40.085] - Field: 'packages' [13:13:40.085] - Field: 'gc' [13:13:40.085] - Field: 'conditions' [13:13:40.085] - Field: 'expr' [13:13:40.085] - Field: 'uuid' [13:13:40.086] - Field: 'seed' [13:13:40.086] - Field: 'version' [13:13:40.086] - Field: 'result' [13:13:40.086] - Field: 'asynchronous' [13:13:40.086] - Field: 'calls' [13:13:40.086] - Field: 'globals' [13:13:40.087] - Field: 'stdout' [13:13:40.087] - Field: 'earlySignal' [13:13:40.087] - Field: 'lazy' [13:13:40.087] - Field: 'state' [13:13:40.087] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:40.087] - Launch lazy future ... [13:13:40.088] Packages needed by the future expression (n = 1): 'future' [13:13:40.088] Packages needed by future strategies (n = 0): [13:13:40.088] { [13:13:40.088] { [13:13:40.088] { [13:13:40.088] ...future.startTime <- base::Sys.time() [13:13:40.088] { [13:13:40.088] { [13:13:40.088] { [13:13:40.088] { [13:13:40.088] base::local({ [13:13:40.088] has_future <- base::requireNamespace("future", [13:13:40.088] quietly = TRUE) [13:13:40.088] if (has_future) { [13:13:40.088] ns <- base::getNamespace("future") [13:13:40.088] version <- ns[[".package"]][["version"]] [13:13:40.088] if (is.null(version)) [13:13:40.088] version <- utils::packageVersion("future") [13:13:40.088] } [13:13:40.088] else { [13:13:40.088] version <- NULL [13:13:40.088] } [13:13:40.088] if (!has_future || version < "1.8.0") { [13:13:40.088] info <- base::c(r_version = base::gsub("R version ", [13:13:40.088] "", base::R.version$version.string), [13:13:40.088] platform = base::sprintf("%s (%s-bit)", [13:13:40.088] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:40.088] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:40.088] "release", "version")], collapse = " "), [13:13:40.088] hostname = base::Sys.info()[["nodename"]]) [13:13:40.088] info <- base::sprintf("%s: %s", base::names(info), [13:13:40.088] info) [13:13:40.088] info <- base::paste(info, collapse = "; ") [13:13:40.088] if (!has_future) { [13:13:40.088] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:40.088] info) [13:13:40.088] } [13:13:40.088] else { [13:13:40.088] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:40.088] info, version) [13:13:40.088] } [13:13:40.088] base::stop(msg) [13:13:40.088] } [13:13:40.088] }) [13:13:40.088] } [13:13:40.088] base::local({ [13:13:40.088] for (pkg in "future") { [13:13:40.088] base::loadNamespace(pkg) [13:13:40.088] base::library(pkg, character.only = TRUE) [13:13:40.088] } [13:13:40.088] }) [13:13:40.088] } [13:13:40.088] options(future.plan = NULL) [13:13:40.088] Sys.unsetenv("R_FUTURE_PLAN") [13:13:40.088] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:40.088] } [13:13:40.088] ...future.workdir <- getwd() [13:13:40.088] } [13:13:40.088] ...future.oldOptions <- base::as.list(base::.Options) [13:13:40.088] ...future.oldEnvVars <- base::Sys.getenv() [13:13:40.088] } [13:13:40.088] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:40.088] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:40.088] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:40.088] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:40.088] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:40.088] future.stdout.windows.reencode = NULL, width = 80L) [13:13:40.088] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:40.088] base::names(...future.oldOptions)) [13:13:40.088] } [13:13:40.088] if (FALSE) { [13:13:40.088] } [13:13:40.088] else { [13:13:40.088] if (TRUE) { [13:13:40.088] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:40.088] open = "w") [13:13:40.088] } [13:13:40.088] else { [13:13:40.088] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:40.088] windows = "NUL", "/dev/null"), open = "w") [13:13:40.088] } [13:13:40.088] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:40.088] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:40.088] base::sink(type = "output", split = FALSE) [13:13:40.088] base::close(...future.stdout) [13:13:40.088] }, add = TRUE) [13:13:40.088] } [13:13:40.088] ...future.frame <- base::sys.nframe() [13:13:40.088] ...future.conditions <- base::list() [13:13:40.088] ...future.rng <- base::globalenv()$.Random.seed [13:13:40.088] if (FALSE) { [13:13:40.088] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:40.088] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:40.088] } [13:13:40.088] ...future.result <- base::tryCatch({ [13:13:40.088] base::withCallingHandlers({ [13:13:40.088] ...future.value <- base::withVisible(base::local({ [13:13:40.088] do.call(function(...) { [13:13:40.088] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:40.088] if (!identical(...future.globals.maxSize.org, [13:13:40.088] ...future.globals.maxSize)) { [13:13:40.088] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:40.088] on.exit(options(oopts), add = TRUE) [13:13:40.088] } [13:13:40.088] { [13:13:40.088] lapply(seq_along(...future.elements_ii), [13:13:40.088] FUN = function(jj) { [13:13:40.088] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:40.088] ...future.FUN(...future.X_jj, ...) [13:13:40.088] }) [13:13:40.088] } [13:13:40.088] }, args = future.call.arguments) [13:13:40.088] })) [13:13:40.088] future::FutureResult(value = ...future.value$value, [13:13:40.088] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:40.088] ...future.rng), globalenv = if (FALSE) [13:13:40.088] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:40.088] ...future.globalenv.names)) [13:13:40.088] else NULL, started = ...future.startTime, version = "1.8") [13:13:40.088] }, condition = base::local({ [13:13:40.088] c <- base::c [13:13:40.088] inherits <- base::inherits [13:13:40.088] invokeRestart <- base::invokeRestart [13:13:40.088] length <- base::length [13:13:40.088] list <- base::list [13:13:40.088] seq.int <- base::seq.int [13:13:40.088] signalCondition <- base::signalCondition [13:13:40.088] sys.calls <- base::sys.calls [13:13:40.088] `[[` <- base::`[[` [13:13:40.088] `+` <- base::`+` [13:13:40.088] `<<-` <- base::`<<-` [13:13:40.088] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:40.088] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:40.088] 3L)] [13:13:40.088] } [13:13:40.088] function(cond) { [13:13:40.088] is_error <- inherits(cond, "error") [13:13:40.088] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:40.088] NULL) [13:13:40.088] if (is_error) { [13:13:40.088] sessionInformation <- function() { [13:13:40.088] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:40.088] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:40.088] search = base::search(), system = base::Sys.info()) [13:13:40.088] } [13:13:40.088] ...future.conditions[[length(...future.conditions) + [13:13:40.088] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:40.088] cond$call), session = sessionInformation(), [13:13:40.088] timestamp = base::Sys.time(), signaled = 0L) [13:13:40.088] signalCondition(cond) [13:13:40.088] } [13:13:40.088] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:40.088] "immediateCondition"))) { [13:13:40.088] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:40.088] ...future.conditions[[length(...future.conditions) + [13:13:40.088] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:40.088] if (TRUE && !signal) { [13:13:40.088] muffleCondition <- function (cond, pattern = "^muffle") [13:13:40.088] { [13:13:40.088] inherits <- base::inherits [13:13:40.088] invokeRestart <- base::invokeRestart [13:13:40.088] is.null <- base::is.null [13:13:40.088] muffled <- FALSE [13:13:40.088] if (inherits(cond, "message")) { [13:13:40.088] muffled <- grepl(pattern, "muffleMessage") [13:13:40.088] if (muffled) [13:13:40.088] invokeRestart("muffleMessage") [13:13:40.088] } [13:13:40.088] else if (inherits(cond, "warning")) { [13:13:40.088] muffled <- grepl(pattern, "muffleWarning") [13:13:40.088] if (muffled) [13:13:40.088] invokeRestart("muffleWarning") [13:13:40.088] } [13:13:40.088] else if (inherits(cond, "condition")) { [13:13:40.088] if (!is.null(pattern)) { [13:13:40.088] computeRestarts <- base::computeRestarts [13:13:40.088] grepl <- base::grepl [13:13:40.088] restarts <- computeRestarts(cond) [13:13:40.088] for (restart in restarts) { [13:13:40.088] name <- restart$name [13:13:40.088] if (is.null(name)) [13:13:40.088] next [13:13:40.088] if (!grepl(pattern, name)) [13:13:40.088] next [13:13:40.088] invokeRestart(restart) [13:13:40.088] muffled <- TRUE [13:13:40.088] break [13:13:40.088] } [13:13:40.088] } [13:13:40.088] } [13:13:40.088] invisible(muffled) [13:13:40.088] } [13:13:40.088] muffleCondition(cond, pattern = "^muffle") [13:13:40.088] } [13:13:40.088] } [13:13:40.088] else { [13:13:40.088] if (TRUE) { [13:13:40.088] muffleCondition <- function (cond, pattern = "^muffle") [13:13:40.088] { [13:13:40.088] inherits <- base::inherits [13:13:40.088] invokeRestart <- base::invokeRestart [13:13:40.088] is.null <- base::is.null [13:13:40.088] muffled <- FALSE [13:13:40.088] if (inherits(cond, "message")) { [13:13:40.088] muffled <- grepl(pattern, "muffleMessage") [13:13:40.088] if (muffled) [13:13:40.088] invokeRestart("muffleMessage") [13:13:40.088] } [13:13:40.088] else if (inherits(cond, "warning")) { [13:13:40.088] muffled <- grepl(pattern, "muffleWarning") [13:13:40.088] if (muffled) [13:13:40.088] invokeRestart("muffleWarning") [13:13:40.088] } [13:13:40.088] else if (inherits(cond, "condition")) { [13:13:40.088] if (!is.null(pattern)) { [13:13:40.088] computeRestarts <- base::computeRestarts [13:13:40.088] grepl <- base::grepl [13:13:40.088] restarts <- computeRestarts(cond) [13:13:40.088] for (restart in restarts) { [13:13:40.088] name <- restart$name [13:13:40.088] if (is.null(name)) [13:13:40.088] next [13:13:40.088] if (!grepl(pattern, name)) [13:13:40.088] next [13:13:40.088] invokeRestart(restart) [13:13:40.088] muffled <- TRUE [13:13:40.088] break [13:13:40.088] } [13:13:40.088] } [13:13:40.088] } [13:13:40.088] invisible(muffled) [13:13:40.088] } [13:13:40.088] muffleCondition(cond, pattern = "^muffle") [13:13:40.088] } [13:13:40.088] } [13:13:40.088] } [13:13:40.088] })) [13:13:40.088] }, error = function(ex) { [13:13:40.088] base::structure(base::list(value = NULL, visible = NULL, [13:13:40.088] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:40.088] ...future.rng), started = ...future.startTime, [13:13:40.088] finished = Sys.time(), session_uuid = NA_character_, [13:13:40.088] version = "1.8"), class = "FutureResult") [13:13:40.088] }, finally = { [13:13:40.088] if (!identical(...future.workdir, getwd())) [13:13:40.088] setwd(...future.workdir) [13:13:40.088] { [13:13:40.088] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:40.088] ...future.oldOptions$nwarnings <- NULL [13:13:40.088] } [13:13:40.088] base::options(...future.oldOptions) [13:13:40.088] if (.Platform$OS.type == "windows") { [13:13:40.088] old_names <- names(...future.oldEnvVars) [13:13:40.088] envs <- base::Sys.getenv() [13:13:40.088] names <- names(envs) [13:13:40.088] common <- intersect(names, old_names) [13:13:40.088] added <- setdiff(names, old_names) [13:13:40.088] removed <- setdiff(old_names, names) [13:13:40.088] changed <- common[...future.oldEnvVars[common] != [13:13:40.088] envs[common]] [13:13:40.088] NAMES <- toupper(changed) [13:13:40.088] args <- list() [13:13:40.088] for (kk in seq_along(NAMES)) { [13:13:40.088] name <- changed[[kk]] [13:13:40.088] NAME <- NAMES[[kk]] [13:13:40.088] if (name != NAME && is.element(NAME, old_names)) [13:13:40.088] next [13:13:40.088] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:40.088] } [13:13:40.088] NAMES <- toupper(added) [13:13:40.088] for (kk in seq_along(NAMES)) { [13:13:40.088] name <- added[[kk]] [13:13:40.088] NAME <- NAMES[[kk]] [13:13:40.088] if (name != NAME && is.element(NAME, old_names)) [13:13:40.088] next [13:13:40.088] args[[name]] <- "" [13:13:40.088] } [13:13:40.088] NAMES <- toupper(removed) [13:13:40.088] for (kk in seq_along(NAMES)) { [13:13:40.088] name <- removed[[kk]] [13:13:40.088] NAME <- NAMES[[kk]] [13:13:40.088] if (name != NAME && is.element(NAME, old_names)) [13:13:40.088] next [13:13:40.088] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:40.088] } [13:13:40.088] if (length(args) > 0) [13:13:40.088] base::do.call(base::Sys.setenv, args = args) [13:13:40.088] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:40.088] } [13:13:40.088] else { [13:13:40.088] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:40.088] } [13:13:40.088] { [13:13:40.088] if (base::length(...future.futureOptionsAdded) > [13:13:40.088] 0L) { [13:13:40.088] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:40.088] base::names(opts) <- ...future.futureOptionsAdded [13:13:40.088] base::options(opts) [13:13:40.088] } [13:13:40.088] { [13:13:40.088] { [13:13:40.088] NULL [13:13:40.088] RNGkind("Mersenne-Twister") [13:13:40.088] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:40.088] inherits = FALSE) [13:13:40.088] } [13:13:40.088] options(future.plan = NULL) [13:13:40.088] if (is.na(NA_character_)) [13:13:40.088] Sys.unsetenv("R_FUTURE_PLAN") [13:13:40.088] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:40.088] future::plan(list(function (..., envir = parent.frame()) [13:13:40.088] { [13:13:40.088] future <- SequentialFuture(..., envir = envir) [13:13:40.088] if (!future$lazy) [13:13:40.088] future <- run(future) [13:13:40.088] invisible(future) [13:13:40.088] }), .cleanup = FALSE, .init = FALSE) [13:13:40.088] } [13:13:40.088] } [13:13:40.088] } [13:13:40.088] }) [13:13:40.088] if (TRUE) { [13:13:40.088] base::sink(type = "output", split = FALSE) [13:13:40.088] if (TRUE) { [13:13:40.088] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:40.088] } [13:13:40.088] else { [13:13:40.088] ...future.result["stdout"] <- base::list(NULL) [13:13:40.088] } [13:13:40.088] base::close(...future.stdout) [13:13:40.088] ...future.stdout <- NULL [13:13:40.088] } [13:13:40.088] ...future.result$conditions <- ...future.conditions [13:13:40.088] ...future.result$finished <- base::Sys.time() [13:13:40.088] ...future.result [13:13:40.088] } [13:13:40.092] assign_globals() ... [13:13:40.093] List of 5 [13:13:40.093] $ ...future.FUN :function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [13:13:40.093] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [13:13:40.093] $ future.call.arguments :List of 2 [13:13:40.093] ..$ collapse: chr "; " [13:13:40.093] ..$ maxHead : int 3 [13:13:40.093] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:40.093] $ ...future.elements_ii :List of 1 [13:13:40.093] ..$ a: Named chr [1:101] "hello" "1" "2" "3" ... [13:13:40.093] .. ..- attr(*, "names")= chr [1:101] "" "b1" "b2" "b3" ... [13:13:40.093] $ ...future.seeds_ii : NULL [13:13:40.093] $ ...future.globals.maxSize: NULL [13:13:40.093] - attr(*, "where")=List of 5 [13:13:40.093] ..$ ...future.FUN : [13:13:40.093] ..$ future.call.arguments : [13:13:40.093] ..$ ...future.elements_ii : [13:13:40.093] ..$ ...future.seeds_ii : [13:13:40.093] ..$ ...future.globals.maxSize: [13:13:40.093] - attr(*, "resolved")= logi FALSE [13:13:40.093] - attr(*, "total_size")= num 71456 [13:13:40.093] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:40.093] - attr(*, "already-done")= logi TRUE [13:13:40.099] - copied '...future.FUN' to environment [13:13:40.099] - copied 'future.call.arguments' to environment [13:13:40.100] - copied '...future.elements_ii' to environment [13:13:40.100] - copied '...future.seeds_ii' to environment [13:13:40.100] - copied '...future.globals.maxSize' to environment [13:13:40.100] assign_globals() ... done [13:13:40.102] plan(): Setting new future strategy stack: [13:13:40.102] List of future strategies: [13:13:40.102] 1. sequential: [13:13:40.102] - args: function (..., envir = parent.frame(), workers = "") [13:13:40.102] - tweaked: FALSE [13:13:40.102] - call: NULL [13:13:40.102] plan(): nbrOfWorkers() = 1 [13:13:40.104] plan(): Setting new future strategy stack: [13:13:40.104] List of future strategies: [13:13:40.104] 1. sequential: [13:13:40.104] - args: function (..., envir = parent.frame(), workers = "") [13:13:40.104] - tweaked: FALSE [13:13:40.104] - call: plan(strategy) [13:13:40.104] plan(): nbrOfWorkers() = 1 [13:13:40.105] SequentialFuture started (and completed) [13:13:40.105] - Launch lazy future ... done [13:13:40.105] run() for 'SequentialFuture' ... done [13:13:40.105] Created future: [13:13:40.105] SequentialFuture: [13:13:40.105] Label: 'future_lapply-1' [13:13:40.105] Expression: [13:13:40.105] { [13:13:40.105] do.call(function(...) { [13:13:40.105] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:40.105] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:40.105] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:40.105] on.exit(options(oopts), add = TRUE) [13:13:40.105] } [13:13:40.105] { [13:13:40.105] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:40.105] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:40.105] ...future.FUN(...future.X_jj, ...) [13:13:40.105] }) [13:13:40.105] } [13:13:40.105] }, args = future.call.arguments) [13:13:40.105] } [13:13:40.105] Lazy evaluation: FALSE [13:13:40.105] Asynchronous evaluation: FALSE [13:13:40.105] Local evaluation: TRUE [13:13:40.105] Environment: R_GlobalEnv [13:13:40.105] Capture standard output: TRUE [13:13:40.105] Capture condition classes: 'condition' (excluding 'nothing') [13:13:40.105] 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) [13:13:40.105] Packages: 1 packages ('future') [13:13:40.105] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:40.105] Resolved: TRUE [13:13:40.105] Value: 136 bytes of class 'list' [13:13:40.105] Early signaling: FALSE [13:13:40.105] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:40.105] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:40.107] Chunk #1 of 1 ... DONE [13:13:40.107] Launching 1 futures (chunks) ... DONE [13:13:40.107] Resolving 1 futures (chunks) ... [13:13:40.107] resolve() on list ... [13:13:40.107] recursive: 0 [13:13:40.108] length: 1 [13:13:40.108] [13:13:40.108] resolved() for 'SequentialFuture' ... [13:13:40.108] - state: 'finished' [13:13:40.108] - run: TRUE [13:13:40.108] - result: 'FutureResult' [13:13:40.109] resolved() for 'SequentialFuture' ... done [13:13:40.109] Future #1 [13:13:40.109] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:40.109] - nx: 1 [13:13:40.109] - relay: TRUE [13:13:40.110] - stdout: TRUE [13:13:40.110] - signal: TRUE [13:13:40.110] - resignal: FALSE [13:13:40.110] - force: TRUE [13:13:40.110] - relayed: [n=1] FALSE [13:13:40.110] - queued futures: [n=1] FALSE [13:13:40.110] - until=1 [13:13:40.111] - relaying element #1 [13:13:40.111] - relayed: [n=1] TRUE [13:13:40.111] - queued futures: [n=1] TRUE [13:13:40.111] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:40.111] length: 0 (resolved future 1) [13:13:40.112] Relaying remaining futures [13:13:40.112] signalConditionsASAP(NULL, pos=0) ... [13:13:40.112] - nx: 1 [13:13:40.112] - relay: TRUE [13:13:40.112] - stdout: TRUE [13:13:40.112] - signal: TRUE [13:13:40.112] - resignal: FALSE [13:13:40.113] - force: TRUE [13:13:40.113] - relayed: [n=1] TRUE [13:13:40.113] - queued futures: [n=1] TRUE - flush all [13:13:40.113] - relayed: [n=1] TRUE [13:13:40.113] - queued futures: [n=1] TRUE [13:13:40.113] signalConditionsASAP(NULL, pos=0) ... done [13:13:40.114] resolve() on list ... DONE [13:13:40.114] - Number of value chunks collected: 1 [13:13:40.114] Resolving 1 futures (chunks) ... DONE [13:13:40.114] Reducing values from 1 chunks ... [13:13:40.114] - Number of values collected after concatenation: 1 [13:13:40.114] - Number of values expected: 1 [13:13:40.115] Reducing values from 1 chunks ... DONE [13:13:40.115] future_lapply() ... DONE List of 1 $ y:List of 1 ..$ a: chr "hello; 1; 2; ...; 100" - future_lapply(x, FUN = listenv::listenv, ...) ... [13:13:40.116] future_lapply() ... [13:13:40.117] Number of chunks: 1 [13:13:40.117] Index remapping (attribute 'ordering'): [n = 2] 2, 1 [13:13:40.117] getGlobalsAndPackagesXApply() ... [13:13:40.117] - future.globals: TRUE [13:13:40.117] getGlobalsAndPackages() ... [13:13:40.117] Searching for globals... [13:13:40.119] - globals found: [4] 'FUN', '{', 'get', 'parent.env' [13:13:40.119] Searching for globals ... DONE [13:13:40.119] Resolving globals: FALSE [13:13:40.120] The total size of the 1 globals is 4.85 KiB (4968 bytes) [13:13:40.120] 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') [13:13:40.120] - globals: [1] 'FUN' [13:13:40.121] - packages: [1] 'listenv' [13:13:40.121] getGlobalsAndPackages() ... DONE [13:13:40.121] - globals found/used: [n=1] 'FUN' [13:13:40.121] - needed namespaces: [n=1] 'listenv' [13:13:40.121] Finding globals ... DONE [13:13:40.121] - use_args: TRUE [13:13:40.121] - Getting '...' globals ... [13:13:40.122] resolve() on list ... [13:13:40.122] recursive: 0 [13:13:40.122] length: 1 [13:13:40.122] elements: '...' [13:13:40.123] length: 0 (resolved future 1) [13:13:40.123] resolve() on list ... DONE [13:13:40.123] - '...' content: [n=0] [13:13:40.123] List of 1 [13:13:40.123] $ ...: list() [13:13:40.123] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:40.123] - attr(*, "where")=List of 1 [13:13:40.123] ..$ ...: [13:13:40.123] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:40.123] - attr(*, "resolved")= logi TRUE [13:13:40.123] - attr(*, "total_size")= num NA [13:13:40.126] - Getting '...' globals ... DONE [13:13:40.127] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:40.127] List of 2 [13:13:40.127] $ ...future.FUN:function (x, ...) [13:13:40.127] $ ... : list() [13:13:40.127] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:40.127] - attr(*, "where")=List of 2 [13:13:40.127] ..$ ...future.FUN: [13:13:40.127] ..$ ... : [13:13:40.127] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:40.127] - attr(*, "resolved")= logi FALSE [13:13:40.127] - attr(*, "total_size")= num 4968 [13:13:40.131] Packages to be attached in all futures: [n=1] 'listenv' [13:13:40.131] getGlobalsAndPackagesXApply() ... DONE [13:13:40.131] Number of futures (= number of chunks): 1 [13:13:40.131] Launching 1 futures (chunks) ... [13:13:40.131] Chunk #1 of 1 ... [13:13:40.132] - Finding globals in 'X' for chunk #1 ... [13:13:40.132] getGlobalsAndPackages() ... [13:13:40.132] Searching for globals... [13:13:40.133] [13:13:40.133] Searching for globals ... DONE [13:13:40.133] - globals: [0] [13:13:40.133] getGlobalsAndPackages() ... DONE [13:13:40.133] + additional globals found: [n=0] [13:13:40.133] + additional namespaces needed: [n=0] [13:13:40.134] - Finding globals in 'X' for chunk #1 ... DONE [13:13:40.134] - seeds: [13:13:40.134] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:40.134] getGlobalsAndPackages() ... [13:13:40.134] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:40.134] Resolving globals: FALSE [13:13:40.135] Tweak future expression to call with '...' arguments ... [13:13:40.135] { [13:13:40.135] do.call(function(...) { [13:13:40.135] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:40.135] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:40.135] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:40.135] on.exit(options(oopts), add = TRUE) [13:13:40.135] } [13:13:40.135] { [13:13:40.135] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:40.135] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:40.135] ...future.FUN(...future.X_jj, ...) [13:13:40.135] }) [13:13:40.135] } [13:13:40.135] }, args = future.call.arguments) [13:13:40.135] } [13:13:40.135] Tweak future expression to call with '...' arguments ... DONE [13:13:40.136] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:40.136] - packages: [1] 'listenv' [13:13:40.136] getGlobalsAndPackages() ... DONE [13:13:40.136] run() for 'Future' ... [13:13:40.137] - state: 'created' [13:13:40.137] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:13:40.137] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:40.137] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:40.138] - Field: 'label' [13:13:40.138] - Field: 'local' [13:13:40.138] - Field: 'owner' [13:13:40.138] - Field: 'envir' [13:13:40.138] - Field: 'packages' [13:13:40.138] - Field: 'gc' [13:13:40.139] - Field: 'conditions' [13:13:40.139] - Field: 'expr' [13:13:40.139] - Field: 'uuid' [13:13:40.139] - Field: 'seed' [13:13:40.139] - Field: 'version' [13:13:40.139] - Field: 'result' [13:13:40.140] - Field: 'asynchronous' [13:13:40.140] - Field: 'calls' [13:13:40.140] - Field: 'globals' [13:13:40.140] - Field: 'stdout' [13:13:40.140] - Field: 'earlySignal' [13:13:40.140] - Field: 'lazy' [13:13:40.141] - Field: 'state' [13:13:40.141] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:40.141] - Launch lazy future ... [13:13:40.141] Packages needed by the future expression (n = 1): 'listenv' [13:13:40.141] Packages needed by future strategies (n = 0): [13:13:40.142] { [13:13:40.142] { [13:13:40.142] { [13:13:40.142] ...future.startTime <- base::Sys.time() [13:13:40.142] { [13:13:40.142] { [13:13:40.142] { [13:13:40.142] { [13:13:40.142] base::local({ [13:13:40.142] has_future <- base::requireNamespace("future", [13:13:40.142] quietly = TRUE) [13:13:40.142] if (has_future) { [13:13:40.142] ns <- base::getNamespace("future") [13:13:40.142] version <- ns[[".package"]][["version"]] [13:13:40.142] if (is.null(version)) [13:13:40.142] version <- utils::packageVersion("future") [13:13:40.142] } [13:13:40.142] else { [13:13:40.142] version <- NULL [13:13:40.142] } [13:13:40.142] if (!has_future || version < "1.8.0") { [13:13:40.142] info <- base::c(r_version = base::gsub("R version ", [13:13:40.142] "", base::R.version$version.string), [13:13:40.142] platform = base::sprintf("%s (%s-bit)", [13:13:40.142] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:40.142] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:40.142] "release", "version")], collapse = " "), [13:13:40.142] hostname = base::Sys.info()[["nodename"]]) [13:13:40.142] info <- base::sprintf("%s: %s", base::names(info), [13:13:40.142] info) [13:13:40.142] info <- base::paste(info, collapse = "; ") [13:13:40.142] if (!has_future) { [13:13:40.142] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:40.142] info) [13:13:40.142] } [13:13:40.142] else { [13:13:40.142] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:40.142] info, version) [13:13:40.142] } [13:13:40.142] base::stop(msg) [13:13:40.142] } [13:13:40.142] }) [13:13:40.142] } [13:13:40.142] base::local({ [13:13:40.142] for (pkg in "listenv") { [13:13:40.142] base::loadNamespace(pkg) [13:13:40.142] base::library(pkg, character.only = TRUE) [13:13:40.142] } [13:13:40.142] }) [13:13:40.142] } [13:13:40.142] options(future.plan = NULL) [13:13:40.142] Sys.unsetenv("R_FUTURE_PLAN") [13:13:40.142] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:40.142] } [13:13:40.142] ...future.workdir <- getwd() [13:13:40.142] } [13:13:40.142] ...future.oldOptions <- base::as.list(base::.Options) [13:13:40.142] ...future.oldEnvVars <- base::Sys.getenv() [13:13:40.142] } [13:13:40.142] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:40.142] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:40.142] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:40.142] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:40.142] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:40.142] future.stdout.windows.reencode = NULL, width = 80L) [13:13:40.142] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:40.142] base::names(...future.oldOptions)) [13:13:40.142] } [13:13:40.142] if (FALSE) { [13:13:40.142] } [13:13:40.142] else { [13:13:40.142] if (TRUE) { [13:13:40.142] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:40.142] open = "w") [13:13:40.142] } [13:13:40.142] else { [13:13:40.142] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:40.142] windows = "NUL", "/dev/null"), open = "w") [13:13:40.142] } [13:13:40.142] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:40.142] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:40.142] base::sink(type = "output", split = FALSE) [13:13:40.142] base::close(...future.stdout) [13:13:40.142] }, add = TRUE) [13:13:40.142] } [13:13:40.142] ...future.frame <- base::sys.nframe() [13:13:40.142] ...future.conditions <- base::list() [13:13:40.142] ...future.rng <- base::globalenv()$.Random.seed [13:13:40.142] if (FALSE) { [13:13:40.142] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:40.142] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:40.142] } [13:13:40.142] ...future.result <- base::tryCatch({ [13:13:40.142] base::withCallingHandlers({ [13:13:40.142] ...future.value <- base::withVisible(base::local({ [13:13:40.142] do.call(function(...) { [13:13:40.142] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:40.142] if (!identical(...future.globals.maxSize.org, [13:13:40.142] ...future.globals.maxSize)) { [13:13:40.142] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:40.142] on.exit(options(oopts), add = TRUE) [13:13:40.142] } [13:13:40.142] { [13:13:40.142] lapply(seq_along(...future.elements_ii), [13:13:40.142] FUN = function(jj) { [13:13:40.142] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:40.142] ...future.FUN(...future.X_jj, ...) [13:13:40.142] }) [13:13:40.142] } [13:13:40.142] }, args = future.call.arguments) [13:13:40.142] })) [13:13:40.142] future::FutureResult(value = ...future.value$value, [13:13:40.142] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:40.142] ...future.rng), globalenv = if (FALSE) [13:13:40.142] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:40.142] ...future.globalenv.names)) [13:13:40.142] else NULL, started = ...future.startTime, version = "1.8") [13:13:40.142] }, condition = base::local({ [13:13:40.142] c <- base::c [13:13:40.142] inherits <- base::inherits [13:13:40.142] invokeRestart <- base::invokeRestart [13:13:40.142] length <- base::length [13:13:40.142] list <- base::list [13:13:40.142] seq.int <- base::seq.int [13:13:40.142] signalCondition <- base::signalCondition [13:13:40.142] sys.calls <- base::sys.calls [13:13:40.142] `[[` <- base::`[[` [13:13:40.142] `+` <- base::`+` [13:13:40.142] `<<-` <- base::`<<-` [13:13:40.142] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:40.142] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:40.142] 3L)] [13:13:40.142] } [13:13:40.142] function(cond) { [13:13:40.142] is_error <- inherits(cond, "error") [13:13:40.142] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:40.142] NULL) [13:13:40.142] if (is_error) { [13:13:40.142] sessionInformation <- function() { [13:13:40.142] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:40.142] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:40.142] search = base::search(), system = base::Sys.info()) [13:13:40.142] } [13:13:40.142] ...future.conditions[[length(...future.conditions) + [13:13:40.142] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:40.142] cond$call), session = sessionInformation(), [13:13:40.142] timestamp = base::Sys.time(), signaled = 0L) [13:13:40.142] signalCondition(cond) [13:13:40.142] } [13:13:40.142] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:40.142] "immediateCondition"))) { [13:13:40.142] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:40.142] ...future.conditions[[length(...future.conditions) + [13:13:40.142] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:40.142] if (TRUE && !signal) { [13:13:40.142] muffleCondition <- function (cond, pattern = "^muffle") [13:13:40.142] { [13:13:40.142] inherits <- base::inherits [13:13:40.142] invokeRestart <- base::invokeRestart [13:13:40.142] is.null <- base::is.null [13:13:40.142] muffled <- FALSE [13:13:40.142] if (inherits(cond, "message")) { [13:13:40.142] muffled <- grepl(pattern, "muffleMessage") [13:13:40.142] if (muffled) [13:13:40.142] invokeRestart("muffleMessage") [13:13:40.142] } [13:13:40.142] else if (inherits(cond, "warning")) { [13:13:40.142] muffled <- grepl(pattern, "muffleWarning") [13:13:40.142] if (muffled) [13:13:40.142] invokeRestart("muffleWarning") [13:13:40.142] } [13:13:40.142] else if (inherits(cond, "condition")) { [13:13:40.142] if (!is.null(pattern)) { [13:13:40.142] computeRestarts <- base::computeRestarts [13:13:40.142] grepl <- base::grepl [13:13:40.142] restarts <- computeRestarts(cond) [13:13:40.142] for (restart in restarts) { [13:13:40.142] name <- restart$name [13:13:40.142] if (is.null(name)) [13:13:40.142] next [13:13:40.142] if (!grepl(pattern, name)) [13:13:40.142] next [13:13:40.142] invokeRestart(restart) [13:13:40.142] muffled <- TRUE [13:13:40.142] break [13:13:40.142] } [13:13:40.142] } [13:13:40.142] } [13:13:40.142] invisible(muffled) [13:13:40.142] } [13:13:40.142] muffleCondition(cond, pattern = "^muffle") [13:13:40.142] } [13:13:40.142] } [13:13:40.142] else { [13:13:40.142] if (TRUE) { [13:13:40.142] muffleCondition <- function (cond, pattern = "^muffle") [13:13:40.142] { [13:13:40.142] inherits <- base::inherits [13:13:40.142] invokeRestart <- base::invokeRestart [13:13:40.142] is.null <- base::is.null [13:13:40.142] muffled <- FALSE [13:13:40.142] if (inherits(cond, "message")) { [13:13:40.142] muffled <- grepl(pattern, "muffleMessage") [13:13:40.142] if (muffled) [13:13:40.142] invokeRestart("muffleMessage") [13:13:40.142] } [13:13:40.142] else if (inherits(cond, "warning")) { [13:13:40.142] muffled <- grepl(pattern, "muffleWarning") [13:13:40.142] if (muffled) [13:13:40.142] invokeRestart("muffleWarning") [13:13:40.142] } [13:13:40.142] else if (inherits(cond, "condition")) { [13:13:40.142] if (!is.null(pattern)) { [13:13:40.142] computeRestarts <- base::computeRestarts [13:13:40.142] grepl <- base::grepl [13:13:40.142] restarts <- computeRestarts(cond) [13:13:40.142] for (restart in restarts) { [13:13:40.142] name <- restart$name [13:13:40.142] if (is.null(name)) [13:13:40.142] next [13:13:40.142] if (!grepl(pattern, name)) [13:13:40.142] next [13:13:40.142] invokeRestart(restart) [13:13:40.142] muffled <- TRUE [13:13:40.142] break [13:13:40.142] } [13:13:40.142] } [13:13:40.142] } [13:13:40.142] invisible(muffled) [13:13:40.142] } [13:13:40.142] muffleCondition(cond, pattern = "^muffle") [13:13:40.142] } [13:13:40.142] } [13:13:40.142] } [13:13:40.142] })) [13:13:40.142] }, error = function(ex) { [13:13:40.142] base::structure(base::list(value = NULL, visible = NULL, [13:13:40.142] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:40.142] ...future.rng), started = ...future.startTime, [13:13:40.142] finished = Sys.time(), session_uuid = NA_character_, [13:13:40.142] version = "1.8"), class = "FutureResult") [13:13:40.142] }, finally = { [13:13:40.142] if (!identical(...future.workdir, getwd())) [13:13:40.142] setwd(...future.workdir) [13:13:40.142] { [13:13:40.142] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:40.142] ...future.oldOptions$nwarnings <- NULL [13:13:40.142] } [13:13:40.142] base::options(...future.oldOptions) [13:13:40.142] if (.Platform$OS.type == "windows") { [13:13:40.142] old_names <- names(...future.oldEnvVars) [13:13:40.142] envs <- base::Sys.getenv() [13:13:40.142] names <- names(envs) [13:13:40.142] common <- intersect(names, old_names) [13:13:40.142] added <- setdiff(names, old_names) [13:13:40.142] removed <- setdiff(old_names, names) [13:13:40.142] changed <- common[...future.oldEnvVars[common] != [13:13:40.142] envs[common]] [13:13:40.142] NAMES <- toupper(changed) [13:13:40.142] args <- list() [13:13:40.142] for (kk in seq_along(NAMES)) { [13:13:40.142] name <- changed[[kk]] [13:13:40.142] NAME <- NAMES[[kk]] [13:13:40.142] if (name != NAME && is.element(NAME, old_names)) [13:13:40.142] next [13:13:40.142] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:40.142] } [13:13:40.142] NAMES <- toupper(added) [13:13:40.142] for (kk in seq_along(NAMES)) { [13:13:40.142] name <- added[[kk]] [13:13:40.142] NAME <- NAMES[[kk]] [13:13:40.142] if (name != NAME && is.element(NAME, old_names)) [13:13:40.142] next [13:13:40.142] args[[name]] <- "" [13:13:40.142] } [13:13:40.142] NAMES <- toupper(removed) [13:13:40.142] for (kk in seq_along(NAMES)) { [13:13:40.142] name <- removed[[kk]] [13:13:40.142] NAME <- NAMES[[kk]] [13:13:40.142] if (name != NAME && is.element(NAME, old_names)) [13:13:40.142] next [13:13:40.142] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:40.142] } [13:13:40.142] if (length(args) > 0) [13:13:40.142] base::do.call(base::Sys.setenv, args = args) [13:13:40.142] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:40.142] } [13:13:40.142] else { [13:13:40.142] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:40.142] } [13:13:40.142] { [13:13:40.142] if (base::length(...future.futureOptionsAdded) > [13:13:40.142] 0L) { [13:13:40.142] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:40.142] base::names(opts) <- ...future.futureOptionsAdded [13:13:40.142] base::options(opts) [13:13:40.142] } [13:13:40.142] { [13:13:40.142] { [13:13:40.142] NULL [13:13:40.142] RNGkind("Mersenne-Twister") [13:13:40.142] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:40.142] inherits = FALSE) [13:13:40.142] } [13:13:40.142] options(future.plan = NULL) [13:13:40.142] if (is.na(NA_character_)) [13:13:40.142] Sys.unsetenv("R_FUTURE_PLAN") [13:13:40.142] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:40.142] future::plan(list(function (..., envir = parent.frame()) [13:13:40.142] { [13:13:40.142] future <- SequentialFuture(..., envir = envir) [13:13:40.142] if (!future$lazy) [13:13:40.142] future <- run(future) [13:13:40.142] invisible(future) [13:13:40.142] }), .cleanup = FALSE, .init = FALSE) [13:13:40.142] } [13:13:40.142] } [13:13:40.142] } [13:13:40.142] }) [13:13:40.142] if (TRUE) { [13:13:40.142] base::sink(type = "output", split = FALSE) [13:13:40.142] if (TRUE) { [13:13:40.142] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:40.142] } [13:13:40.142] else { [13:13:40.142] ...future.result["stdout"] <- base::list(NULL) [13:13:40.142] } [13:13:40.142] base::close(...future.stdout) [13:13:40.142] ...future.stdout <- NULL [13:13:40.142] } [13:13:40.142] ...future.result$conditions <- ...future.conditions [13:13:40.142] ...future.result$finished <- base::Sys.time() [13:13:40.142] ...future.result [13:13:40.142] } [13:13:40.146] assign_globals() ... [13:13:40.146] List of 5 [13:13:40.146] $ ...future.FUN :function (x, ...) [13:13:40.146] $ future.call.arguments : list() [13:13:40.146] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:40.146] $ ...future.elements_ii :List of 2 [13:13:40.146] ..$ b:Classes 'listenv', 'environment' [13:13:40.146] ..$ a:Classes 'listenv', 'environment' [13:13:40.146] $ ...future.seeds_ii : NULL [13:13:40.146] $ ...future.globals.maxSize: NULL [13:13:40.146] - attr(*, "where")=List of 5 [13:13:40.146] ..$ ...future.FUN : [13:13:40.146] ..$ future.call.arguments : [13:13:40.146] ..$ ...future.elements_ii : [13:13:40.146] ..$ ...future.seeds_ii : [13:13:40.146] ..$ ...future.globals.maxSize: [13:13:40.146] - attr(*, "resolved")= logi FALSE [13:13:40.146] - attr(*, "total_size")= num 4968 [13:13:40.146] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:40.146] - attr(*, "already-done")= logi TRUE [13:13:40.152] - copied '...future.FUN' to environment [13:13:40.152] - copied 'future.call.arguments' to environment [13:13:40.152] - copied '...future.elements_ii' to environment [13:13:40.152] - copied '...future.seeds_ii' to environment [13:13:40.152] - copied '...future.globals.maxSize' to environment [13:13:40.154] assign_globals() ... done [13:13:40.154] plan(): Setting new future strategy stack: [13:13:40.154] List of future strategies: [13:13:40.154] 1. sequential: [13:13:40.154] - args: function (..., envir = parent.frame(), workers = "") [13:13:40.154] - tweaked: FALSE [13:13:40.154] - call: NULL [13:13:40.155] plan(): nbrOfWorkers() = 1 [13:13:40.156] plan(): Setting new future strategy stack: [13:13:40.156] List of future strategies: [13:13:40.156] 1. sequential: [13:13:40.156] - args: function (..., envir = parent.frame(), workers = "") [13:13:40.156] - tweaked: FALSE [13:13:40.156] - call: plan(strategy) [13:13:40.157] plan(): nbrOfWorkers() = 1 [13:13:40.157] SequentialFuture started (and completed) [13:13:40.157] - Launch lazy future ... done [13:13:40.157] run() for 'SequentialFuture' ... done [13:13:40.158] Created future: [13:13:40.158] SequentialFuture: [13:13:40.158] Label: 'future_lapply-1' [13:13:40.158] Expression: [13:13:40.158] { [13:13:40.158] do.call(function(...) { [13:13:40.158] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:40.158] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:40.158] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:40.158] on.exit(options(oopts), add = TRUE) [13:13:40.158] } [13:13:40.158] { [13:13:40.158] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:40.158] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:40.158] ...future.FUN(...future.X_jj, ...) [13:13:40.158] }) [13:13:40.158] } [13:13:40.158] }, args = future.call.arguments) [13:13:40.158] } [13:13:40.158] Lazy evaluation: FALSE [13:13:40.158] Asynchronous evaluation: FALSE [13:13:40.158] Local evaluation: TRUE [13:13:40.158] Environment: R_GlobalEnv [13:13:40.158] Capture standard output: TRUE [13:13:40.158] Capture condition classes: 'condition' (excluding 'nothing') [13:13:40.158] 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) [13:13:40.158] Packages: 1 packages ('listenv') [13:13:40.158] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:40.158] Resolved: TRUE [13:13:40.158] Value: 800 bytes of class 'list' [13:13:40.158] Early signaling: FALSE [13:13:40.158] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:40.158] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:40.159] Chunk #1 of 1 ... DONE [13:13:40.159] Launching 1 futures (chunks) ... DONE [13:13:40.160] Resolving 1 futures (chunks) ... [13:13:40.160] resolve() on list ... [13:13:40.160] recursive: 0 [13:13:40.160] length: 1 [13:13:40.160] [13:13:40.160] resolved() for 'SequentialFuture' ... [13:13:40.161] - state: 'finished' [13:13:40.161] - run: TRUE [13:13:40.161] - result: 'FutureResult' [13:13:40.161] resolved() for 'SequentialFuture' ... done [13:13:40.161] Future #1 [13:13:40.162] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:40.162] - nx: 1 [13:13:40.162] - relay: TRUE [13:13:40.162] - stdout: TRUE [13:13:40.162] - signal: TRUE [13:13:40.162] - resignal: FALSE [13:13:40.163] - force: TRUE [13:13:40.163] - relayed: [n=1] FALSE [13:13:40.163] - queued futures: [n=1] FALSE [13:13:40.163] - until=1 [13:13:40.163] - relaying element #1 [13:13:40.163] - relayed: [n=1] TRUE [13:13:40.164] - queued futures: [n=1] TRUE [13:13:40.164] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:40.164] length: 0 (resolved future 1) [13:13:40.164] Relaying remaining futures [13:13:40.164] signalConditionsASAP(NULL, pos=0) ... [13:13:40.164] - nx: 1 [13:13:40.165] - relay: TRUE [13:13:40.165] - stdout: TRUE [13:13:40.165] - signal: TRUE [13:13:40.165] - resignal: FALSE [13:13:40.165] - force: TRUE [13:13:40.165] - relayed: [n=1] TRUE [13:13:40.165] - queued futures: [n=1] TRUE - flush all [13:13:40.166] - relayed: [n=1] TRUE [13:13:40.166] - queued futures: [n=1] TRUE [13:13:40.166] signalConditionsASAP(NULL, pos=0) ... done [13:13:40.166] resolve() on list ... DONE [13:13:40.166] - Number of value chunks collected: 1 [13:13:40.166] Resolving 1 futures (chunks) ... DONE [13:13:40.167] Reducing values from 1 chunks ... [13:13:40.167] - Number of values collected after concatenation: 2 [13:13:40.167] - Number of values expected: 2 [13:13:40.167] Reverse index remapping (attribute 'ordering'): [n = 2] 2, 1 [13:13:40.167] Reducing values from 1 chunks ... DONE [13:13:40.167] 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) ... [13:13:40.169] future_lapply() ... [13:13:40.170] Number of chunks: 1 [13:13:40.170] getGlobalsAndPackagesXApply() ... [13:13:40.171] - future.globals: TRUE [13:13:40.171] getGlobalsAndPackages() ... [13:13:40.171] Searching for globals... [13:13:40.172] - globals found: [4] 'FUN', 'sqrt', '+', 'a' [13:13:40.173] Searching for globals ... DONE [13:13:40.173] Resolving globals: FALSE [13:13:40.173] The total size of the 2 globals is 1.93 KiB (1976 bytes) [13:13:40.174] 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') [13:13:40.174] - globals: [2] 'FUN', 'a' [13:13:40.174] [13:13:40.174] getGlobalsAndPackages() ... DONE [13:13:40.174] - globals found/used: [n=2] 'FUN', 'a' [13:13:40.175] - needed namespaces: [n=0] [13:13:40.175] Finding globals ... DONE [13:13:40.175] - use_args: TRUE [13:13:40.175] - Getting '...' globals ... [13:13:40.175] resolve() on list ... [13:13:40.176] recursive: 0 [13:13:40.176] length: 1 [13:13:40.176] elements: '...' [13:13:40.176] length: 0 (resolved future 1) [13:13:40.176] resolve() on list ... DONE [13:13:40.176] - '...' content: [n=0] [13:13:40.177] List of 1 [13:13:40.177] $ ...: list() [13:13:40.177] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:40.177] - attr(*, "where")=List of 1 [13:13:40.177] ..$ ...: [13:13:40.177] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:40.177] - attr(*, "resolved")= logi TRUE [13:13:40.177] - attr(*, "total_size")= num NA [13:13:40.181] - Getting '...' globals ... DONE [13:13:40.181] Globals to be used in all futures (chunks): [n=3] '...future.FUN', 'a', '...' [13:13:40.181] List of 3 [13:13:40.181] $ ...future.FUN:function (z) [13:13:40.181] $ a : num 3.14 [13:13:40.181] $ ... : list() [13:13:40.181] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:40.181] - attr(*, "where")=List of 3 [13:13:40.181] ..$ ...future.FUN: [13:13:40.181] ..$ a : [13:13:40.181] ..$ ... : [13:13:40.181] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:40.181] - attr(*, "resolved")= logi FALSE [13:13:40.181] - attr(*, "total_size")= num 1976 [13:13:40.185] Packages to be attached in all futures: [n=0] [13:13:40.185] getGlobalsAndPackagesXApply() ... DONE [13:13:40.185] Number of futures (= number of chunks): 1 [13:13:40.186] Launching 1 futures (chunks) ... [13:13:40.186] Chunk #1 of 1 ... [13:13:40.188] - Finding globals in 'X' for chunk #1 ... [13:13:40.188] getGlobalsAndPackages() ... [13:13:40.188] Searching for globals... [13:13:40.197] [13:13:40.197] Searching for globals ... DONE [13:13:40.197] - globals: [0] [13:13:40.197] getGlobalsAndPackages() ... DONE [13:13:40.197] + additional globals found: [n=0] [13:13:40.198] + additional namespaces needed: [n=0] [13:13:40.198] - Finding globals in 'X' for chunk #1 ... DONE [13:13:40.198] - seeds: [13:13:40.198] - All globals exported: [n=6] '...future.FUN', 'a', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:40.198] getGlobalsAndPackages() ... [13:13:40.198] - globals passed as-is: [6] '...future.FUN', 'a', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:40.199] Resolving globals: FALSE [13:13:40.199] Tweak future expression to call with '...' arguments ... [13:13:40.199] { [13:13:40.199] do.call(function(...) { [13:13:40.199] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:40.199] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:40.199] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:40.199] on.exit(options(oopts), add = TRUE) [13:13:40.199] } [13:13:40.199] { [13:13:40.199] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:40.199] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:40.199] ...future.FUN(...future.X_jj, ...) [13:13:40.199] }) [13:13:40.199] } [13:13:40.199] }, args = future.call.arguments) [13:13:40.199] } [13:13:40.199] Tweak future expression to call with '...' arguments ... DONE [13:13:40.200] - globals: [6] '...future.FUN', 'a', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:40.200] [13:13:40.200] getGlobalsAndPackages() ... DONE [13:13:40.201] run() for 'Future' ... [13:13:40.201] - state: 'created' [13:13:40.201] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:13:40.201] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:40.202] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:40.202] - Field: 'label' [13:13:40.202] - Field: 'local' [13:13:40.202] - Field: 'owner' [13:13:40.202] - Field: 'envir' [13:13:40.202] - Field: 'packages' [13:13:40.203] - Field: 'gc' [13:13:40.203] - Field: 'conditions' [13:13:40.203] - Field: 'expr' [13:13:40.203] - Field: 'uuid' [13:13:40.203] - Field: 'seed' [13:13:40.203] - Field: 'version' [13:13:40.204] - Field: 'result' [13:13:40.204] - Field: 'asynchronous' [13:13:40.204] - Field: 'calls' [13:13:40.204] - Field: 'globals' [13:13:40.204] - Field: 'stdout' [13:13:40.204] - Field: 'earlySignal' [13:13:40.205] - Field: 'lazy' [13:13:40.205] - Field: 'state' [13:13:40.205] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:40.205] - Launch lazy future ... [13:13:40.205] Packages needed by the future expression (n = 0): [13:13:40.206] Packages needed by future strategies (n = 0): [13:13:40.206] { [13:13:40.206] { [13:13:40.206] { [13:13:40.206] ...future.startTime <- base::Sys.time() [13:13:40.206] { [13:13:40.206] { [13:13:40.206] { [13:13:40.206] base::local({ [13:13:40.206] has_future <- base::requireNamespace("future", [13:13:40.206] quietly = TRUE) [13:13:40.206] if (has_future) { [13:13:40.206] ns <- base::getNamespace("future") [13:13:40.206] version <- ns[[".package"]][["version"]] [13:13:40.206] if (is.null(version)) [13:13:40.206] version <- utils::packageVersion("future") [13:13:40.206] } [13:13:40.206] else { [13:13:40.206] version <- NULL [13:13:40.206] } [13:13:40.206] if (!has_future || version < "1.8.0") { [13:13:40.206] info <- base::c(r_version = base::gsub("R version ", [13:13:40.206] "", base::R.version$version.string), [13:13:40.206] platform = base::sprintf("%s (%s-bit)", [13:13:40.206] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:40.206] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:40.206] "release", "version")], collapse = " "), [13:13:40.206] hostname = base::Sys.info()[["nodename"]]) [13:13:40.206] info <- base::sprintf("%s: %s", base::names(info), [13:13:40.206] info) [13:13:40.206] info <- base::paste(info, collapse = "; ") [13:13:40.206] if (!has_future) { [13:13:40.206] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:40.206] info) [13:13:40.206] } [13:13:40.206] else { [13:13:40.206] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:40.206] info, version) [13:13:40.206] } [13:13:40.206] base::stop(msg) [13:13:40.206] } [13:13:40.206] }) [13:13:40.206] } [13:13:40.206] options(future.plan = NULL) [13:13:40.206] Sys.unsetenv("R_FUTURE_PLAN") [13:13:40.206] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:40.206] } [13:13:40.206] ...future.workdir <- getwd() [13:13:40.206] } [13:13:40.206] ...future.oldOptions <- base::as.list(base::.Options) [13:13:40.206] ...future.oldEnvVars <- base::Sys.getenv() [13:13:40.206] } [13:13:40.206] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:40.206] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:40.206] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:40.206] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:40.206] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:40.206] future.stdout.windows.reencode = NULL, width = 80L) [13:13:40.206] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:40.206] base::names(...future.oldOptions)) [13:13:40.206] } [13:13:40.206] if (FALSE) { [13:13:40.206] } [13:13:40.206] else { [13:13:40.206] if (TRUE) { [13:13:40.206] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:40.206] open = "w") [13:13:40.206] } [13:13:40.206] else { [13:13:40.206] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:40.206] windows = "NUL", "/dev/null"), open = "w") [13:13:40.206] } [13:13:40.206] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:40.206] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:40.206] base::sink(type = "output", split = FALSE) [13:13:40.206] base::close(...future.stdout) [13:13:40.206] }, add = TRUE) [13:13:40.206] } [13:13:40.206] ...future.frame <- base::sys.nframe() [13:13:40.206] ...future.conditions <- base::list() [13:13:40.206] ...future.rng <- base::globalenv()$.Random.seed [13:13:40.206] if (FALSE) { [13:13:40.206] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:40.206] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:40.206] } [13:13:40.206] ...future.result <- base::tryCatch({ [13:13:40.206] base::withCallingHandlers({ [13:13:40.206] ...future.value <- base::withVisible(base::local({ [13:13:40.206] do.call(function(...) { [13:13:40.206] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:40.206] if (!identical(...future.globals.maxSize.org, [13:13:40.206] ...future.globals.maxSize)) { [13:13:40.206] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:40.206] on.exit(options(oopts), add = TRUE) [13:13:40.206] } [13:13:40.206] { [13:13:40.206] lapply(seq_along(...future.elements_ii), [13:13:40.206] FUN = function(jj) { [13:13:40.206] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:40.206] ...future.FUN(...future.X_jj, ...) [13:13:40.206] }) [13:13:40.206] } [13:13:40.206] }, args = future.call.arguments) [13:13:40.206] })) [13:13:40.206] future::FutureResult(value = ...future.value$value, [13:13:40.206] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:40.206] ...future.rng), globalenv = if (FALSE) [13:13:40.206] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:40.206] ...future.globalenv.names)) [13:13:40.206] else NULL, started = ...future.startTime, version = "1.8") [13:13:40.206] }, condition = base::local({ [13:13:40.206] c <- base::c [13:13:40.206] inherits <- base::inherits [13:13:40.206] invokeRestart <- base::invokeRestart [13:13:40.206] length <- base::length [13:13:40.206] list <- base::list [13:13:40.206] seq.int <- base::seq.int [13:13:40.206] signalCondition <- base::signalCondition [13:13:40.206] sys.calls <- base::sys.calls [13:13:40.206] `[[` <- base::`[[` [13:13:40.206] `+` <- base::`+` [13:13:40.206] `<<-` <- base::`<<-` [13:13:40.206] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:40.206] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:40.206] 3L)] [13:13:40.206] } [13:13:40.206] function(cond) { [13:13:40.206] is_error <- inherits(cond, "error") [13:13:40.206] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:40.206] NULL) [13:13:40.206] if (is_error) { [13:13:40.206] sessionInformation <- function() { [13:13:40.206] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:40.206] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:40.206] search = base::search(), system = base::Sys.info()) [13:13:40.206] } [13:13:40.206] ...future.conditions[[length(...future.conditions) + [13:13:40.206] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:40.206] cond$call), session = sessionInformation(), [13:13:40.206] timestamp = base::Sys.time(), signaled = 0L) [13:13:40.206] signalCondition(cond) [13:13:40.206] } [13:13:40.206] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:40.206] "immediateCondition"))) { [13:13:40.206] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:40.206] ...future.conditions[[length(...future.conditions) + [13:13:40.206] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:40.206] if (TRUE && !signal) { [13:13:40.206] muffleCondition <- function (cond, pattern = "^muffle") [13:13:40.206] { [13:13:40.206] inherits <- base::inherits [13:13:40.206] invokeRestart <- base::invokeRestart [13:13:40.206] is.null <- base::is.null [13:13:40.206] muffled <- FALSE [13:13:40.206] if (inherits(cond, "message")) { [13:13:40.206] muffled <- grepl(pattern, "muffleMessage") [13:13:40.206] if (muffled) [13:13:40.206] invokeRestart("muffleMessage") [13:13:40.206] } [13:13:40.206] else if (inherits(cond, "warning")) { [13:13:40.206] muffled <- grepl(pattern, "muffleWarning") [13:13:40.206] if (muffled) [13:13:40.206] invokeRestart("muffleWarning") [13:13:40.206] } [13:13:40.206] else if (inherits(cond, "condition")) { [13:13:40.206] if (!is.null(pattern)) { [13:13:40.206] computeRestarts <- base::computeRestarts [13:13:40.206] grepl <- base::grepl [13:13:40.206] restarts <- computeRestarts(cond) [13:13:40.206] for (restart in restarts) { [13:13:40.206] name <- restart$name [13:13:40.206] if (is.null(name)) [13:13:40.206] next [13:13:40.206] if (!grepl(pattern, name)) [13:13:40.206] next [13:13:40.206] invokeRestart(restart) [13:13:40.206] muffled <- TRUE [13:13:40.206] break [13:13:40.206] } [13:13:40.206] } [13:13:40.206] } [13:13:40.206] invisible(muffled) [13:13:40.206] } [13:13:40.206] muffleCondition(cond, pattern = "^muffle") [13:13:40.206] } [13:13:40.206] } [13:13:40.206] else { [13:13:40.206] if (TRUE) { [13:13:40.206] muffleCondition <- function (cond, pattern = "^muffle") [13:13:40.206] { [13:13:40.206] inherits <- base::inherits [13:13:40.206] invokeRestart <- base::invokeRestart [13:13:40.206] is.null <- base::is.null [13:13:40.206] muffled <- FALSE [13:13:40.206] if (inherits(cond, "message")) { [13:13:40.206] muffled <- grepl(pattern, "muffleMessage") [13:13:40.206] if (muffled) [13:13:40.206] invokeRestart("muffleMessage") [13:13:40.206] } [13:13:40.206] else if (inherits(cond, "warning")) { [13:13:40.206] muffled <- grepl(pattern, "muffleWarning") [13:13:40.206] if (muffled) [13:13:40.206] invokeRestart("muffleWarning") [13:13:40.206] } [13:13:40.206] else if (inherits(cond, "condition")) { [13:13:40.206] if (!is.null(pattern)) { [13:13:40.206] computeRestarts <- base::computeRestarts [13:13:40.206] grepl <- base::grepl [13:13:40.206] restarts <- computeRestarts(cond) [13:13:40.206] for (restart in restarts) { [13:13:40.206] name <- restart$name [13:13:40.206] if (is.null(name)) [13:13:40.206] next [13:13:40.206] if (!grepl(pattern, name)) [13:13:40.206] next [13:13:40.206] invokeRestart(restart) [13:13:40.206] muffled <- TRUE [13:13:40.206] break [13:13:40.206] } [13:13:40.206] } [13:13:40.206] } [13:13:40.206] invisible(muffled) [13:13:40.206] } [13:13:40.206] muffleCondition(cond, pattern = "^muffle") [13:13:40.206] } [13:13:40.206] } [13:13:40.206] } [13:13:40.206] })) [13:13:40.206] }, error = function(ex) { [13:13:40.206] base::structure(base::list(value = NULL, visible = NULL, [13:13:40.206] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:40.206] ...future.rng), started = ...future.startTime, [13:13:40.206] finished = Sys.time(), session_uuid = NA_character_, [13:13:40.206] version = "1.8"), class = "FutureResult") [13:13:40.206] }, finally = { [13:13:40.206] if (!identical(...future.workdir, getwd())) [13:13:40.206] setwd(...future.workdir) [13:13:40.206] { [13:13:40.206] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:40.206] ...future.oldOptions$nwarnings <- NULL [13:13:40.206] } [13:13:40.206] base::options(...future.oldOptions) [13:13:40.206] if (.Platform$OS.type == "windows") { [13:13:40.206] old_names <- names(...future.oldEnvVars) [13:13:40.206] envs <- base::Sys.getenv() [13:13:40.206] names <- names(envs) [13:13:40.206] common <- intersect(names, old_names) [13:13:40.206] added <- setdiff(names, old_names) [13:13:40.206] removed <- setdiff(old_names, names) [13:13:40.206] changed <- common[...future.oldEnvVars[common] != [13:13:40.206] envs[common]] [13:13:40.206] NAMES <- toupper(changed) [13:13:40.206] args <- list() [13:13:40.206] for (kk in seq_along(NAMES)) { [13:13:40.206] name <- changed[[kk]] [13:13:40.206] NAME <- NAMES[[kk]] [13:13:40.206] if (name != NAME && is.element(NAME, old_names)) [13:13:40.206] next [13:13:40.206] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:40.206] } [13:13:40.206] NAMES <- toupper(added) [13:13:40.206] for (kk in seq_along(NAMES)) { [13:13:40.206] name <- added[[kk]] [13:13:40.206] NAME <- NAMES[[kk]] [13:13:40.206] if (name != NAME && is.element(NAME, old_names)) [13:13:40.206] next [13:13:40.206] args[[name]] <- "" [13:13:40.206] } [13:13:40.206] NAMES <- toupper(removed) [13:13:40.206] for (kk in seq_along(NAMES)) { [13:13:40.206] name <- removed[[kk]] [13:13:40.206] NAME <- NAMES[[kk]] [13:13:40.206] if (name != NAME && is.element(NAME, old_names)) [13:13:40.206] next [13:13:40.206] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:40.206] } [13:13:40.206] if (length(args) > 0) [13:13:40.206] base::do.call(base::Sys.setenv, args = args) [13:13:40.206] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:40.206] } [13:13:40.206] else { [13:13:40.206] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:40.206] } [13:13:40.206] { [13:13:40.206] if (base::length(...future.futureOptionsAdded) > [13:13:40.206] 0L) { [13:13:40.206] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:40.206] base::names(opts) <- ...future.futureOptionsAdded [13:13:40.206] base::options(opts) [13:13:40.206] } [13:13:40.206] { [13:13:40.206] { [13:13:40.206] NULL [13:13:40.206] RNGkind("Mersenne-Twister") [13:13:40.206] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:40.206] inherits = FALSE) [13:13:40.206] } [13:13:40.206] options(future.plan = NULL) [13:13:40.206] if (is.na(NA_character_)) [13:13:40.206] Sys.unsetenv("R_FUTURE_PLAN") [13:13:40.206] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:40.206] future::plan(list(function (..., envir = parent.frame()) [13:13:40.206] { [13:13:40.206] future <- SequentialFuture(..., envir = envir) [13:13:40.206] if (!future$lazy) [13:13:40.206] future <- run(future) [13:13:40.206] invisible(future) [13:13:40.206] }), .cleanup = FALSE, .init = FALSE) [13:13:40.206] } [13:13:40.206] } [13:13:40.206] } [13:13:40.206] }) [13:13:40.206] if (TRUE) { [13:13:40.206] base::sink(type = "output", split = FALSE) [13:13:40.206] if (TRUE) { [13:13:40.206] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:40.206] } [13:13:40.206] else { [13:13:40.206] ...future.result["stdout"] <- base::list(NULL) [13:13:40.206] } [13:13:40.206] base::close(...future.stdout) [13:13:40.206] ...future.stdout <- NULL [13:13:40.206] } [13:13:40.206] ...future.result$conditions <- ...future.conditions [13:13:40.206] ...future.result$finished <- base::Sys.time() [13:13:40.206] ...future.result [13:13:40.206] } [13:13:40.210] assign_globals() ... [13:13:40.210] List of 6 [13:13:40.210] $ ...future.FUN :function (z) [13:13:40.210] $ a : num 3.14 [13:13:40.210] $ future.call.arguments : list() [13:13:40.210] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:40.210] $ ...future.elements_ii :List of 10000 [13:13:40.210] ..$ : int 1 [13:13:40.210] ..$ : int 2 [13:13:40.210] ..$ : int 3 [13:13:40.210] ..$ : int 4 [13:13:40.210] ..$ : int 5 [13:13:40.210] ..$ : int 6 [13:13:40.210] ..$ : int 7 [13:13:40.210] ..$ : int 8 [13:13:40.210] ..$ : int 9 [13:13:40.210] ..$ : int 10 [13:13:40.210] ..$ : int 11 [13:13:40.210] ..$ : int 12 [13:13:40.210] ..$ : int 13 [13:13:40.210] ..$ : int 14 [13:13:40.210] ..$ : int 15 [13:13:40.210] ..$ : int 16 [13:13:40.210] ..$ : int 17 [13:13:40.210] ..$ : int 18 [13:13:40.210] ..$ : int 19 [13:13:40.210] ..$ : int 20 [13:13:40.210] ..$ : int 21 [13:13:40.210] ..$ : int 22 [13:13:40.210] ..$ : int 23 [13:13:40.210] ..$ : int 24 [13:13:40.210] ..$ : int 25 [13:13:40.210] ..$ : int 26 [13:13:40.210] ..$ : int 27 [13:13:40.210] ..$ : int 28 [13:13:40.210] ..$ : int 29 [13:13:40.210] ..$ : int 30 [13:13:40.210] ..$ : int 31 [13:13:40.210] ..$ : int 32 [13:13:40.210] ..$ : int 33 [13:13:40.210] ..$ : int 34 [13:13:40.210] ..$ : int 35 [13:13:40.210] ..$ : int 36 [13:13:40.210] ..$ : int 37 [13:13:40.210] ..$ : int 38 [13:13:40.210] ..$ : int 39 [13:13:40.210] ..$ : int 40 [13:13:40.210] ..$ : int 41 [13:13:40.210] ..$ : int 42 [13:13:40.210] ..$ : int 43 [13:13:40.210] ..$ : int 44 [13:13:40.210] ..$ : int 45 [13:13:40.210] ..$ : int 46 [13:13:40.210] ..$ : int 47 [13:13:40.210] ..$ : int 48 [13:13:40.210] ..$ : int 49 [13:13:40.210] ..$ : int 50 [13:13:40.210] ..$ : int 51 [13:13:40.210] ..$ : int 52 [13:13:40.210] ..$ : int 53 [13:13:40.210] ..$ : int 54 [13:13:40.210] ..$ : int 55 [13:13:40.210] ..$ : int 56 [13:13:40.210] ..$ : int 57 [13:13:40.210] ..$ : int 58 [13:13:40.210] ..$ : int 59 [13:13:40.210] ..$ : int 60 [13:13:40.210] ..$ : int 61 [13:13:40.210] ..$ : int 62 [13:13:40.210] ..$ : int 63 [13:13:40.210] ..$ : int 64 [13:13:40.210] ..$ : int 65 [13:13:40.210] ..$ : int 66 [13:13:40.210] ..$ : int 67 [13:13:40.210] ..$ : int 68 [13:13:40.210] ..$ : int 69 [13:13:40.210] ..$ : int 70 [13:13:40.210] ..$ : int 71 [13:13:40.210] ..$ : int 72 [13:13:40.210] ..$ : int 73 [13:13:40.210] ..$ : int 74 [13:13:40.210] ..$ : int 75 [13:13:40.210] ..$ : int 76 [13:13:40.210] ..$ : int 77 [13:13:40.210] ..$ : int 78 [13:13:40.210] ..$ : int 79 [13:13:40.210] ..$ : int 80 [13:13:40.210] ..$ : int 81 [13:13:40.210] ..$ : int 82 [13:13:40.210] ..$ : int 83 [13:13:40.210] ..$ : int 84 [13:13:40.210] ..$ : int 85 [13:13:40.210] ..$ : int 86 [13:13:40.210] ..$ : int 87 [13:13:40.210] ..$ : int 88 [13:13:40.210] ..$ : int 89 [13:13:40.210] ..$ : int 90 [13:13:40.210] ..$ : int 91 [13:13:40.210] ..$ : int 92 [13:13:40.210] ..$ : int 93 [13:13:40.210] ..$ : int 94 [13:13:40.210] ..$ : int 95 [13:13:40.210] ..$ : int 96 [13:13:40.210] ..$ : int 97 [13:13:40.210] ..$ : int 98 [13:13:40.210] ..$ : int 99 [13:13:40.210] .. [list output truncated] [13:13:40.210] $ ...future.seeds_ii : NULL [13:13:40.210] $ ...future.globals.maxSize: NULL [13:13:40.210] - attr(*, "where")=List of 6 [13:13:40.210] ..$ ...future.FUN : [13:13:40.210] ..$ a : [13:13:40.210] ..$ future.call.arguments : [13:13:40.210] ..$ ...future.elements_ii : [13:13:40.210] ..$ ...future.seeds_ii : [13:13:40.210] ..$ ...future.globals.maxSize: [13:13:40.210] - attr(*, "resolved")= logi FALSE [13:13:40.210] - attr(*, "total_size")= num 1976 [13:13:40.210] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:40.210] - attr(*, "already-done")= logi TRUE [13:13:40.284] - reassign environment for '...future.FUN' [13:13:40.284] - copied '...future.FUN' to environment [13:13:40.284] - copied 'a' to environment [13:13:40.285] - copied 'future.call.arguments' to environment [13:13:40.285] - copied '...future.elements_ii' to environment [13:13:40.285] - copied '...future.seeds_ii' to environment [13:13:40.285] - copied '...future.globals.maxSize' to environment [13:13:40.285] assign_globals() ... done [13:13:40.286] plan(): Setting new future strategy stack: [13:13:40.286] List of future strategies: [13:13:40.286] 1. sequential: [13:13:40.286] - args: function (..., envir = parent.frame(), workers = "") [13:13:40.286] - tweaked: FALSE [13:13:40.286] - call: NULL [13:13:40.287] plan(): nbrOfWorkers() = 1 [13:13:40.310] plan(): Setting new future strategy stack: [13:13:40.310] List of future strategies: [13:13:40.310] 1. sequential: [13:13:40.310] - args: function (..., envir = parent.frame(), workers = "") [13:13:40.310] - tweaked: FALSE [13:13:40.310] - call: plan(strategy) [13:13:40.311] plan(): nbrOfWorkers() = 1 [13:13:40.311] SequentialFuture started (and completed) [13:13:40.312] - Launch lazy future ... done [13:13:40.312] run() for 'SequentialFuture' ... done [13:13:40.312] Created future: [13:13:40.312] SequentialFuture: [13:13:40.312] Label: 'future_lapply-1' [13:13:40.312] Expression: [13:13:40.312] { [13:13:40.312] do.call(function(...) { [13:13:40.312] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:40.312] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:40.312] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:40.312] on.exit(options(oopts), add = TRUE) [13:13:40.312] } [13:13:40.312] { [13:13:40.312] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:40.312] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:40.312] ...future.FUN(...future.X_jj, ...) [13:13:40.312] }) [13:13:40.312] } [13:13:40.312] }, args = future.call.arguments) [13:13:40.312] } [13:13:40.312] Lazy evaluation: FALSE [13:13:40.312] Asynchronous evaluation: FALSE [13:13:40.312] Local evaluation: TRUE [13:13:40.312] Environment: R_GlobalEnv [13:13:40.312] Capture standard output: TRUE [13:13:40.312] Capture condition classes: 'condition' (excluding 'nothing') [13:13:40.312] 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, ...) [13:13:40.312] Packages: [13:13:40.312] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:40.312] Resolved: TRUE [13:13:40.312] Value: 546.88 KiB of class 'list' [13:13:40.312] Early signaling: FALSE [13:13:40.312] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:40.312] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:40.415] Chunk #1 of 1 ... DONE [13:13:40.415] Launching 1 futures (chunks) ... DONE [13:13:40.415] Resolving 1 futures (chunks) ... [13:13:40.415] resolve() on list ... [13:13:40.415] recursive: 0 [13:13:40.415] length: 1 [13:13:40.416] [13:13:40.416] resolved() for 'SequentialFuture' ... [13:13:40.416] - state: 'finished' [13:13:40.416] - run: TRUE [13:13:40.416] - result: 'FutureResult' [13:13:40.416] resolved() for 'SequentialFuture' ... done [13:13:40.417] Future #1 [13:13:40.417] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:40.417] - nx: 1 [13:13:40.417] - relay: TRUE [13:13:40.417] - stdout: TRUE [13:13:40.418] - signal: TRUE [13:13:40.418] - resignal: FALSE [13:13:40.418] - force: TRUE [13:13:40.418] - relayed: [n=1] FALSE [13:13:40.418] - queued futures: [n=1] FALSE [13:13:40.418] - until=1 [13:13:40.418] - relaying element #1 [13:13:40.419] - relayed: [n=1] TRUE [13:13:40.419] - queued futures: [n=1] TRUE [13:13:40.419] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:40.419] length: 0 (resolved future 1) [13:13:40.419] Relaying remaining futures [13:13:40.420] signalConditionsASAP(NULL, pos=0) ... [13:13:40.420] - nx: 1 [13:13:40.420] - relay: TRUE [13:13:40.420] - stdout: TRUE [13:13:40.420] - signal: TRUE [13:13:40.420] - resignal: FALSE [13:13:40.420] - force: TRUE [13:13:40.421] - relayed: [n=1] TRUE [13:13:40.421] - queued futures: [n=1] TRUE - flush all [13:13:40.421] - relayed: [n=1] TRUE [13:13:40.421] - queued futures: [n=1] TRUE [13:13:40.421] signalConditionsASAP(NULL, pos=0) ... done [13:13:40.421] resolve() on list ... DONE [13:13:40.422] - Number of value chunks collected: 1 [13:13:40.422] Resolving 1 futures (chunks) ... DONE [13:13:40.422] Reducing values from 1 chunks ... [13:13:40.422] - Number of values collected after concatenation: 10000 [13:13:40.423] - Number of values expected: 10000 [13:13:40.423] Reducing values from 1 chunks ... DONE [13:13:40.423] future_lapply() ... DONE - future_lapply(x, FUN = table, ...) ... [13:13:40.425] future_lapply() ... [13:13:40.471] Number of chunks: 1 [13:13:40.472] getGlobalsAndPackagesXApply() ... [13:13:40.472] - future.globals: TRUE [13:13:40.472] getGlobalsAndPackages() ... [13:13:40.472] Searching for globals... [13:13:40.523] - 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<-' [13:13:40.523] Searching for globals ... DONE [13:13:40.524] Resolving globals: FALSE [13:13:40.526] The total size of the 1 globals is 345.92 KiB (354224 bytes) [13:13:40.526] 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') [13:13:40.526] - globals: [1] 'FUN' [13:13:40.527] [13:13:40.527] getGlobalsAndPackages() ... DONE [13:13:40.527] - globals found/used: [n=1] 'FUN' [13:13:40.527] - needed namespaces: [n=0] [13:13:40.527] Finding globals ... DONE [13:13:40.527] - use_args: TRUE [13:13:40.528] - Getting '...' globals ... [13:13:40.528] resolve() on list ... [13:13:40.528] recursive: 0 [13:13:40.528] length: 1 [13:13:40.528] elements: '...' [13:13:40.529] length: 0 (resolved future 1) [13:13:40.529] resolve() on list ... DONE [13:13:40.529] - '...' content: [n=0] [13:13:40.529] List of 1 [13:13:40.529] $ ...: list() [13:13:40.529] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:40.529] - attr(*, "where")=List of 1 [13:13:40.529] ..$ ...: [13:13:40.529] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:40.529] - attr(*, "resolved")= logi TRUE [13:13:40.529] - attr(*, "total_size")= num NA [13:13:40.532] - Getting '...' globals ... DONE [13:13:40.533] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:40.533] List of 2 [13:13:40.533] $ ...future.FUN:function (..., exclude = if (useNA == "no") c(NA, NaN), useNA = c("no", [13:13:40.533] "ifany", "always"), dnn = list.names(...), deparse.level = 1) [13:13:40.533] $ ... : list() [13:13:40.533] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:40.533] - attr(*, "where")=List of 2 [13:13:40.533] ..$ ...future.FUN: [13:13:40.533] ..$ ... : [13:13:40.533] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:40.533] - attr(*, "resolved")= logi FALSE [13:13:40.533] - attr(*, "total_size")= num 354224 [13:13:40.536] Packages to be attached in all futures: [n=0] [13:13:40.536] getGlobalsAndPackagesXApply() ... DONE [13:13:40.536] Number of futures (= number of chunks): 1 [13:13:40.537] Launching 1 futures (chunks) ... [13:13:40.537] Chunk #1 of 1 ... [13:13:40.537] - Finding globals in 'X' for chunk #1 ... [13:13:40.537] getGlobalsAndPackages() ... [13:13:40.537] Searching for globals... [13:13:40.538] [13:13:40.538] Searching for globals ... DONE [13:13:40.538] - globals: [0] [13:13:40.538] getGlobalsAndPackages() ... DONE [13:13:40.538] + additional globals found: [n=0] [13:13:40.539] + additional namespaces needed: [n=0] [13:13:40.539] - Finding globals in 'X' for chunk #1 ... DONE [13:13:40.539] - seeds: [13:13:40.539] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:40.539] getGlobalsAndPackages() ... [13:13:40.539] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:40.540] Resolving globals: FALSE [13:13:40.540] Tweak future expression to call with '...' arguments ... [13:13:40.540] { [13:13:40.540] do.call(function(...) { [13:13:40.540] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:40.540] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:40.540] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:40.540] on.exit(options(oopts), add = TRUE) [13:13:40.540] } [13:13:40.540] { [13:13:40.540] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:40.540] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:40.540] ...future.FUN(...future.X_jj, ...) [13:13:40.540] }) [13:13:40.540] } [13:13:40.540] }, args = future.call.arguments) [13:13:40.540] } [13:13:40.540] Tweak future expression to call with '...' arguments ... DONE [13:13:40.541] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:40.541] [13:13:40.541] getGlobalsAndPackages() ... DONE [13:13:40.542] run() for 'Future' ... [13:13:40.542] - state: 'created' [13:13:40.542] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:13:40.542] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:40.543] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:40.543] - Field: 'label' [13:13:40.543] - Field: 'local' [13:13:40.543] - Field: 'owner' [13:13:40.543] - Field: 'envir' [13:13:40.543] - Field: 'packages' [13:13:40.544] - Field: 'gc' [13:13:40.544] - Field: 'conditions' [13:13:40.544] - Field: 'expr' [13:13:40.544] - Field: 'uuid' [13:13:40.544] - Field: 'seed' [13:13:40.544] - Field: 'version' [13:13:40.545] - Field: 'result' [13:13:40.545] - Field: 'asynchronous' [13:13:40.545] - Field: 'calls' [13:13:40.545] - Field: 'globals' [13:13:40.545] - Field: 'stdout' [13:13:40.546] - Field: 'earlySignal' [13:13:40.546] - Field: 'lazy' [13:13:40.546] - Field: 'state' [13:13:40.546] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:40.546] - Launch lazy future ... [13:13:40.546] Packages needed by the future expression (n = 0): [13:13:40.547] Packages needed by future strategies (n = 0): [13:13:40.547] { [13:13:40.547] { [13:13:40.547] { [13:13:40.547] ...future.startTime <- base::Sys.time() [13:13:40.547] { [13:13:40.547] { [13:13:40.547] { [13:13:40.547] base::local({ [13:13:40.547] has_future <- base::requireNamespace("future", [13:13:40.547] quietly = TRUE) [13:13:40.547] if (has_future) { [13:13:40.547] ns <- base::getNamespace("future") [13:13:40.547] version <- ns[[".package"]][["version"]] [13:13:40.547] if (is.null(version)) [13:13:40.547] version <- utils::packageVersion("future") [13:13:40.547] } [13:13:40.547] else { [13:13:40.547] version <- NULL [13:13:40.547] } [13:13:40.547] if (!has_future || version < "1.8.0") { [13:13:40.547] info <- base::c(r_version = base::gsub("R version ", [13:13:40.547] "", base::R.version$version.string), [13:13:40.547] platform = base::sprintf("%s (%s-bit)", [13:13:40.547] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:40.547] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:40.547] "release", "version")], collapse = " "), [13:13:40.547] hostname = base::Sys.info()[["nodename"]]) [13:13:40.547] info <- base::sprintf("%s: %s", base::names(info), [13:13:40.547] info) [13:13:40.547] info <- base::paste(info, collapse = "; ") [13:13:40.547] if (!has_future) { [13:13:40.547] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:40.547] info) [13:13:40.547] } [13:13:40.547] else { [13:13:40.547] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:40.547] info, version) [13:13:40.547] } [13:13:40.547] base::stop(msg) [13:13:40.547] } [13:13:40.547] }) [13:13:40.547] } [13:13:40.547] options(future.plan = NULL) [13:13:40.547] Sys.unsetenv("R_FUTURE_PLAN") [13:13:40.547] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:40.547] } [13:13:40.547] ...future.workdir <- getwd() [13:13:40.547] } [13:13:40.547] ...future.oldOptions <- base::as.list(base::.Options) [13:13:40.547] ...future.oldEnvVars <- base::Sys.getenv() [13:13:40.547] } [13:13:40.547] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:40.547] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:40.547] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:40.547] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:40.547] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:40.547] future.stdout.windows.reencode = NULL, width = 80L) [13:13:40.547] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:40.547] base::names(...future.oldOptions)) [13:13:40.547] } [13:13:40.547] if (FALSE) { [13:13:40.547] } [13:13:40.547] else { [13:13:40.547] if (TRUE) { [13:13:40.547] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:40.547] open = "w") [13:13:40.547] } [13:13:40.547] else { [13:13:40.547] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:40.547] windows = "NUL", "/dev/null"), open = "w") [13:13:40.547] } [13:13:40.547] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:40.547] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:40.547] base::sink(type = "output", split = FALSE) [13:13:40.547] base::close(...future.stdout) [13:13:40.547] }, add = TRUE) [13:13:40.547] } [13:13:40.547] ...future.frame <- base::sys.nframe() [13:13:40.547] ...future.conditions <- base::list() [13:13:40.547] ...future.rng <- base::globalenv()$.Random.seed [13:13:40.547] if (FALSE) { [13:13:40.547] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:40.547] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:40.547] } [13:13:40.547] ...future.result <- base::tryCatch({ [13:13:40.547] base::withCallingHandlers({ [13:13:40.547] ...future.value <- base::withVisible(base::local({ [13:13:40.547] do.call(function(...) { [13:13:40.547] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:40.547] if (!identical(...future.globals.maxSize.org, [13:13:40.547] ...future.globals.maxSize)) { [13:13:40.547] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:40.547] on.exit(options(oopts), add = TRUE) [13:13:40.547] } [13:13:40.547] { [13:13:40.547] lapply(seq_along(...future.elements_ii), [13:13:40.547] FUN = function(jj) { [13:13:40.547] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:40.547] ...future.FUN(...future.X_jj, ...) [13:13:40.547] }) [13:13:40.547] } [13:13:40.547] }, args = future.call.arguments) [13:13:40.547] })) [13:13:40.547] future::FutureResult(value = ...future.value$value, [13:13:40.547] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:40.547] ...future.rng), globalenv = if (FALSE) [13:13:40.547] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:40.547] ...future.globalenv.names)) [13:13:40.547] else NULL, started = ...future.startTime, version = "1.8") [13:13:40.547] }, condition = base::local({ [13:13:40.547] c <- base::c [13:13:40.547] inherits <- base::inherits [13:13:40.547] invokeRestart <- base::invokeRestart [13:13:40.547] length <- base::length [13:13:40.547] list <- base::list [13:13:40.547] seq.int <- base::seq.int [13:13:40.547] signalCondition <- base::signalCondition [13:13:40.547] sys.calls <- base::sys.calls [13:13:40.547] `[[` <- base::`[[` [13:13:40.547] `+` <- base::`+` [13:13:40.547] `<<-` <- base::`<<-` [13:13:40.547] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:40.547] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:40.547] 3L)] [13:13:40.547] } [13:13:40.547] function(cond) { [13:13:40.547] is_error <- inherits(cond, "error") [13:13:40.547] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:40.547] NULL) [13:13:40.547] if (is_error) { [13:13:40.547] sessionInformation <- function() { [13:13:40.547] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:40.547] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:40.547] search = base::search(), system = base::Sys.info()) [13:13:40.547] } [13:13:40.547] ...future.conditions[[length(...future.conditions) + [13:13:40.547] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:40.547] cond$call), session = sessionInformation(), [13:13:40.547] timestamp = base::Sys.time(), signaled = 0L) [13:13:40.547] signalCondition(cond) [13:13:40.547] } [13:13:40.547] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:40.547] "immediateCondition"))) { [13:13:40.547] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:40.547] ...future.conditions[[length(...future.conditions) + [13:13:40.547] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:40.547] if (TRUE && !signal) { [13:13:40.547] muffleCondition <- function (cond, pattern = "^muffle") [13:13:40.547] { [13:13:40.547] inherits <- base::inherits [13:13:40.547] invokeRestart <- base::invokeRestart [13:13:40.547] is.null <- base::is.null [13:13:40.547] muffled <- FALSE [13:13:40.547] if (inherits(cond, "message")) { [13:13:40.547] muffled <- grepl(pattern, "muffleMessage") [13:13:40.547] if (muffled) [13:13:40.547] invokeRestart("muffleMessage") [13:13:40.547] } [13:13:40.547] else if (inherits(cond, "warning")) { [13:13:40.547] muffled <- grepl(pattern, "muffleWarning") [13:13:40.547] if (muffled) [13:13:40.547] invokeRestart("muffleWarning") [13:13:40.547] } [13:13:40.547] else if (inherits(cond, "condition")) { [13:13:40.547] if (!is.null(pattern)) { [13:13:40.547] computeRestarts <- base::computeRestarts [13:13:40.547] grepl <- base::grepl [13:13:40.547] restarts <- computeRestarts(cond) [13:13:40.547] for (restart in restarts) { [13:13:40.547] name <- restart$name [13:13:40.547] if (is.null(name)) [13:13:40.547] next [13:13:40.547] if (!grepl(pattern, name)) [13:13:40.547] next [13:13:40.547] invokeRestart(restart) [13:13:40.547] muffled <- TRUE [13:13:40.547] break [13:13:40.547] } [13:13:40.547] } [13:13:40.547] } [13:13:40.547] invisible(muffled) [13:13:40.547] } [13:13:40.547] muffleCondition(cond, pattern = "^muffle") [13:13:40.547] } [13:13:40.547] } [13:13:40.547] else { [13:13:40.547] if (TRUE) { [13:13:40.547] muffleCondition <- function (cond, pattern = "^muffle") [13:13:40.547] { [13:13:40.547] inherits <- base::inherits [13:13:40.547] invokeRestart <- base::invokeRestart [13:13:40.547] is.null <- base::is.null [13:13:40.547] muffled <- FALSE [13:13:40.547] if (inherits(cond, "message")) { [13:13:40.547] muffled <- grepl(pattern, "muffleMessage") [13:13:40.547] if (muffled) [13:13:40.547] invokeRestart("muffleMessage") [13:13:40.547] } [13:13:40.547] else if (inherits(cond, "warning")) { [13:13:40.547] muffled <- grepl(pattern, "muffleWarning") [13:13:40.547] if (muffled) [13:13:40.547] invokeRestart("muffleWarning") [13:13:40.547] } [13:13:40.547] else if (inherits(cond, "condition")) { [13:13:40.547] if (!is.null(pattern)) { [13:13:40.547] computeRestarts <- base::computeRestarts [13:13:40.547] grepl <- base::grepl [13:13:40.547] restarts <- computeRestarts(cond) [13:13:40.547] for (restart in restarts) { [13:13:40.547] name <- restart$name [13:13:40.547] if (is.null(name)) [13:13:40.547] next [13:13:40.547] if (!grepl(pattern, name)) [13:13:40.547] next [13:13:40.547] invokeRestart(restart) [13:13:40.547] muffled <- TRUE [13:13:40.547] break [13:13:40.547] } [13:13:40.547] } [13:13:40.547] } [13:13:40.547] invisible(muffled) [13:13:40.547] } [13:13:40.547] muffleCondition(cond, pattern = "^muffle") [13:13:40.547] } [13:13:40.547] } [13:13:40.547] } [13:13:40.547] })) [13:13:40.547] }, error = function(ex) { [13:13:40.547] base::structure(base::list(value = NULL, visible = NULL, [13:13:40.547] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:40.547] ...future.rng), started = ...future.startTime, [13:13:40.547] finished = Sys.time(), session_uuid = NA_character_, [13:13:40.547] version = "1.8"), class = "FutureResult") [13:13:40.547] }, finally = { [13:13:40.547] if (!identical(...future.workdir, getwd())) [13:13:40.547] setwd(...future.workdir) [13:13:40.547] { [13:13:40.547] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:40.547] ...future.oldOptions$nwarnings <- NULL [13:13:40.547] } [13:13:40.547] base::options(...future.oldOptions) [13:13:40.547] if (.Platform$OS.type == "windows") { [13:13:40.547] old_names <- names(...future.oldEnvVars) [13:13:40.547] envs <- base::Sys.getenv() [13:13:40.547] names <- names(envs) [13:13:40.547] common <- intersect(names, old_names) [13:13:40.547] added <- setdiff(names, old_names) [13:13:40.547] removed <- setdiff(old_names, names) [13:13:40.547] changed <- common[...future.oldEnvVars[common] != [13:13:40.547] envs[common]] [13:13:40.547] NAMES <- toupper(changed) [13:13:40.547] args <- list() [13:13:40.547] for (kk in seq_along(NAMES)) { [13:13:40.547] name <- changed[[kk]] [13:13:40.547] NAME <- NAMES[[kk]] [13:13:40.547] if (name != NAME && is.element(NAME, old_names)) [13:13:40.547] next [13:13:40.547] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:40.547] } [13:13:40.547] NAMES <- toupper(added) [13:13:40.547] for (kk in seq_along(NAMES)) { [13:13:40.547] name <- added[[kk]] [13:13:40.547] NAME <- NAMES[[kk]] [13:13:40.547] if (name != NAME && is.element(NAME, old_names)) [13:13:40.547] next [13:13:40.547] args[[name]] <- "" [13:13:40.547] } [13:13:40.547] NAMES <- toupper(removed) [13:13:40.547] for (kk in seq_along(NAMES)) { [13:13:40.547] name <- removed[[kk]] [13:13:40.547] NAME <- NAMES[[kk]] [13:13:40.547] if (name != NAME && is.element(NAME, old_names)) [13:13:40.547] next [13:13:40.547] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:40.547] } [13:13:40.547] if (length(args) > 0) [13:13:40.547] base::do.call(base::Sys.setenv, args = args) [13:13:40.547] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:40.547] } [13:13:40.547] else { [13:13:40.547] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:40.547] } [13:13:40.547] { [13:13:40.547] if (base::length(...future.futureOptionsAdded) > [13:13:40.547] 0L) { [13:13:40.547] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:40.547] base::names(opts) <- ...future.futureOptionsAdded [13:13:40.547] base::options(opts) [13:13:40.547] } [13:13:40.547] { [13:13:40.547] { [13:13:40.547] NULL [13:13:40.547] RNGkind("Mersenne-Twister") [13:13:40.547] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:40.547] inherits = FALSE) [13:13:40.547] } [13:13:40.547] options(future.plan = NULL) [13:13:40.547] if (is.na(NA_character_)) [13:13:40.547] Sys.unsetenv("R_FUTURE_PLAN") [13:13:40.547] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:40.547] future::plan(list(function (..., envir = parent.frame()) [13:13:40.547] { [13:13:40.547] future <- SequentialFuture(..., envir = envir) [13:13:40.547] if (!future$lazy) [13:13:40.547] future <- run(future) [13:13:40.547] invisible(future) [13:13:40.547] }), .cleanup = FALSE, .init = FALSE) [13:13:40.547] } [13:13:40.547] } [13:13:40.547] } [13:13:40.547] }) [13:13:40.547] if (TRUE) { [13:13:40.547] base::sink(type = "output", split = FALSE) [13:13:40.547] if (TRUE) { [13:13:40.547] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:40.547] } [13:13:40.547] else { [13:13:40.547] ...future.result["stdout"] <- base::list(NULL) [13:13:40.547] } [13:13:40.547] base::close(...future.stdout) [13:13:40.547] ...future.stdout <- NULL [13:13:40.547] } [13:13:40.547] ...future.result$conditions <- ...future.conditions [13:13:40.547] ...future.result$finished <- base::Sys.time() [13:13:40.547] ...future.result [13:13:40.547] } [13:13:40.551] assign_globals() ... [13:13:40.551] List of 5 [13:13:40.551] $ ...future.FUN :function (..., exclude = if (useNA == "no") c(NA, NaN), useNA = c("no", [13:13:40.551] "ifany", "always"), dnn = list.names(...), deparse.level = 1) [13:13:40.551] $ future.call.arguments : list() [13:13:40.551] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:40.551] $ ...future.elements_ii :List of 2 [13:13:40.551] ..$ a: int [1:4] 1 2 3 4 [13:13:40.551] ..$ b: int [1:4] 5 6 7 8 [13:13:40.551] $ ...future.seeds_ii : NULL [13:13:40.551] $ ...future.globals.maxSize: NULL [13:13:40.551] - attr(*, "where")=List of 5 [13:13:40.551] ..$ ...future.FUN : [13:13:40.551] ..$ future.call.arguments : [13:13:40.551] ..$ ...future.elements_ii : [13:13:40.551] ..$ ...future.seeds_ii : [13:13:40.551] ..$ ...future.globals.maxSize: [13:13:40.551] - attr(*, "resolved")= logi FALSE [13:13:40.551] - attr(*, "total_size")= num 354224 [13:13:40.551] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:40.551] - attr(*, "already-done")= logi TRUE [13:13:40.557] - copied '...future.FUN' to environment [13:13:40.558] - copied 'future.call.arguments' to environment [13:13:40.558] - copied '...future.elements_ii' to environment [13:13:40.558] - copied '...future.seeds_ii' to environment [13:13:40.558] - copied '...future.globals.maxSize' to environment [13:13:40.558] assign_globals() ... done [13:13:40.559] plan(): Setting new future strategy stack: [13:13:40.559] List of future strategies: [13:13:40.559] 1. sequential: [13:13:40.559] - args: function (..., envir = parent.frame(), workers = "") [13:13:40.559] - tweaked: FALSE [13:13:40.559] - call: NULL [13:13:40.559] plan(): nbrOfWorkers() = 1 [13:13:40.561] plan(): Setting new future strategy stack: [13:13:40.561] List of future strategies: [13:13:40.561] 1. sequential: [13:13:40.561] - args: function (..., envir = parent.frame(), workers = "") [13:13:40.561] - tweaked: FALSE [13:13:40.561] - call: plan(strategy) [13:13:40.562] plan(): nbrOfWorkers() = 1 [13:13:40.562] SequentialFuture started (and completed) [13:13:40.562] - Launch lazy future ... done [13:13:40.562] run() for 'SequentialFuture' ... done [13:13:40.562] Created future: [13:13:40.563] SequentialFuture: [13:13:40.563] Label: 'future_lapply-1' [13:13:40.563] Expression: [13:13:40.563] { [13:13:40.563] do.call(function(...) { [13:13:40.563] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:40.563] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:40.563] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:40.563] on.exit(options(oopts), add = TRUE) [13:13:40.563] } [13:13:40.563] { [13:13:40.563] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:40.563] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:40.563] ...future.FUN(...future.X_jj, ...) [13:13:40.563] }) [13:13:40.563] } [13:13:40.563] }, args = future.call.arguments) [13:13:40.563] } [13:13:40.563] Lazy evaluation: FALSE [13:13:40.563] Asynchronous evaluation: FALSE [13:13:40.563] Local evaluation: TRUE [13:13:40.563] Environment: R_GlobalEnv [13:13:40.563] Capture standard output: TRUE [13:13:40.563] Capture condition classes: 'condition' (excluding 'nothing') [13:13:40.563] 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) [13:13:40.563] Packages: [13:13:40.563] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:40.563] Resolved: TRUE [13:13:40.563] Value: 2.27 KiB of class 'list' [13:13:40.563] Early signaling: FALSE [13:13:40.563] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:40.563] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:40.564] Chunk #1 of 1 ... DONE [13:13:40.564] Launching 1 futures (chunks) ... DONE [13:13:40.564] Resolving 1 futures (chunks) ... [13:13:40.565] resolve() on list ... [13:13:40.565] recursive: 0 [13:13:40.565] length: 1 [13:13:40.565] [13:13:40.565] resolved() for 'SequentialFuture' ... [13:13:40.565] - state: 'finished' [13:13:40.566] - run: TRUE [13:13:40.566] - result: 'FutureResult' [13:13:40.566] resolved() for 'SequentialFuture' ... done [13:13:40.566] Future #1 [13:13:40.566] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:40.567] - nx: 1 [13:13:40.567] - relay: TRUE [13:13:40.567] - stdout: TRUE [13:13:40.567] - signal: TRUE [13:13:40.567] - resignal: FALSE [13:13:40.567] - force: TRUE [13:13:40.567] - relayed: [n=1] FALSE [13:13:40.568] - queued futures: [n=1] FALSE [13:13:40.568] - until=1 [13:13:40.568] - relaying element #1 [13:13:40.568] - relayed: [n=1] TRUE [13:13:40.568] - queued futures: [n=1] TRUE [13:13:40.569] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:40.569] length: 0 (resolved future 1) [13:13:40.569] Relaying remaining futures [13:13:40.569] signalConditionsASAP(NULL, pos=0) ... [13:13:40.569] - nx: 1 [13:13:40.569] - relay: TRUE [13:13:40.570] - stdout: TRUE [13:13:40.570] - signal: TRUE [13:13:40.570] - resignal: FALSE [13:13:40.570] - force: TRUE [13:13:40.570] - relayed: [n=1] TRUE [13:13:40.570] - queued futures: [n=1] TRUE - flush all [13:13:40.571] - relayed: [n=1] TRUE [13:13:40.571] - queued futures: [n=1] TRUE [13:13:40.571] signalConditionsASAP(NULL, pos=0) ... done [13:13:40.571] resolve() on list ... DONE [13:13:40.571] - Number of value chunks collected: 1 [13:13:40.571] Resolving 1 futures (chunks) ... DONE [13:13:40.572] Reducing values from 1 chunks ... [13:13:40.572] - Number of values collected after concatenation: 2 [13:13:40.572] - Number of values expected: 2 [13:13:40.572] Reducing values from 1 chunks ... DONE [13:13:40.572] future_lapply() ... DONE - future_lapply(x, ...) where length(x) != length(as.list(x)) ... [13:13:40.573] future_lapply() ... [13:13:40.573] Number of chunks: 1 [13:13:40.573] getGlobalsAndPackagesXApply() ... [13:13:40.574] - future.globals: TRUE [13:13:40.574] getGlobalsAndPackages() ... [13:13:40.574] Searching for globals... [13:13:40.575] - globals found: [1] 'FUN' [13:13:40.575] Searching for globals ... DONE [13:13:40.575] Resolving globals: FALSE [13:13:40.575] The total size of the 1 globals is 56 bytes (56 bytes) [13:13:40.576] 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') [13:13:40.576] - globals: [1] 'FUN' [13:13:40.576] [13:13:40.576] getGlobalsAndPackages() ... DONE [13:13:40.576] - globals found/used: [n=1] 'FUN' [13:13:40.577] - needed namespaces: [n=0] [13:13:40.577] Finding globals ... DONE [13:13:40.577] - use_args: TRUE [13:13:40.577] - Getting '...' globals ... [13:13:40.577] resolve() on list ... [13:13:40.578] recursive: 0 [13:13:40.578] length: 1 [13:13:40.578] elements: '...' [13:13:40.578] length: 0 (resolved future 1) [13:13:40.578] resolve() on list ... DONE [13:13:40.578] - '...' content: [n=0] [13:13:40.579] List of 1 [13:13:40.579] $ ...: list() [13:13:40.579] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:40.579] - attr(*, "where")=List of 1 [13:13:40.579] ..$ ...: [13:13:40.579] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:40.579] - attr(*, "resolved")= logi TRUE [13:13:40.579] - attr(*, "total_size")= num NA [13:13:40.582] - Getting '...' globals ... DONE [13:13:40.582] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:40.582] List of 2 [13:13:40.582] $ ...future.FUN:function (x) [13:13:40.582] $ ... : list() [13:13:40.582] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:40.582] - attr(*, "where")=List of 2 [13:13:40.582] ..$ ...future.FUN: [13:13:40.582] ..$ ... : [13:13:40.582] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:40.582] - attr(*, "resolved")= logi FALSE [13:13:40.582] - attr(*, "total_size")= num 56 [13:13:40.585] Packages to be attached in all futures: [n=0] [13:13:40.586] getGlobalsAndPackagesXApply() ... DONE [13:13:40.586] Number of futures (= number of chunks): 1 [13:13:40.586] Launching 1 futures (chunks) ... [13:13:40.586] Chunk #1 of 1 ... [13:13:40.586] - Finding globals in 'X' for chunk #1 ... [13:13:40.587] getGlobalsAndPackages() ... [13:13:40.587] Searching for globals... [13:13:40.587] [13:13:40.587] Searching for globals ... DONE [13:13:40.587] - globals: [0] [13:13:40.587] getGlobalsAndPackages() ... DONE [13:13:40.588] + additional globals found: [n=0] [13:13:40.588] + additional namespaces needed: [n=0] [13:13:40.588] - Finding globals in 'X' for chunk #1 ... DONE [13:13:40.588] - seeds: [13:13:40.588] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:40.588] getGlobalsAndPackages() ... [13:13:40.589] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:40.589] Resolving globals: FALSE [13:13:40.589] Tweak future expression to call with '...' arguments ... [13:13:40.589] { [13:13:40.589] do.call(function(...) { [13:13:40.589] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:40.589] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:40.589] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:40.589] on.exit(options(oopts), add = TRUE) [13:13:40.589] } [13:13:40.589] { [13:13:40.589] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:40.589] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:40.589] ...future.FUN(...future.X_jj, ...) [13:13:40.589] }) [13:13:40.589] } [13:13:40.589] }, args = future.call.arguments) [13:13:40.589] } [13:13:40.590] Tweak future expression to call with '...' arguments ... DONE [13:13:40.590] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:40.590] [13:13:40.590] getGlobalsAndPackages() ... DONE [13:13:40.591] run() for 'Future' ... [13:13:40.591] - state: 'created' [13:13:40.591] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:13:40.592] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:40.592] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:40.592] - Field: 'label' [13:13:40.592] - Field: 'local' [13:13:40.592] - Field: 'owner' [13:13:40.593] - Field: 'envir' [13:13:40.593] - Field: 'packages' [13:13:40.593] - Field: 'gc' [13:13:40.593] - Field: 'conditions' [13:13:40.593] - Field: 'expr' [13:13:40.593] - Field: 'uuid' [13:13:40.594] - Field: 'seed' [13:13:40.594] - Field: 'version' [13:13:40.594] - Field: 'result' [13:13:40.594] - Field: 'asynchronous' [13:13:40.594] - Field: 'calls' [13:13:40.595] - Field: 'globals' [13:13:40.595] - Field: 'stdout' [13:13:40.595] - Field: 'earlySignal' [13:13:40.595] - Field: 'lazy' [13:13:40.595] - Field: 'state' [13:13:40.595] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:40.596] - Launch lazy future ... [13:13:40.596] Packages needed by the future expression (n = 0): [13:13:40.596] Packages needed by future strategies (n = 0): [13:13:40.597] { [13:13:40.597] { [13:13:40.597] { [13:13:40.597] ...future.startTime <- base::Sys.time() [13:13:40.597] { [13:13:40.597] { [13:13:40.597] { [13:13:40.597] base::local({ [13:13:40.597] has_future <- base::requireNamespace("future", [13:13:40.597] quietly = TRUE) [13:13:40.597] if (has_future) { [13:13:40.597] ns <- base::getNamespace("future") [13:13:40.597] version <- ns[[".package"]][["version"]] [13:13:40.597] if (is.null(version)) [13:13:40.597] version <- utils::packageVersion("future") [13:13:40.597] } [13:13:40.597] else { [13:13:40.597] version <- NULL [13:13:40.597] } [13:13:40.597] if (!has_future || version < "1.8.0") { [13:13:40.597] info <- base::c(r_version = base::gsub("R version ", [13:13:40.597] "", base::R.version$version.string), [13:13:40.597] platform = base::sprintf("%s (%s-bit)", [13:13:40.597] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:40.597] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:40.597] "release", "version")], collapse = " "), [13:13:40.597] hostname = base::Sys.info()[["nodename"]]) [13:13:40.597] info <- base::sprintf("%s: %s", base::names(info), [13:13:40.597] info) [13:13:40.597] info <- base::paste(info, collapse = "; ") [13:13:40.597] if (!has_future) { [13:13:40.597] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:40.597] info) [13:13:40.597] } [13:13:40.597] else { [13:13:40.597] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:40.597] info, version) [13:13:40.597] } [13:13:40.597] base::stop(msg) [13:13:40.597] } [13:13:40.597] }) [13:13:40.597] } [13:13:40.597] options(future.plan = NULL) [13:13:40.597] Sys.unsetenv("R_FUTURE_PLAN") [13:13:40.597] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:40.597] } [13:13:40.597] ...future.workdir <- getwd() [13:13:40.597] } [13:13:40.597] ...future.oldOptions <- base::as.list(base::.Options) [13:13:40.597] ...future.oldEnvVars <- base::Sys.getenv() [13:13:40.597] } [13:13:40.597] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:40.597] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:40.597] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:40.597] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:40.597] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:40.597] future.stdout.windows.reencode = NULL, width = 80L) [13:13:40.597] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:40.597] base::names(...future.oldOptions)) [13:13:40.597] } [13:13:40.597] if (FALSE) { [13:13:40.597] } [13:13:40.597] else { [13:13:40.597] if (TRUE) { [13:13:40.597] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:40.597] open = "w") [13:13:40.597] } [13:13:40.597] else { [13:13:40.597] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:40.597] windows = "NUL", "/dev/null"), open = "w") [13:13:40.597] } [13:13:40.597] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:40.597] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:40.597] base::sink(type = "output", split = FALSE) [13:13:40.597] base::close(...future.stdout) [13:13:40.597] }, add = TRUE) [13:13:40.597] } [13:13:40.597] ...future.frame <- base::sys.nframe() [13:13:40.597] ...future.conditions <- base::list() [13:13:40.597] ...future.rng <- base::globalenv()$.Random.seed [13:13:40.597] if (FALSE) { [13:13:40.597] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:40.597] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:40.597] } [13:13:40.597] ...future.result <- base::tryCatch({ [13:13:40.597] base::withCallingHandlers({ [13:13:40.597] ...future.value <- base::withVisible(base::local({ [13:13:40.597] do.call(function(...) { [13:13:40.597] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:40.597] if (!identical(...future.globals.maxSize.org, [13:13:40.597] ...future.globals.maxSize)) { [13:13:40.597] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:40.597] on.exit(options(oopts), add = TRUE) [13:13:40.597] } [13:13:40.597] { [13:13:40.597] lapply(seq_along(...future.elements_ii), [13:13:40.597] FUN = function(jj) { [13:13:40.597] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:40.597] ...future.FUN(...future.X_jj, ...) [13:13:40.597] }) [13:13:40.597] } [13:13:40.597] }, args = future.call.arguments) [13:13:40.597] })) [13:13:40.597] future::FutureResult(value = ...future.value$value, [13:13:40.597] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:40.597] ...future.rng), globalenv = if (FALSE) [13:13:40.597] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:40.597] ...future.globalenv.names)) [13:13:40.597] else NULL, started = ...future.startTime, version = "1.8") [13:13:40.597] }, condition = base::local({ [13:13:40.597] c <- base::c [13:13:40.597] inherits <- base::inherits [13:13:40.597] invokeRestart <- base::invokeRestart [13:13:40.597] length <- base::length [13:13:40.597] list <- base::list [13:13:40.597] seq.int <- base::seq.int [13:13:40.597] signalCondition <- base::signalCondition [13:13:40.597] sys.calls <- base::sys.calls [13:13:40.597] `[[` <- base::`[[` [13:13:40.597] `+` <- base::`+` [13:13:40.597] `<<-` <- base::`<<-` [13:13:40.597] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:40.597] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:40.597] 3L)] [13:13:40.597] } [13:13:40.597] function(cond) { [13:13:40.597] is_error <- inherits(cond, "error") [13:13:40.597] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:40.597] NULL) [13:13:40.597] if (is_error) { [13:13:40.597] sessionInformation <- function() { [13:13:40.597] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:40.597] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:40.597] search = base::search(), system = base::Sys.info()) [13:13:40.597] } [13:13:40.597] ...future.conditions[[length(...future.conditions) + [13:13:40.597] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:40.597] cond$call), session = sessionInformation(), [13:13:40.597] timestamp = base::Sys.time(), signaled = 0L) [13:13:40.597] signalCondition(cond) [13:13:40.597] } [13:13:40.597] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:40.597] "immediateCondition"))) { [13:13:40.597] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:40.597] ...future.conditions[[length(...future.conditions) + [13:13:40.597] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:40.597] if (TRUE && !signal) { [13:13:40.597] muffleCondition <- function (cond, pattern = "^muffle") [13:13:40.597] { [13:13:40.597] inherits <- base::inherits [13:13:40.597] invokeRestart <- base::invokeRestart [13:13:40.597] is.null <- base::is.null [13:13:40.597] muffled <- FALSE [13:13:40.597] if (inherits(cond, "message")) { [13:13:40.597] muffled <- grepl(pattern, "muffleMessage") [13:13:40.597] if (muffled) [13:13:40.597] invokeRestart("muffleMessage") [13:13:40.597] } [13:13:40.597] else if (inherits(cond, "warning")) { [13:13:40.597] muffled <- grepl(pattern, "muffleWarning") [13:13:40.597] if (muffled) [13:13:40.597] invokeRestart("muffleWarning") [13:13:40.597] } [13:13:40.597] else if (inherits(cond, "condition")) { [13:13:40.597] if (!is.null(pattern)) { [13:13:40.597] computeRestarts <- base::computeRestarts [13:13:40.597] grepl <- base::grepl [13:13:40.597] restarts <- computeRestarts(cond) [13:13:40.597] for (restart in restarts) { [13:13:40.597] name <- restart$name [13:13:40.597] if (is.null(name)) [13:13:40.597] next [13:13:40.597] if (!grepl(pattern, name)) [13:13:40.597] next [13:13:40.597] invokeRestart(restart) [13:13:40.597] muffled <- TRUE [13:13:40.597] break [13:13:40.597] } [13:13:40.597] } [13:13:40.597] } [13:13:40.597] invisible(muffled) [13:13:40.597] } [13:13:40.597] muffleCondition(cond, pattern = "^muffle") [13:13:40.597] } [13:13:40.597] } [13:13:40.597] else { [13:13:40.597] if (TRUE) { [13:13:40.597] muffleCondition <- function (cond, pattern = "^muffle") [13:13:40.597] { [13:13:40.597] inherits <- base::inherits [13:13:40.597] invokeRestart <- base::invokeRestart [13:13:40.597] is.null <- base::is.null [13:13:40.597] muffled <- FALSE [13:13:40.597] if (inherits(cond, "message")) { [13:13:40.597] muffled <- grepl(pattern, "muffleMessage") [13:13:40.597] if (muffled) [13:13:40.597] invokeRestart("muffleMessage") [13:13:40.597] } [13:13:40.597] else if (inherits(cond, "warning")) { [13:13:40.597] muffled <- grepl(pattern, "muffleWarning") [13:13:40.597] if (muffled) [13:13:40.597] invokeRestart("muffleWarning") [13:13:40.597] } [13:13:40.597] else if (inherits(cond, "condition")) { [13:13:40.597] if (!is.null(pattern)) { [13:13:40.597] computeRestarts <- base::computeRestarts [13:13:40.597] grepl <- base::grepl [13:13:40.597] restarts <- computeRestarts(cond) [13:13:40.597] for (restart in restarts) { [13:13:40.597] name <- restart$name [13:13:40.597] if (is.null(name)) [13:13:40.597] next [13:13:40.597] if (!grepl(pattern, name)) [13:13:40.597] next [13:13:40.597] invokeRestart(restart) [13:13:40.597] muffled <- TRUE [13:13:40.597] break [13:13:40.597] } [13:13:40.597] } [13:13:40.597] } [13:13:40.597] invisible(muffled) [13:13:40.597] } [13:13:40.597] muffleCondition(cond, pattern = "^muffle") [13:13:40.597] } [13:13:40.597] } [13:13:40.597] } [13:13:40.597] })) [13:13:40.597] }, error = function(ex) { [13:13:40.597] base::structure(base::list(value = NULL, visible = NULL, [13:13:40.597] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:40.597] ...future.rng), started = ...future.startTime, [13:13:40.597] finished = Sys.time(), session_uuid = NA_character_, [13:13:40.597] version = "1.8"), class = "FutureResult") [13:13:40.597] }, finally = { [13:13:40.597] if (!identical(...future.workdir, getwd())) [13:13:40.597] setwd(...future.workdir) [13:13:40.597] { [13:13:40.597] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:40.597] ...future.oldOptions$nwarnings <- NULL [13:13:40.597] } [13:13:40.597] base::options(...future.oldOptions) [13:13:40.597] if (.Platform$OS.type == "windows") { [13:13:40.597] old_names <- names(...future.oldEnvVars) [13:13:40.597] envs <- base::Sys.getenv() [13:13:40.597] names <- names(envs) [13:13:40.597] common <- intersect(names, old_names) [13:13:40.597] added <- setdiff(names, old_names) [13:13:40.597] removed <- setdiff(old_names, names) [13:13:40.597] changed <- common[...future.oldEnvVars[common] != [13:13:40.597] envs[common]] [13:13:40.597] NAMES <- toupper(changed) [13:13:40.597] args <- list() [13:13:40.597] for (kk in seq_along(NAMES)) { [13:13:40.597] name <- changed[[kk]] [13:13:40.597] NAME <- NAMES[[kk]] [13:13:40.597] if (name != NAME && is.element(NAME, old_names)) [13:13:40.597] next [13:13:40.597] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:40.597] } [13:13:40.597] NAMES <- toupper(added) [13:13:40.597] for (kk in seq_along(NAMES)) { [13:13:40.597] name <- added[[kk]] [13:13:40.597] NAME <- NAMES[[kk]] [13:13:40.597] if (name != NAME && is.element(NAME, old_names)) [13:13:40.597] next [13:13:40.597] args[[name]] <- "" [13:13:40.597] } [13:13:40.597] NAMES <- toupper(removed) [13:13:40.597] for (kk in seq_along(NAMES)) { [13:13:40.597] name <- removed[[kk]] [13:13:40.597] NAME <- NAMES[[kk]] [13:13:40.597] if (name != NAME && is.element(NAME, old_names)) [13:13:40.597] next [13:13:40.597] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:40.597] } [13:13:40.597] if (length(args) > 0) [13:13:40.597] base::do.call(base::Sys.setenv, args = args) [13:13:40.597] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:40.597] } [13:13:40.597] else { [13:13:40.597] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:40.597] } [13:13:40.597] { [13:13:40.597] if (base::length(...future.futureOptionsAdded) > [13:13:40.597] 0L) { [13:13:40.597] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:40.597] base::names(opts) <- ...future.futureOptionsAdded [13:13:40.597] base::options(opts) [13:13:40.597] } [13:13:40.597] { [13:13:40.597] { [13:13:40.597] NULL [13:13:40.597] RNGkind("Mersenne-Twister") [13:13:40.597] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:40.597] inherits = FALSE) [13:13:40.597] } [13:13:40.597] options(future.plan = NULL) [13:13:40.597] if (is.na(NA_character_)) [13:13:40.597] Sys.unsetenv("R_FUTURE_PLAN") [13:13:40.597] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:40.597] future::plan(list(function (..., envir = parent.frame()) [13:13:40.597] { [13:13:40.597] future <- SequentialFuture(..., envir = envir) [13:13:40.597] if (!future$lazy) [13:13:40.597] future <- run(future) [13:13:40.597] invisible(future) [13:13:40.597] }), .cleanup = FALSE, .init = FALSE) [13:13:40.597] } [13:13:40.597] } [13:13:40.597] } [13:13:40.597] }) [13:13:40.597] if (TRUE) { [13:13:40.597] base::sink(type = "output", split = FALSE) [13:13:40.597] if (TRUE) { [13:13:40.597] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:40.597] } [13:13:40.597] else { [13:13:40.597] ...future.result["stdout"] <- base::list(NULL) [13:13:40.597] } [13:13:40.597] base::close(...future.stdout) [13:13:40.597] ...future.stdout <- NULL [13:13:40.597] } [13:13:40.597] ...future.result$conditions <- ...future.conditions [13:13:40.597] ...future.result$finished <- base::Sys.time() [13:13:40.597] ...future.result [13:13:40.597] } [13:13:40.601] assign_globals() ... [13:13:40.601] List of 5 [13:13:40.601] $ ...future.FUN :function (x) [13:13:40.601] $ future.call.arguments : list() [13:13:40.601] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:40.601] $ ...future.elements_ii :List of 3 [13:13:40.601] ..$ a: num 1 [13:13:40.601] ..$ b: num 2 [13:13:40.601] ..$ c: num 3 [13:13:40.601] $ ...future.seeds_ii : NULL [13:13:40.601] $ ...future.globals.maxSize: NULL [13:13:40.601] - attr(*, "where")=List of 5 [13:13:40.601] ..$ ...future.FUN : [13:13:40.601] ..$ future.call.arguments : [13:13:40.601] ..$ ...future.elements_ii : [13:13:40.601] ..$ ...future.seeds_ii : [13:13:40.601] ..$ ...future.globals.maxSize: [13:13:40.601] - attr(*, "resolved")= logi FALSE [13:13:40.601] - attr(*, "total_size")= num 56 [13:13:40.601] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:40.601] - attr(*, "already-done")= logi TRUE [13:13:40.607] - copied '...future.FUN' to environment [13:13:40.608] - copied 'future.call.arguments' to environment [13:13:40.608] - copied '...future.elements_ii' to environment [13:13:40.608] - copied '...future.seeds_ii' to environment [13:13:40.608] - copied '...future.globals.maxSize' to environment [13:13:40.608] assign_globals() ... done [13:13:40.609] plan(): Setting new future strategy stack: [13:13:40.609] List of future strategies: [13:13:40.609] 1. sequential: [13:13:40.609] - args: function (..., envir = parent.frame(), workers = "") [13:13:40.609] - tweaked: FALSE [13:13:40.609] - call: NULL [13:13:40.609] plan(): nbrOfWorkers() = 1 [13:13:40.611] plan(): Setting new future strategy stack: [13:13:40.611] List of future strategies: [13:13:40.611] 1. sequential: [13:13:40.611] - args: function (..., envir = parent.frame(), workers = "") [13:13:40.611] - tweaked: FALSE [13:13:40.611] - call: plan(strategy) [13:13:40.611] plan(): nbrOfWorkers() = 1 [13:13:40.612] SequentialFuture started (and completed) [13:13:40.612] - Launch lazy future ... done [13:13:40.612] run() for 'SequentialFuture' ... done [13:13:40.612] Created future: [13:13:40.612] SequentialFuture: [13:13:40.612] Label: 'future_lapply-1' [13:13:40.612] Expression: [13:13:40.612] { [13:13:40.612] do.call(function(...) { [13:13:40.612] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:40.612] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:40.612] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:40.612] on.exit(options(oopts), add = TRUE) [13:13:40.612] } [13:13:40.612] { [13:13:40.612] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:40.612] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:40.612] ...future.FUN(...future.X_jj, ...) [13:13:40.612] }) [13:13:40.612] } [13:13:40.612] }, args = future.call.arguments) [13:13:40.612] } [13:13:40.612] Lazy evaluation: FALSE [13:13:40.612] Asynchronous evaluation: FALSE [13:13:40.612] Local evaluation: TRUE [13:13:40.612] Environment: R_GlobalEnv [13:13:40.612] Capture standard output: TRUE [13:13:40.612] Capture condition classes: 'condition' (excluding 'nothing') [13:13:40.612] 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) [13:13:40.612] Packages: [13:13:40.612] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:40.612] Resolved: TRUE [13:13:40.612] Value: 168 bytes of class 'list' [13:13:40.612] Early signaling: FALSE [13:13:40.612] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:40.612] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:40.614] Chunk #1 of 1 ... DONE [13:13:40.614] Launching 1 futures (chunks) ... DONE [13:13:40.614] Resolving 1 futures (chunks) ... [13:13:40.614] resolve() on list ... [13:13:40.614] recursive: 0 [13:13:40.615] length: 1 [13:13:40.615] [13:13:40.615] resolved() for 'SequentialFuture' ... [13:13:40.615] - state: 'finished' [13:13:40.615] - run: TRUE [13:13:40.616] - result: 'FutureResult' [13:13:40.616] resolved() for 'SequentialFuture' ... done [13:13:40.616] Future #1 [13:13:40.616] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:40.616] - nx: 1 [13:13:40.616] - relay: TRUE [13:13:40.617] - stdout: TRUE [13:13:40.617] - signal: TRUE [13:13:40.617] - resignal: FALSE [13:13:40.617] - force: TRUE [13:13:40.617] - relayed: [n=1] FALSE [13:13:40.617] - queued futures: [n=1] FALSE [13:13:40.618] - until=1 [13:13:40.618] - relaying element #1 [13:13:40.618] - relayed: [n=1] TRUE [13:13:40.618] - queued futures: [n=1] TRUE [13:13:40.618] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:40.619] length: 0 (resolved future 1) [13:13:40.619] Relaying remaining futures [13:13:40.619] signalConditionsASAP(NULL, pos=0) ... [13:13:40.619] - nx: 1 [13:13:40.619] - relay: TRUE [13:13:40.619] - stdout: TRUE [13:13:40.619] - signal: TRUE [13:13:40.620] - resignal: FALSE [13:13:40.620] - force: TRUE [13:13:40.620] - relayed: [n=1] TRUE [13:13:40.620] - queued futures: [n=1] TRUE - flush all [13:13:40.620] - relayed: [n=1] TRUE [13:13:40.620] - queued futures: [n=1] TRUE [13:13:40.621] signalConditionsASAP(NULL, pos=0) ... done [13:13:40.621] resolve() on list ... DONE [13:13:40.621] - Number of value chunks collected: 1 [13:13:40.621] Resolving 1 futures (chunks) ... DONE [13:13:40.621] Reducing values from 1 chunks ... [13:13:40.621] - Number of values collected after concatenation: 3 [13:13:40.622] - Number of values expected: 3 [13:13:40.622] Reducing values from 1 chunks ... DONE [13:13:40.622] future_lapply() ... DONE - future_lapply(x, ...) where x[[i]] subsets via S3 method ... [13:13:40.622] future_lapply() ... [13:13:40.623] Number of chunks: 1 [13:13:40.623] getGlobalsAndPackagesXApply() ... [13:13:40.623] - future.globals: TRUE [13:13:40.623] getGlobalsAndPackages() ... [13:13:40.624] Searching for globals... [13:13:40.625] - globals found: [1] 'FUN' [13:13:40.625] Searching for globals ... DONE [13:13:40.625] Resolving globals: FALSE [13:13:40.625] The total size of the 1 globals is 848 bytes (848 bytes) [13:13:40.626] 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') [13:13:40.626] - globals: [1] 'FUN' [13:13:40.626] [13:13:40.626] getGlobalsAndPackages() ... DONE [13:13:40.627] - globals found/used: [n=1] 'FUN' [13:13:40.627] - needed namespaces: [n=0] [13:13:40.628] Finding globals ... DONE [13:13:40.629] - use_args: TRUE [13:13:40.629] - Getting '...' globals ... [13:13:40.629] resolve() on list ... [13:13:40.629] recursive: 0 [13:13:40.629] length: 1 [13:13:40.630] elements: '...' [13:13:40.630] length: 0 (resolved future 1) [13:13:40.630] resolve() on list ... DONE [13:13:40.630] - '...' content: [n=0] [13:13:40.630] List of 1 [13:13:40.630] $ ...: list() [13:13:40.630] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:40.630] - attr(*, "where")=List of 1 [13:13:40.630] ..$ ...: [13:13:40.630] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:40.630] - attr(*, "resolved")= logi TRUE [13:13:40.630] - attr(*, "total_size")= num NA [13:13:40.633] - Getting '...' globals ... DONE [13:13:40.634] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:40.634] List of 2 [13:13:40.634] $ ...future.FUN:function (x) [13:13:40.634] $ ... : list() [13:13:40.634] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:40.634] - attr(*, "where")=List of 2 [13:13:40.634] ..$ ...future.FUN: [13:13:40.634] ..$ ... : [13:13:40.634] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:40.634] - attr(*, "resolved")= logi FALSE [13:13:40.634] - attr(*, "total_size")= num 848 [13:13:40.637] Packages to be attached in all futures: [n=0] [13:13:40.637] getGlobalsAndPackagesXApply() ... DONE [13:13:40.637] Number of futures (= number of chunks): 1 [13:13:40.638] Launching 1 futures (chunks) ... [13:13:40.638] Chunk #1 of 1 ... [13:13:40.638] - Finding globals in 'X' for chunk #1 ... [13:13:40.638] getGlobalsAndPackages() ... [13:13:40.638] Searching for globals... [13:13:40.638] [13:13:40.639] Searching for globals ... DONE [13:13:40.639] - globals: [0] [13:13:40.639] getGlobalsAndPackages() ... DONE [13:13:40.639] + additional globals found: [n=0] [13:13:40.639] + additional namespaces needed: [n=0] [13:13:40.639] - Finding globals in 'X' for chunk #1 ... DONE [13:13:40.640] - seeds: [13:13:40.640] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:40.640] getGlobalsAndPackages() ... [13:13:40.640] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:40.640] Resolving globals: FALSE [13:13:40.640] Tweak future expression to call with '...' arguments ... [13:13:40.641] { [13:13:40.641] do.call(function(...) { [13:13:40.641] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:40.641] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:40.641] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:40.641] on.exit(options(oopts), add = TRUE) [13:13:40.641] } [13:13:40.641] { [13:13:40.641] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:40.641] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:40.641] ...future.FUN(...future.X_jj, ...) [13:13:40.641] }) [13:13:40.641] } [13:13:40.641] }, args = future.call.arguments) [13:13:40.641] } [13:13:40.641] Tweak future expression to call with '...' arguments ... DONE [13:13:40.641] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:40.642] [13:13:40.642] getGlobalsAndPackages() ... DONE [13:13:40.642] run() for 'Future' ... [13:13:40.642] - state: 'created' [13:13:40.642] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:13:40.643] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:40.643] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:40.643] - Field: 'label' [13:13:40.643] - Field: 'local' [13:13:40.643] - Field: 'owner' [13:13:40.644] - Field: 'envir' [13:13:40.644] - Field: 'packages' [13:13:40.644] - Field: 'gc' [13:13:40.644] - Field: 'conditions' [13:13:40.644] - Field: 'expr' [13:13:40.644] - Field: 'uuid' [13:13:40.645] - Field: 'seed' [13:13:40.645] - Field: 'version' [13:13:40.645] - Field: 'result' [13:13:40.645] - Field: 'asynchronous' [13:13:40.645] - Field: 'calls' [13:13:40.645] - Field: 'globals' [13:13:40.646] - Field: 'stdout' [13:13:40.646] - Field: 'earlySignal' [13:13:40.646] - Field: 'lazy' [13:13:40.646] - Field: 'state' [13:13:40.646] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:40.646] - Launch lazy future ... [13:13:40.647] Packages needed by the future expression (n = 0): [13:13:40.647] Packages needed by future strategies (n = 0): [13:13:40.647] { [13:13:40.647] { [13:13:40.647] { [13:13:40.647] ...future.startTime <- base::Sys.time() [13:13:40.647] { [13:13:40.647] { [13:13:40.647] { [13:13:40.647] base::local({ [13:13:40.647] has_future <- base::requireNamespace("future", [13:13:40.647] quietly = TRUE) [13:13:40.647] if (has_future) { [13:13:40.647] ns <- base::getNamespace("future") [13:13:40.647] version <- ns[[".package"]][["version"]] [13:13:40.647] if (is.null(version)) [13:13:40.647] version <- utils::packageVersion("future") [13:13:40.647] } [13:13:40.647] else { [13:13:40.647] version <- NULL [13:13:40.647] } [13:13:40.647] if (!has_future || version < "1.8.0") { [13:13:40.647] info <- base::c(r_version = base::gsub("R version ", [13:13:40.647] "", base::R.version$version.string), [13:13:40.647] platform = base::sprintf("%s (%s-bit)", [13:13:40.647] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:40.647] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:40.647] "release", "version")], collapse = " "), [13:13:40.647] hostname = base::Sys.info()[["nodename"]]) [13:13:40.647] info <- base::sprintf("%s: %s", base::names(info), [13:13:40.647] info) [13:13:40.647] info <- base::paste(info, collapse = "; ") [13:13:40.647] if (!has_future) { [13:13:40.647] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:40.647] info) [13:13:40.647] } [13:13:40.647] else { [13:13:40.647] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:40.647] info, version) [13:13:40.647] } [13:13:40.647] base::stop(msg) [13:13:40.647] } [13:13:40.647] }) [13:13:40.647] } [13:13:40.647] options(future.plan = NULL) [13:13:40.647] Sys.unsetenv("R_FUTURE_PLAN") [13:13:40.647] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:40.647] } [13:13:40.647] ...future.workdir <- getwd() [13:13:40.647] } [13:13:40.647] ...future.oldOptions <- base::as.list(base::.Options) [13:13:40.647] ...future.oldEnvVars <- base::Sys.getenv() [13:13:40.647] } [13:13:40.647] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:40.647] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:40.647] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:40.647] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:40.647] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:40.647] future.stdout.windows.reencode = NULL, width = 80L) [13:13:40.647] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:40.647] base::names(...future.oldOptions)) [13:13:40.647] } [13:13:40.647] if (FALSE) { [13:13:40.647] } [13:13:40.647] else { [13:13:40.647] if (TRUE) { [13:13:40.647] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:40.647] open = "w") [13:13:40.647] } [13:13:40.647] else { [13:13:40.647] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:40.647] windows = "NUL", "/dev/null"), open = "w") [13:13:40.647] } [13:13:40.647] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:40.647] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:40.647] base::sink(type = "output", split = FALSE) [13:13:40.647] base::close(...future.stdout) [13:13:40.647] }, add = TRUE) [13:13:40.647] } [13:13:40.647] ...future.frame <- base::sys.nframe() [13:13:40.647] ...future.conditions <- base::list() [13:13:40.647] ...future.rng <- base::globalenv()$.Random.seed [13:13:40.647] if (FALSE) { [13:13:40.647] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:40.647] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:40.647] } [13:13:40.647] ...future.result <- base::tryCatch({ [13:13:40.647] base::withCallingHandlers({ [13:13:40.647] ...future.value <- base::withVisible(base::local({ [13:13:40.647] do.call(function(...) { [13:13:40.647] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:40.647] if (!identical(...future.globals.maxSize.org, [13:13:40.647] ...future.globals.maxSize)) { [13:13:40.647] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:40.647] on.exit(options(oopts), add = TRUE) [13:13:40.647] } [13:13:40.647] { [13:13:40.647] lapply(seq_along(...future.elements_ii), [13:13:40.647] FUN = function(jj) { [13:13:40.647] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:40.647] ...future.FUN(...future.X_jj, ...) [13:13:40.647] }) [13:13:40.647] } [13:13:40.647] }, args = future.call.arguments) [13:13:40.647] })) [13:13:40.647] future::FutureResult(value = ...future.value$value, [13:13:40.647] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:40.647] ...future.rng), globalenv = if (FALSE) [13:13:40.647] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:40.647] ...future.globalenv.names)) [13:13:40.647] else NULL, started = ...future.startTime, version = "1.8") [13:13:40.647] }, condition = base::local({ [13:13:40.647] c <- base::c [13:13:40.647] inherits <- base::inherits [13:13:40.647] invokeRestart <- base::invokeRestart [13:13:40.647] length <- base::length [13:13:40.647] list <- base::list [13:13:40.647] seq.int <- base::seq.int [13:13:40.647] signalCondition <- base::signalCondition [13:13:40.647] sys.calls <- base::sys.calls [13:13:40.647] `[[` <- base::`[[` [13:13:40.647] `+` <- base::`+` [13:13:40.647] `<<-` <- base::`<<-` [13:13:40.647] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:40.647] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:40.647] 3L)] [13:13:40.647] } [13:13:40.647] function(cond) { [13:13:40.647] is_error <- inherits(cond, "error") [13:13:40.647] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:40.647] NULL) [13:13:40.647] if (is_error) { [13:13:40.647] sessionInformation <- function() { [13:13:40.647] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:40.647] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:40.647] search = base::search(), system = base::Sys.info()) [13:13:40.647] } [13:13:40.647] ...future.conditions[[length(...future.conditions) + [13:13:40.647] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:40.647] cond$call), session = sessionInformation(), [13:13:40.647] timestamp = base::Sys.time(), signaled = 0L) [13:13:40.647] signalCondition(cond) [13:13:40.647] } [13:13:40.647] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:40.647] "immediateCondition"))) { [13:13:40.647] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:40.647] ...future.conditions[[length(...future.conditions) + [13:13:40.647] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:40.647] if (TRUE && !signal) { [13:13:40.647] muffleCondition <- function (cond, pattern = "^muffle") [13:13:40.647] { [13:13:40.647] inherits <- base::inherits [13:13:40.647] invokeRestart <- base::invokeRestart [13:13:40.647] is.null <- base::is.null [13:13:40.647] muffled <- FALSE [13:13:40.647] if (inherits(cond, "message")) { [13:13:40.647] muffled <- grepl(pattern, "muffleMessage") [13:13:40.647] if (muffled) [13:13:40.647] invokeRestart("muffleMessage") [13:13:40.647] } [13:13:40.647] else if (inherits(cond, "warning")) { [13:13:40.647] muffled <- grepl(pattern, "muffleWarning") [13:13:40.647] if (muffled) [13:13:40.647] invokeRestart("muffleWarning") [13:13:40.647] } [13:13:40.647] else if (inherits(cond, "condition")) { [13:13:40.647] if (!is.null(pattern)) { [13:13:40.647] computeRestarts <- base::computeRestarts [13:13:40.647] grepl <- base::grepl [13:13:40.647] restarts <- computeRestarts(cond) [13:13:40.647] for (restart in restarts) { [13:13:40.647] name <- restart$name [13:13:40.647] if (is.null(name)) [13:13:40.647] next [13:13:40.647] if (!grepl(pattern, name)) [13:13:40.647] next [13:13:40.647] invokeRestart(restart) [13:13:40.647] muffled <- TRUE [13:13:40.647] break [13:13:40.647] } [13:13:40.647] } [13:13:40.647] } [13:13:40.647] invisible(muffled) [13:13:40.647] } [13:13:40.647] muffleCondition(cond, pattern = "^muffle") [13:13:40.647] } [13:13:40.647] } [13:13:40.647] else { [13:13:40.647] if (TRUE) { [13:13:40.647] muffleCondition <- function (cond, pattern = "^muffle") [13:13:40.647] { [13:13:40.647] inherits <- base::inherits [13:13:40.647] invokeRestart <- base::invokeRestart [13:13:40.647] is.null <- base::is.null [13:13:40.647] muffled <- FALSE [13:13:40.647] if (inherits(cond, "message")) { [13:13:40.647] muffled <- grepl(pattern, "muffleMessage") [13:13:40.647] if (muffled) [13:13:40.647] invokeRestart("muffleMessage") [13:13:40.647] } [13:13:40.647] else if (inherits(cond, "warning")) { [13:13:40.647] muffled <- grepl(pattern, "muffleWarning") [13:13:40.647] if (muffled) [13:13:40.647] invokeRestart("muffleWarning") [13:13:40.647] } [13:13:40.647] else if (inherits(cond, "condition")) { [13:13:40.647] if (!is.null(pattern)) { [13:13:40.647] computeRestarts <- base::computeRestarts [13:13:40.647] grepl <- base::grepl [13:13:40.647] restarts <- computeRestarts(cond) [13:13:40.647] for (restart in restarts) { [13:13:40.647] name <- restart$name [13:13:40.647] if (is.null(name)) [13:13:40.647] next [13:13:40.647] if (!grepl(pattern, name)) [13:13:40.647] next [13:13:40.647] invokeRestart(restart) [13:13:40.647] muffled <- TRUE [13:13:40.647] break [13:13:40.647] } [13:13:40.647] } [13:13:40.647] } [13:13:40.647] invisible(muffled) [13:13:40.647] } [13:13:40.647] muffleCondition(cond, pattern = "^muffle") [13:13:40.647] } [13:13:40.647] } [13:13:40.647] } [13:13:40.647] })) [13:13:40.647] }, error = function(ex) { [13:13:40.647] base::structure(base::list(value = NULL, visible = NULL, [13:13:40.647] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:40.647] ...future.rng), started = ...future.startTime, [13:13:40.647] finished = Sys.time(), session_uuid = NA_character_, [13:13:40.647] version = "1.8"), class = "FutureResult") [13:13:40.647] }, finally = { [13:13:40.647] if (!identical(...future.workdir, getwd())) [13:13:40.647] setwd(...future.workdir) [13:13:40.647] { [13:13:40.647] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:40.647] ...future.oldOptions$nwarnings <- NULL [13:13:40.647] } [13:13:40.647] base::options(...future.oldOptions) [13:13:40.647] if (.Platform$OS.type == "windows") { [13:13:40.647] old_names <- names(...future.oldEnvVars) [13:13:40.647] envs <- base::Sys.getenv() [13:13:40.647] names <- names(envs) [13:13:40.647] common <- intersect(names, old_names) [13:13:40.647] added <- setdiff(names, old_names) [13:13:40.647] removed <- setdiff(old_names, names) [13:13:40.647] changed <- common[...future.oldEnvVars[common] != [13:13:40.647] envs[common]] [13:13:40.647] NAMES <- toupper(changed) [13:13:40.647] args <- list() [13:13:40.647] for (kk in seq_along(NAMES)) { [13:13:40.647] name <- changed[[kk]] [13:13:40.647] NAME <- NAMES[[kk]] [13:13:40.647] if (name != NAME && is.element(NAME, old_names)) [13:13:40.647] next [13:13:40.647] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:40.647] } [13:13:40.647] NAMES <- toupper(added) [13:13:40.647] for (kk in seq_along(NAMES)) { [13:13:40.647] name <- added[[kk]] [13:13:40.647] NAME <- NAMES[[kk]] [13:13:40.647] if (name != NAME && is.element(NAME, old_names)) [13:13:40.647] next [13:13:40.647] args[[name]] <- "" [13:13:40.647] } [13:13:40.647] NAMES <- toupper(removed) [13:13:40.647] for (kk in seq_along(NAMES)) { [13:13:40.647] name <- removed[[kk]] [13:13:40.647] NAME <- NAMES[[kk]] [13:13:40.647] if (name != NAME && is.element(NAME, old_names)) [13:13:40.647] next [13:13:40.647] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:40.647] } [13:13:40.647] if (length(args) > 0) [13:13:40.647] base::do.call(base::Sys.setenv, args = args) [13:13:40.647] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:40.647] } [13:13:40.647] else { [13:13:40.647] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:40.647] } [13:13:40.647] { [13:13:40.647] if (base::length(...future.futureOptionsAdded) > [13:13:40.647] 0L) { [13:13:40.647] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:40.647] base::names(opts) <- ...future.futureOptionsAdded [13:13:40.647] base::options(opts) [13:13:40.647] } [13:13:40.647] { [13:13:40.647] { [13:13:40.647] NULL [13:13:40.647] RNGkind("Mersenne-Twister") [13:13:40.647] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:40.647] inherits = FALSE) [13:13:40.647] } [13:13:40.647] options(future.plan = NULL) [13:13:40.647] if (is.na(NA_character_)) [13:13:40.647] Sys.unsetenv("R_FUTURE_PLAN") [13:13:40.647] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:40.647] future::plan(list(function (..., envir = parent.frame()) [13:13:40.647] { [13:13:40.647] future <- SequentialFuture(..., envir = envir) [13:13:40.647] if (!future$lazy) [13:13:40.647] future <- run(future) [13:13:40.647] invisible(future) [13:13:40.647] }), .cleanup = FALSE, .init = FALSE) [13:13:40.647] } [13:13:40.647] } [13:13:40.647] } [13:13:40.647] }) [13:13:40.647] if (TRUE) { [13:13:40.647] base::sink(type = "output", split = FALSE) [13:13:40.647] if (TRUE) { [13:13:40.647] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:40.647] } [13:13:40.647] else { [13:13:40.647] ...future.result["stdout"] <- base::list(NULL) [13:13:40.647] } [13:13:40.647] base::close(...future.stdout) [13:13:40.647] ...future.stdout <- NULL [13:13:40.647] } [13:13:40.647] ...future.result$conditions <- ...future.conditions [13:13:40.647] ...future.result$finished <- base::Sys.time() [13:13:40.647] ...future.result [13:13:40.647] } [13:13:40.651] assign_globals() ... [13:13:40.651] List of 5 [13:13:40.651] $ ...future.FUN :function (x) [13:13:40.651] $ future.call.arguments : list() [13:13:40.651] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:40.651] $ ...future.elements_ii :List of 2 [13:13:40.651] ..$ a: num 0 [13:13:40.651] ..$ b: num 0 [13:13:40.651] $ ...future.seeds_ii : NULL [13:13:40.651] $ ...future.globals.maxSize: NULL [13:13:40.651] - attr(*, "where")=List of 5 [13:13:40.651] ..$ ...future.FUN : [13:13:40.651] ..$ future.call.arguments : [13:13:40.651] ..$ ...future.elements_ii : [13:13:40.651] ..$ ...future.seeds_ii : [13:13:40.651] ..$ ...future.globals.maxSize: [13:13:40.651] - attr(*, "resolved")= logi FALSE [13:13:40.651] - attr(*, "total_size")= num 848 [13:13:40.651] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:40.651] - attr(*, "already-done")= logi TRUE [13:13:40.657] - copied '...future.FUN' to environment [13:13:40.657] - copied 'future.call.arguments' to environment [13:13:40.657] - copied '...future.elements_ii' to environment [13:13:40.657] - copied '...future.seeds_ii' to environment [13:13:40.658] - copied '...future.globals.maxSize' to environment [13:13:40.658] assign_globals() ... done [13:13:40.658] plan(): Setting new future strategy stack: [13:13:40.658] List of future strategies: [13:13:40.658] 1. sequential: [13:13:40.658] - args: function (..., envir = parent.frame(), workers = "") [13:13:40.658] - tweaked: FALSE [13:13:40.658] - call: NULL [13:13:40.659] plan(): nbrOfWorkers() = 1 [13:13:40.660] plan(): Setting new future strategy stack: [13:13:40.660] List of future strategies: [13:13:40.660] 1. sequential: [13:13:40.660] - args: function (..., envir = parent.frame(), workers = "") [13:13:40.660] - tweaked: FALSE [13:13:40.660] - call: plan(strategy) [13:13:40.661] plan(): nbrOfWorkers() = 1 [13:13:40.661] SequentialFuture started (and completed) [13:13:40.661] - Launch lazy future ... done [13:13:40.661] run() for 'SequentialFuture' ... done [13:13:40.662] Created future: [13:13:40.662] SequentialFuture: [13:13:40.662] Label: 'future_lapply-1' [13:13:40.662] Expression: [13:13:40.662] { [13:13:40.662] do.call(function(...) { [13:13:40.662] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:40.662] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:40.662] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:40.662] on.exit(options(oopts), add = TRUE) [13:13:40.662] } [13:13:40.662] { [13:13:40.662] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:40.662] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:40.662] ...future.FUN(...future.X_jj, ...) [13:13:40.662] }) [13:13:40.662] } [13:13:40.662] }, args = future.call.arguments) [13:13:40.662] } [13:13:40.662] Lazy evaluation: FALSE [13:13:40.662] Asynchronous evaluation: FALSE [13:13:40.662] Local evaluation: TRUE [13:13:40.662] Environment: R_GlobalEnv [13:13:40.662] Capture standard output: TRUE [13:13:40.662] Capture condition classes: 'condition' (excluding 'nothing') [13:13:40.662] 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) [13:13:40.662] Packages: [13:13:40.662] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:40.662] Resolved: TRUE [13:13:40.662] Value: 112 bytes of class 'list' [13:13:40.662] Early signaling: FALSE [13:13:40.662] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:40.662] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:40.663] Chunk #1 of 1 ... DONE [13:13:40.663] Launching 1 futures (chunks) ... DONE [13:13:40.663] Resolving 1 futures (chunks) ... [13:13:40.663] resolve() on list ... [13:13:40.664] recursive: 0 [13:13:40.664] length: 1 [13:13:40.664] [13:13:40.664] resolved() for 'SequentialFuture' ... [13:13:40.664] - state: 'finished' [13:13:40.664] - run: TRUE [13:13:40.664] - result: 'FutureResult' [13:13:40.665] resolved() for 'SequentialFuture' ... done [13:13:40.665] Future #1 [13:13:40.665] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:40.665] - nx: 1 [13:13:40.665] - relay: TRUE [13:13:40.666] - stdout: TRUE [13:13:40.666] - signal: TRUE [13:13:40.666] - resignal: FALSE [13:13:40.666] - force: TRUE [13:13:40.666] - relayed: [n=1] FALSE [13:13:40.666] - queued futures: [n=1] FALSE [13:13:40.666] - until=1 [13:13:40.667] - relaying element #1 [13:13:40.667] - relayed: [n=1] TRUE [13:13:40.667] - queued futures: [n=1] TRUE [13:13:40.667] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:40.667] length: 0 (resolved future 1) [13:13:40.667] Relaying remaining futures [13:13:40.668] signalConditionsASAP(NULL, pos=0) ... [13:13:40.668] - nx: 1 [13:13:40.668] - relay: TRUE [13:13:40.668] - stdout: TRUE [13:13:40.668] - signal: TRUE [13:13:40.668] - resignal: FALSE [13:13:40.669] - force: TRUE [13:13:40.669] - relayed: [n=1] TRUE [13:13:40.669] - queued futures: [n=1] TRUE - flush all [13:13:40.669] - relayed: [n=1] TRUE [13:13:40.669] - queued futures: [n=1] TRUE [13:13:40.669] signalConditionsASAP(NULL, pos=0) ... done [13:13:40.669] resolve() on list ... DONE [13:13:40.670] - Number of value chunks collected: 1 [13:13:40.670] Resolving 1 futures (chunks) ... DONE [13:13:40.670] Reducing values from 1 chunks ... [13:13:40.670] - Number of values collected after concatenation: 2 [13:13:40.670] - Number of values expected: 2 [13:13:40.670] Reducing values from 1 chunks ... DONE [13:13:40.671] future_lapply() ... DONE - plan('multisession') ... [13:13:40.671] plan(): Setting new future strategy stack: [13:13:40.671] List of future strategies: [13:13:40.671] 1. multisession: [13:13:40.671] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [13:13:40.671] - tweaked: FALSE [13:13:40.671] - call: plan(strategy) [13:13:40.672] plan(): plan_init() of 'multisession', 'cluster', 'multiprocess', 'future', 'function' ... [13:13:40.672] multisession: [13:13:40.672] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [13:13:40.672] - tweaked: FALSE [13:13:40.672] - call: plan(strategy) [13:13:40.674] getGlobalsAndPackages() ... [13:13:40.674] Not searching for globals [13:13:40.675] - globals: [0] [13:13:40.675] getGlobalsAndPackages() ... DONE [13:13:40.675] Packages needed by the future expression (n = 0): [13:13:40.675] Packages needed by future strategies (n = 0): [13:13:40.676] { [13:13:40.676] { [13:13:40.676] { [13:13:40.676] ...future.startTime <- base::Sys.time() [13:13:40.676] { [13:13:40.676] { [13:13:40.676] { [13:13:40.676] base::local({ [13:13:40.676] has_future <- base::requireNamespace("future", [13:13:40.676] quietly = TRUE) [13:13:40.676] if (has_future) { [13:13:40.676] ns <- base::getNamespace("future") [13:13:40.676] version <- ns[[".package"]][["version"]] [13:13:40.676] if (is.null(version)) [13:13:40.676] version <- utils::packageVersion("future") [13:13:40.676] } [13:13:40.676] else { [13:13:40.676] version <- NULL [13:13:40.676] } [13:13:40.676] if (!has_future || version < "1.8.0") { [13:13:40.676] info <- base::c(r_version = base::gsub("R version ", [13:13:40.676] "", base::R.version$version.string), [13:13:40.676] platform = base::sprintf("%s (%s-bit)", [13:13:40.676] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:40.676] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:40.676] "release", "version")], collapse = " "), [13:13:40.676] hostname = base::Sys.info()[["nodename"]]) [13:13:40.676] info <- base::sprintf("%s: %s", base::names(info), [13:13:40.676] info) [13:13:40.676] info <- base::paste(info, collapse = "; ") [13:13:40.676] if (!has_future) { [13:13:40.676] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:40.676] info) [13:13:40.676] } [13:13:40.676] else { [13:13:40.676] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:40.676] info, version) [13:13:40.676] } [13:13:40.676] base::stop(msg) [13:13:40.676] } [13:13:40.676] }) [13:13:40.676] } [13:13:40.676] options(future.plan = NULL) [13:13:40.676] Sys.unsetenv("R_FUTURE_PLAN") [13:13:40.676] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:40.676] } [13:13:40.676] ...future.workdir <- getwd() [13:13:40.676] } [13:13:40.676] ...future.oldOptions <- base::as.list(base::.Options) [13:13:40.676] ...future.oldEnvVars <- base::Sys.getenv() [13:13:40.676] } [13:13:40.676] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:40.676] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:40.676] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:40.676] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:40.676] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:40.676] future.stdout.windows.reencode = NULL, width = 80L) [13:13:40.676] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:40.676] base::names(...future.oldOptions)) [13:13:40.676] } [13:13:40.676] if (FALSE) { [13:13:40.676] } [13:13:40.676] else { [13:13:40.676] if (TRUE) { [13:13:40.676] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:40.676] open = "w") [13:13:40.676] } [13:13:40.676] else { [13:13:40.676] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:40.676] windows = "NUL", "/dev/null"), open = "w") [13:13:40.676] } [13:13:40.676] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:40.676] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:40.676] base::sink(type = "output", split = FALSE) [13:13:40.676] base::close(...future.stdout) [13:13:40.676] }, add = TRUE) [13:13:40.676] } [13:13:40.676] ...future.frame <- base::sys.nframe() [13:13:40.676] ...future.conditions <- base::list() [13:13:40.676] ...future.rng <- base::globalenv()$.Random.seed [13:13:40.676] if (FALSE) { [13:13:40.676] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:40.676] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:40.676] } [13:13:40.676] ...future.result <- base::tryCatch({ [13:13:40.676] base::withCallingHandlers({ [13:13:40.676] ...future.value <- base::withVisible(base::local(NA)) [13:13:40.676] future::FutureResult(value = ...future.value$value, [13:13:40.676] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:40.676] ...future.rng), globalenv = if (FALSE) [13:13:40.676] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:40.676] ...future.globalenv.names)) [13:13:40.676] else NULL, started = ...future.startTime, version = "1.8") [13:13:40.676] }, condition = base::local({ [13:13:40.676] c <- base::c [13:13:40.676] inherits <- base::inherits [13:13:40.676] invokeRestart <- base::invokeRestart [13:13:40.676] length <- base::length [13:13:40.676] list <- base::list [13:13:40.676] seq.int <- base::seq.int [13:13:40.676] signalCondition <- base::signalCondition [13:13:40.676] sys.calls <- base::sys.calls [13:13:40.676] `[[` <- base::`[[` [13:13:40.676] `+` <- base::`+` [13:13:40.676] `<<-` <- base::`<<-` [13:13:40.676] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:40.676] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:40.676] 3L)] [13:13:40.676] } [13:13:40.676] function(cond) { [13:13:40.676] is_error <- inherits(cond, "error") [13:13:40.676] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:40.676] NULL) [13:13:40.676] if (is_error) { [13:13:40.676] sessionInformation <- function() { [13:13:40.676] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:40.676] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:40.676] search = base::search(), system = base::Sys.info()) [13:13:40.676] } [13:13:40.676] ...future.conditions[[length(...future.conditions) + [13:13:40.676] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:40.676] cond$call), session = sessionInformation(), [13:13:40.676] timestamp = base::Sys.time(), signaled = 0L) [13:13:40.676] signalCondition(cond) [13:13:40.676] } [13:13:40.676] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:40.676] "immediateCondition"))) { [13:13:40.676] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:40.676] ...future.conditions[[length(...future.conditions) + [13:13:40.676] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:40.676] if (TRUE && !signal) { [13:13:40.676] muffleCondition <- function (cond, pattern = "^muffle") [13:13:40.676] { [13:13:40.676] inherits <- base::inherits [13:13:40.676] invokeRestart <- base::invokeRestart [13:13:40.676] is.null <- base::is.null [13:13:40.676] muffled <- FALSE [13:13:40.676] if (inherits(cond, "message")) { [13:13:40.676] muffled <- grepl(pattern, "muffleMessage") [13:13:40.676] if (muffled) [13:13:40.676] invokeRestart("muffleMessage") [13:13:40.676] } [13:13:40.676] else if (inherits(cond, "warning")) { [13:13:40.676] muffled <- grepl(pattern, "muffleWarning") [13:13:40.676] if (muffled) [13:13:40.676] invokeRestart("muffleWarning") [13:13:40.676] } [13:13:40.676] else if (inherits(cond, "condition")) { [13:13:40.676] if (!is.null(pattern)) { [13:13:40.676] computeRestarts <- base::computeRestarts [13:13:40.676] grepl <- base::grepl [13:13:40.676] restarts <- computeRestarts(cond) [13:13:40.676] for (restart in restarts) { [13:13:40.676] name <- restart$name [13:13:40.676] if (is.null(name)) [13:13:40.676] next [13:13:40.676] if (!grepl(pattern, name)) [13:13:40.676] next [13:13:40.676] invokeRestart(restart) [13:13:40.676] muffled <- TRUE [13:13:40.676] break [13:13:40.676] } [13:13:40.676] } [13:13:40.676] } [13:13:40.676] invisible(muffled) [13:13:40.676] } [13:13:40.676] muffleCondition(cond, pattern = "^muffle") [13:13:40.676] } [13:13:40.676] } [13:13:40.676] else { [13:13:40.676] if (TRUE) { [13:13:40.676] muffleCondition <- function (cond, pattern = "^muffle") [13:13:40.676] { [13:13:40.676] inherits <- base::inherits [13:13:40.676] invokeRestart <- base::invokeRestart [13:13:40.676] is.null <- base::is.null [13:13:40.676] muffled <- FALSE [13:13:40.676] if (inherits(cond, "message")) { [13:13:40.676] muffled <- grepl(pattern, "muffleMessage") [13:13:40.676] if (muffled) [13:13:40.676] invokeRestart("muffleMessage") [13:13:40.676] } [13:13:40.676] else if (inherits(cond, "warning")) { [13:13:40.676] muffled <- grepl(pattern, "muffleWarning") [13:13:40.676] if (muffled) [13:13:40.676] invokeRestart("muffleWarning") [13:13:40.676] } [13:13:40.676] else if (inherits(cond, "condition")) { [13:13:40.676] if (!is.null(pattern)) { [13:13:40.676] computeRestarts <- base::computeRestarts [13:13:40.676] grepl <- base::grepl [13:13:40.676] restarts <- computeRestarts(cond) [13:13:40.676] for (restart in restarts) { [13:13:40.676] name <- restart$name [13:13:40.676] if (is.null(name)) [13:13:40.676] next [13:13:40.676] if (!grepl(pattern, name)) [13:13:40.676] next [13:13:40.676] invokeRestart(restart) [13:13:40.676] muffled <- TRUE [13:13:40.676] break [13:13:40.676] } [13:13:40.676] } [13:13:40.676] } [13:13:40.676] invisible(muffled) [13:13:40.676] } [13:13:40.676] muffleCondition(cond, pattern = "^muffle") [13:13:40.676] } [13:13:40.676] } [13:13:40.676] } [13:13:40.676] })) [13:13:40.676] }, error = function(ex) { [13:13:40.676] base::structure(base::list(value = NULL, visible = NULL, [13:13:40.676] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:40.676] ...future.rng), started = ...future.startTime, [13:13:40.676] finished = Sys.time(), session_uuid = NA_character_, [13:13:40.676] version = "1.8"), class = "FutureResult") [13:13:40.676] }, finally = { [13:13:40.676] if (!identical(...future.workdir, getwd())) [13:13:40.676] setwd(...future.workdir) [13:13:40.676] { [13:13:40.676] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:40.676] ...future.oldOptions$nwarnings <- NULL [13:13:40.676] } [13:13:40.676] base::options(...future.oldOptions) [13:13:40.676] if (.Platform$OS.type == "windows") { [13:13:40.676] old_names <- names(...future.oldEnvVars) [13:13:40.676] envs <- base::Sys.getenv() [13:13:40.676] names <- names(envs) [13:13:40.676] common <- intersect(names, old_names) [13:13:40.676] added <- setdiff(names, old_names) [13:13:40.676] removed <- setdiff(old_names, names) [13:13:40.676] changed <- common[...future.oldEnvVars[common] != [13:13:40.676] envs[common]] [13:13:40.676] NAMES <- toupper(changed) [13:13:40.676] args <- list() [13:13:40.676] for (kk in seq_along(NAMES)) { [13:13:40.676] name <- changed[[kk]] [13:13:40.676] NAME <- NAMES[[kk]] [13:13:40.676] if (name != NAME && is.element(NAME, old_names)) [13:13:40.676] next [13:13:40.676] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:40.676] } [13:13:40.676] NAMES <- toupper(added) [13:13:40.676] for (kk in seq_along(NAMES)) { [13:13:40.676] name <- added[[kk]] [13:13:40.676] NAME <- NAMES[[kk]] [13:13:40.676] if (name != NAME && is.element(NAME, old_names)) [13:13:40.676] next [13:13:40.676] args[[name]] <- "" [13:13:40.676] } [13:13:40.676] NAMES <- toupper(removed) [13:13:40.676] for (kk in seq_along(NAMES)) { [13:13:40.676] name <- removed[[kk]] [13:13:40.676] NAME <- NAMES[[kk]] [13:13:40.676] if (name != NAME && is.element(NAME, old_names)) [13:13:40.676] next [13:13:40.676] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:40.676] } [13:13:40.676] if (length(args) > 0) [13:13:40.676] base::do.call(base::Sys.setenv, args = args) [13:13:40.676] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:40.676] } [13:13:40.676] else { [13:13:40.676] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:40.676] } [13:13:40.676] { [13:13:40.676] if (base::length(...future.futureOptionsAdded) > [13:13:40.676] 0L) { [13:13:40.676] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:40.676] base::names(opts) <- ...future.futureOptionsAdded [13:13:40.676] base::options(opts) [13:13:40.676] } [13:13:40.676] { [13:13:40.676] { [13:13:40.676] NULL [13:13:40.676] RNGkind("Mersenne-Twister") [13:13:40.676] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:40.676] inherits = FALSE) [13:13:40.676] } [13:13:40.676] options(future.plan = NULL) [13:13:40.676] if (is.na(NA_character_)) [13:13:40.676] Sys.unsetenv("R_FUTURE_PLAN") [13:13:40.676] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:40.676] future::plan(list(function (..., workers = availableCores(), [13:13:40.676] lazy = FALSE, rscript_libs = .libPaths(), [13:13:40.676] envir = parent.frame()) [13:13:40.676] { [13:13:40.676] if (is.function(workers)) [13:13:40.676] workers <- workers() [13:13:40.676] workers <- structure(as.integer(workers), [13:13:40.676] class = class(workers)) [13:13:40.676] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:40.676] workers >= 1) [13:13:40.676] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:40.676] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:40.676] } [13:13:40.676] future <- MultisessionFuture(..., workers = workers, [13:13:40.676] lazy = lazy, rscript_libs = rscript_libs, [13:13:40.676] envir = envir) [13:13:40.676] if (!future$lazy) [13:13:40.676] future <- run(future) [13:13:40.676] invisible(future) [13:13:40.676] }), .cleanup = FALSE, .init = FALSE) [13:13:40.676] } [13:13:40.676] } [13:13:40.676] } [13:13:40.676] }) [13:13:40.676] if (TRUE) { [13:13:40.676] base::sink(type = "output", split = FALSE) [13:13:40.676] if (TRUE) { [13:13:40.676] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:40.676] } [13:13:40.676] else { [13:13:40.676] ...future.result["stdout"] <- base::list(NULL) [13:13:40.676] } [13:13:40.676] base::close(...future.stdout) [13:13:40.676] ...future.stdout <- NULL [13:13:40.676] } [13:13:40.676] ...future.result$conditions <- ...future.conditions [13:13:40.676] ...future.result$finished <- base::Sys.time() [13:13:40.676] ...future.result [13:13:40.676] } [13:13:40.680] plan(): Setting new future strategy stack: [13:13:40.680] List of future strategies: [13:13:40.680] 1. sequential: [13:13:40.680] - args: function (..., envir = parent.frame(), workers = "") [13:13:40.680] - tweaked: FALSE [13:13:40.680] - call: NULL [13:13:40.681] plan(): nbrOfWorkers() = 1 [13:13:40.682] plan(): Setting new future strategy stack: [13:13:40.682] List of future strategies: [13:13:40.682] 1. multisession: [13:13:40.682] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [13:13:40.682] - tweaked: FALSE [13:13:40.682] - call: plan(strategy) [13:13:40.684] plan(): nbrOfWorkers() = 1 [13:13:40.684] SequentialFuture started (and completed) [13:13:40.685] plan(): plan_init() of 'multisession', 'cluster', 'multiprocess', 'future', 'function' ... DONE [13:13:40.687] plan(): nbrOfWorkers() = 1 - future_lapply(x, FUN = vector, ...) ... [13:13:40.687] future_lapply() ... [13:13:40.689] Number of chunks: 4 [13:13:40.690] getGlobalsAndPackagesXApply() ... [13:13:40.690] - future.globals: TRUE [13:13:40.690] getGlobalsAndPackages() ... [13:13:40.690] Searching for globals... [13:13:40.691] - globals found: [2] 'FUN', '.Internal' [13:13:40.691] Searching for globals ... DONE [13:13:40.692] Resolving globals: FALSE [13:13:40.692] The total size of the 1 globals is 2.13 KiB (2184 bytes) [13:13:40.692] 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') [13:13:40.693] - globals: [1] 'FUN' [13:13:40.693] [13:13:40.693] getGlobalsAndPackages() ... DONE [13:13:40.693] - globals found/used: [n=1] 'FUN' [13:13:40.693] - needed namespaces: [n=0] [13:13:40.693] Finding globals ... DONE [13:13:40.694] - use_args: TRUE [13:13:40.694] - Getting '...' globals ... [13:13:40.694] resolve() on list ... [13:13:40.694] recursive: 0 [13:13:40.694] length: 1 [13:13:40.694] elements: '...' [13:13:40.695] length: 0 (resolved future 1) [13:13:40.695] resolve() on list ... DONE [13:13:40.695] - '...' content: [n=1] 'length' [13:13:40.695] List of 1 [13:13:40.695] $ ...:List of 1 [13:13:40.695] ..$ length: int 2 [13:13:40.695] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:40.695] - attr(*, "where")=List of 1 [13:13:40.695] ..$ ...: [13:13:40.695] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:40.695] - attr(*, "resolved")= logi TRUE [13:13:40.695] - attr(*, "total_size")= num NA [13:13:40.698] - Getting '...' globals ... DONE [13:13:40.699] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:40.699] List of 2 [13:13:40.699] $ ...future.FUN:function (mode = "logical", length = 0L) [13:13:40.699] $ ... :List of 1 [13:13:40.699] ..$ length: int 2 [13:13:40.699] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:40.699] - attr(*, "where")=List of 2 [13:13:40.699] ..$ ...future.FUN: [13:13:40.699] ..$ ... : [13:13:40.699] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:40.699] - attr(*, "resolved")= logi FALSE [13:13:40.699] - attr(*, "total_size")= num 2240 [13:13:40.702] Packages to be attached in all futures: [n=0] [13:13:40.702] getGlobalsAndPackagesXApply() ... DONE [13:13:40.703] Number of futures (= number of chunks): 4 [13:13:40.703] Launching 4 futures (chunks) ... [13:13:40.703] Chunk #1 of 4 ... [13:13:40.703] - Finding globals in 'X' for chunk #1 ... [13:13:40.703] getGlobalsAndPackages() ... [13:13:40.703] Searching for globals... [13:13:40.704] [13:13:40.704] Searching for globals ... DONE [13:13:40.704] - globals: [0] [13:13:40.704] getGlobalsAndPackages() ... DONE [13:13:40.704] + additional globals found: [n=0] [13:13:40.704] + additional namespaces needed: [n=0] [13:13:40.705] - Finding globals in 'X' for chunk #1 ... DONE [13:13:40.705] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [13:13:40.705] - seeds: [13:13:40.705] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:40.705] getGlobalsAndPackages() ... [13:13:40.705] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:40.706] Resolving globals: FALSE [13:13:40.706] Tweak future expression to call with '...' arguments ... [13:13:40.706] { [13:13:40.706] do.call(function(...) { [13:13:40.706] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:40.706] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:40.706] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:40.706] on.exit(options(oopts), add = TRUE) [13:13:40.706] } [13:13:40.706] { [13:13:40.706] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:40.706] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:40.706] ...future.FUN(...future.X_jj, ...) [13:13:40.706] }) [13:13:40.706] } [13:13:40.706] }, args = future.call.arguments) [13:13:40.706] } [13:13:40.706] Tweak future expression to call with '...' arguments ... DONE [13:13:40.707] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:40.707] [13:13:40.707] getGlobalsAndPackages() ... DONE [13:13:40.707] run() for 'Future' ... [13:13:40.708] - state: 'created' [13:13:40.708] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:40.710] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:40.710] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:40.710] - Field: 'label' [13:13:40.710] - Field: 'local' [13:13:40.711] - Field: 'owner' [13:13:40.711] - Field: 'envir' [13:13:40.711] - Field: 'packages' [13:13:40.711] - Field: 'gc' [13:13:40.711] - Field: 'conditions' [13:13:40.711] - Field: 'expr' [13:13:40.712] - Field: 'uuid' [13:13:40.712] - Field: 'seed' [13:13:40.712] - Field: 'version' [13:13:40.712] - Field: 'result' [13:13:40.712] - Field: 'asynchronous' [13:13:40.712] - Field: 'calls' [13:13:40.712] - Field: 'globals' [13:13:40.713] - Field: 'stdout' [13:13:40.713] - Field: 'earlySignal' [13:13:40.713] - Field: 'lazy' [13:13:40.713] - Field: 'state' [13:13:40.713] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:40.713] - Launch lazy future ... [13:13:40.714] Packages needed by the future expression (n = 0): [13:13:40.714] Packages needed by future strategies (n = 0): [13:13:40.714] { [13:13:40.714] { [13:13:40.714] { [13:13:40.714] ...future.startTime <- base::Sys.time() [13:13:40.714] { [13:13:40.714] { [13:13:40.714] { [13:13:40.714] base::local({ [13:13:40.714] has_future <- base::requireNamespace("future", [13:13:40.714] quietly = TRUE) [13:13:40.714] if (has_future) { [13:13:40.714] ns <- base::getNamespace("future") [13:13:40.714] version <- ns[[".package"]][["version"]] [13:13:40.714] if (is.null(version)) [13:13:40.714] version <- utils::packageVersion("future") [13:13:40.714] } [13:13:40.714] else { [13:13:40.714] version <- NULL [13:13:40.714] } [13:13:40.714] if (!has_future || version < "1.8.0") { [13:13:40.714] info <- base::c(r_version = base::gsub("R version ", [13:13:40.714] "", base::R.version$version.string), [13:13:40.714] platform = base::sprintf("%s (%s-bit)", [13:13:40.714] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:40.714] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:40.714] "release", "version")], collapse = " "), [13:13:40.714] hostname = base::Sys.info()[["nodename"]]) [13:13:40.714] info <- base::sprintf("%s: %s", base::names(info), [13:13:40.714] info) [13:13:40.714] info <- base::paste(info, collapse = "; ") [13:13:40.714] if (!has_future) { [13:13:40.714] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:40.714] info) [13:13:40.714] } [13:13:40.714] else { [13:13:40.714] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:40.714] info, version) [13:13:40.714] } [13:13:40.714] base::stop(msg) [13:13:40.714] } [13:13:40.714] }) [13:13:40.714] } [13:13:40.714] options(future.plan = NULL) [13:13:40.714] Sys.unsetenv("R_FUTURE_PLAN") [13:13:40.714] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:40.714] } [13:13:40.714] ...future.workdir <- getwd() [13:13:40.714] } [13:13:40.714] ...future.oldOptions <- base::as.list(base::.Options) [13:13:40.714] ...future.oldEnvVars <- base::Sys.getenv() [13:13:40.714] } [13:13:40.714] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:40.714] future.globals.maxSize = 2097152000, future.globals.method = NULL, [13:13:40.714] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:40.714] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:40.714] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:40.714] future.stdout.windows.reencode = NULL, width = 80L) [13:13:40.714] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:40.714] base::names(...future.oldOptions)) [13:13:40.714] } [13:13:40.714] if (FALSE) { [13:13:40.714] } [13:13:40.714] else { [13:13:40.714] if (TRUE) { [13:13:40.714] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:40.714] open = "w") [13:13:40.714] } [13:13:40.714] else { [13:13:40.714] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:40.714] windows = "NUL", "/dev/null"), open = "w") [13:13:40.714] } [13:13:40.714] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:40.714] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:40.714] base::sink(type = "output", split = FALSE) [13:13:40.714] base::close(...future.stdout) [13:13:40.714] }, add = TRUE) [13:13:40.714] } [13:13:40.714] ...future.frame <- base::sys.nframe() [13:13:40.714] ...future.conditions <- base::list() [13:13:40.714] ...future.rng <- base::globalenv()$.Random.seed [13:13:40.714] if (FALSE) { [13:13:40.714] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:40.714] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:40.714] } [13:13:40.714] ...future.result <- base::tryCatch({ [13:13:40.714] base::withCallingHandlers({ [13:13:40.714] ...future.value <- base::withVisible(base::local({ [13:13:40.714] do.call(function(...) { [13:13:40.714] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:40.714] if (!identical(...future.globals.maxSize.org, [13:13:40.714] ...future.globals.maxSize)) { [13:13:40.714] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:40.714] on.exit(options(oopts), add = TRUE) [13:13:40.714] } [13:13:40.714] { [13:13:40.714] lapply(seq_along(...future.elements_ii), [13:13:40.714] FUN = function(jj) { [13:13:40.714] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:40.714] ...future.FUN(...future.X_jj, ...) [13:13:40.714] }) [13:13:40.714] } [13:13:40.714] }, args = future.call.arguments) [13:13:40.714] })) [13:13:40.714] future::FutureResult(value = ...future.value$value, [13:13:40.714] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:40.714] ...future.rng), globalenv = if (FALSE) [13:13:40.714] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:40.714] ...future.globalenv.names)) [13:13:40.714] else NULL, started = ...future.startTime, version = "1.8") [13:13:40.714] }, condition = base::local({ [13:13:40.714] c <- base::c [13:13:40.714] inherits <- base::inherits [13:13:40.714] invokeRestart <- base::invokeRestart [13:13:40.714] length <- base::length [13:13:40.714] list <- base::list [13:13:40.714] seq.int <- base::seq.int [13:13:40.714] signalCondition <- base::signalCondition [13:13:40.714] sys.calls <- base::sys.calls [13:13:40.714] `[[` <- base::`[[` [13:13:40.714] `+` <- base::`+` [13:13:40.714] `<<-` <- base::`<<-` [13:13:40.714] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:40.714] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:40.714] 3L)] [13:13:40.714] } [13:13:40.714] function(cond) { [13:13:40.714] is_error <- inherits(cond, "error") [13:13:40.714] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:40.714] NULL) [13:13:40.714] if (is_error) { [13:13:40.714] sessionInformation <- function() { [13:13:40.714] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:40.714] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:40.714] search = base::search(), system = base::Sys.info()) [13:13:40.714] } [13:13:40.714] ...future.conditions[[length(...future.conditions) + [13:13:40.714] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:40.714] cond$call), session = sessionInformation(), [13:13:40.714] timestamp = base::Sys.time(), signaled = 0L) [13:13:40.714] signalCondition(cond) [13:13:40.714] } [13:13:40.714] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:40.714] "immediateCondition"))) { [13:13:40.714] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:40.714] ...future.conditions[[length(...future.conditions) + [13:13:40.714] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:40.714] if (TRUE && !signal) { [13:13:40.714] muffleCondition <- function (cond, pattern = "^muffle") [13:13:40.714] { [13:13:40.714] inherits <- base::inherits [13:13:40.714] invokeRestart <- base::invokeRestart [13:13:40.714] is.null <- base::is.null [13:13:40.714] muffled <- FALSE [13:13:40.714] if (inherits(cond, "message")) { [13:13:40.714] muffled <- grepl(pattern, "muffleMessage") [13:13:40.714] if (muffled) [13:13:40.714] invokeRestart("muffleMessage") [13:13:40.714] } [13:13:40.714] else if (inherits(cond, "warning")) { [13:13:40.714] muffled <- grepl(pattern, "muffleWarning") [13:13:40.714] if (muffled) [13:13:40.714] invokeRestart("muffleWarning") [13:13:40.714] } [13:13:40.714] else if (inherits(cond, "condition")) { [13:13:40.714] if (!is.null(pattern)) { [13:13:40.714] computeRestarts <- base::computeRestarts [13:13:40.714] grepl <- base::grepl [13:13:40.714] restarts <- computeRestarts(cond) [13:13:40.714] for (restart in restarts) { [13:13:40.714] name <- restart$name [13:13:40.714] if (is.null(name)) [13:13:40.714] next [13:13:40.714] if (!grepl(pattern, name)) [13:13:40.714] next [13:13:40.714] invokeRestart(restart) [13:13:40.714] muffled <- TRUE [13:13:40.714] break [13:13:40.714] } [13:13:40.714] } [13:13:40.714] } [13:13:40.714] invisible(muffled) [13:13:40.714] } [13:13:40.714] muffleCondition(cond, pattern = "^muffle") [13:13:40.714] } [13:13:40.714] } [13:13:40.714] else { [13:13:40.714] if (TRUE) { [13:13:40.714] muffleCondition <- function (cond, pattern = "^muffle") [13:13:40.714] { [13:13:40.714] inherits <- base::inherits [13:13:40.714] invokeRestart <- base::invokeRestart [13:13:40.714] is.null <- base::is.null [13:13:40.714] muffled <- FALSE [13:13:40.714] if (inherits(cond, "message")) { [13:13:40.714] muffled <- grepl(pattern, "muffleMessage") [13:13:40.714] if (muffled) [13:13:40.714] invokeRestart("muffleMessage") [13:13:40.714] } [13:13:40.714] else if (inherits(cond, "warning")) { [13:13:40.714] muffled <- grepl(pattern, "muffleWarning") [13:13:40.714] if (muffled) [13:13:40.714] invokeRestart("muffleWarning") [13:13:40.714] } [13:13:40.714] else if (inherits(cond, "condition")) { [13:13:40.714] if (!is.null(pattern)) { [13:13:40.714] computeRestarts <- base::computeRestarts [13:13:40.714] grepl <- base::grepl [13:13:40.714] restarts <- computeRestarts(cond) [13:13:40.714] for (restart in restarts) { [13:13:40.714] name <- restart$name [13:13:40.714] if (is.null(name)) [13:13:40.714] next [13:13:40.714] if (!grepl(pattern, name)) [13:13:40.714] next [13:13:40.714] invokeRestart(restart) [13:13:40.714] muffled <- TRUE [13:13:40.714] break [13:13:40.714] } [13:13:40.714] } [13:13:40.714] } [13:13:40.714] invisible(muffled) [13:13:40.714] } [13:13:40.714] muffleCondition(cond, pattern = "^muffle") [13:13:40.714] } [13:13:40.714] } [13:13:40.714] } [13:13:40.714] })) [13:13:40.714] }, error = function(ex) { [13:13:40.714] base::structure(base::list(value = NULL, visible = NULL, [13:13:40.714] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:40.714] ...future.rng), started = ...future.startTime, [13:13:40.714] finished = Sys.time(), session_uuid = NA_character_, [13:13:40.714] version = "1.8"), class = "FutureResult") [13:13:40.714] }, finally = { [13:13:40.714] if (!identical(...future.workdir, getwd())) [13:13:40.714] setwd(...future.workdir) [13:13:40.714] { [13:13:40.714] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:40.714] ...future.oldOptions$nwarnings <- NULL [13:13:40.714] } [13:13:40.714] base::options(...future.oldOptions) [13:13:40.714] if (.Platform$OS.type == "windows") { [13:13:40.714] old_names <- names(...future.oldEnvVars) [13:13:40.714] envs <- base::Sys.getenv() [13:13:40.714] names <- names(envs) [13:13:40.714] common <- intersect(names, old_names) [13:13:40.714] added <- setdiff(names, old_names) [13:13:40.714] removed <- setdiff(old_names, names) [13:13:40.714] changed <- common[...future.oldEnvVars[common] != [13:13:40.714] envs[common]] [13:13:40.714] NAMES <- toupper(changed) [13:13:40.714] args <- list() [13:13:40.714] for (kk in seq_along(NAMES)) { [13:13:40.714] name <- changed[[kk]] [13:13:40.714] NAME <- NAMES[[kk]] [13:13:40.714] if (name != NAME && is.element(NAME, old_names)) [13:13:40.714] next [13:13:40.714] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:40.714] } [13:13:40.714] NAMES <- toupper(added) [13:13:40.714] for (kk in seq_along(NAMES)) { [13:13:40.714] name <- added[[kk]] [13:13:40.714] NAME <- NAMES[[kk]] [13:13:40.714] if (name != NAME && is.element(NAME, old_names)) [13:13:40.714] next [13:13:40.714] args[[name]] <- "" [13:13:40.714] } [13:13:40.714] NAMES <- toupper(removed) [13:13:40.714] for (kk in seq_along(NAMES)) { [13:13:40.714] name <- removed[[kk]] [13:13:40.714] NAME <- NAMES[[kk]] [13:13:40.714] if (name != NAME && is.element(NAME, old_names)) [13:13:40.714] next [13:13:40.714] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:40.714] } [13:13:40.714] if (length(args) > 0) [13:13:40.714] base::do.call(base::Sys.setenv, args = args) [13:13:40.714] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:40.714] } [13:13:40.714] else { [13:13:40.714] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:40.714] } [13:13:40.714] { [13:13:40.714] if (base::length(...future.futureOptionsAdded) > [13:13:40.714] 0L) { [13:13:40.714] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:40.714] base::names(opts) <- ...future.futureOptionsAdded [13:13:40.714] base::options(opts) [13:13:40.714] } [13:13:40.714] { [13:13:40.714] { [13:13:40.714] NULL [13:13:40.714] RNGkind("Mersenne-Twister") [13:13:40.714] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:40.714] inherits = FALSE) [13:13:40.714] } [13:13:40.714] options(future.plan = NULL) [13:13:40.714] if (is.na(NA_character_)) [13:13:40.714] Sys.unsetenv("R_FUTURE_PLAN") [13:13:40.714] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:40.714] future::plan(list(function (..., workers = availableCores(), [13:13:40.714] lazy = FALSE, rscript_libs = .libPaths(), [13:13:40.714] envir = parent.frame()) [13:13:40.714] { [13:13:40.714] if (is.function(workers)) [13:13:40.714] workers <- workers() [13:13:40.714] workers <- structure(as.integer(workers), [13:13:40.714] class = class(workers)) [13:13:40.714] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:40.714] workers >= 1) [13:13:40.714] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:40.714] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:40.714] } [13:13:40.714] future <- MultisessionFuture(..., workers = workers, [13:13:40.714] lazy = lazy, rscript_libs = rscript_libs, [13:13:40.714] envir = envir) [13:13:40.714] if (!future$lazy) [13:13:40.714] future <- run(future) [13:13:40.714] invisible(future) [13:13:40.714] }), .cleanup = FALSE, .init = FALSE) [13:13:40.714] } [13:13:40.714] } [13:13:40.714] } [13:13:40.714] }) [13:13:40.714] if (TRUE) { [13:13:40.714] base::sink(type = "output", split = FALSE) [13:13:40.714] if (TRUE) { [13:13:40.714] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:40.714] } [13:13:40.714] else { [13:13:40.714] ...future.result["stdout"] <- base::list(NULL) [13:13:40.714] } [13:13:40.714] base::close(...future.stdout) [13:13:40.714] ...future.stdout <- NULL [13:13:40.714] } [13:13:40.714] ...future.result$conditions <- ...future.conditions [13:13:40.714] ...future.result$finished <- base::Sys.time() [13:13:40.714] ...future.result [13:13:40.714] } [13:13:40.718] assign_globals() ... [13:13:40.718] List of 5 [13:13:40.718] $ ...future.FUN :function (mode = "logical", length = 0L) [13:13:40.718] $ future.call.arguments :List of 1 [13:13:40.718] ..$ length: int 2 [13:13:40.718] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:40.718] $ ...future.elements_ii :List of 1 [13:13:40.718] ..$ a: chr "integer" [13:13:40.718] $ ...future.seeds_ii : NULL [13:13:40.718] $ ...future.globals.maxSize: NULL [13:13:40.718] - attr(*, "where")=List of 5 [13:13:40.718] ..$ ...future.FUN : [13:13:40.718] ..$ future.call.arguments : [13:13:40.718] ..$ ...future.elements_ii : [13:13:40.718] ..$ ...future.seeds_ii : [13:13:40.718] ..$ ...future.globals.maxSize: [13:13:40.718] - attr(*, "resolved")= logi FALSE [13:13:40.718] - attr(*, "total_size")= num 2240 [13:13:40.718] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:40.718] - attr(*, "already-done")= logi TRUE [13:13:40.724] - copied '...future.FUN' to environment [13:13:40.724] - copied 'future.call.arguments' to environment [13:13:40.724] - copied '...future.elements_ii' to environment [13:13:40.724] - copied '...future.seeds_ii' to environment [13:13:40.724] - copied '...future.globals.maxSize' to environment [13:13:40.725] assign_globals() ... done [13:13:40.725] plan(): Setting new future strategy stack: [13:13:40.725] List of future strategies: [13:13:40.725] 1. sequential: [13:13:40.725] - args: function (..., envir = parent.frame(), workers = "") [13:13:40.725] - tweaked: FALSE [13:13:40.725] - call: NULL [13:13:40.726] plan(): nbrOfWorkers() = 1 [13:13:40.727] plan(): Setting new future strategy stack: [13:13:40.727] List of future strategies: [13:13:40.727] 1. multisession: [13:13:40.727] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [13:13:40.727] - tweaked: FALSE [13:13:40.727] - call: plan(strategy) [13:13:40.729] plan(): nbrOfWorkers() = 1 [13:13:40.729] SequentialFuture started (and completed) [13:13:40.730] - Launch lazy future ... done [13:13:40.730] run() for 'SequentialFuture' ... done [13:13:40.730] Created future: [13:13:40.730] SequentialFuture: [13:13:40.730] Label: 'future_lapply-1' [13:13:40.730] Expression: [13:13:40.730] { [13:13:40.730] do.call(function(...) { [13:13:40.730] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:40.730] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:40.730] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:40.730] on.exit(options(oopts), add = TRUE) [13:13:40.730] } [13:13:40.730] { [13:13:40.730] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:40.730] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:40.730] ...future.FUN(...future.X_jj, ...) [13:13:40.730] }) [13:13:40.730] } [13:13:40.730] }, args = future.call.arguments) [13:13:40.730] } [13:13:40.730] Lazy evaluation: FALSE [13:13:40.730] Asynchronous evaluation: FALSE [13:13:40.730] Local evaluation: TRUE [13:13:40.730] Environment: R_GlobalEnv [13:13:40.730] Capture standard output: TRUE [13:13:40.730] Capture condition classes: 'condition' (excluding 'nothing') [13:13:40.730] 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) [13:13:40.730] Packages: [13:13:40.730] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:40.730] Resolved: TRUE [13:13:40.730] Value: 56 bytes of class 'list' [13:13:40.730] Early signaling: FALSE [13:13:40.730] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:40.730] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:40.731] Chunk #1 of 4 ... DONE [13:13:40.731] Chunk #2 of 4 ... [13:13:40.732] - Finding globals in 'X' for chunk #2 ... [13:13:40.732] getGlobalsAndPackages() ... [13:13:40.732] Searching for globals... [13:13:40.732] [13:13:40.732] Searching for globals ... DONE [13:13:40.732] - globals: [0] [13:13:40.733] getGlobalsAndPackages() ... DONE [13:13:40.733] + additional globals found: [n=0] [13:13:40.733] + additional namespaces needed: [n=0] [13:13:40.733] - Finding globals in 'X' for chunk #2 ... DONE [13:13:40.733] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [13:13:40.733] - seeds: [13:13:40.733] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:40.734] getGlobalsAndPackages() ... [13:13:40.734] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:40.734] Resolving globals: FALSE [13:13:40.734] Tweak future expression to call with '...' arguments ... [13:13:40.734] { [13:13:40.734] do.call(function(...) { [13:13:40.734] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:40.734] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:40.734] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:40.734] on.exit(options(oopts), add = TRUE) [13:13:40.734] } [13:13:40.734] { [13:13:40.734] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:40.734] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:40.734] ...future.FUN(...future.X_jj, ...) [13:13:40.734] }) [13:13:40.734] } [13:13:40.734] }, args = future.call.arguments) [13:13:40.734] } [13:13:40.735] Tweak future expression to call with '...' arguments ... DONE [13:13:40.735] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:40.735] [13:13:40.735] getGlobalsAndPackages() ... DONE [13:13:40.736] run() for 'Future' ... [13:13:40.736] - state: 'created' [13:13:40.736] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:40.738] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:40.738] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:40.738] - Field: 'label' [13:13:40.739] - Field: 'local' [13:13:40.739] - Field: 'owner' [13:13:40.739] - Field: 'envir' [13:13:40.739] - Field: 'packages' [13:13:40.739] - Field: 'gc' [13:13:40.739] - Field: 'conditions' [13:13:40.739] - Field: 'expr' [13:13:40.740] - Field: 'uuid' [13:13:40.740] - Field: 'seed' [13:13:40.740] - Field: 'version' [13:13:40.740] - Field: 'result' [13:13:40.740] - Field: 'asynchronous' [13:13:40.740] - Field: 'calls' [13:13:40.741] - Field: 'globals' [13:13:40.741] - Field: 'stdout' [13:13:40.741] - Field: 'earlySignal' [13:13:40.741] - Field: 'lazy' [13:13:40.741] - Field: 'state' [13:13:40.741] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:40.741] - Launch lazy future ... [13:13:40.742] Packages needed by the future expression (n = 0): [13:13:40.742] Packages needed by future strategies (n = 0): [13:13:40.744] { [13:13:40.744] { [13:13:40.744] { [13:13:40.744] ...future.startTime <- base::Sys.time() [13:13:40.744] { [13:13:40.744] { [13:13:40.744] { [13:13:40.744] base::local({ [13:13:40.744] has_future <- base::requireNamespace("future", [13:13:40.744] quietly = TRUE) [13:13:40.744] if (has_future) { [13:13:40.744] ns <- base::getNamespace("future") [13:13:40.744] version <- ns[[".package"]][["version"]] [13:13:40.744] if (is.null(version)) [13:13:40.744] version <- utils::packageVersion("future") [13:13:40.744] } [13:13:40.744] else { [13:13:40.744] version <- NULL [13:13:40.744] } [13:13:40.744] if (!has_future || version < "1.8.0") { [13:13:40.744] info <- base::c(r_version = base::gsub("R version ", [13:13:40.744] "", base::R.version$version.string), [13:13:40.744] platform = base::sprintf("%s (%s-bit)", [13:13:40.744] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:40.744] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:40.744] "release", "version")], collapse = " "), [13:13:40.744] hostname = base::Sys.info()[["nodename"]]) [13:13:40.744] info <- base::sprintf("%s: %s", base::names(info), [13:13:40.744] info) [13:13:40.744] info <- base::paste(info, collapse = "; ") [13:13:40.744] if (!has_future) { [13:13:40.744] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:40.744] info) [13:13:40.744] } [13:13:40.744] else { [13:13:40.744] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:40.744] info, version) [13:13:40.744] } [13:13:40.744] base::stop(msg) [13:13:40.744] } [13:13:40.744] }) [13:13:40.744] } [13:13:40.744] options(future.plan = NULL) [13:13:40.744] Sys.unsetenv("R_FUTURE_PLAN") [13:13:40.744] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:40.744] } [13:13:40.744] ...future.workdir <- getwd() [13:13:40.744] } [13:13:40.744] ...future.oldOptions <- base::as.list(base::.Options) [13:13:40.744] ...future.oldEnvVars <- base::Sys.getenv() [13:13:40.744] } [13:13:40.744] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:40.744] future.globals.maxSize = 2097152000, future.globals.method = NULL, [13:13:40.744] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:40.744] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:40.744] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:40.744] future.stdout.windows.reencode = NULL, width = 80L) [13:13:40.744] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:40.744] base::names(...future.oldOptions)) [13:13:40.744] } [13:13:40.744] if (FALSE) { [13:13:40.744] } [13:13:40.744] else { [13:13:40.744] if (TRUE) { [13:13:40.744] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:40.744] open = "w") [13:13:40.744] } [13:13:40.744] else { [13:13:40.744] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:40.744] windows = "NUL", "/dev/null"), open = "w") [13:13:40.744] } [13:13:40.744] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:40.744] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:40.744] base::sink(type = "output", split = FALSE) [13:13:40.744] base::close(...future.stdout) [13:13:40.744] }, add = TRUE) [13:13:40.744] } [13:13:40.744] ...future.frame <- base::sys.nframe() [13:13:40.744] ...future.conditions <- base::list() [13:13:40.744] ...future.rng <- base::globalenv()$.Random.seed [13:13:40.744] if (FALSE) { [13:13:40.744] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:40.744] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:40.744] } [13:13:40.744] ...future.result <- base::tryCatch({ [13:13:40.744] base::withCallingHandlers({ [13:13:40.744] ...future.value <- base::withVisible(base::local({ [13:13:40.744] do.call(function(...) { [13:13:40.744] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:40.744] if (!identical(...future.globals.maxSize.org, [13:13:40.744] ...future.globals.maxSize)) { [13:13:40.744] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:40.744] on.exit(options(oopts), add = TRUE) [13:13:40.744] } [13:13:40.744] { [13:13:40.744] lapply(seq_along(...future.elements_ii), [13:13:40.744] FUN = function(jj) { [13:13:40.744] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:40.744] ...future.FUN(...future.X_jj, ...) [13:13:40.744] }) [13:13:40.744] } [13:13:40.744] }, args = future.call.arguments) [13:13:40.744] })) [13:13:40.744] future::FutureResult(value = ...future.value$value, [13:13:40.744] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:40.744] ...future.rng), globalenv = if (FALSE) [13:13:40.744] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:40.744] ...future.globalenv.names)) [13:13:40.744] else NULL, started = ...future.startTime, version = "1.8") [13:13:40.744] }, condition = base::local({ [13:13:40.744] c <- base::c [13:13:40.744] inherits <- base::inherits [13:13:40.744] invokeRestart <- base::invokeRestart [13:13:40.744] length <- base::length [13:13:40.744] list <- base::list [13:13:40.744] seq.int <- base::seq.int [13:13:40.744] signalCondition <- base::signalCondition [13:13:40.744] sys.calls <- base::sys.calls [13:13:40.744] `[[` <- base::`[[` [13:13:40.744] `+` <- base::`+` [13:13:40.744] `<<-` <- base::`<<-` [13:13:40.744] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:40.744] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:40.744] 3L)] [13:13:40.744] } [13:13:40.744] function(cond) { [13:13:40.744] is_error <- inherits(cond, "error") [13:13:40.744] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:40.744] NULL) [13:13:40.744] if (is_error) { [13:13:40.744] sessionInformation <- function() { [13:13:40.744] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:40.744] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:40.744] search = base::search(), system = base::Sys.info()) [13:13:40.744] } [13:13:40.744] ...future.conditions[[length(...future.conditions) + [13:13:40.744] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:40.744] cond$call), session = sessionInformation(), [13:13:40.744] timestamp = base::Sys.time(), signaled = 0L) [13:13:40.744] signalCondition(cond) [13:13:40.744] } [13:13:40.744] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:40.744] "immediateCondition"))) { [13:13:40.744] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:40.744] ...future.conditions[[length(...future.conditions) + [13:13:40.744] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:40.744] if (TRUE && !signal) { [13:13:40.744] muffleCondition <- function (cond, pattern = "^muffle") [13:13:40.744] { [13:13:40.744] inherits <- base::inherits [13:13:40.744] invokeRestart <- base::invokeRestart [13:13:40.744] is.null <- base::is.null [13:13:40.744] muffled <- FALSE [13:13:40.744] if (inherits(cond, "message")) { [13:13:40.744] muffled <- grepl(pattern, "muffleMessage") [13:13:40.744] if (muffled) [13:13:40.744] invokeRestart("muffleMessage") [13:13:40.744] } [13:13:40.744] else if (inherits(cond, "warning")) { [13:13:40.744] muffled <- grepl(pattern, "muffleWarning") [13:13:40.744] if (muffled) [13:13:40.744] invokeRestart("muffleWarning") [13:13:40.744] } [13:13:40.744] else if (inherits(cond, "condition")) { [13:13:40.744] if (!is.null(pattern)) { [13:13:40.744] computeRestarts <- base::computeRestarts [13:13:40.744] grepl <- base::grepl [13:13:40.744] restarts <- computeRestarts(cond) [13:13:40.744] for (restart in restarts) { [13:13:40.744] name <- restart$name [13:13:40.744] if (is.null(name)) [13:13:40.744] next [13:13:40.744] if (!grepl(pattern, name)) [13:13:40.744] next [13:13:40.744] invokeRestart(restart) [13:13:40.744] muffled <- TRUE [13:13:40.744] break [13:13:40.744] } [13:13:40.744] } [13:13:40.744] } [13:13:40.744] invisible(muffled) [13:13:40.744] } [13:13:40.744] muffleCondition(cond, pattern = "^muffle") [13:13:40.744] } [13:13:40.744] } [13:13:40.744] else { [13:13:40.744] if (TRUE) { [13:13:40.744] muffleCondition <- function (cond, pattern = "^muffle") [13:13:40.744] { [13:13:40.744] inherits <- base::inherits [13:13:40.744] invokeRestart <- base::invokeRestart [13:13:40.744] is.null <- base::is.null [13:13:40.744] muffled <- FALSE [13:13:40.744] if (inherits(cond, "message")) { [13:13:40.744] muffled <- grepl(pattern, "muffleMessage") [13:13:40.744] if (muffled) [13:13:40.744] invokeRestart("muffleMessage") [13:13:40.744] } [13:13:40.744] else if (inherits(cond, "warning")) { [13:13:40.744] muffled <- grepl(pattern, "muffleWarning") [13:13:40.744] if (muffled) [13:13:40.744] invokeRestart("muffleWarning") [13:13:40.744] } [13:13:40.744] else if (inherits(cond, "condition")) { [13:13:40.744] if (!is.null(pattern)) { [13:13:40.744] computeRestarts <- base::computeRestarts [13:13:40.744] grepl <- base::grepl [13:13:40.744] restarts <- computeRestarts(cond) [13:13:40.744] for (restart in restarts) { [13:13:40.744] name <- restart$name [13:13:40.744] if (is.null(name)) [13:13:40.744] next [13:13:40.744] if (!grepl(pattern, name)) [13:13:40.744] next [13:13:40.744] invokeRestart(restart) [13:13:40.744] muffled <- TRUE [13:13:40.744] break [13:13:40.744] } [13:13:40.744] } [13:13:40.744] } [13:13:40.744] invisible(muffled) [13:13:40.744] } [13:13:40.744] muffleCondition(cond, pattern = "^muffle") [13:13:40.744] } [13:13:40.744] } [13:13:40.744] } [13:13:40.744] })) [13:13:40.744] }, error = function(ex) { [13:13:40.744] base::structure(base::list(value = NULL, visible = NULL, [13:13:40.744] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:40.744] ...future.rng), started = ...future.startTime, [13:13:40.744] finished = Sys.time(), session_uuid = NA_character_, [13:13:40.744] version = "1.8"), class = "FutureResult") [13:13:40.744] }, finally = { [13:13:40.744] if (!identical(...future.workdir, getwd())) [13:13:40.744] setwd(...future.workdir) [13:13:40.744] { [13:13:40.744] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:40.744] ...future.oldOptions$nwarnings <- NULL [13:13:40.744] } [13:13:40.744] base::options(...future.oldOptions) [13:13:40.744] if (.Platform$OS.type == "windows") { [13:13:40.744] old_names <- names(...future.oldEnvVars) [13:13:40.744] envs <- base::Sys.getenv() [13:13:40.744] names <- names(envs) [13:13:40.744] common <- intersect(names, old_names) [13:13:40.744] added <- setdiff(names, old_names) [13:13:40.744] removed <- setdiff(old_names, names) [13:13:40.744] changed <- common[...future.oldEnvVars[common] != [13:13:40.744] envs[common]] [13:13:40.744] NAMES <- toupper(changed) [13:13:40.744] args <- list() [13:13:40.744] for (kk in seq_along(NAMES)) { [13:13:40.744] name <- changed[[kk]] [13:13:40.744] NAME <- NAMES[[kk]] [13:13:40.744] if (name != NAME && is.element(NAME, old_names)) [13:13:40.744] next [13:13:40.744] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:40.744] } [13:13:40.744] NAMES <- toupper(added) [13:13:40.744] for (kk in seq_along(NAMES)) { [13:13:40.744] name <- added[[kk]] [13:13:40.744] NAME <- NAMES[[kk]] [13:13:40.744] if (name != NAME && is.element(NAME, old_names)) [13:13:40.744] next [13:13:40.744] args[[name]] <- "" [13:13:40.744] } [13:13:40.744] NAMES <- toupper(removed) [13:13:40.744] for (kk in seq_along(NAMES)) { [13:13:40.744] name <- removed[[kk]] [13:13:40.744] NAME <- NAMES[[kk]] [13:13:40.744] if (name != NAME && is.element(NAME, old_names)) [13:13:40.744] next [13:13:40.744] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:40.744] } [13:13:40.744] if (length(args) > 0) [13:13:40.744] base::do.call(base::Sys.setenv, args = args) [13:13:40.744] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:40.744] } [13:13:40.744] else { [13:13:40.744] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:40.744] } [13:13:40.744] { [13:13:40.744] if (base::length(...future.futureOptionsAdded) > [13:13:40.744] 0L) { [13:13:40.744] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:40.744] base::names(opts) <- ...future.futureOptionsAdded [13:13:40.744] base::options(opts) [13:13:40.744] } [13:13:40.744] { [13:13:40.744] { [13:13:40.744] NULL [13:13:40.744] RNGkind("Mersenne-Twister") [13:13:40.744] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:40.744] inherits = FALSE) [13:13:40.744] } [13:13:40.744] options(future.plan = NULL) [13:13:40.744] if (is.na(NA_character_)) [13:13:40.744] Sys.unsetenv("R_FUTURE_PLAN") [13:13:40.744] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:40.744] future::plan(list(function (..., workers = availableCores(), [13:13:40.744] lazy = FALSE, rscript_libs = .libPaths(), [13:13:40.744] envir = parent.frame()) [13:13:40.744] { [13:13:40.744] if (is.function(workers)) [13:13:40.744] workers <- workers() [13:13:40.744] workers <- structure(as.integer(workers), [13:13:40.744] class = class(workers)) [13:13:40.744] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:40.744] workers >= 1) [13:13:40.744] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:40.744] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:40.744] } [13:13:40.744] future <- MultisessionFuture(..., workers = workers, [13:13:40.744] lazy = lazy, rscript_libs = rscript_libs, [13:13:40.744] envir = envir) [13:13:40.744] if (!future$lazy) [13:13:40.744] future <- run(future) [13:13:40.744] invisible(future) [13:13:40.744] }), .cleanup = FALSE, .init = FALSE) [13:13:40.744] } [13:13:40.744] } [13:13:40.744] } [13:13:40.744] }) [13:13:40.744] if (TRUE) { [13:13:40.744] base::sink(type = "output", split = FALSE) [13:13:40.744] if (TRUE) { [13:13:40.744] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:40.744] } [13:13:40.744] else { [13:13:40.744] ...future.result["stdout"] <- base::list(NULL) [13:13:40.744] } [13:13:40.744] base::close(...future.stdout) [13:13:40.744] ...future.stdout <- NULL [13:13:40.744] } [13:13:40.744] ...future.result$conditions <- ...future.conditions [13:13:40.744] ...future.result$finished <- base::Sys.time() [13:13:40.744] ...future.result [13:13:40.744] } [13:13:40.747] assign_globals() ... [13:13:40.747] List of 5 [13:13:40.747] $ ...future.FUN :function (mode = "logical", length = 0L) [13:13:40.747] $ future.call.arguments :List of 1 [13:13:40.747] ..$ length: int 2 [13:13:40.747] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:40.747] $ ...future.elements_ii :List of 1 [13:13:40.747] ..$ b: chr "numeric" [13:13:40.747] $ ...future.seeds_ii : NULL [13:13:40.747] $ ...future.globals.maxSize: NULL [13:13:40.747] - attr(*, "where")=List of 5 [13:13:40.747] ..$ ...future.FUN : [13:13:40.747] ..$ future.call.arguments : [13:13:40.747] ..$ ...future.elements_ii : [13:13:40.747] ..$ ...future.seeds_ii : [13:13:40.747] ..$ ...future.globals.maxSize: [13:13:40.747] - attr(*, "resolved")= logi FALSE [13:13:40.747] - attr(*, "total_size")= num 2240 [13:13:40.747] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:40.747] - attr(*, "already-done")= logi TRUE [13:13:40.752] - copied '...future.FUN' to environment [13:13:40.753] - copied 'future.call.arguments' to environment [13:13:40.753] - copied '...future.elements_ii' to environment [13:13:40.753] - copied '...future.seeds_ii' to environment [13:13:40.753] - copied '...future.globals.maxSize' to environment [13:13:40.753] assign_globals() ... done [13:13:40.753] plan(): Setting new future strategy stack: [13:13:40.754] List of future strategies: [13:13:40.754] 1. sequential: [13:13:40.754] - args: function (..., envir = parent.frame(), workers = "") [13:13:40.754] - tweaked: FALSE [13:13:40.754] - call: NULL [13:13:40.754] plan(): nbrOfWorkers() = 1 [13:13:40.755] plan(): Setting new future strategy stack: [13:13:40.755] List of future strategies: [13:13:40.755] 1. multisession: [13:13:40.755] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [13:13:40.755] - tweaked: FALSE [13:13:40.755] - call: plan(strategy) [13:13:40.757] plan(): nbrOfWorkers() = 1 [13:13:40.758] SequentialFuture started (and completed) [13:13:40.758] - Launch lazy future ... done [13:13:40.758] run() for 'SequentialFuture' ... done [13:13:40.758] Created future: [13:13:40.758] SequentialFuture: [13:13:40.758] Label: 'future_lapply-2' [13:13:40.758] Expression: [13:13:40.758] { [13:13:40.758] do.call(function(...) { [13:13:40.758] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:40.758] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:40.758] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:40.758] on.exit(options(oopts), add = TRUE) [13:13:40.758] } [13:13:40.758] { [13:13:40.758] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:40.758] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:40.758] ...future.FUN(...future.X_jj, ...) [13:13:40.758] }) [13:13:40.758] } [13:13:40.758] }, args = future.call.arguments) [13:13:40.758] } [13:13:40.758] Lazy evaluation: FALSE [13:13:40.758] Asynchronous evaluation: FALSE [13:13:40.758] Local evaluation: TRUE [13:13:40.758] Environment: R_GlobalEnv [13:13:40.758] Capture standard output: TRUE [13:13:40.758] Capture condition classes: 'condition' (excluding 'nothing') [13:13:40.758] 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) [13:13:40.758] Packages: [13:13:40.758] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:40.758] Resolved: TRUE [13:13:40.758] Value: 64 bytes of class 'list' [13:13:40.758] Early signaling: FALSE [13:13:40.758] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:40.758] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:40.759] Chunk #2 of 4 ... DONE [13:13:40.760] Chunk #3 of 4 ... [13:13:40.760] - Finding globals in 'X' for chunk #3 ... [13:13:40.760] getGlobalsAndPackages() ... [13:13:40.760] Searching for globals... [13:13:40.760] [13:13:40.760] Searching for globals ... DONE [13:13:40.761] - globals: [0] [13:13:40.761] getGlobalsAndPackages() ... DONE [13:13:40.761] + additional globals found: [n=0] [13:13:40.761] + additional namespaces needed: [n=0] [13:13:40.761] - Finding globals in 'X' for chunk #3 ... DONE [13:13:40.761] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [13:13:40.761] - seeds: [13:13:40.761] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:40.762] getGlobalsAndPackages() ... [13:13:40.762] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:40.762] Resolving globals: FALSE [13:13:40.762] Tweak future expression to call with '...' arguments ... [13:13:40.762] { [13:13:40.762] do.call(function(...) { [13:13:40.762] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:40.762] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:40.762] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:40.762] on.exit(options(oopts), add = TRUE) [13:13:40.762] } [13:13:40.762] { [13:13:40.762] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:40.762] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:40.762] ...future.FUN(...future.X_jj, ...) [13:13:40.762] }) [13:13:40.762] } [13:13:40.762] }, args = future.call.arguments) [13:13:40.762] } [13:13:40.763] Tweak future expression to call with '...' arguments ... DONE [13:13:40.763] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:40.763] [13:13:40.763] getGlobalsAndPackages() ... DONE [13:13:40.764] run() for 'Future' ... [13:13:40.764] - state: 'created' [13:13:40.764] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:40.766] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:40.766] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:40.766] - Field: 'label' [13:13:40.766] - Field: 'local' [13:13:40.767] - Field: 'owner' [13:13:40.767] - Field: 'envir' [13:13:40.767] - Field: 'packages' [13:13:40.767] - Field: 'gc' [13:13:40.767] - Field: 'conditions' [13:13:40.767] - Field: 'expr' [13:13:40.768] - Field: 'uuid' [13:13:40.768] - Field: 'seed' [13:13:40.768] - Field: 'version' [13:13:40.768] - Field: 'result' [13:13:40.768] - Field: 'asynchronous' [13:13:40.768] - Field: 'calls' [13:13:40.768] - Field: 'globals' [13:13:40.769] - Field: 'stdout' [13:13:40.769] - Field: 'earlySignal' [13:13:40.769] - Field: 'lazy' [13:13:40.769] - Field: 'state' [13:13:40.769] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:40.769] - Launch lazy future ... [13:13:40.770] Packages needed by the future expression (n = 0): [13:13:40.770] Packages needed by future strategies (n = 0): [13:13:40.770] { [13:13:40.770] { [13:13:40.770] { [13:13:40.770] ...future.startTime <- base::Sys.time() [13:13:40.770] { [13:13:40.770] { [13:13:40.770] { [13:13:40.770] base::local({ [13:13:40.770] has_future <- base::requireNamespace("future", [13:13:40.770] quietly = TRUE) [13:13:40.770] if (has_future) { [13:13:40.770] ns <- base::getNamespace("future") [13:13:40.770] version <- ns[[".package"]][["version"]] [13:13:40.770] if (is.null(version)) [13:13:40.770] version <- utils::packageVersion("future") [13:13:40.770] } [13:13:40.770] else { [13:13:40.770] version <- NULL [13:13:40.770] } [13:13:40.770] if (!has_future || version < "1.8.0") { [13:13:40.770] info <- base::c(r_version = base::gsub("R version ", [13:13:40.770] "", base::R.version$version.string), [13:13:40.770] platform = base::sprintf("%s (%s-bit)", [13:13:40.770] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:40.770] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:40.770] "release", "version")], collapse = " "), [13:13:40.770] hostname = base::Sys.info()[["nodename"]]) [13:13:40.770] info <- base::sprintf("%s: %s", base::names(info), [13:13:40.770] info) [13:13:40.770] info <- base::paste(info, collapse = "; ") [13:13:40.770] if (!has_future) { [13:13:40.770] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:40.770] info) [13:13:40.770] } [13:13:40.770] else { [13:13:40.770] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:40.770] info, version) [13:13:40.770] } [13:13:40.770] base::stop(msg) [13:13:40.770] } [13:13:40.770] }) [13:13:40.770] } [13:13:40.770] options(future.plan = NULL) [13:13:40.770] Sys.unsetenv("R_FUTURE_PLAN") [13:13:40.770] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:40.770] } [13:13:40.770] ...future.workdir <- getwd() [13:13:40.770] } [13:13:40.770] ...future.oldOptions <- base::as.list(base::.Options) [13:13:40.770] ...future.oldEnvVars <- base::Sys.getenv() [13:13:40.770] } [13:13:40.770] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:40.770] future.globals.maxSize = 2097152000, future.globals.method = NULL, [13:13:40.770] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:40.770] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:40.770] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:40.770] future.stdout.windows.reencode = NULL, width = 80L) [13:13:40.770] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:40.770] base::names(...future.oldOptions)) [13:13:40.770] } [13:13:40.770] if (FALSE) { [13:13:40.770] } [13:13:40.770] else { [13:13:40.770] if (TRUE) { [13:13:40.770] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:40.770] open = "w") [13:13:40.770] } [13:13:40.770] else { [13:13:40.770] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:40.770] windows = "NUL", "/dev/null"), open = "w") [13:13:40.770] } [13:13:40.770] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:40.770] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:40.770] base::sink(type = "output", split = FALSE) [13:13:40.770] base::close(...future.stdout) [13:13:40.770] }, add = TRUE) [13:13:40.770] } [13:13:40.770] ...future.frame <- base::sys.nframe() [13:13:40.770] ...future.conditions <- base::list() [13:13:40.770] ...future.rng <- base::globalenv()$.Random.seed [13:13:40.770] if (FALSE) { [13:13:40.770] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:40.770] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:40.770] } [13:13:40.770] ...future.result <- base::tryCatch({ [13:13:40.770] base::withCallingHandlers({ [13:13:40.770] ...future.value <- base::withVisible(base::local({ [13:13:40.770] do.call(function(...) { [13:13:40.770] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:40.770] if (!identical(...future.globals.maxSize.org, [13:13:40.770] ...future.globals.maxSize)) { [13:13:40.770] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:40.770] on.exit(options(oopts), add = TRUE) [13:13:40.770] } [13:13:40.770] { [13:13:40.770] lapply(seq_along(...future.elements_ii), [13:13:40.770] FUN = function(jj) { [13:13:40.770] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:40.770] ...future.FUN(...future.X_jj, ...) [13:13:40.770] }) [13:13:40.770] } [13:13:40.770] }, args = future.call.arguments) [13:13:40.770] })) [13:13:40.770] future::FutureResult(value = ...future.value$value, [13:13:40.770] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:40.770] ...future.rng), globalenv = if (FALSE) [13:13:40.770] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:40.770] ...future.globalenv.names)) [13:13:40.770] else NULL, started = ...future.startTime, version = "1.8") [13:13:40.770] }, condition = base::local({ [13:13:40.770] c <- base::c [13:13:40.770] inherits <- base::inherits [13:13:40.770] invokeRestart <- base::invokeRestart [13:13:40.770] length <- base::length [13:13:40.770] list <- base::list [13:13:40.770] seq.int <- base::seq.int [13:13:40.770] signalCondition <- base::signalCondition [13:13:40.770] sys.calls <- base::sys.calls [13:13:40.770] `[[` <- base::`[[` [13:13:40.770] `+` <- base::`+` [13:13:40.770] `<<-` <- base::`<<-` [13:13:40.770] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:40.770] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:40.770] 3L)] [13:13:40.770] } [13:13:40.770] function(cond) { [13:13:40.770] is_error <- inherits(cond, "error") [13:13:40.770] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:40.770] NULL) [13:13:40.770] if (is_error) { [13:13:40.770] sessionInformation <- function() { [13:13:40.770] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:40.770] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:40.770] search = base::search(), system = base::Sys.info()) [13:13:40.770] } [13:13:40.770] ...future.conditions[[length(...future.conditions) + [13:13:40.770] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:40.770] cond$call), session = sessionInformation(), [13:13:40.770] timestamp = base::Sys.time(), signaled = 0L) [13:13:40.770] signalCondition(cond) [13:13:40.770] } [13:13:40.770] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:40.770] "immediateCondition"))) { [13:13:40.770] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:40.770] ...future.conditions[[length(...future.conditions) + [13:13:40.770] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:40.770] if (TRUE && !signal) { [13:13:40.770] muffleCondition <- function (cond, pattern = "^muffle") [13:13:40.770] { [13:13:40.770] inherits <- base::inherits [13:13:40.770] invokeRestart <- base::invokeRestart [13:13:40.770] is.null <- base::is.null [13:13:40.770] muffled <- FALSE [13:13:40.770] if (inherits(cond, "message")) { [13:13:40.770] muffled <- grepl(pattern, "muffleMessage") [13:13:40.770] if (muffled) [13:13:40.770] invokeRestart("muffleMessage") [13:13:40.770] } [13:13:40.770] else if (inherits(cond, "warning")) { [13:13:40.770] muffled <- grepl(pattern, "muffleWarning") [13:13:40.770] if (muffled) [13:13:40.770] invokeRestart("muffleWarning") [13:13:40.770] } [13:13:40.770] else if (inherits(cond, "condition")) { [13:13:40.770] if (!is.null(pattern)) { [13:13:40.770] computeRestarts <- base::computeRestarts [13:13:40.770] grepl <- base::grepl [13:13:40.770] restarts <- computeRestarts(cond) [13:13:40.770] for (restart in restarts) { [13:13:40.770] name <- restart$name [13:13:40.770] if (is.null(name)) [13:13:40.770] next [13:13:40.770] if (!grepl(pattern, name)) [13:13:40.770] next [13:13:40.770] invokeRestart(restart) [13:13:40.770] muffled <- TRUE [13:13:40.770] break [13:13:40.770] } [13:13:40.770] } [13:13:40.770] } [13:13:40.770] invisible(muffled) [13:13:40.770] } [13:13:40.770] muffleCondition(cond, pattern = "^muffle") [13:13:40.770] } [13:13:40.770] } [13:13:40.770] else { [13:13:40.770] if (TRUE) { [13:13:40.770] muffleCondition <- function (cond, pattern = "^muffle") [13:13:40.770] { [13:13:40.770] inherits <- base::inherits [13:13:40.770] invokeRestart <- base::invokeRestart [13:13:40.770] is.null <- base::is.null [13:13:40.770] muffled <- FALSE [13:13:40.770] if (inherits(cond, "message")) { [13:13:40.770] muffled <- grepl(pattern, "muffleMessage") [13:13:40.770] if (muffled) [13:13:40.770] invokeRestart("muffleMessage") [13:13:40.770] } [13:13:40.770] else if (inherits(cond, "warning")) { [13:13:40.770] muffled <- grepl(pattern, "muffleWarning") [13:13:40.770] if (muffled) [13:13:40.770] invokeRestart("muffleWarning") [13:13:40.770] } [13:13:40.770] else if (inherits(cond, "condition")) { [13:13:40.770] if (!is.null(pattern)) { [13:13:40.770] computeRestarts <- base::computeRestarts [13:13:40.770] grepl <- base::grepl [13:13:40.770] restarts <- computeRestarts(cond) [13:13:40.770] for (restart in restarts) { [13:13:40.770] name <- restart$name [13:13:40.770] if (is.null(name)) [13:13:40.770] next [13:13:40.770] if (!grepl(pattern, name)) [13:13:40.770] next [13:13:40.770] invokeRestart(restart) [13:13:40.770] muffled <- TRUE [13:13:40.770] break [13:13:40.770] } [13:13:40.770] } [13:13:40.770] } [13:13:40.770] invisible(muffled) [13:13:40.770] } [13:13:40.770] muffleCondition(cond, pattern = "^muffle") [13:13:40.770] } [13:13:40.770] } [13:13:40.770] } [13:13:40.770] })) [13:13:40.770] }, error = function(ex) { [13:13:40.770] base::structure(base::list(value = NULL, visible = NULL, [13:13:40.770] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:40.770] ...future.rng), started = ...future.startTime, [13:13:40.770] finished = Sys.time(), session_uuid = NA_character_, [13:13:40.770] version = "1.8"), class = "FutureResult") [13:13:40.770] }, finally = { [13:13:40.770] if (!identical(...future.workdir, getwd())) [13:13:40.770] setwd(...future.workdir) [13:13:40.770] { [13:13:40.770] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:40.770] ...future.oldOptions$nwarnings <- NULL [13:13:40.770] } [13:13:40.770] base::options(...future.oldOptions) [13:13:40.770] if (.Platform$OS.type == "windows") { [13:13:40.770] old_names <- names(...future.oldEnvVars) [13:13:40.770] envs <- base::Sys.getenv() [13:13:40.770] names <- names(envs) [13:13:40.770] common <- intersect(names, old_names) [13:13:40.770] added <- setdiff(names, old_names) [13:13:40.770] removed <- setdiff(old_names, names) [13:13:40.770] changed <- common[...future.oldEnvVars[common] != [13:13:40.770] envs[common]] [13:13:40.770] NAMES <- toupper(changed) [13:13:40.770] args <- list() [13:13:40.770] for (kk in seq_along(NAMES)) { [13:13:40.770] name <- changed[[kk]] [13:13:40.770] NAME <- NAMES[[kk]] [13:13:40.770] if (name != NAME && is.element(NAME, old_names)) [13:13:40.770] next [13:13:40.770] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:40.770] } [13:13:40.770] NAMES <- toupper(added) [13:13:40.770] for (kk in seq_along(NAMES)) { [13:13:40.770] name <- added[[kk]] [13:13:40.770] NAME <- NAMES[[kk]] [13:13:40.770] if (name != NAME && is.element(NAME, old_names)) [13:13:40.770] next [13:13:40.770] args[[name]] <- "" [13:13:40.770] } [13:13:40.770] NAMES <- toupper(removed) [13:13:40.770] for (kk in seq_along(NAMES)) { [13:13:40.770] name <- removed[[kk]] [13:13:40.770] NAME <- NAMES[[kk]] [13:13:40.770] if (name != NAME && is.element(NAME, old_names)) [13:13:40.770] next [13:13:40.770] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:40.770] } [13:13:40.770] if (length(args) > 0) [13:13:40.770] base::do.call(base::Sys.setenv, args = args) [13:13:40.770] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:40.770] } [13:13:40.770] else { [13:13:40.770] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:40.770] } [13:13:40.770] { [13:13:40.770] if (base::length(...future.futureOptionsAdded) > [13:13:40.770] 0L) { [13:13:40.770] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:40.770] base::names(opts) <- ...future.futureOptionsAdded [13:13:40.770] base::options(opts) [13:13:40.770] } [13:13:40.770] { [13:13:40.770] { [13:13:40.770] NULL [13:13:40.770] RNGkind("Mersenne-Twister") [13:13:40.770] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:40.770] inherits = FALSE) [13:13:40.770] } [13:13:40.770] options(future.plan = NULL) [13:13:40.770] if (is.na(NA_character_)) [13:13:40.770] Sys.unsetenv("R_FUTURE_PLAN") [13:13:40.770] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:40.770] future::plan(list(function (..., workers = availableCores(), [13:13:40.770] lazy = FALSE, rscript_libs = .libPaths(), [13:13:40.770] envir = parent.frame()) [13:13:40.770] { [13:13:40.770] if (is.function(workers)) [13:13:40.770] workers <- workers() [13:13:40.770] workers <- structure(as.integer(workers), [13:13:40.770] class = class(workers)) [13:13:40.770] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:40.770] workers >= 1) [13:13:40.770] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:40.770] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:40.770] } [13:13:40.770] future <- MultisessionFuture(..., workers = workers, [13:13:40.770] lazy = lazy, rscript_libs = rscript_libs, [13:13:40.770] envir = envir) [13:13:40.770] if (!future$lazy) [13:13:40.770] future <- run(future) [13:13:40.770] invisible(future) [13:13:40.770] }), .cleanup = FALSE, .init = FALSE) [13:13:40.770] } [13:13:40.770] } [13:13:40.770] } [13:13:40.770] }) [13:13:40.770] if (TRUE) { [13:13:40.770] base::sink(type = "output", split = FALSE) [13:13:40.770] if (TRUE) { [13:13:40.770] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:40.770] } [13:13:40.770] else { [13:13:40.770] ...future.result["stdout"] <- base::list(NULL) [13:13:40.770] } [13:13:40.770] base::close(...future.stdout) [13:13:40.770] ...future.stdout <- NULL [13:13:40.770] } [13:13:40.770] ...future.result$conditions <- ...future.conditions [13:13:40.770] ...future.result$finished <- base::Sys.time() [13:13:40.770] ...future.result [13:13:40.770] } [13:13:40.774] assign_globals() ... [13:13:40.774] List of 5 [13:13:40.774] $ ...future.FUN :function (mode = "logical", length = 0L) [13:13:40.774] $ future.call.arguments :List of 1 [13:13:40.774] ..$ length: int 2 [13:13:40.774] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:40.774] $ ...future.elements_ii :List of 1 [13:13:40.774] ..$ c: chr "character" [13:13:40.774] $ ...future.seeds_ii : NULL [13:13:40.774] $ ...future.globals.maxSize: NULL [13:13:40.774] - attr(*, "where")=List of 5 [13:13:40.774] ..$ ...future.FUN : [13:13:40.774] ..$ future.call.arguments : [13:13:40.774] ..$ ...future.elements_ii : [13:13:40.774] ..$ ...future.seeds_ii : [13:13:40.774] ..$ ...future.globals.maxSize: [13:13:40.774] - attr(*, "resolved")= logi FALSE [13:13:40.774] - attr(*, "total_size")= num 2240 [13:13:40.774] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:40.774] - attr(*, "already-done")= logi TRUE [13:13:40.779] - copied '...future.FUN' to environment [13:13:40.779] - copied 'future.call.arguments' to environment [13:13:40.779] - copied '...future.elements_ii' to environment [13:13:40.779] - copied '...future.seeds_ii' to environment [13:13:40.780] - copied '...future.globals.maxSize' to environment [13:13:40.780] assign_globals() ... done [13:13:40.780] plan(): Setting new future strategy stack: [13:13:40.780] List of future strategies: [13:13:40.780] 1. sequential: [13:13:40.780] - args: function (..., envir = parent.frame(), workers = "") [13:13:40.780] - tweaked: FALSE [13:13:40.780] - call: NULL [13:13:40.781] plan(): nbrOfWorkers() = 1 [13:13:40.782] plan(): Setting new future strategy stack: [13:13:40.782] List of future strategies: [13:13:40.782] 1. multisession: [13:13:40.782] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [13:13:40.782] - tweaked: FALSE [13:13:40.782] - call: plan(strategy) [13:13:40.784] plan(): nbrOfWorkers() = 1 [13:13:40.784] SequentialFuture started (and completed) [13:13:40.784] - Launch lazy future ... done [13:13:40.784] run() for 'SequentialFuture' ... done [13:13:40.784] Created future: [13:13:40.785] SequentialFuture: [13:13:40.785] Label: 'future_lapply-3' [13:13:40.785] Expression: [13:13:40.785] { [13:13:40.785] do.call(function(...) { [13:13:40.785] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:40.785] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:40.785] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:40.785] on.exit(options(oopts), add = TRUE) [13:13:40.785] } [13:13:40.785] { [13:13:40.785] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:40.785] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:40.785] ...future.FUN(...future.X_jj, ...) [13:13:40.785] }) [13:13:40.785] } [13:13:40.785] }, args = future.call.arguments) [13:13:40.785] } [13:13:40.785] Lazy evaluation: FALSE [13:13:40.785] Asynchronous evaluation: FALSE [13:13:40.785] Local evaluation: TRUE [13:13:40.785] Environment: R_GlobalEnv [13:13:40.785] Capture standard output: TRUE [13:13:40.785] Capture condition classes: 'condition' (excluding 'nothing') [13:13:40.785] 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) [13:13:40.785] Packages: [13:13:40.785] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:40.785] Resolved: TRUE [13:13:40.785] Value: 120 bytes of class 'list' [13:13:40.785] Early signaling: FALSE [13:13:40.785] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:40.785] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:40.786] Chunk #3 of 4 ... DONE [13:13:40.786] Chunk #4 of 4 ... [13:13:40.786] - Finding globals in 'X' for chunk #4 ... [13:13:40.786] getGlobalsAndPackages() ... [13:13:40.786] Searching for globals... [13:13:40.787] [13:13:40.787] Searching for globals ... DONE [13:13:40.787] - globals: [0] [13:13:40.787] getGlobalsAndPackages() ... DONE [13:13:40.787] + additional globals found: [n=0] [13:13:40.787] + additional namespaces needed: [n=0] [13:13:40.787] - Finding globals in 'X' for chunk #4 ... DONE [13:13:40.787] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [13:13:40.788] - seeds: [13:13:40.788] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:40.788] getGlobalsAndPackages() ... [13:13:40.788] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:40.788] Resolving globals: FALSE [13:13:40.788] Tweak future expression to call with '...' arguments ... [13:13:40.789] { [13:13:40.789] do.call(function(...) { [13:13:40.789] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:40.789] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:40.789] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:40.789] on.exit(options(oopts), add = TRUE) [13:13:40.789] } [13:13:40.789] { [13:13:40.789] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:40.789] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:40.789] ...future.FUN(...future.X_jj, ...) [13:13:40.789] }) [13:13:40.789] } [13:13:40.789] }, args = future.call.arguments) [13:13:40.789] } [13:13:40.789] Tweak future expression to call with '...' arguments ... DONE [13:13:40.789] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:40.789] [13:13:40.790] getGlobalsAndPackages() ... DONE [13:13:40.790] run() for 'Future' ... [13:13:40.790] - state: 'created' [13:13:40.790] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:40.792] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:40.792] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:40.792] - Field: 'label' [13:13:40.793] - Field: 'local' [13:13:40.793] - Field: 'owner' [13:13:40.793] - Field: 'envir' [13:13:40.793] - Field: 'packages' [13:13:40.793] - Field: 'gc' [13:13:40.793] - Field: 'conditions' [13:13:40.793] - Field: 'expr' [13:13:40.794] - Field: 'uuid' [13:13:40.794] - Field: 'seed' [13:13:40.794] - Field: 'version' [13:13:40.794] - Field: 'result' [13:13:40.794] - Field: 'asynchronous' [13:13:40.794] - Field: 'calls' [13:13:40.794] - Field: 'globals' [13:13:40.795] - Field: 'stdout' [13:13:40.795] - Field: 'earlySignal' [13:13:40.795] - Field: 'lazy' [13:13:40.795] - Field: 'state' [13:13:40.795] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:40.795] - Launch lazy future ... [13:13:40.796] Packages needed by the future expression (n = 0): [13:13:40.796] Packages needed by future strategies (n = 0): [13:13:40.796] { [13:13:40.796] { [13:13:40.796] { [13:13:40.796] ...future.startTime <- base::Sys.time() [13:13:40.796] { [13:13:40.796] { [13:13:40.796] { [13:13:40.796] base::local({ [13:13:40.796] has_future <- base::requireNamespace("future", [13:13:40.796] quietly = TRUE) [13:13:40.796] if (has_future) { [13:13:40.796] ns <- base::getNamespace("future") [13:13:40.796] version <- ns[[".package"]][["version"]] [13:13:40.796] if (is.null(version)) [13:13:40.796] version <- utils::packageVersion("future") [13:13:40.796] } [13:13:40.796] else { [13:13:40.796] version <- NULL [13:13:40.796] } [13:13:40.796] if (!has_future || version < "1.8.0") { [13:13:40.796] info <- base::c(r_version = base::gsub("R version ", [13:13:40.796] "", base::R.version$version.string), [13:13:40.796] platform = base::sprintf("%s (%s-bit)", [13:13:40.796] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:40.796] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:40.796] "release", "version")], collapse = " "), [13:13:40.796] hostname = base::Sys.info()[["nodename"]]) [13:13:40.796] info <- base::sprintf("%s: %s", base::names(info), [13:13:40.796] info) [13:13:40.796] info <- base::paste(info, collapse = "; ") [13:13:40.796] if (!has_future) { [13:13:40.796] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:40.796] info) [13:13:40.796] } [13:13:40.796] else { [13:13:40.796] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:40.796] info, version) [13:13:40.796] } [13:13:40.796] base::stop(msg) [13:13:40.796] } [13:13:40.796] }) [13:13:40.796] } [13:13:40.796] options(future.plan = NULL) [13:13:40.796] Sys.unsetenv("R_FUTURE_PLAN") [13:13:40.796] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:40.796] } [13:13:40.796] ...future.workdir <- getwd() [13:13:40.796] } [13:13:40.796] ...future.oldOptions <- base::as.list(base::.Options) [13:13:40.796] ...future.oldEnvVars <- base::Sys.getenv() [13:13:40.796] } [13:13:40.796] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:40.796] future.globals.maxSize = 2097152000, future.globals.method = NULL, [13:13:40.796] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:40.796] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:40.796] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:40.796] future.stdout.windows.reencode = NULL, width = 80L) [13:13:40.796] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:40.796] base::names(...future.oldOptions)) [13:13:40.796] } [13:13:40.796] if (FALSE) { [13:13:40.796] } [13:13:40.796] else { [13:13:40.796] if (TRUE) { [13:13:40.796] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:40.796] open = "w") [13:13:40.796] } [13:13:40.796] else { [13:13:40.796] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:40.796] windows = "NUL", "/dev/null"), open = "w") [13:13:40.796] } [13:13:40.796] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:40.796] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:40.796] base::sink(type = "output", split = FALSE) [13:13:40.796] base::close(...future.stdout) [13:13:40.796] }, add = TRUE) [13:13:40.796] } [13:13:40.796] ...future.frame <- base::sys.nframe() [13:13:40.796] ...future.conditions <- base::list() [13:13:40.796] ...future.rng <- base::globalenv()$.Random.seed [13:13:40.796] if (FALSE) { [13:13:40.796] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:40.796] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:40.796] } [13:13:40.796] ...future.result <- base::tryCatch({ [13:13:40.796] base::withCallingHandlers({ [13:13:40.796] ...future.value <- base::withVisible(base::local({ [13:13:40.796] do.call(function(...) { [13:13:40.796] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:40.796] if (!identical(...future.globals.maxSize.org, [13:13:40.796] ...future.globals.maxSize)) { [13:13:40.796] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:40.796] on.exit(options(oopts), add = TRUE) [13:13:40.796] } [13:13:40.796] { [13:13:40.796] lapply(seq_along(...future.elements_ii), [13:13:40.796] FUN = function(jj) { [13:13:40.796] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:40.796] ...future.FUN(...future.X_jj, ...) [13:13:40.796] }) [13:13:40.796] } [13:13:40.796] }, args = future.call.arguments) [13:13:40.796] })) [13:13:40.796] future::FutureResult(value = ...future.value$value, [13:13:40.796] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:40.796] ...future.rng), globalenv = if (FALSE) [13:13:40.796] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:40.796] ...future.globalenv.names)) [13:13:40.796] else NULL, started = ...future.startTime, version = "1.8") [13:13:40.796] }, condition = base::local({ [13:13:40.796] c <- base::c [13:13:40.796] inherits <- base::inherits [13:13:40.796] invokeRestart <- base::invokeRestart [13:13:40.796] length <- base::length [13:13:40.796] list <- base::list [13:13:40.796] seq.int <- base::seq.int [13:13:40.796] signalCondition <- base::signalCondition [13:13:40.796] sys.calls <- base::sys.calls [13:13:40.796] `[[` <- base::`[[` [13:13:40.796] `+` <- base::`+` [13:13:40.796] `<<-` <- base::`<<-` [13:13:40.796] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:40.796] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:40.796] 3L)] [13:13:40.796] } [13:13:40.796] function(cond) { [13:13:40.796] is_error <- inherits(cond, "error") [13:13:40.796] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:40.796] NULL) [13:13:40.796] if (is_error) { [13:13:40.796] sessionInformation <- function() { [13:13:40.796] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:40.796] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:40.796] search = base::search(), system = base::Sys.info()) [13:13:40.796] } [13:13:40.796] ...future.conditions[[length(...future.conditions) + [13:13:40.796] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:40.796] cond$call), session = sessionInformation(), [13:13:40.796] timestamp = base::Sys.time(), signaled = 0L) [13:13:40.796] signalCondition(cond) [13:13:40.796] } [13:13:40.796] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:40.796] "immediateCondition"))) { [13:13:40.796] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:40.796] ...future.conditions[[length(...future.conditions) + [13:13:40.796] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:40.796] if (TRUE && !signal) { [13:13:40.796] muffleCondition <- function (cond, pattern = "^muffle") [13:13:40.796] { [13:13:40.796] inherits <- base::inherits [13:13:40.796] invokeRestart <- base::invokeRestart [13:13:40.796] is.null <- base::is.null [13:13:40.796] muffled <- FALSE [13:13:40.796] if (inherits(cond, "message")) { [13:13:40.796] muffled <- grepl(pattern, "muffleMessage") [13:13:40.796] if (muffled) [13:13:40.796] invokeRestart("muffleMessage") [13:13:40.796] } [13:13:40.796] else if (inherits(cond, "warning")) { [13:13:40.796] muffled <- grepl(pattern, "muffleWarning") [13:13:40.796] if (muffled) [13:13:40.796] invokeRestart("muffleWarning") [13:13:40.796] } [13:13:40.796] else if (inherits(cond, "condition")) { [13:13:40.796] if (!is.null(pattern)) { [13:13:40.796] computeRestarts <- base::computeRestarts [13:13:40.796] grepl <- base::grepl [13:13:40.796] restarts <- computeRestarts(cond) [13:13:40.796] for (restart in restarts) { [13:13:40.796] name <- restart$name [13:13:40.796] if (is.null(name)) [13:13:40.796] next [13:13:40.796] if (!grepl(pattern, name)) [13:13:40.796] next [13:13:40.796] invokeRestart(restart) [13:13:40.796] muffled <- TRUE [13:13:40.796] break [13:13:40.796] } [13:13:40.796] } [13:13:40.796] } [13:13:40.796] invisible(muffled) [13:13:40.796] } [13:13:40.796] muffleCondition(cond, pattern = "^muffle") [13:13:40.796] } [13:13:40.796] } [13:13:40.796] else { [13:13:40.796] if (TRUE) { [13:13:40.796] muffleCondition <- function (cond, pattern = "^muffle") [13:13:40.796] { [13:13:40.796] inherits <- base::inherits [13:13:40.796] invokeRestart <- base::invokeRestart [13:13:40.796] is.null <- base::is.null [13:13:40.796] muffled <- FALSE [13:13:40.796] if (inherits(cond, "message")) { [13:13:40.796] muffled <- grepl(pattern, "muffleMessage") [13:13:40.796] if (muffled) [13:13:40.796] invokeRestart("muffleMessage") [13:13:40.796] } [13:13:40.796] else if (inherits(cond, "warning")) { [13:13:40.796] muffled <- grepl(pattern, "muffleWarning") [13:13:40.796] if (muffled) [13:13:40.796] invokeRestart("muffleWarning") [13:13:40.796] } [13:13:40.796] else if (inherits(cond, "condition")) { [13:13:40.796] if (!is.null(pattern)) { [13:13:40.796] computeRestarts <- base::computeRestarts [13:13:40.796] grepl <- base::grepl [13:13:40.796] restarts <- computeRestarts(cond) [13:13:40.796] for (restart in restarts) { [13:13:40.796] name <- restart$name [13:13:40.796] if (is.null(name)) [13:13:40.796] next [13:13:40.796] if (!grepl(pattern, name)) [13:13:40.796] next [13:13:40.796] invokeRestart(restart) [13:13:40.796] muffled <- TRUE [13:13:40.796] break [13:13:40.796] } [13:13:40.796] } [13:13:40.796] } [13:13:40.796] invisible(muffled) [13:13:40.796] } [13:13:40.796] muffleCondition(cond, pattern = "^muffle") [13:13:40.796] } [13:13:40.796] } [13:13:40.796] } [13:13:40.796] })) [13:13:40.796] }, error = function(ex) { [13:13:40.796] base::structure(base::list(value = NULL, visible = NULL, [13:13:40.796] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:40.796] ...future.rng), started = ...future.startTime, [13:13:40.796] finished = Sys.time(), session_uuid = NA_character_, [13:13:40.796] version = "1.8"), class = "FutureResult") [13:13:40.796] }, finally = { [13:13:40.796] if (!identical(...future.workdir, getwd())) [13:13:40.796] setwd(...future.workdir) [13:13:40.796] { [13:13:40.796] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:40.796] ...future.oldOptions$nwarnings <- NULL [13:13:40.796] } [13:13:40.796] base::options(...future.oldOptions) [13:13:40.796] if (.Platform$OS.type == "windows") { [13:13:40.796] old_names <- names(...future.oldEnvVars) [13:13:40.796] envs <- base::Sys.getenv() [13:13:40.796] names <- names(envs) [13:13:40.796] common <- intersect(names, old_names) [13:13:40.796] added <- setdiff(names, old_names) [13:13:40.796] removed <- setdiff(old_names, names) [13:13:40.796] changed <- common[...future.oldEnvVars[common] != [13:13:40.796] envs[common]] [13:13:40.796] NAMES <- toupper(changed) [13:13:40.796] args <- list() [13:13:40.796] for (kk in seq_along(NAMES)) { [13:13:40.796] name <- changed[[kk]] [13:13:40.796] NAME <- NAMES[[kk]] [13:13:40.796] if (name != NAME && is.element(NAME, old_names)) [13:13:40.796] next [13:13:40.796] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:40.796] } [13:13:40.796] NAMES <- toupper(added) [13:13:40.796] for (kk in seq_along(NAMES)) { [13:13:40.796] name <- added[[kk]] [13:13:40.796] NAME <- NAMES[[kk]] [13:13:40.796] if (name != NAME && is.element(NAME, old_names)) [13:13:40.796] next [13:13:40.796] args[[name]] <- "" [13:13:40.796] } [13:13:40.796] NAMES <- toupper(removed) [13:13:40.796] for (kk in seq_along(NAMES)) { [13:13:40.796] name <- removed[[kk]] [13:13:40.796] NAME <- NAMES[[kk]] [13:13:40.796] if (name != NAME && is.element(NAME, old_names)) [13:13:40.796] next [13:13:40.796] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:40.796] } [13:13:40.796] if (length(args) > 0) [13:13:40.796] base::do.call(base::Sys.setenv, args = args) [13:13:40.796] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:40.796] } [13:13:40.796] else { [13:13:40.796] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:40.796] } [13:13:40.796] { [13:13:40.796] if (base::length(...future.futureOptionsAdded) > [13:13:40.796] 0L) { [13:13:40.796] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:40.796] base::names(opts) <- ...future.futureOptionsAdded [13:13:40.796] base::options(opts) [13:13:40.796] } [13:13:40.796] { [13:13:40.796] { [13:13:40.796] NULL [13:13:40.796] RNGkind("Mersenne-Twister") [13:13:40.796] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:40.796] inherits = FALSE) [13:13:40.796] } [13:13:40.796] options(future.plan = NULL) [13:13:40.796] if (is.na(NA_character_)) [13:13:40.796] Sys.unsetenv("R_FUTURE_PLAN") [13:13:40.796] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:40.796] future::plan(list(function (..., workers = availableCores(), [13:13:40.796] lazy = FALSE, rscript_libs = .libPaths(), [13:13:40.796] envir = parent.frame()) [13:13:40.796] { [13:13:40.796] if (is.function(workers)) [13:13:40.796] workers <- workers() [13:13:40.796] workers <- structure(as.integer(workers), [13:13:40.796] class = class(workers)) [13:13:40.796] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:40.796] workers >= 1) [13:13:40.796] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:40.796] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:40.796] } [13:13:40.796] future <- MultisessionFuture(..., workers = workers, [13:13:40.796] lazy = lazy, rscript_libs = rscript_libs, [13:13:40.796] envir = envir) [13:13:40.796] if (!future$lazy) [13:13:40.796] future <- run(future) [13:13:40.796] invisible(future) [13:13:40.796] }), .cleanup = FALSE, .init = FALSE) [13:13:40.796] } [13:13:40.796] } [13:13:40.796] } [13:13:40.796] }) [13:13:40.796] if (TRUE) { [13:13:40.796] base::sink(type = "output", split = FALSE) [13:13:40.796] if (TRUE) { [13:13:40.796] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:40.796] } [13:13:40.796] else { [13:13:40.796] ...future.result["stdout"] <- base::list(NULL) [13:13:40.796] } [13:13:40.796] base::close(...future.stdout) [13:13:40.796] ...future.stdout <- NULL [13:13:40.796] } [13:13:40.796] ...future.result$conditions <- ...future.conditions [13:13:40.796] ...future.result$finished <- base::Sys.time() [13:13:40.796] ...future.result [13:13:40.796] } [13:13:40.800] assign_globals() ... [13:13:40.800] List of 5 [13:13:40.800] $ ...future.FUN :function (mode = "logical", length = 0L) [13:13:40.800] $ future.call.arguments :List of 1 [13:13:40.800] ..$ length: int 2 [13:13:40.800] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:40.800] $ ...future.elements_ii :List of 1 [13:13:40.800] ..$ c: chr "list" [13:13:40.800] $ ...future.seeds_ii : NULL [13:13:40.800] $ ...future.globals.maxSize: NULL [13:13:40.800] - attr(*, "where")=List of 5 [13:13:40.800] ..$ ...future.FUN : [13:13:40.800] ..$ future.call.arguments : [13:13:40.800] ..$ ...future.elements_ii : [13:13:40.800] ..$ ...future.seeds_ii : [13:13:40.800] ..$ ...future.globals.maxSize: [13:13:40.800] - attr(*, "resolved")= logi FALSE [13:13:40.800] - attr(*, "total_size")= num 2240 [13:13:40.800] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:40.800] - attr(*, "already-done")= logi TRUE [13:13:40.805] - copied '...future.FUN' to environment [13:13:40.805] - copied 'future.call.arguments' to environment [13:13:40.805] - copied '...future.elements_ii' to environment [13:13:40.805] - copied '...future.seeds_ii' to environment [13:13:40.805] - copied '...future.globals.maxSize' to environment [13:13:40.805] assign_globals() ... done [13:13:40.806] plan(): Setting new future strategy stack: [13:13:40.806] List of future strategies: [13:13:40.806] 1. sequential: [13:13:40.806] - args: function (..., envir = parent.frame(), workers = "") [13:13:40.806] - tweaked: FALSE [13:13:40.806] - call: NULL [13:13:40.806] plan(): nbrOfWorkers() = 1 [13:13:40.807] plan(): Setting new future strategy stack: [13:13:40.808] List of future strategies: [13:13:40.808] 1. multisession: [13:13:40.808] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [13:13:40.808] - tweaked: FALSE [13:13:40.808] - call: plan(strategy) [13:13:40.810] plan(): nbrOfWorkers() = 1 [13:13:40.810] SequentialFuture started (and completed) [13:13:40.810] - Launch lazy future ... done [13:13:40.810] run() for 'SequentialFuture' ... done [13:13:40.810] Created future: [13:13:40.810] SequentialFuture: [13:13:40.810] Label: 'future_lapply-4' [13:13:40.810] Expression: [13:13:40.810] { [13:13:40.810] do.call(function(...) { [13:13:40.810] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:40.810] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:40.810] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:40.810] on.exit(options(oopts), add = TRUE) [13:13:40.810] } [13:13:40.810] { [13:13:40.810] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:40.810] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:40.810] ...future.FUN(...future.X_jj, ...) [13:13:40.810] }) [13:13:40.810] } [13:13:40.810] }, args = future.call.arguments) [13:13:40.810] } [13:13:40.810] Lazy evaluation: FALSE [13:13:40.810] Asynchronous evaluation: FALSE [13:13:40.810] Local evaluation: TRUE [13:13:40.810] Environment: R_GlobalEnv [13:13:40.810] Capture standard output: TRUE [13:13:40.810] Capture condition classes: 'condition' (excluding 'nothing') [13:13:40.810] 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) [13:13:40.810] Packages: [13:13:40.810] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:40.810] Resolved: TRUE [13:13:40.810] Value: 0 bytes of class 'list' [13:13:40.810] Early signaling: FALSE [13:13:40.810] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:40.810] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:40.811] Chunk #4 of 4 ... DONE [13:13:40.812] Launching 4 futures (chunks) ... DONE [13:13:40.812] Resolving 4 futures (chunks) ... [13:13:40.812] resolve() on list ... [13:13:40.812] recursive: 0 [13:13:40.812] length: 4 [13:13:40.812] [13:13:40.812] resolved() for 'SequentialFuture' ... [13:13:40.813] - state: 'finished' [13:13:40.813] - run: TRUE [13:13:40.813] - result: 'FutureResult' [13:13:40.813] resolved() for 'SequentialFuture' ... done [13:13:40.813] Future #1 [13:13:40.813] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:40.813] - nx: 4 [13:13:40.814] - relay: TRUE [13:13:40.814] - stdout: TRUE [13:13:40.814] - signal: TRUE [13:13:40.814] - resignal: FALSE [13:13:40.814] - force: TRUE [13:13:40.814] - relayed: [n=4] FALSE, FALSE, FALSE, FALSE [13:13:40.814] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [13:13:40.815] - until=1 [13:13:40.815] - relaying element #1 [13:13:40.815] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [13:13:40.815] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [13:13:40.815] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:40.815] length: 3 (resolved future 1) [13:13:40.815] resolved() for 'SequentialFuture' ... [13:13:40.816] - state: 'finished' [13:13:40.816] - run: TRUE [13:13:40.816] - result: 'FutureResult' [13:13:40.816] resolved() for 'SequentialFuture' ... done [13:13:40.816] Future #2 [13:13:40.816] signalConditionsASAP(SequentialFuture, pos=2) ... [13:13:40.817] - nx: 4 [13:13:40.817] - relay: TRUE [13:13:40.817] - stdout: TRUE [13:13:40.817] - signal: TRUE [13:13:40.817] - resignal: FALSE [13:13:40.817] - force: TRUE [13:13:40.817] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [13:13:40.817] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [13:13:40.818] - until=2 [13:13:40.818] - relaying element #2 [13:13:40.818] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [13:13:40.818] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [13:13:40.818] signalConditionsASAP(SequentialFuture, pos=2) ... done [13:13:40.818] length: 2 (resolved future 2) [13:13:40.819] resolved() for 'SequentialFuture' ... [13:13:40.819] - state: 'finished' [13:13:40.819] - run: TRUE [13:13:40.819] - result: 'FutureResult' [13:13:40.819] resolved() for 'SequentialFuture' ... done [13:13:40.819] Future #3 [13:13:40.820] signalConditionsASAP(SequentialFuture, pos=3) ... [13:13:40.820] - nx: 4 [13:13:40.820] - relay: TRUE [13:13:40.820] - stdout: TRUE [13:13:40.820] - signal: TRUE [13:13:40.820] - resignal: FALSE [13:13:40.820] - force: TRUE [13:13:40.820] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [13:13:40.821] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [13:13:40.821] - until=3 [13:13:40.821] - relaying element #3 [13:13:40.821] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [13:13:40.821] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [13:13:40.821] signalConditionsASAP(SequentialFuture, pos=3) ... done [13:13:40.821] length: 1 (resolved future 3) [13:13:40.822] resolved() for 'SequentialFuture' ... [13:13:40.822] - state: 'finished' [13:13:40.822] - run: TRUE [13:13:40.822] - result: 'FutureResult' [13:13:40.822] resolved() for 'SequentialFuture' ... done [13:13:40.822] Future #4 [13:13:40.823] signalConditionsASAP(SequentialFuture, pos=4) ... [13:13:40.823] - nx: 4 [13:13:40.823] - relay: TRUE [13:13:40.823] - stdout: TRUE [13:13:40.823] - signal: TRUE [13:13:40.823] - resignal: FALSE [13:13:40.823] - force: TRUE [13:13:40.823] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [13:13:40.824] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [13:13:40.824] - until=4 [13:13:40.824] - relaying element #4 [13:13:40.824] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [13:13:40.824] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [13:13:40.824] signalConditionsASAP(SequentialFuture, pos=4) ... done [13:13:40.824] length: 0 (resolved future 4) [13:13:40.825] Relaying remaining futures [13:13:40.825] signalConditionsASAP(NULL, pos=0) ... [13:13:40.825] - nx: 4 [13:13:40.825] - relay: TRUE [13:13:40.825] - stdout: TRUE [13:13:40.825] - signal: TRUE [13:13:40.825] - resignal: FALSE [13:13:40.825] - force: TRUE [13:13:40.826] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [13:13:40.826] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE - flush all [13:13:40.826] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [13:13:40.826] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [13:13:40.826] signalConditionsASAP(NULL, pos=0) ... done [13:13:40.826] resolve() on list ... DONE [13:13:40.827] - Number of value chunks collected: 4 [13:13:40.827] Resolving 4 futures (chunks) ... DONE [13:13:40.827] Reducing values from 4 chunks ... [13:13:40.827] - Number of values collected after concatenation: 4 [13:13:40.827] - Number of values expected: 4 [13:13:40.827] Reducing values from 4 chunks ... DONE [13:13:40.828] 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 [13:13:40.830] future_lapply() ... [13:13:40.832] Number of chunks: 4 [13:13:40.832] getGlobalsAndPackagesXApply() ... [13:13:40.833] - future.globals: TRUE [13:13:40.833] getGlobalsAndPackages() ... [13:13:40.833] Searching for globals... [13:13:40.834] - globals found: [2] 'FUN', '.Internal' [13:13:40.834] Searching for globals ... DONE [13:13:40.834] Resolving globals: FALSE [13:13:40.835] The total size of the 1 globals is 2.13 KiB (2184 bytes) [13:13:40.835] 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') [13:13:40.835] - globals: [1] 'FUN' [13:13:40.836] [13:13:40.836] getGlobalsAndPackages() ... DONE [13:13:40.836] - globals found/used: [n=1] 'FUN' [13:13:40.836] - needed namespaces: [n=0] [13:13:40.836] Finding globals ... DONE [13:13:40.836] - use_args: TRUE [13:13:40.836] - Getting '...' globals ... [13:13:40.837] resolve() on list ... [13:13:40.837] recursive: 0 [13:13:40.837] length: 1 [13:13:40.837] elements: '...' [13:13:40.837] length: 0 (resolved future 1) [13:13:40.837] resolve() on list ... DONE [13:13:40.837] - '...' content: [n=1] 'length' [13:13:40.838] List of 1 [13:13:40.838] $ ...:List of 1 [13:13:40.838] ..$ length: int 2 [13:13:40.838] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:40.838] - attr(*, "where")=List of 1 [13:13:40.838] ..$ ...: [13:13:40.838] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:40.838] - attr(*, "resolved")= logi TRUE [13:13:40.838] - attr(*, "total_size")= num NA [13:13:40.840] - Getting '...' globals ... DONE [13:13:40.841] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:40.841] List of 2 [13:13:40.841] $ ...future.FUN:function (mode = "logical", length = 0L) [13:13:40.841] $ ... :List of 1 [13:13:40.841] ..$ length: int 2 [13:13:40.841] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:40.841] - attr(*, "where")=List of 2 [13:13:40.841] ..$ ...future.FUN: [13:13:40.841] ..$ ... : [13:13:40.841] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:40.841] - attr(*, "resolved")= logi FALSE [13:13:40.841] - attr(*, "total_size")= num 2240 [13:13:40.844] Packages to be attached in all futures: [n=0] [13:13:40.844] getGlobalsAndPackagesXApply() ... DONE [13:13:40.844] Number of futures (= number of chunks): 4 [13:13:40.844] Launching 4 futures (chunks) ... [13:13:40.845] Chunk #1 of 4 ... [13:13:40.845] - Finding globals in 'X' for chunk #1 ... [13:13:40.846] getGlobalsAndPackages() ... [13:13:40.846] Searching for globals... [13:13:40.847] [13:13:40.847] Searching for globals ... DONE [13:13:40.847] - globals: [0] [13:13:40.847] getGlobalsAndPackages() ... DONE [13:13:40.847] + additional globals found: [n=0] [13:13:40.847] + additional namespaces needed: [n=0] [13:13:40.847] - Finding globals in 'X' for chunk #1 ... DONE [13:13:40.848] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [13:13:40.848] - seeds: [13:13:40.848] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:40.848] getGlobalsAndPackages() ... [13:13:40.848] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:40.848] Resolving globals: FALSE [13:13:40.848] Tweak future expression to call with '...' arguments ... [13:13:40.848] { [13:13:40.848] do.call(function(...) { [13:13:40.848] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:40.848] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:40.848] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:40.848] on.exit(options(oopts), add = TRUE) [13:13:40.848] } [13:13:40.848] { [13:13:40.848] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:40.848] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:40.848] ...future.FUN(...future.X_jj, ...) [13:13:40.848] }) [13:13:40.848] } [13:13:40.848] }, args = future.call.arguments) [13:13:40.848] } [13:13:40.849] Tweak future expression to call with '...' arguments ... DONE [13:13:40.849] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:40.849] [13:13:40.849] getGlobalsAndPackages() ... DONE [13:13:40.850] run() for 'Future' ... [13:13:40.850] - state: 'created' [13:13:40.850] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:40.852] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:40.852] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:40.852] - Field: 'label' [13:13:40.852] - Field: 'local' [13:13:40.853] - Field: 'owner' [13:13:40.853] - Field: 'envir' [13:13:40.853] - Field: 'packages' [13:13:40.853] - Field: 'gc' [13:13:40.853] - Field: 'conditions' [13:13:40.853] - Field: 'expr' [13:13:40.853] - Field: 'uuid' [13:13:40.854] - Field: 'seed' [13:13:40.854] - Field: 'version' [13:13:40.854] - Field: 'result' [13:13:40.854] - Field: 'asynchronous' [13:13:40.854] - Field: 'calls' [13:13:40.854] - Field: 'globals' [13:13:40.854] - Field: 'stdout' [13:13:40.854] - Field: 'earlySignal' [13:13:40.855] - Field: 'lazy' [13:13:40.855] - Field: 'state' [13:13:40.855] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:40.855] - Launch lazy future ... [13:13:40.855] Packages needed by the future expression (n = 0): [13:13:40.855] Packages needed by future strategies (n = 0): [13:13:40.856] { [13:13:40.856] { [13:13:40.856] { [13:13:40.856] ...future.startTime <- base::Sys.time() [13:13:40.856] { [13:13:40.856] { [13:13:40.856] { [13:13:40.856] base::local({ [13:13:40.856] has_future <- base::requireNamespace("future", [13:13:40.856] quietly = TRUE) [13:13:40.856] if (has_future) { [13:13:40.856] ns <- base::getNamespace("future") [13:13:40.856] version <- ns[[".package"]][["version"]] [13:13:40.856] if (is.null(version)) [13:13:40.856] version <- utils::packageVersion("future") [13:13:40.856] } [13:13:40.856] else { [13:13:40.856] version <- NULL [13:13:40.856] } [13:13:40.856] if (!has_future || version < "1.8.0") { [13:13:40.856] info <- base::c(r_version = base::gsub("R version ", [13:13:40.856] "", base::R.version$version.string), [13:13:40.856] platform = base::sprintf("%s (%s-bit)", [13:13:40.856] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:40.856] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:40.856] "release", "version")], collapse = " "), [13:13:40.856] hostname = base::Sys.info()[["nodename"]]) [13:13:40.856] info <- base::sprintf("%s: %s", base::names(info), [13:13:40.856] info) [13:13:40.856] info <- base::paste(info, collapse = "; ") [13:13:40.856] if (!has_future) { [13:13:40.856] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:40.856] info) [13:13:40.856] } [13:13:40.856] else { [13:13:40.856] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:40.856] info, version) [13:13:40.856] } [13:13:40.856] base::stop(msg) [13:13:40.856] } [13:13:40.856] }) [13:13:40.856] } [13:13:40.856] options(future.plan = NULL) [13:13:40.856] Sys.unsetenv("R_FUTURE_PLAN") [13:13:40.856] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:40.856] } [13:13:40.856] ...future.workdir <- getwd() [13:13:40.856] } [13:13:40.856] ...future.oldOptions <- base::as.list(base::.Options) [13:13:40.856] ...future.oldEnvVars <- base::Sys.getenv() [13:13:40.856] } [13:13:40.856] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:40.856] future.globals.maxSize = 2097152000, future.globals.method = NULL, [13:13:40.856] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:40.856] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:40.856] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:40.856] future.stdout.windows.reencode = NULL, width = 80L) [13:13:40.856] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:40.856] base::names(...future.oldOptions)) [13:13:40.856] } [13:13:40.856] if (FALSE) { [13:13:40.856] } [13:13:40.856] else { [13:13:40.856] if (TRUE) { [13:13:40.856] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:40.856] open = "w") [13:13:40.856] } [13:13:40.856] else { [13:13:40.856] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:40.856] windows = "NUL", "/dev/null"), open = "w") [13:13:40.856] } [13:13:40.856] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:40.856] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:40.856] base::sink(type = "output", split = FALSE) [13:13:40.856] base::close(...future.stdout) [13:13:40.856] }, add = TRUE) [13:13:40.856] } [13:13:40.856] ...future.frame <- base::sys.nframe() [13:13:40.856] ...future.conditions <- base::list() [13:13:40.856] ...future.rng <- base::globalenv()$.Random.seed [13:13:40.856] if (FALSE) { [13:13:40.856] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:40.856] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:40.856] } [13:13:40.856] ...future.result <- base::tryCatch({ [13:13:40.856] base::withCallingHandlers({ [13:13:40.856] ...future.value <- base::withVisible(base::local({ [13:13:40.856] do.call(function(...) { [13:13:40.856] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:40.856] if (!identical(...future.globals.maxSize.org, [13:13:40.856] ...future.globals.maxSize)) { [13:13:40.856] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:40.856] on.exit(options(oopts), add = TRUE) [13:13:40.856] } [13:13:40.856] { [13:13:40.856] lapply(seq_along(...future.elements_ii), [13:13:40.856] FUN = function(jj) { [13:13:40.856] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:40.856] ...future.FUN(...future.X_jj, ...) [13:13:40.856] }) [13:13:40.856] } [13:13:40.856] }, args = future.call.arguments) [13:13:40.856] })) [13:13:40.856] future::FutureResult(value = ...future.value$value, [13:13:40.856] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:40.856] ...future.rng), globalenv = if (FALSE) [13:13:40.856] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:40.856] ...future.globalenv.names)) [13:13:40.856] else NULL, started = ...future.startTime, version = "1.8") [13:13:40.856] }, condition = base::local({ [13:13:40.856] c <- base::c [13:13:40.856] inherits <- base::inherits [13:13:40.856] invokeRestart <- base::invokeRestart [13:13:40.856] length <- base::length [13:13:40.856] list <- base::list [13:13:40.856] seq.int <- base::seq.int [13:13:40.856] signalCondition <- base::signalCondition [13:13:40.856] sys.calls <- base::sys.calls [13:13:40.856] `[[` <- base::`[[` [13:13:40.856] `+` <- base::`+` [13:13:40.856] `<<-` <- base::`<<-` [13:13:40.856] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:40.856] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:40.856] 3L)] [13:13:40.856] } [13:13:40.856] function(cond) { [13:13:40.856] is_error <- inherits(cond, "error") [13:13:40.856] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:40.856] NULL) [13:13:40.856] if (is_error) { [13:13:40.856] sessionInformation <- function() { [13:13:40.856] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:40.856] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:40.856] search = base::search(), system = base::Sys.info()) [13:13:40.856] } [13:13:40.856] ...future.conditions[[length(...future.conditions) + [13:13:40.856] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:40.856] cond$call), session = sessionInformation(), [13:13:40.856] timestamp = base::Sys.time(), signaled = 0L) [13:13:40.856] signalCondition(cond) [13:13:40.856] } [13:13:40.856] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:40.856] "immediateCondition"))) { [13:13:40.856] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:40.856] ...future.conditions[[length(...future.conditions) + [13:13:40.856] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:40.856] if (TRUE && !signal) { [13:13:40.856] muffleCondition <- function (cond, pattern = "^muffle") [13:13:40.856] { [13:13:40.856] inherits <- base::inherits [13:13:40.856] invokeRestart <- base::invokeRestart [13:13:40.856] is.null <- base::is.null [13:13:40.856] muffled <- FALSE [13:13:40.856] if (inherits(cond, "message")) { [13:13:40.856] muffled <- grepl(pattern, "muffleMessage") [13:13:40.856] if (muffled) [13:13:40.856] invokeRestart("muffleMessage") [13:13:40.856] } [13:13:40.856] else if (inherits(cond, "warning")) { [13:13:40.856] muffled <- grepl(pattern, "muffleWarning") [13:13:40.856] if (muffled) [13:13:40.856] invokeRestart("muffleWarning") [13:13:40.856] } [13:13:40.856] else if (inherits(cond, "condition")) { [13:13:40.856] if (!is.null(pattern)) { [13:13:40.856] computeRestarts <- base::computeRestarts [13:13:40.856] grepl <- base::grepl [13:13:40.856] restarts <- computeRestarts(cond) [13:13:40.856] for (restart in restarts) { [13:13:40.856] name <- restart$name [13:13:40.856] if (is.null(name)) [13:13:40.856] next [13:13:40.856] if (!grepl(pattern, name)) [13:13:40.856] next [13:13:40.856] invokeRestart(restart) [13:13:40.856] muffled <- TRUE [13:13:40.856] break [13:13:40.856] } [13:13:40.856] } [13:13:40.856] } [13:13:40.856] invisible(muffled) [13:13:40.856] } [13:13:40.856] muffleCondition(cond, pattern = "^muffle") [13:13:40.856] } [13:13:40.856] } [13:13:40.856] else { [13:13:40.856] if (TRUE) { [13:13:40.856] muffleCondition <- function (cond, pattern = "^muffle") [13:13:40.856] { [13:13:40.856] inherits <- base::inherits [13:13:40.856] invokeRestart <- base::invokeRestart [13:13:40.856] is.null <- base::is.null [13:13:40.856] muffled <- FALSE [13:13:40.856] if (inherits(cond, "message")) { [13:13:40.856] muffled <- grepl(pattern, "muffleMessage") [13:13:40.856] if (muffled) [13:13:40.856] invokeRestart("muffleMessage") [13:13:40.856] } [13:13:40.856] else if (inherits(cond, "warning")) { [13:13:40.856] muffled <- grepl(pattern, "muffleWarning") [13:13:40.856] if (muffled) [13:13:40.856] invokeRestart("muffleWarning") [13:13:40.856] } [13:13:40.856] else if (inherits(cond, "condition")) { [13:13:40.856] if (!is.null(pattern)) { [13:13:40.856] computeRestarts <- base::computeRestarts [13:13:40.856] grepl <- base::grepl [13:13:40.856] restarts <- computeRestarts(cond) [13:13:40.856] for (restart in restarts) { [13:13:40.856] name <- restart$name [13:13:40.856] if (is.null(name)) [13:13:40.856] next [13:13:40.856] if (!grepl(pattern, name)) [13:13:40.856] next [13:13:40.856] invokeRestart(restart) [13:13:40.856] muffled <- TRUE [13:13:40.856] break [13:13:40.856] } [13:13:40.856] } [13:13:40.856] } [13:13:40.856] invisible(muffled) [13:13:40.856] } [13:13:40.856] muffleCondition(cond, pattern = "^muffle") [13:13:40.856] } [13:13:40.856] } [13:13:40.856] } [13:13:40.856] })) [13:13:40.856] }, error = function(ex) { [13:13:40.856] base::structure(base::list(value = NULL, visible = NULL, [13:13:40.856] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:40.856] ...future.rng), started = ...future.startTime, [13:13:40.856] finished = Sys.time(), session_uuid = NA_character_, [13:13:40.856] version = "1.8"), class = "FutureResult") [13:13:40.856] }, finally = { [13:13:40.856] if (!identical(...future.workdir, getwd())) [13:13:40.856] setwd(...future.workdir) [13:13:40.856] { [13:13:40.856] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:40.856] ...future.oldOptions$nwarnings <- NULL [13:13:40.856] } [13:13:40.856] base::options(...future.oldOptions) [13:13:40.856] if (.Platform$OS.type == "windows") { [13:13:40.856] old_names <- names(...future.oldEnvVars) [13:13:40.856] envs <- base::Sys.getenv() [13:13:40.856] names <- names(envs) [13:13:40.856] common <- intersect(names, old_names) [13:13:40.856] added <- setdiff(names, old_names) [13:13:40.856] removed <- setdiff(old_names, names) [13:13:40.856] changed <- common[...future.oldEnvVars[common] != [13:13:40.856] envs[common]] [13:13:40.856] NAMES <- toupper(changed) [13:13:40.856] args <- list() [13:13:40.856] for (kk in seq_along(NAMES)) { [13:13:40.856] name <- changed[[kk]] [13:13:40.856] NAME <- NAMES[[kk]] [13:13:40.856] if (name != NAME && is.element(NAME, old_names)) [13:13:40.856] next [13:13:40.856] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:40.856] } [13:13:40.856] NAMES <- toupper(added) [13:13:40.856] for (kk in seq_along(NAMES)) { [13:13:40.856] name <- added[[kk]] [13:13:40.856] NAME <- NAMES[[kk]] [13:13:40.856] if (name != NAME && is.element(NAME, old_names)) [13:13:40.856] next [13:13:40.856] args[[name]] <- "" [13:13:40.856] } [13:13:40.856] NAMES <- toupper(removed) [13:13:40.856] for (kk in seq_along(NAMES)) { [13:13:40.856] name <- removed[[kk]] [13:13:40.856] NAME <- NAMES[[kk]] [13:13:40.856] if (name != NAME && is.element(NAME, old_names)) [13:13:40.856] next [13:13:40.856] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:40.856] } [13:13:40.856] if (length(args) > 0) [13:13:40.856] base::do.call(base::Sys.setenv, args = args) [13:13:40.856] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:40.856] } [13:13:40.856] else { [13:13:40.856] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:40.856] } [13:13:40.856] { [13:13:40.856] if (base::length(...future.futureOptionsAdded) > [13:13:40.856] 0L) { [13:13:40.856] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:40.856] base::names(opts) <- ...future.futureOptionsAdded [13:13:40.856] base::options(opts) [13:13:40.856] } [13:13:40.856] { [13:13:40.856] { [13:13:40.856] NULL [13:13:40.856] RNGkind("Mersenne-Twister") [13:13:40.856] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:40.856] inherits = FALSE) [13:13:40.856] } [13:13:40.856] options(future.plan = NULL) [13:13:40.856] if (is.na(NA_character_)) [13:13:40.856] Sys.unsetenv("R_FUTURE_PLAN") [13:13:40.856] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:40.856] future::plan(list(function (..., workers = availableCores(), [13:13:40.856] lazy = FALSE, rscript_libs = .libPaths(), [13:13:40.856] envir = parent.frame()) [13:13:40.856] { [13:13:40.856] if (is.function(workers)) [13:13:40.856] workers <- workers() [13:13:40.856] workers <- structure(as.integer(workers), [13:13:40.856] class = class(workers)) [13:13:40.856] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:40.856] workers >= 1) [13:13:40.856] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:40.856] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:40.856] } [13:13:40.856] future <- MultisessionFuture(..., workers = workers, [13:13:40.856] lazy = lazy, rscript_libs = rscript_libs, [13:13:40.856] envir = envir) [13:13:40.856] if (!future$lazy) [13:13:40.856] future <- run(future) [13:13:40.856] invisible(future) [13:13:40.856] }), .cleanup = FALSE, .init = FALSE) [13:13:40.856] } [13:13:40.856] } [13:13:40.856] } [13:13:40.856] }) [13:13:40.856] if (TRUE) { [13:13:40.856] base::sink(type = "output", split = FALSE) [13:13:40.856] if (TRUE) { [13:13:40.856] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:40.856] } [13:13:40.856] else { [13:13:40.856] ...future.result["stdout"] <- base::list(NULL) [13:13:40.856] } [13:13:40.856] base::close(...future.stdout) [13:13:40.856] ...future.stdout <- NULL [13:13:40.856] } [13:13:40.856] ...future.result$conditions <- ...future.conditions [13:13:40.856] ...future.result$finished <- base::Sys.time() [13:13:40.856] ...future.result [13:13:40.856] } [13:13:40.859] assign_globals() ... [13:13:40.859] List of 5 [13:13:40.859] $ ...future.FUN :function (mode = "logical", length = 0L) [13:13:40.859] $ future.call.arguments :List of 1 [13:13:40.859] ..$ length: int 2 [13:13:40.859] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:40.859] $ ...future.elements_ii :List of 1 [13:13:40.859] ..$ a: chr "integer" [13:13:40.859] $ ...future.seeds_ii : NULL [13:13:40.859] $ ...future.globals.maxSize: NULL [13:13:40.859] - attr(*, "where")=List of 5 [13:13:40.859] ..$ ...future.FUN : [13:13:40.859] ..$ future.call.arguments : [13:13:40.859] ..$ ...future.elements_ii : [13:13:40.859] ..$ ...future.seeds_ii : [13:13:40.859] ..$ ...future.globals.maxSize: [13:13:40.859] - attr(*, "resolved")= logi FALSE [13:13:40.859] - attr(*, "total_size")= num 2240 [13:13:40.859] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:40.859] - attr(*, "already-done")= logi TRUE [13:13:40.864] - copied '...future.FUN' to environment [13:13:40.864] - copied 'future.call.arguments' to environment [13:13:40.864] - copied '...future.elements_ii' to environment [13:13:40.865] - copied '...future.seeds_ii' to environment [13:13:40.865] - copied '...future.globals.maxSize' to environment [13:13:40.865] assign_globals() ... done [13:13:40.865] plan(): Setting new future strategy stack: [13:13:40.865] List of future strategies: [13:13:40.865] 1. sequential: [13:13:40.865] - args: function (..., envir = parent.frame(), workers = "") [13:13:40.865] - tweaked: FALSE [13:13:40.865] - call: NULL [13:13:40.866] plan(): nbrOfWorkers() = 1 [13:13:40.867] plan(): Setting new future strategy stack: [13:13:40.867] List of future strategies: [13:13:40.867] 1. multisession: [13:13:40.867] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [13:13:40.867] - tweaked: FALSE [13:13:40.867] - call: plan(strategy) [13:13:40.869] plan(): nbrOfWorkers() = 1 [13:13:40.869] SequentialFuture started (and completed) [13:13:40.869] - Launch lazy future ... done [13:13:40.869] run() for 'SequentialFuture' ... done [13:13:40.869] Created future: [13:13:40.870] SequentialFuture: [13:13:40.870] Label: 'future_lapply-1' [13:13:40.870] Expression: [13:13:40.870] { [13:13:40.870] do.call(function(...) { [13:13:40.870] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:40.870] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:40.870] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:40.870] on.exit(options(oopts), add = TRUE) [13:13:40.870] } [13:13:40.870] { [13:13:40.870] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:40.870] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:40.870] ...future.FUN(...future.X_jj, ...) [13:13:40.870] }) [13:13:40.870] } [13:13:40.870] }, args = future.call.arguments) [13:13:40.870] } [13:13:40.870] Lazy evaluation: FALSE [13:13:40.870] Asynchronous evaluation: FALSE [13:13:40.870] Local evaluation: TRUE [13:13:40.870] Environment: R_GlobalEnv [13:13:40.870] Capture standard output: TRUE [13:13:40.870] Capture condition classes: 'condition' (excluding 'nothing') [13:13:40.870] 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) [13:13:40.870] Packages: [13:13:40.870] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:40.870] Resolved: TRUE [13:13:40.870] Value: 56 bytes of class 'list' [13:13:40.870] Early signaling: FALSE [13:13:40.870] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:40.870] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:40.871] Chunk #1 of 4 ... DONE [13:13:40.871] Chunk #2 of 4 ... [13:13:40.871] - Finding globals in 'X' for chunk #2 ... [13:13:40.871] getGlobalsAndPackages() ... [13:13:40.871] Searching for globals... [13:13:40.871] [13:13:40.872] Searching for globals ... DONE [13:13:40.872] - globals: [0] [13:13:40.872] getGlobalsAndPackages() ... DONE [13:13:40.872] + additional globals found: [n=0] [13:13:40.872] + additional namespaces needed: [n=0] [13:13:40.872] - Finding globals in 'X' for chunk #2 ... DONE [13:13:40.872] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [13:13:40.873] - seeds: [13:13:40.873] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:40.873] getGlobalsAndPackages() ... [13:13:40.873] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:40.873] Resolving globals: FALSE [13:13:40.873] Tweak future expression to call with '...' arguments ... [13:13:40.873] { [13:13:40.873] do.call(function(...) { [13:13:40.873] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:40.873] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:40.873] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:40.873] on.exit(options(oopts), add = TRUE) [13:13:40.873] } [13:13:40.873] { [13:13:40.873] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:40.873] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:40.873] ...future.FUN(...future.X_jj, ...) [13:13:40.873] }) [13:13:40.873] } [13:13:40.873] }, args = future.call.arguments) [13:13:40.873] } [13:13:40.874] Tweak future expression to call with '...' arguments ... DONE [13:13:40.874] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:40.874] [13:13:40.874] getGlobalsAndPackages() ... DONE [13:13:40.875] run() for 'Future' ... [13:13:40.875] - state: 'created' [13:13:40.875] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:40.877] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:40.877] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:40.877] - Field: 'label' [13:13:40.877] - Field: 'local' [13:13:40.877] - Field: 'owner' [13:13:40.878] - Field: 'envir' [13:13:40.878] - Field: 'packages' [13:13:40.878] - Field: 'gc' [13:13:40.878] - Field: 'conditions' [13:13:40.878] - Field: 'expr' [13:13:40.878] - Field: 'uuid' [13:13:40.878] - Field: 'seed' [13:13:40.879] - Field: 'version' [13:13:40.879] - Field: 'result' [13:13:40.879] - Field: 'asynchronous' [13:13:40.879] - Field: 'calls' [13:13:40.879] - Field: 'globals' [13:13:40.879] - Field: 'stdout' [13:13:40.879] - Field: 'earlySignal' [13:13:40.880] - Field: 'lazy' [13:13:40.880] - Field: 'state' [13:13:40.880] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:40.880] - Launch lazy future ... [13:13:40.880] Packages needed by the future expression (n = 0): [13:13:40.880] Packages needed by future strategies (n = 0): [13:13:40.881] { [13:13:40.881] { [13:13:40.881] { [13:13:40.881] ...future.startTime <- base::Sys.time() [13:13:40.881] { [13:13:40.881] { [13:13:40.881] { [13:13:40.881] base::local({ [13:13:40.881] has_future <- base::requireNamespace("future", [13:13:40.881] quietly = TRUE) [13:13:40.881] if (has_future) { [13:13:40.881] ns <- base::getNamespace("future") [13:13:40.881] version <- ns[[".package"]][["version"]] [13:13:40.881] if (is.null(version)) [13:13:40.881] version <- utils::packageVersion("future") [13:13:40.881] } [13:13:40.881] else { [13:13:40.881] version <- NULL [13:13:40.881] } [13:13:40.881] if (!has_future || version < "1.8.0") { [13:13:40.881] info <- base::c(r_version = base::gsub("R version ", [13:13:40.881] "", base::R.version$version.string), [13:13:40.881] platform = base::sprintf("%s (%s-bit)", [13:13:40.881] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:40.881] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:40.881] "release", "version")], collapse = " "), [13:13:40.881] hostname = base::Sys.info()[["nodename"]]) [13:13:40.881] info <- base::sprintf("%s: %s", base::names(info), [13:13:40.881] info) [13:13:40.881] info <- base::paste(info, collapse = "; ") [13:13:40.881] if (!has_future) { [13:13:40.881] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:40.881] info) [13:13:40.881] } [13:13:40.881] else { [13:13:40.881] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:40.881] info, version) [13:13:40.881] } [13:13:40.881] base::stop(msg) [13:13:40.881] } [13:13:40.881] }) [13:13:40.881] } [13:13:40.881] options(future.plan = NULL) [13:13:40.881] Sys.unsetenv("R_FUTURE_PLAN") [13:13:40.881] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:40.881] } [13:13:40.881] ...future.workdir <- getwd() [13:13:40.881] } [13:13:40.881] ...future.oldOptions <- base::as.list(base::.Options) [13:13:40.881] ...future.oldEnvVars <- base::Sys.getenv() [13:13:40.881] } [13:13:40.881] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:40.881] future.globals.maxSize = 2097152000, future.globals.method = NULL, [13:13:40.881] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:40.881] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:40.881] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:40.881] future.stdout.windows.reencode = NULL, width = 80L) [13:13:40.881] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:40.881] base::names(...future.oldOptions)) [13:13:40.881] } [13:13:40.881] if (FALSE) { [13:13:40.881] } [13:13:40.881] else { [13:13:40.881] if (TRUE) { [13:13:40.881] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:40.881] open = "w") [13:13:40.881] } [13:13:40.881] else { [13:13:40.881] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:40.881] windows = "NUL", "/dev/null"), open = "w") [13:13:40.881] } [13:13:40.881] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:40.881] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:40.881] base::sink(type = "output", split = FALSE) [13:13:40.881] base::close(...future.stdout) [13:13:40.881] }, add = TRUE) [13:13:40.881] } [13:13:40.881] ...future.frame <- base::sys.nframe() [13:13:40.881] ...future.conditions <- base::list() [13:13:40.881] ...future.rng <- base::globalenv()$.Random.seed [13:13:40.881] if (FALSE) { [13:13:40.881] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:40.881] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:40.881] } [13:13:40.881] ...future.result <- base::tryCatch({ [13:13:40.881] base::withCallingHandlers({ [13:13:40.881] ...future.value <- base::withVisible(base::local({ [13:13:40.881] do.call(function(...) { [13:13:40.881] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:40.881] if (!identical(...future.globals.maxSize.org, [13:13:40.881] ...future.globals.maxSize)) { [13:13:40.881] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:40.881] on.exit(options(oopts), add = TRUE) [13:13:40.881] } [13:13:40.881] { [13:13:40.881] lapply(seq_along(...future.elements_ii), [13:13:40.881] FUN = function(jj) { [13:13:40.881] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:40.881] ...future.FUN(...future.X_jj, ...) [13:13:40.881] }) [13:13:40.881] } [13:13:40.881] }, args = future.call.arguments) [13:13:40.881] })) [13:13:40.881] future::FutureResult(value = ...future.value$value, [13:13:40.881] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:40.881] ...future.rng), globalenv = if (FALSE) [13:13:40.881] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:40.881] ...future.globalenv.names)) [13:13:40.881] else NULL, started = ...future.startTime, version = "1.8") [13:13:40.881] }, condition = base::local({ [13:13:40.881] c <- base::c [13:13:40.881] inherits <- base::inherits [13:13:40.881] invokeRestart <- base::invokeRestart [13:13:40.881] length <- base::length [13:13:40.881] list <- base::list [13:13:40.881] seq.int <- base::seq.int [13:13:40.881] signalCondition <- base::signalCondition [13:13:40.881] sys.calls <- base::sys.calls [13:13:40.881] `[[` <- base::`[[` [13:13:40.881] `+` <- base::`+` [13:13:40.881] `<<-` <- base::`<<-` [13:13:40.881] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:40.881] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:40.881] 3L)] [13:13:40.881] } [13:13:40.881] function(cond) { [13:13:40.881] is_error <- inherits(cond, "error") [13:13:40.881] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:40.881] NULL) [13:13:40.881] if (is_error) { [13:13:40.881] sessionInformation <- function() { [13:13:40.881] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:40.881] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:40.881] search = base::search(), system = base::Sys.info()) [13:13:40.881] } [13:13:40.881] ...future.conditions[[length(...future.conditions) + [13:13:40.881] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:40.881] cond$call), session = sessionInformation(), [13:13:40.881] timestamp = base::Sys.time(), signaled = 0L) [13:13:40.881] signalCondition(cond) [13:13:40.881] } [13:13:40.881] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:40.881] "immediateCondition"))) { [13:13:40.881] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:40.881] ...future.conditions[[length(...future.conditions) + [13:13:40.881] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:40.881] if (TRUE && !signal) { [13:13:40.881] muffleCondition <- function (cond, pattern = "^muffle") [13:13:40.881] { [13:13:40.881] inherits <- base::inherits [13:13:40.881] invokeRestart <- base::invokeRestart [13:13:40.881] is.null <- base::is.null [13:13:40.881] muffled <- FALSE [13:13:40.881] if (inherits(cond, "message")) { [13:13:40.881] muffled <- grepl(pattern, "muffleMessage") [13:13:40.881] if (muffled) [13:13:40.881] invokeRestart("muffleMessage") [13:13:40.881] } [13:13:40.881] else if (inherits(cond, "warning")) { [13:13:40.881] muffled <- grepl(pattern, "muffleWarning") [13:13:40.881] if (muffled) [13:13:40.881] invokeRestart("muffleWarning") [13:13:40.881] } [13:13:40.881] else if (inherits(cond, "condition")) { [13:13:40.881] if (!is.null(pattern)) { [13:13:40.881] computeRestarts <- base::computeRestarts [13:13:40.881] grepl <- base::grepl [13:13:40.881] restarts <- computeRestarts(cond) [13:13:40.881] for (restart in restarts) { [13:13:40.881] name <- restart$name [13:13:40.881] if (is.null(name)) [13:13:40.881] next [13:13:40.881] if (!grepl(pattern, name)) [13:13:40.881] next [13:13:40.881] invokeRestart(restart) [13:13:40.881] muffled <- TRUE [13:13:40.881] break [13:13:40.881] } [13:13:40.881] } [13:13:40.881] } [13:13:40.881] invisible(muffled) [13:13:40.881] } [13:13:40.881] muffleCondition(cond, pattern = "^muffle") [13:13:40.881] } [13:13:40.881] } [13:13:40.881] else { [13:13:40.881] if (TRUE) { [13:13:40.881] muffleCondition <- function (cond, pattern = "^muffle") [13:13:40.881] { [13:13:40.881] inherits <- base::inherits [13:13:40.881] invokeRestart <- base::invokeRestart [13:13:40.881] is.null <- base::is.null [13:13:40.881] muffled <- FALSE [13:13:40.881] if (inherits(cond, "message")) { [13:13:40.881] muffled <- grepl(pattern, "muffleMessage") [13:13:40.881] if (muffled) [13:13:40.881] invokeRestart("muffleMessage") [13:13:40.881] } [13:13:40.881] else if (inherits(cond, "warning")) { [13:13:40.881] muffled <- grepl(pattern, "muffleWarning") [13:13:40.881] if (muffled) [13:13:40.881] invokeRestart("muffleWarning") [13:13:40.881] } [13:13:40.881] else if (inherits(cond, "condition")) { [13:13:40.881] if (!is.null(pattern)) { [13:13:40.881] computeRestarts <- base::computeRestarts [13:13:40.881] grepl <- base::grepl [13:13:40.881] restarts <- computeRestarts(cond) [13:13:40.881] for (restart in restarts) { [13:13:40.881] name <- restart$name [13:13:40.881] if (is.null(name)) [13:13:40.881] next [13:13:40.881] if (!grepl(pattern, name)) [13:13:40.881] next [13:13:40.881] invokeRestart(restart) [13:13:40.881] muffled <- TRUE [13:13:40.881] break [13:13:40.881] } [13:13:40.881] } [13:13:40.881] } [13:13:40.881] invisible(muffled) [13:13:40.881] } [13:13:40.881] muffleCondition(cond, pattern = "^muffle") [13:13:40.881] } [13:13:40.881] } [13:13:40.881] } [13:13:40.881] })) [13:13:40.881] }, error = function(ex) { [13:13:40.881] base::structure(base::list(value = NULL, visible = NULL, [13:13:40.881] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:40.881] ...future.rng), started = ...future.startTime, [13:13:40.881] finished = Sys.time(), session_uuid = NA_character_, [13:13:40.881] version = "1.8"), class = "FutureResult") [13:13:40.881] }, finally = { [13:13:40.881] if (!identical(...future.workdir, getwd())) [13:13:40.881] setwd(...future.workdir) [13:13:40.881] { [13:13:40.881] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:40.881] ...future.oldOptions$nwarnings <- NULL [13:13:40.881] } [13:13:40.881] base::options(...future.oldOptions) [13:13:40.881] if (.Platform$OS.type == "windows") { [13:13:40.881] old_names <- names(...future.oldEnvVars) [13:13:40.881] envs <- base::Sys.getenv() [13:13:40.881] names <- names(envs) [13:13:40.881] common <- intersect(names, old_names) [13:13:40.881] added <- setdiff(names, old_names) [13:13:40.881] removed <- setdiff(old_names, names) [13:13:40.881] changed <- common[...future.oldEnvVars[common] != [13:13:40.881] envs[common]] [13:13:40.881] NAMES <- toupper(changed) [13:13:40.881] args <- list() [13:13:40.881] for (kk in seq_along(NAMES)) { [13:13:40.881] name <- changed[[kk]] [13:13:40.881] NAME <- NAMES[[kk]] [13:13:40.881] if (name != NAME && is.element(NAME, old_names)) [13:13:40.881] next [13:13:40.881] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:40.881] } [13:13:40.881] NAMES <- toupper(added) [13:13:40.881] for (kk in seq_along(NAMES)) { [13:13:40.881] name <- added[[kk]] [13:13:40.881] NAME <- NAMES[[kk]] [13:13:40.881] if (name != NAME && is.element(NAME, old_names)) [13:13:40.881] next [13:13:40.881] args[[name]] <- "" [13:13:40.881] } [13:13:40.881] NAMES <- toupper(removed) [13:13:40.881] for (kk in seq_along(NAMES)) { [13:13:40.881] name <- removed[[kk]] [13:13:40.881] NAME <- NAMES[[kk]] [13:13:40.881] if (name != NAME && is.element(NAME, old_names)) [13:13:40.881] next [13:13:40.881] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:40.881] } [13:13:40.881] if (length(args) > 0) [13:13:40.881] base::do.call(base::Sys.setenv, args = args) [13:13:40.881] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:40.881] } [13:13:40.881] else { [13:13:40.881] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:40.881] } [13:13:40.881] { [13:13:40.881] if (base::length(...future.futureOptionsAdded) > [13:13:40.881] 0L) { [13:13:40.881] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:40.881] base::names(opts) <- ...future.futureOptionsAdded [13:13:40.881] base::options(opts) [13:13:40.881] } [13:13:40.881] { [13:13:40.881] { [13:13:40.881] NULL [13:13:40.881] RNGkind("Mersenne-Twister") [13:13:40.881] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:40.881] inherits = FALSE) [13:13:40.881] } [13:13:40.881] options(future.plan = NULL) [13:13:40.881] if (is.na(NA_character_)) [13:13:40.881] Sys.unsetenv("R_FUTURE_PLAN") [13:13:40.881] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:40.881] future::plan(list(function (..., workers = availableCores(), [13:13:40.881] lazy = FALSE, rscript_libs = .libPaths(), [13:13:40.881] envir = parent.frame()) [13:13:40.881] { [13:13:40.881] if (is.function(workers)) [13:13:40.881] workers <- workers() [13:13:40.881] workers <- structure(as.integer(workers), [13:13:40.881] class = class(workers)) [13:13:40.881] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:40.881] workers >= 1) [13:13:40.881] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:40.881] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:40.881] } [13:13:40.881] future <- MultisessionFuture(..., workers = workers, [13:13:40.881] lazy = lazy, rscript_libs = rscript_libs, [13:13:40.881] envir = envir) [13:13:40.881] if (!future$lazy) [13:13:40.881] future <- run(future) [13:13:40.881] invisible(future) [13:13:40.881] }), .cleanup = FALSE, .init = FALSE) [13:13:40.881] } [13:13:40.881] } [13:13:40.881] } [13:13:40.881] }) [13:13:40.881] if (TRUE) { [13:13:40.881] base::sink(type = "output", split = FALSE) [13:13:40.881] if (TRUE) { [13:13:40.881] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:40.881] } [13:13:40.881] else { [13:13:40.881] ...future.result["stdout"] <- base::list(NULL) [13:13:40.881] } [13:13:40.881] base::close(...future.stdout) [13:13:40.881] ...future.stdout <- NULL [13:13:40.881] } [13:13:40.881] ...future.result$conditions <- ...future.conditions [13:13:40.881] ...future.result$finished <- base::Sys.time() [13:13:40.881] ...future.result [13:13:40.881] } [13:13:40.884] assign_globals() ... [13:13:40.884] List of 5 [13:13:40.884] $ ...future.FUN :function (mode = "logical", length = 0L) [13:13:40.884] $ future.call.arguments :List of 1 [13:13:40.884] ..$ length: int 2 [13:13:40.884] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:40.884] $ ...future.elements_ii :List of 1 [13:13:40.884] ..$ b: chr "numeric" [13:13:40.884] $ ...future.seeds_ii : NULL [13:13:40.884] $ ...future.globals.maxSize: NULL [13:13:40.884] - attr(*, "where")=List of 5 [13:13:40.884] ..$ ...future.FUN : [13:13:40.884] ..$ future.call.arguments : [13:13:40.884] ..$ ...future.elements_ii : [13:13:40.884] ..$ ...future.seeds_ii : [13:13:40.884] ..$ ...future.globals.maxSize: [13:13:40.884] - attr(*, "resolved")= logi FALSE [13:13:40.884] - attr(*, "total_size")= num 2240 [13:13:40.884] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:40.884] - attr(*, "already-done")= logi TRUE [13:13:40.889] - copied '...future.FUN' to environment [13:13:40.889] - copied 'future.call.arguments' to environment [13:13:40.889] - copied '...future.elements_ii' to environment [13:13:40.890] - copied '...future.seeds_ii' to environment [13:13:40.890] - copied '...future.globals.maxSize' to environment [13:13:40.890] assign_globals() ... done [13:13:40.890] plan(): Setting new future strategy stack: [13:13:40.890] List of future strategies: [13:13:40.890] 1. sequential: [13:13:40.890] - args: function (..., envir = parent.frame(), workers = "") [13:13:40.890] - tweaked: FALSE [13:13:40.890] - call: NULL [13:13:40.891] plan(): nbrOfWorkers() = 1 [13:13:40.892] plan(): Setting new future strategy stack: [13:13:40.892] List of future strategies: [13:13:40.892] 1. multisession: [13:13:40.892] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [13:13:40.892] - tweaked: FALSE [13:13:40.892] - call: plan(strategy) [13:13:40.894] plan(): nbrOfWorkers() = 1 [13:13:40.894] SequentialFuture started (and completed) [13:13:40.894] - Launch lazy future ... done [13:13:40.894] run() for 'SequentialFuture' ... done [13:13:40.894] Created future: [13:13:40.894] SequentialFuture: [13:13:40.894] Label: 'future_lapply-2' [13:13:40.894] Expression: [13:13:40.894] { [13:13:40.894] do.call(function(...) { [13:13:40.894] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:40.894] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:40.894] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:40.894] on.exit(options(oopts), add = TRUE) [13:13:40.894] } [13:13:40.894] { [13:13:40.894] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:40.894] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:40.894] ...future.FUN(...future.X_jj, ...) [13:13:40.894] }) [13:13:40.894] } [13:13:40.894] }, args = future.call.arguments) [13:13:40.894] } [13:13:40.894] Lazy evaluation: FALSE [13:13:40.894] Asynchronous evaluation: FALSE [13:13:40.894] Local evaluation: TRUE [13:13:40.894] Environment: R_GlobalEnv [13:13:40.894] Capture standard output: TRUE [13:13:40.894] Capture condition classes: 'condition' (excluding 'nothing') [13:13:40.894] 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) [13:13:40.894] Packages: [13:13:40.894] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:40.894] Resolved: TRUE [13:13:40.894] Value: 64 bytes of class 'list' [13:13:40.894] Early signaling: FALSE [13:13:40.894] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:40.894] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:40.895] Chunk #2 of 4 ... DONE [13:13:40.895] Chunk #3 of 4 ... [13:13:40.896] - Finding globals in 'X' for chunk #3 ... [13:13:40.896] getGlobalsAndPackages() ... [13:13:40.896] Searching for globals... [13:13:40.896] [13:13:40.896] Searching for globals ... DONE [13:13:40.896] - globals: [0] [13:13:40.897] getGlobalsAndPackages() ... DONE [13:13:40.897] + additional globals found: [n=0] [13:13:40.897] + additional namespaces needed: [n=0] [13:13:40.897] - Finding globals in 'X' for chunk #3 ... DONE [13:13:40.897] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [13:13:40.897] - seeds: [13:13:40.897] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:40.897] getGlobalsAndPackages() ... [13:13:40.898] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:40.898] Resolving globals: FALSE [13:13:40.898] Tweak future expression to call with '...' arguments ... [13:13:40.898] { [13:13:40.898] do.call(function(...) { [13:13:40.898] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:40.898] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:40.898] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:40.898] on.exit(options(oopts), add = TRUE) [13:13:40.898] } [13:13:40.898] { [13:13:40.898] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:40.898] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:40.898] ...future.FUN(...future.X_jj, ...) [13:13:40.898] }) [13:13:40.898] } [13:13:40.898] }, args = future.call.arguments) [13:13:40.898] } [13:13:40.898] Tweak future expression to call with '...' arguments ... DONE [13:13:40.899] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:40.899] [13:13:40.899] getGlobalsAndPackages() ... DONE [13:13:40.899] run() for 'Future' ... [13:13:40.899] - state: 'created' [13:13:40.900] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:40.901] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:40.902] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:40.902] - Field: 'label' [13:13:40.902] - Field: 'local' [13:13:40.902] - Field: 'owner' [13:13:40.902] - Field: 'envir' [13:13:40.902] - Field: 'packages' [13:13:40.902] - Field: 'gc' [13:13:40.902] - Field: 'conditions' [13:13:40.903] - Field: 'expr' [13:13:40.903] - Field: 'uuid' [13:13:40.903] - Field: 'seed' [13:13:40.903] - Field: 'version' [13:13:40.903] - Field: 'result' [13:13:40.903] - Field: 'asynchronous' [13:13:40.903] - Field: 'calls' [13:13:40.904] - Field: 'globals' [13:13:40.904] - Field: 'stdout' [13:13:40.904] - Field: 'earlySignal' [13:13:40.904] - Field: 'lazy' [13:13:40.904] - Field: 'state' [13:13:40.904] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:40.904] - Launch lazy future ... [13:13:40.905] Packages needed by the future expression (n = 0): [13:13:40.905] Packages needed by future strategies (n = 0): [13:13:40.905] { [13:13:40.905] { [13:13:40.905] { [13:13:40.905] ...future.startTime <- base::Sys.time() [13:13:40.905] { [13:13:40.905] { [13:13:40.905] { [13:13:40.905] base::local({ [13:13:40.905] has_future <- base::requireNamespace("future", [13:13:40.905] quietly = TRUE) [13:13:40.905] if (has_future) { [13:13:40.905] ns <- base::getNamespace("future") [13:13:40.905] version <- ns[[".package"]][["version"]] [13:13:40.905] if (is.null(version)) [13:13:40.905] version <- utils::packageVersion("future") [13:13:40.905] } [13:13:40.905] else { [13:13:40.905] version <- NULL [13:13:40.905] } [13:13:40.905] if (!has_future || version < "1.8.0") { [13:13:40.905] info <- base::c(r_version = base::gsub("R version ", [13:13:40.905] "", base::R.version$version.string), [13:13:40.905] platform = base::sprintf("%s (%s-bit)", [13:13:40.905] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:40.905] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:40.905] "release", "version")], collapse = " "), [13:13:40.905] hostname = base::Sys.info()[["nodename"]]) [13:13:40.905] info <- base::sprintf("%s: %s", base::names(info), [13:13:40.905] info) [13:13:40.905] info <- base::paste(info, collapse = "; ") [13:13:40.905] if (!has_future) { [13:13:40.905] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:40.905] info) [13:13:40.905] } [13:13:40.905] else { [13:13:40.905] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:40.905] info, version) [13:13:40.905] } [13:13:40.905] base::stop(msg) [13:13:40.905] } [13:13:40.905] }) [13:13:40.905] } [13:13:40.905] options(future.plan = NULL) [13:13:40.905] Sys.unsetenv("R_FUTURE_PLAN") [13:13:40.905] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:40.905] } [13:13:40.905] ...future.workdir <- getwd() [13:13:40.905] } [13:13:40.905] ...future.oldOptions <- base::as.list(base::.Options) [13:13:40.905] ...future.oldEnvVars <- base::Sys.getenv() [13:13:40.905] } [13:13:40.905] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:40.905] future.globals.maxSize = 2097152000, future.globals.method = NULL, [13:13:40.905] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:40.905] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:40.905] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:40.905] future.stdout.windows.reencode = NULL, width = 80L) [13:13:40.905] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:40.905] base::names(...future.oldOptions)) [13:13:40.905] } [13:13:40.905] if (FALSE) { [13:13:40.905] } [13:13:40.905] else { [13:13:40.905] if (TRUE) { [13:13:40.905] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:40.905] open = "w") [13:13:40.905] } [13:13:40.905] else { [13:13:40.905] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:40.905] windows = "NUL", "/dev/null"), open = "w") [13:13:40.905] } [13:13:40.905] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:40.905] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:40.905] base::sink(type = "output", split = FALSE) [13:13:40.905] base::close(...future.stdout) [13:13:40.905] }, add = TRUE) [13:13:40.905] } [13:13:40.905] ...future.frame <- base::sys.nframe() [13:13:40.905] ...future.conditions <- base::list() [13:13:40.905] ...future.rng <- base::globalenv()$.Random.seed [13:13:40.905] if (FALSE) { [13:13:40.905] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:40.905] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:40.905] } [13:13:40.905] ...future.result <- base::tryCatch({ [13:13:40.905] base::withCallingHandlers({ [13:13:40.905] ...future.value <- base::withVisible(base::local({ [13:13:40.905] do.call(function(...) { [13:13:40.905] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:40.905] if (!identical(...future.globals.maxSize.org, [13:13:40.905] ...future.globals.maxSize)) { [13:13:40.905] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:40.905] on.exit(options(oopts), add = TRUE) [13:13:40.905] } [13:13:40.905] { [13:13:40.905] lapply(seq_along(...future.elements_ii), [13:13:40.905] FUN = function(jj) { [13:13:40.905] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:40.905] ...future.FUN(...future.X_jj, ...) [13:13:40.905] }) [13:13:40.905] } [13:13:40.905] }, args = future.call.arguments) [13:13:40.905] })) [13:13:40.905] future::FutureResult(value = ...future.value$value, [13:13:40.905] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:40.905] ...future.rng), globalenv = if (FALSE) [13:13:40.905] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:40.905] ...future.globalenv.names)) [13:13:40.905] else NULL, started = ...future.startTime, version = "1.8") [13:13:40.905] }, condition = base::local({ [13:13:40.905] c <- base::c [13:13:40.905] inherits <- base::inherits [13:13:40.905] invokeRestart <- base::invokeRestart [13:13:40.905] length <- base::length [13:13:40.905] list <- base::list [13:13:40.905] seq.int <- base::seq.int [13:13:40.905] signalCondition <- base::signalCondition [13:13:40.905] sys.calls <- base::sys.calls [13:13:40.905] `[[` <- base::`[[` [13:13:40.905] `+` <- base::`+` [13:13:40.905] `<<-` <- base::`<<-` [13:13:40.905] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:40.905] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:40.905] 3L)] [13:13:40.905] } [13:13:40.905] function(cond) { [13:13:40.905] is_error <- inherits(cond, "error") [13:13:40.905] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:40.905] NULL) [13:13:40.905] if (is_error) { [13:13:40.905] sessionInformation <- function() { [13:13:40.905] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:40.905] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:40.905] search = base::search(), system = base::Sys.info()) [13:13:40.905] } [13:13:40.905] ...future.conditions[[length(...future.conditions) + [13:13:40.905] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:40.905] cond$call), session = sessionInformation(), [13:13:40.905] timestamp = base::Sys.time(), signaled = 0L) [13:13:40.905] signalCondition(cond) [13:13:40.905] } [13:13:40.905] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:40.905] "immediateCondition"))) { [13:13:40.905] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:40.905] ...future.conditions[[length(...future.conditions) + [13:13:40.905] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:40.905] if (TRUE && !signal) { [13:13:40.905] muffleCondition <- function (cond, pattern = "^muffle") [13:13:40.905] { [13:13:40.905] inherits <- base::inherits [13:13:40.905] invokeRestart <- base::invokeRestart [13:13:40.905] is.null <- base::is.null [13:13:40.905] muffled <- FALSE [13:13:40.905] if (inherits(cond, "message")) { [13:13:40.905] muffled <- grepl(pattern, "muffleMessage") [13:13:40.905] if (muffled) [13:13:40.905] invokeRestart("muffleMessage") [13:13:40.905] } [13:13:40.905] else if (inherits(cond, "warning")) { [13:13:40.905] muffled <- grepl(pattern, "muffleWarning") [13:13:40.905] if (muffled) [13:13:40.905] invokeRestart("muffleWarning") [13:13:40.905] } [13:13:40.905] else if (inherits(cond, "condition")) { [13:13:40.905] if (!is.null(pattern)) { [13:13:40.905] computeRestarts <- base::computeRestarts [13:13:40.905] grepl <- base::grepl [13:13:40.905] restarts <- computeRestarts(cond) [13:13:40.905] for (restart in restarts) { [13:13:40.905] name <- restart$name [13:13:40.905] if (is.null(name)) [13:13:40.905] next [13:13:40.905] if (!grepl(pattern, name)) [13:13:40.905] next [13:13:40.905] invokeRestart(restart) [13:13:40.905] muffled <- TRUE [13:13:40.905] break [13:13:40.905] } [13:13:40.905] } [13:13:40.905] } [13:13:40.905] invisible(muffled) [13:13:40.905] } [13:13:40.905] muffleCondition(cond, pattern = "^muffle") [13:13:40.905] } [13:13:40.905] } [13:13:40.905] else { [13:13:40.905] if (TRUE) { [13:13:40.905] muffleCondition <- function (cond, pattern = "^muffle") [13:13:40.905] { [13:13:40.905] inherits <- base::inherits [13:13:40.905] invokeRestart <- base::invokeRestart [13:13:40.905] is.null <- base::is.null [13:13:40.905] muffled <- FALSE [13:13:40.905] if (inherits(cond, "message")) { [13:13:40.905] muffled <- grepl(pattern, "muffleMessage") [13:13:40.905] if (muffled) [13:13:40.905] invokeRestart("muffleMessage") [13:13:40.905] } [13:13:40.905] else if (inherits(cond, "warning")) { [13:13:40.905] muffled <- grepl(pattern, "muffleWarning") [13:13:40.905] if (muffled) [13:13:40.905] invokeRestart("muffleWarning") [13:13:40.905] } [13:13:40.905] else if (inherits(cond, "condition")) { [13:13:40.905] if (!is.null(pattern)) { [13:13:40.905] computeRestarts <- base::computeRestarts [13:13:40.905] grepl <- base::grepl [13:13:40.905] restarts <- computeRestarts(cond) [13:13:40.905] for (restart in restarts) { [13:13:40.905] name <- restart$name [13:13:40.905] if (is.null(name)) [13:13:40.905] next [13:13:40.905] if (!grepl(pattern, name)) [13:13:40.905] next [13:13:40.905] invokeRestart(restart) [13:13:40.905] muffled <- TRUE [13:13:40.905] break [13:13:40.905] } [13:13:40.905] } [13:13:40.905] } [13:13:40.905] invisible(muffled) [13:13:40.905] } [13:13:40.905] muffleCondition(cond, pattern = "^muffle") [13:13:40.905] } [13:13:40.905] } [13:13:40.905] } [13:13:40.905] })) [13:13:40.905] }, error = function(ex) { [13:13:40.905] base::structure(base::list(value = NULL, visible = NULL, [13:13:40.905] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:40.905] ...future.rng), started = ...future.startTime, [13:13:40.905] finished = Sys.time(), session_uuid = NA_character_, [13:13:40.905] version = "1.8"), class = "FutureResult") [13:13:40.905] }, finally = { [13:13:40.905] if (!identical(...future.workdir, getwd())) [13:13:40.905] setwd(...future.workdir) [13:13:40.905] { [13:13:40.905] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:40.905] ...future.oldOptions$nwarnings <- NULL [13:13:40.905] } [13:13:40.905] base::options(...future.oldOptions) [13:13:40.905] if (.Platform$OS.type == "windows") { [13:13:40.905] old_names <- names(...future.oldEnvVars) [13:13:40.905] envs <- base::Sys.getenv() [13:13:40.905] names <- names(envs) [13:13:40.905] common <- intersect(names, old_names) [13:13:40.905] added <- setdiff(names, old_names) [13:13:40.905] removed <- setdiff(old_names, names) [13:13:40.905] changed <- common[...future.oldEnvVars[common] != [13:13:40.905] envs[common]] [13:13:40.905] NAMES <- toupper(changed) [13:13:40.905] args <- list() [13:13:40.905] for (kk in seq_along(NAMES)) { [13:13:40.905] name <- changed[[kk]] [13:13:40.905] NAME <- NAMES[[kk]] [13:13:40.905] if (name != NAME && is.element(NAME, old_names)) [13:13:40.905] next [13:13:40.905] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:40.905] } [13:13:40.905] NAMES <- toupper(added) [13:13:40.905] for (kk in seq_along(NAMES)) { [13:13:40.905] name <- added[[kk]] [13:13:40.905] NAME <- NAMES[[kk]] [13:13:40.905] if (name != NAME && is.element(NAME, old_names)) [13:13:40.905] next [13:13:40.905] args[[name]] <- "" [13:13:40.905] } [13:13:40.905] NAMES <- toupper(removed) [13:13:40.905] for (kk in seq_along(NAMES)) { [13:13:40.905] name <- removed[[kk]] [13:13:40.905] NAME <- NAMES[[kk]] [13:13:40.905] if (name != NAME && is.element(NAME, old_names)) [13:13:40.905] next [13:13:40.905] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:40.905] } [13:13:40.905] if (length(args) > 0) [13:13:40.905] base::do.call(base::Sys.setenv, args = args) [13:13:40.905] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:40.905] } [13:13:40.905] else { [13:13:40.905] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:40.905] } [13:13:40.905] { [13:13:40.905] if (base::length(...future.futureOptionsAdded) > [13:13:40.905] 0L) { [13:13:40.905] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:40.905] base::names(opts) <- ...future.futureOptionsAdded [13:13:40.905] base::options(opts) [13:13:40.905] } [13:13:40.905] { [13:13:40.905] { [13:13:40.905] NULL [13:13:40.905] RNGkind("Mersenne-Twister") [13:13:40.905] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:40.905] inherits = FALSE) [13:13:40.905] } [13:13:40.905] options(future.plan = NULL) [13:13:40.905] if (is.na(NA_character_)) [13:13:40.905] Sys.unsetenv("R_FUTURE_PLAN") [13:13:40.905] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:40.905] future::plan(list(function (..., workers = availableCores(), [13:13:40.905] lazy = FALSE, rscript_libs = .libPaths(), [13:13:40.905] envir = parent.frame()) [13:13:40.905] { [13:13:40.905] if (is.function(workers)) [13:13:40.905] workers <- workers() [13:13:40.905] workers <- structure(as.integer(workers), [13:13:40.905] class = class(workers)) [13:13:40.905] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:40.905] workers >= 1) [13:13:40.905] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:40.905] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:40.905] } [13:13:40.905] future <- MultisessionFuture(..., workers = workers, [13:13:40.905] lazy = lazy, rscript_libs = rscript_libs, [13:13:40.905] envir = envir) [13:13:40.905] if (!future$lazy) [13:13:40.905] future <- run(future) [13:13:40.905] invisible(future) [13:13:40.905] }), .cleanup = FALSE, .init = FALSE) [13:13:40.905] } [13:13:40.905] } [13:13:40.905] } [13:13:40.905] }) [13:13:40.905] if (TRUE) { [13:13:40.905] base::sink(type = "output", split = FALSE) [13:13:40.905] if (TRUE) { [13:13:40.905] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:40.905] } [13:13:40.905] else { [13:13:40.905] ...future.result["stdout"] <- base::list(NULL) [13:13:40.905] } [13:13:40.905] base::close(...future.stdout) [13:13:40.905] ...future.stdout <- NULL [13:13:40.905] } [13:13:40.905] ...future.result$conditions <- ...future.conditions [13:13:40.905] ...future.result$finished <- base::Sys.time() [13:13:40.905] ...future.result [13:13:40.905] } [13:13:40.908] assign_globals() ... [13:13:40.909] List of 5 [13:13:40.909] $ ...future.FUN :function (mode = "logical", length = 0L) [13:13:40.909] $ future.call.arguments :List of 1 [13:13:40.909] ..$ length: int 2 [13:13:40.909] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:40.909] $ ...future.elements_ii :List of 1 [13:13:40.909] ..$ c: chr "character" [13:13:40.909] $ ...future.seeds_ii : NULL [13:13:40.909] $ ...future.globals.maxSize: NULL [13:13:40.909] - attr(*, "where")=List of 5 [13:13:40.909] ..$ ...future.FUN : [13:13:40.909] ..$ future.call.arguments : [13:13:40.909] ..$ ...future.elements_ii : [13:13:40.909] ..$ ...future.seeds_ii : [13:13:40.909] ..$ ...future.globals.maxSize: [13:13:40.909] - attr(*, "resolved")= logi FALSE [13:13:40.909] - attr(*, "total_size")= num 2240 [13:13:40.909] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:40.909] - attr(*, "already-done")= logi TRUE [13:13:40.913] - copied '...future.FUN' to environment [13:13:40.913] - copied 'future.call.arguments' to environment [13:13:40.914] - copied '...future.elements_ii' to environment [13:13:40.914] - copied '...future.seeds_ii' to environment [13:13:40.914] - copied '...future.globals.maxSize' to environment [13:13:40.914] assign_globals() ... done [13:13:40.914] plan(): Setting new future strategy stack: [13:13:40.914] List of future strategies: [13:13:40.914] 1. sequential: [13:13:40.914] - args: function (..., envir = parent.frame(), workers = "") [13:13:40.914] - tweaked: FALSE [13:13:40.914] - call: NULL [13:13:40.915] plan(): nbrOfWorkers() = 1 [13:13:40.916] plan(): Setting new future strategy stack: [13:13:40.916] List of future strategies: [13:13:40.916] 1. multisession: [13:13:40.916] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [13:13:40.916] - tweaked: FALSE [13:13:40.916] - call: plan(strategy) [13:13:40.918] plan(): nbrOfWorkers() = 1 [13:13:40.918] SequentialFuture started (and completed) [13:13:40.918] - Launch lazy future ... done [13:13:40.918] run() for 'SequentialFuture' ... done [13:13:40.918] Created future: [13:13:40.919] SequentialFuture: [13:13:40.919] Label: 'future_lapply-3' [13:13:40.919] Expression: [13:13:40.919] { [13:13:40.919] do.call(function(...) { [13:13:40.919] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:40.919] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:40.919] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:40.919] on.exit(options(oopts), add = TRUE) [13:13:40.919] } [13:13:40.919] { [13:13:40.919] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:40.919] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:40.919] ...future.FUN(...future.X_jj, ...) [13:13:40.919] }) [13:13:40.919] } [13:13:40.919] }, args = future.call.arguments) [13:13:40.919] } [13:13:40.919] Lazy evaluation: FALSE [13:13:40.919] Asynchronous evaluation: FALSE [13:13:40.919] Local evaluation: TRUE [13:13:40.919] Environment: R_GlobalEnv [13:13:40.919] Capture standard output: TRUE [13:13:40.919] Capture condition classes: 'condition' (excluding 'nothing') [13:13:40.919] 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) [13:13:40.919] Packages: [13:13:40.919] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:40.919] Resolved: TRUE [13:13:40.919] Value: 120 bytes of class 'list' [13:13:40.919] Early signaling: FALSE [13:13:40.919] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:40.919] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:40.920] Chunk #3 of 4 ... DONE [13:13:40.920] Chunk #4 of 4 ... [13:13:40.920] - Finding globals in 'X' for chunk #4 ... [13:13:40.920] getGlobalsAndPackages() ... [13:13:40.920] Searching for globals... [13:13:40.920] [13:13:40.921] Searching for globals ... DONE [13:13:40.921] - globals: [0] [13:13:40.921] getGlobalsAndPackages() ... DONE [13:13:40.921] + additional globals found: [n=0] [13:13:40.921] + additional namespaces needed: [n=0] [13:13:40.921] - Finding globals in 'X' for chunk #4 ... DONE [13:13:40.921] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [13:13:40.921] - seeds: [13:13:40.922] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:40.922] getGlobalsAndPackages() ... [13:13:40.922] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:40.922] Resolving globals: FALSE [13:13:40.922] Tweak future expression to call with '...' arguments ... [13:13:40.922] { [13:13:40.922] do.call(function(...) { [13:13:40.922] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:40.922] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:40.922] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:40.922] on.exit(options(oopts), add = TRUE) [13:13:40.922] } [13:13:40.922] { [13:13:40.922] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:40.922] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:40.922] ...future.FUN(...future.X_jj, ...) [13:13:40.922] }) [13:13:40.922] } [13:13:40.922] }, args = future.call.arguments) [13:13:40.922] } [13:13:40.923] Tweak future expression to call with '...' arguments ... DONE [13:13:40.923] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:40.923] [13:13:40.923] getGlobalsAndPackages() ... DONE [13:13:40.923] run() for 'Future' ... [13:13:40.924] - state: 'created' [13:13:40.924] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:40.926] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:40.926] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:40.926] - Field: 'label' [13:13:40.926] - Field: 'local' [13:13:40.926] - Field: 'owner' [13:13:40.926] - Field: 'envir' [13:13:40.926] - Field: 'packages' [13:13:40.927] - Field: 'gc' [13:13:40.927] - Field: 'conditions' [13:13:40.927] - Field: 'expr' [13:13:40.927] - Field: 'uuid' [13:13:40.927] - Field: 'seed' [13:13:40.927] - Field: 'version' [13:13:40.927] - Field: 'result' [13:13:40.927] - Field: 'asynchronous' [13:13:40.928] - Field: 'calls' [13:13:40.928] - Field: 'globals' [13:13:40.928] - Field: 'stdout' [13:13:40.928] - Field: 'earlySignal' [13:13:40.928] - Field: 'lazy' [13:13:40.928] - Field: 'state' [13:13:40.929] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:40.929] - Launch lazy future ... [13:13:40.929] Packages needed by the future expression (n = 0): [13:13:40.929] Packages needed by future strategies (n = 0): [13:13:40.929] { [13:13:40.929] { [13:13:40.929] { [13:13:40.929] ...future.startTime <- base::Sys.time() [13:13:40.929] { [13:13:40.929] { [13:13:40.929] { [13:13:40.929] base::local({ [13:13:40.929] has_future <- base::requireNamespace("future", [13:13:40.929] quietly = TRUE) [13:13:40.929] if (has_future) { [13:13:40.929] ns <- base::getNamespace("future") [13:13:40.929] version <- ns[[".package"]][["version"]] [13:13:40.929] if (is.null(version)) [13:13:40.929] version <- utils::packageVersion("future") [13:13:40.929] } [13:13:40.929] else { [13:13:40.929] version <- NULL [13:13:40.929] } [13:13:40.929] if (!has_future || version < "1.8.0") { [13:13:40.929] info <- base::c(r_version = base::gsub("R version ", [13:13:40.929] "", base::R.version$version.string), [13:13:40.929] platform = base::sprintf("%s (%s-bit)", [13:13:40.929] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:40.929] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:40.929] "release", "version")], collapse = " "), [13:13:40.929] hostname = base::Sys.info()[["nodename"]]) [13:13:40.929] info <- base::sprintf("%s: %s", base::names(info), [13:13:40.929] info) [13:13:40.929] info <- base::paste(info, collapse = "; ") [13:13:40.929] if (!has_future) { [13:13:40.929] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:40.929] info) [13:13:40.929] } [13:13:40.929] else { [13:13:40.929] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:40.929] info, version) [13:13:40.929] } [13:13:40.929] base::stop(msg) [13:13:40.929] } [13:13:40.929] }) [13:13:40.929] } [13:13:40.929] options(future.plan = NULL) [13:13:40.929] Sys.unsetenv("R_FUTURE_PLAN") [13:13:40.929] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:40.929] } [13:13:40.929] ...future.workdir <- getwd() [13:13:40.929] } [13:13:40.929] ...future.oldOptions <- base::as.list(base::.Options) [13:13:40.929] ...future.oldEnvVars <- base::Sys.getenv() [13:13:40.929] } [13:13:40.929] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:40.929] future.globals.maxSize = 2097152000, future.globals.method = NULL, [13:13:40.929] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:40.929] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:40.929] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:40.929] future.stdout.windows.reencode = NULL, width = 80L) [13:13:40.929] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:40.929] base::names(...future.oldOptions)) [13:13:40.929] } [13:13:40.929] if (FALSE) { [13:13:40.929] } [13:13:40.929] else { [13:13:40.929] if (TRUE) { [13:13:40.929] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:40.929] open = "w") [13:13:40.929] } [13:13:40.929] else { [13:13:40.929] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:40.929] windows = "NUL", "/dev/null"), open = "w") [13:13:40.929] } [13:13:40.929] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:40.929] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:40.929] base::sink(type = "output", split = FALSE) [13:13:40.929] base::close(...future.stdout) [13:13:40.929] }, add = TRUE) [13:13:40.929] } [13:13:40.929] ...future.frame <- base::sys.nframe() [13:13:40.929] ...future.conditions <- base::list() [13:13:40.929] ...future.rng <- base::globalenv()$.Random.seed [13:13:40.929] if (FALSE) { [13:13:40.929] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:40.929] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:40.929] } [13:13:40.929] ...future.result <- base::tryCatch({ [13:13:40.929] base::withCallingHandlers({ [13:13:40.929] ...future.value <- base::withVisible(base::local({ [13:13:40.929] do.call(function(...) { [13:13:40.929] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:40.929] if (!identical(...future.globals.maxSize.org, [13:13:40.929] ...future.globals.maxSize)) { [13:13:40.929] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:40.929] on.exit(options(oopts), add = TRUE) [13:13:40.929] } [13:13:40.929] { [13:13:40.929] lapply(seq_along(...future.elements_ii), [13:13:40.929] FUN = function(jj) { [13:13:40.929] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:40.929] ...future.FUN(...future.X_jj, ...) [13:13:40.929] }) [13:13:40.929] } [13:13:40.929] }, args = future.call.arguments) [13:13:40.929] })) [13:13:40.929] future::FutureResult(value = ...future.value$value, [13:13:40.929] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:40.929] ...future.rng), globalenv = if (FALSE) [13:13:40.929] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:40.929] ...future.globalenv.names)) [13:13:40.929] else NULL, started = ...future.startTime, version = "1.8") [13:13:40.929] }, condition = base::local({ [13:13:40.929] c <- base::c [13:13:40.929] inherits <- base::inherits [13:13:40.929] invokeRestart <- base::invokeRestart [13:13:40.929] length <- base::length [13:13:40.929] list <- base::list [13:13:40.929] seq.int <- base::seq.int [13:13:40.929] signalCondition <- base::signalCondition [13:13:40.929] sys.calls <- base::sys.calls [13:13:40.929] `[[` <- base::`[[` [13:13:40.929] `+` <- base::`+` [13:13:40.929] `<<-` <- base::`<<-` [13:13:40.929] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:40.929] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:40.929] 3L)] [13:13:40.929] } [13:13:40.929] function(cond) { [13:13:40.929] is_error <- inherits(cond, "error") [13:13:40.929] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:40.929] NULL) [13:13:40.929] if (is_error) { [13:13:40.929] sessionInformation <- function() { [13:13:40.929] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:40.929] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:40.929] search = base::search(), system = base::Sys.info()) [13:13:40.929] } [13:13:40.929] ...future.conditions[[length(...future.conditions) + [13:13:40.929] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:40.929] cond$call), session = sessionInformation(), [13:13:40.929] timestamp = base::Sys.time(), signaled = 0L) [13:13:40.929] signalCondition(cond) [13:13:40.929] } [13:13:40.929] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:40.929] "immediateCondition"))) { [13:13:40.929] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:40.929] ...future.conditions[[length(...future.conditions) + [13:13:40.929] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:40.929] if (TRUE && !signal) { [13:13:40.929] muffleCondition <- function (cond, pattern = "^muffle") [13:13:40.929] { [13:13:40.929] inherits <- base::inherits [13:13:40.929] invokeRestart <- base::invokeRestart [13:13:40.929] is.null <- base::is.null [13:13:40.929] muffled <- FALSE [13:13:40.929] if (inherits(cond, "message")) { [13:13:40.929] muffled <- grepl(pattern, "muffleMessage") [13:13:40.929] if (muffled) [13:13:40.929] invokeRestart("muffleMessage") [13:13:40.929] } [13:13:40.929] else if (inherits(cond, "warning")) { [13:13:40.929] muffled <- grepl(pattern, "muffleWarning") [13:13:40.929] if (muffled) [13:13:40.929] invokeRestart("muffleWarning") [13:13:40.929] } [13:13:40.929] else if (inherits(cond, "condition")) { [13:13:40.929] if (!is.null(pattern)) { [13:13:40.929] computeRestarts <- base::computeRestarts [13:13:40.929] grepl <- base::grepl [13:13:40.929] restarts <- computeRestarts(cond) [13:13:40.929] for (restart in restarts) { [13:13:40.929] name <- restart$name [13:13:40.929] if (is.null(name)) [13:13:40.929] next [13:13:40.929] if (!grepl(pattern, name)) [13:13:40.929] next [13:13:40.929] invokeRestart(restart) [13:13:40.929] muffled <- TRUE [13:13:40.929] break [13:13:40.929] } [13:13:40.929] } [13:13:40.929] } [13:13:40.929] invisible(muffled) [13:13:40.929] } [13:13:40.929] muffleCondition(cond, pattern = "^muffle") [13:13:40.929] } [13:13:40.929] } [13:13:40.929] else { [13:13:40.929] if (TRUE) { [13:13:40.929] muffleCondition <- function (cond, pattern = "^muffle") [13:13:40.929] { [13:13:40.929] inherits <- base::inherits [13:13:40.929] invokeRestart <- base::invokeRestart [13:13:40.929] is.null <- base::is.null [13:13:40.929] muffled <- FALSE [13:13:40.929] if (inherits(cond, "message")) { [13:13:40.929] muffled <- grepl(pattern, "muffleMessage") [13:13:40.929] if (muffled) [13:13:40.929] invokeRestart("muffleMessage") [13:13:40.929] } [13:13:40.929] else if (inherits(cond, "warning")) { [13:13:40.929] muffled <- grepl(pattern, "muffleWarning") [13:13:40.929] if (muffled) [13:13:40.929] invokeRestart("muffleWarning") [13:13:40.929] } [13:13:40.929] else if (inherits(cond, "condition")) { [13:13:40.929] if (!is.null(pattern)) { [13:13:40.929] computeRestarts <- base::computeRestarts [13:13:40.929] grepl <- base::grepl [13:13:40.929] restarts <- computeRestarts(cond) [13:13:40.929] for (restart in restarts) { [13:13:40.929] name <- restart$name [13:13:40.929] if (is.null(name)) [13:13:40.929] next [13:13:40.929] if (!grepl(pattern, name)) [13:13:40.929] next [13:13:40.929] invokeRestart(restart) [13:13:40.929] muffled <- TRUE [13:13:40.929] break [13:13:40.929] } [13:13:40.929] } [13:13:40.929] } [13:13:40.929] invisible(muffled) [13:13:40.929] } [13:13:40.929] muffleCondition(cond, pattern = "^muffle") [13:13:40.929] } [13:13:40.929] } [13:13:40.929] } [13:13:40.929] })) [13:13:40.929] }, error = function(ex) { [13:13:40.929] base::structure(base::list(value = NULL, visible = NULL, [13:13:40.929] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:40.929] ...future.rng), started = ...future.startTime, [13:13:40.929] finished = Sys.time(), session_uuid = NA_character_, [13:13:40.929] version = "1.8"), class = "FutureResult") [13:13:40.929] }, finally = { [13:13:40.929] if (!identical(...future.workdir, getwd())) [13:13:40.929] setwd(...future.workdir) [13:13:40.929] { [13:13:40.929] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:40.929] ...future.oldOptions$nwarnings <- NULL [13:13:40.929] } [13:13:40.929] base::options(...future.oldOptions) [13:13:40.929] if (.Platform$OS.type == "windows") { [13:13:40.929] old_names <- names(...future.oldEnvVars) [13:13:40.929] envs <- base::Sys.getenv() [13:13:40.929] names <- names(envs) [13:13:40.929] common <- intersect(names, old_names) [13:13:40.929] added <- setdiff(names, old_names) [13:13:40.929] removed <- setdiff(old_names, names) [13:13:40.929] changed <- common[...future.oldEnvVars[common] != [13:13:40.929] envs[common]] [13:13:40.929] NAMES <- toupper(changed) [13:13:40.929] args <- list() [13:13:40.929] for (kk in seq_along(NAMES)) { [13:13:40.929] name <- changed[[kk]] [13:13:40.929] NAME <- NAMES[[kk]] [13:13:40.929] if (name != NAME && is.element(NAME, old_names)) [13:13:40.929] next [13:13:40.929] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:40.929] } [13:13:40.929] NAMES <- toupper(added) [13:13:40.929] for (kk in seq_along(NAMES)) { [13:13:40.929] name <- added[[kk]] [13:13:40.929] NAME <- NAMES[[kk]] [13:13:40.929] if (name != NAME && is.element(NAME, old_names)) [13:13:40.929] next [13:13:40.929] args[[name]] <- "" [13:13:40.929] } [13:13:40.929] NAMES <- toupper(removed) [13:13:40.929] for (kk in seq_along(NAMES)) { [13:13:40.929] name <- removed[[kk]] [13:13:40.929] NAME <- NAMES[[kk]] [13:13:40.929] if (name != NAME && is.element(NAME, old_names)) [13:13:40.929] next [13:13:40.929] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:40.929] } [13:13:40.929] if (length(args) > 0) [13:13:40.929] base::do.call(base::Sys.setenv, args = args) [13:13:40.929] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:40.929] } [13:13:40.929] else { [13:13:40.929] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:40.929] } [13:13:40.929] { [13:13:40.929] if (base::length(...future.futureOptionsAdded) > [13:13:40.929] 0L) { [13:13:40.929] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:40.929] base::names(opts) <- ...future.futureOptionsAdded [13:13:40.929] base::options(opts) [13:13:40.929] } [13:13:40.929] { [13:13:40.929] { [13:13:40.929] NULL [13:13:40.929] RNGkind("Mersenne-Twister") [13:13:40.929] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:40.929] inherits = FALSE) [13:13:40.929] } [13:13:40.929] options(future.plan = NULL) [13:13:40.929] if (is.na(NA_character_)) [13:13:40.929] Sys.unsetenv("R_FUTURE_PLAN") [13:13:40.929] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:40.929] future::plan(list(function (..., workers = availableCores(), [13:13:40.929] lazy = FALSE, rscript_libs = .libPaths(), [13:13:40.929] envir = parent.frame()) [13:13:40.929] { [13:13:40.929] if (is.function(workers)) [13:13:40.929] workers <- workers() [13:13:40.929] workers <- structure(as.integer(workers), [13:13:40.929] class = class(workers)) [13:13:40.929] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:40.929] workers >= 1) [13:13:40.929] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:40.929] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:40.929] } [13:13:40.929] future <- MultisessionFuture(..., workers = workers, [13:13:40.929] lazy = lazy, rscript_libs = rscript_libs, [13:13:40.929] envir = envir) [13:13:40.929] if (!future$lazy) [13:13:40.929] future <- run(future) [13:13:40.929] invisible(future) [13:13:40.929] }), .cleanup = FALSE, .init = FALSE) [13:13:40.929] } [13:13:40.929] } [13:13:40.929] } [13:13:40.929] }) [13:13:40.929] if (TRUE) { [13:13:40.929] base::sink(type = "output", split = FALSE) [13:13:40.929] if (TRUE) { [13:13:40.929] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:40.929] } [13:13:40.929] else { [13:13:40.929] ...future.result["stdout"] <- base::list(NULL) [13:13:40.929] } [13:13:40.929] base::close(...future.stdout) [13:13:40.929] ...future.stdout <- NULL [13:13:40.929] } [13:13:40.929] ...future.result$conditions <- ...future.conditions [13:13:40.929] ...future.result$finished <- base::Sys.time() [13:13:40.929] ...future.result [13:13:40.929] } [13:13:40.932] assign_globals() ... [13:13:40.933] List of 5 [13:13:40.933] $ ...future.FUN :function (mode = "logical", length = 0L) [13:13:40.933] $ future.call.arguments :List of 1 [13:13:40.933] ..$ length: int 2 [13:13:40.933] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:40.933] $ ...future.elements_ii :List of 1 [13:13:40.933] ..$ c: chr "list" [13:13:40.933] $ ...future.seeds_ii : NULL [13:13:40.933] $ ...future.globals.maxSize: NULL [13:13:40.933] - attr(*, "where")=List of 5 [13:13:40.933] ..$ ...future.FUN : [13:13:40.933] ..$ future.call.arguments : [13:13:40.933] ..$ ...future.elements_ii : [13:13:40.933] ..$ ...future.seeds_ii : [13:13:40.933] ..$ ...future.globals.maxSize: [13:13:40.933] - attr(*, "resolved")= logi FALSE [13:13:40.933] - attr(*, "total_size")= num 2240 [13:13:40.933] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:40.933] - attr(*, "already-done")= logi TRUE [13:13:40.937] - copied '...future.FUN' to environment [13:13:40.937] - copied 'future.call.arguments' to environment [13:13:40.937] - copied '...future.elements_ii' to environment [13:13:40.938] - copied '...future.seeds_ii' to environment [13:13:40.938] - copied '...future.globals.maxSize' to environment [13:13:40.938] assign_globals() ... done [13:13:40.938] plan(): Setting new future strategy stack: [13:13:40.938] List of future strategies: [13:13:40.938] 1. sequential: [13:13:40.938] - args: function (..., envir = parent.frame(), workers = "") [13:13:40.938] - tweaked: FALSE [13:13:40.938] - call: NULL [13:13:40.939] plan(): nbrOfWorkers() = 1 [13:13:40.940] plan(): Setting new future strategy stack: [13:13:40.940] List of future strategies: [13:13:40.940] 1. multisession: [13:13:40.940] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [13:13:40.940] - tweaked: FALSE [13:13:40.940] - call: plan(strategy) [13:13:40.942] plan(): nbrOfWorkers() = 1 [13:13:40.942] SequentialFuture started (and completed) [13:13:40.942] - Launch lazy future ... done [13:13:40.942] run() for 'SequentialFuture' ... done [13:13:40.942] Created future: [13:13:40.942] SequentialFuture: [13:13:40.942] Label: 'future_lapply-4' [13:13:40.942] Expression: [13:13:40.942] { [13:13:40.942] do.call(function(...) { [13:13:40.942] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:40.942] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:40.942] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:40.942] on.exit(options(oopts), add = TRUE) [13:13:40.942] } [13:13:40.942] { [13:13:40.942] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:40.942] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:40.942] ...future.FUN(...future.X_jj, ...) [13:13:40.942] }) [13:13:40.942] } [13:13:40.942] }, args = future.call.arguments) [13:13:40.942] } [13:13:40.942] Lazy evaluation: FALSE [13:13:40.942] Asynchronous evaluation: FALSE [13:13:40.942] Local evaluation: TRUE [13:13:40.942] Environment: R_GlobalEnv [13:13:40.942] Capture standard output: TRUE [13:13:40.942] Capture condition classes: 'condition' (excluding 'nothing') [13:13:40.942] 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) [13:13:40.942] Packages: [13:13:40.942] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:40.942] Resolved: TRUE [13:13:40.942] Value: 0 bytes of class 'list' [13:13:40.942] Early signaling: FALSE [13:13:40.942] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:40.942] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:40.943] Chunk #4 of 4 ... DONE [13:13:40.943] Launching 4 futures (chunks) ... DONE [13:13:40.944] Resolving 4 futures (chunks) ... [13:13:40.944] resolve() on list ... [13:13:40.944] recursive: 0 [13:13:40.944] length: 4 [13:13:40.944] [13:13:40.944] resolved() for 'SequentialFuture' ... [13:13:40.944] - state: 'finished' [13:13:40.944] - run: TRUE [13:13:40.945] - result: 'FutureResult' [13:13:40.945] resolved() for 'SequentialFuture' ... done [13:13:40.945] Future #1 [13:13:40.945] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:40.945] - nx: 4 [13:13:40.945] - relay: TRUE [13:13:40.945] - stdout: TRUE [13:13:40.946] - signal: TRUE [13:13:40.946] - resignal: FALSE [13:13:40.946] - force: TRUE [13:13:40.946] - relayed: [n=4] FALSE, FALSE, FALSE, FALSE [13:13:40.946] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [13:13:40.946] - until=1 [13:13:40.948] - relaying element #1 [13:13:40.948] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [13:13:40.948] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [13:13:40.948] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:40.948] length: 3 (resolved future 1) [13:13:40.948] resolved() for 'SequentialFuture' ... [13:13:40.949] - state: 'finished' [13:13:40.949] - run: TRUE [13:13:40.949] - result: 'FutureResult' [13:13:40.949] resolved() for 'SequentialFuture' ... done [13:13:40.949] Future #2 [13:13:40.949] signalConditionsASAP(SequentialFuture, pos=2) ... [13:13:40.949] - nx: 4 [13:13:40.950] - relay: TRUE [13:13:40.950] - stdout: TRUE [13:13:40.950] - signal: TRUE [13:13:40.950] - resignal: FALSE [13:13:40.950] - force: TRUE [13:13:40.950] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [13:13:40.950] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [13:13:40.950] - until=2 [13:13:40.950] - relaying element #2 [13:13:40.951] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [13:13:40.951] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [13:13:40.951] signalConditionsASAP(SequentialFuture, pos=2) ... done [13:13:40.951] length: 2 (resolved future 2) [13:13:40.951] resolved() for 'SequentialFuture' ... [13:13:40.951] - state: 'finished' [13:13:40.951] - run: TRUE [13:13:40.952] - result: 'FutureResult' [13:13:40.952] resolved() for 'SequentialFuture' ... done [13:13:40.952] Future #3 [13:13:40.952] signalConditionsASAP(SequentialFuture, pos=3) ... [13:13:40.952] - nx: 4 [13:13:40.952] - relay: TRUE [13:13:40.952] - stdout: TRUE [13:13:40.952] - signal: TRUE [13:13:40.953] - resignal: FALSE [13:13:40.953] - force: TRUE [13:13:40.953] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [13:13:40.953] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [13:13:40.953] - until=3 [13:13:40.953] - relaying element #3 [13:13:40.953] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [13:13:40.953] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [13:13:40.954] signalConditionsASAP(SequentialFuture, pos=3) ... done [13:13:40.954] length: 1 (resolved future 3) [13:13:40.954] resolved() for 'SequentialFuture' ... [13:13:40.954] - state: 'finished' [13:13:40.954] - run: TRUE [13:13:40.954] - result: 'FutureResult' [13:13:40.954] resolved() for 'SequentialFuture' ... done [13:13:40.955] Future #4 [13:13:40.955] signalConditionsASAP(SequentialFuture, pos=4) ... [13:13:40.955] - nx: 4 [13:13:40.955] - relay: TRUE [13:13:40.955] - stdout: TRUE [13:13:40.955] - signal: TRUE [13:13:40.955] - resignal: FALSE [13:13:40.955] - force: TRUE [13:13:40.955] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [13:13:40.956] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [13:13:40.956] - until=4 [13:13:40.956] - relaying element #4 [13:13:40.956] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [13:13:40.956] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [13:13:40.956] signalConditionsASAP(SequentialFuture, pos=4) ... done [13:13:40.956] length: 0 (resolved future 4) [13:13:40.957] Relaying remaining futures [13:13:40.957] signalConditionsASAP(NULL, pos=0) ... [13:13:40.957] - nx: 4 [13:13:40.957] - relay: TRUE [13:13:40.957] - stdout: TRUE [13:13:40.957] - signal: TRUE [13:13:40.957] - resignal: FALSE [13:13:40.957] - force: TRUE [13:13:40.957] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [13:13:40.958] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE - flush all [13:13:40.958] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [13:13:40.958] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [13:13:40.958] signalConditionsASAP(NULL, pos=0) ... done [13:13:40.958] resolve() on list ... DONE [13:13:40.958] - Number of value chunks collected: 4 [13:13:40.958] Resolving 4 futures (chunks) ... DONE [13:13:40.959] Reducing values from 4 chunks ... [13:13:40.959] - Number of values collected after concatenation: 4 [13:13:40.959] - Number of values expected: 4 [13:13:40.959] Reducing values from 4 chunks ... DONE [13:13:40.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 - future_lapply(x, FUN = base::vector, ...) ... [13:13:40.961] future_lapply() ... [13:13:40.963] Number of chunks: 4 [13:13:40.963] getGlobalsAndPackagesXApply() ... [13:13:40.964] - future.globals: TRUE [13:13:40.964] getGlobalsAndPackages() ... [13:13:40.964] Searching for globals... [13:13:40.965] - globals found: [2] 'FUN', '.Internal' [13:13:40.965] Searching for globals ... DONE [13:13:40.965] Resolving globals: FALSE [13:13:40.965] The total size of the 1 globals is 2.13 KiB (2184 bytes) [13:13:40.966] 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') [13:13:40.966] - globals: [1] 'FUN' [13:13:40.966] [13:13:40.966] getGlobalsAndPackages() ... DONE [13:13:40.966] - globals found/used: [n=1] 'FUN' [13:13:40.966] - needed namespaces: [n=0] [13:13:40.967] Finding globals ... DONE [13:13:40.967] - use_args: TRUE [13:13:40.967] - Getting '...' globals ... [13:13:40.967] resolve() on list ... [13:13:40.967] recursive: 0 [13:13:40.967] length: 1 [13:13:40.967] elements: '...' [13:13:40.968] length: 0 (resolved future 1) [13:13:40.968] resolve() on list ... DONE [13:13:40.968] - '...' content: [n=1] 'length' [13:13:40.968] List of 1 [13:13:40.968] $ ...:List of 1 [13:13:40.968] ..$ length: int 2 [13:13:40.968] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:40.968] - attr(*, "where")=List of 1 [13:13:40.968] ..$ ...: [13:13:40.968] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:40.968] - attr(*, "resolved")= logi TRUE [13:13:40.968] - attr(*, "total_size")= num NA [13:13:40.971] - Getting '...' globals ... DONE [13:13:40.971] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:40.971] List of 2 [13:13:40.971] $ ...future.FUN:function (mode = "logical", length = 0L) [13:13:40.971] $ ... :List of 1 [13:13:40.971] ..$ length: int 2 [13:13:40.971] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:40.971] - attr(*, "where")=List of 2 [13:13:40.971] ..$ ...future.FUN: [13:13:40.971] ..$ ... : [13:13:40.971] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:40.971] - attr(*, "resolved")= logi FALSE [13:13:40.971] - attr(*, "total_size")= num 2240 [13:13:40.974] Packages to be attached in all futures: [n=0] [13:13:40.974] getGlobalsAndPackagesXApply() ... DONE [13:13:40.974] Number of futures (= number of chunks): 4 [13:13:40.974] Launching 4 futures (chunks) ... [13:13:40.974] Chunk #1 of 4 ... [13:13:40.975] - Finding globals in 'X' for chunk #1 ... [13:13:40.975] getGlobalsAndPackages() ... [13:13:40.975] Searching for globals... [13:13:40.975] [13:13:40.975] Searching for globals ... DONE [13:13:40.975] - globals: [0] [13:13:40.976] getGlobalsAndPackages() ... DONE [13:13:40.976] + additional globals found: [n=0] [13:13:40.976] + additional namespaces needed: [n=0] [13:13:40.976] - Finding globals in 'X' for chunk #1 ... DONE [13:13:40.976] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [13:13:40.976] - seeds: [13:13:40.976] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:40.977] getGlobalsAndPackages() ... [13:13:40.977] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:40.977] Resolving globals: FALSE [13:13:40.977] Tweak future expression to call with '...' arguments ... [13:13:40.977] { [13:13:40.977] do.call(function(...) { [13:13:40.977] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:40.977] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:40.977] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:40.977] on.exit(options(oopts), add = TRUE) [13:13:40.977] } [13:13:40.977] { [13:13:40.977] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:40.977] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:40.977] ...future.FUN(...future.X_jj, ...) [13:13:40.977] }) [13:13:40.977] } [13:13:40.977] }, args = future.call.arguments) [13:13:40.977] } [13:13:40.977] Tweak future expression to call with '...' arguments ... DONE [13:13:40.978] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:40.978] [13:13:40.978] getGlobalsAndPackages() ... DONE [13:13:40.978] run() for 'Future' ... [13:13:40.978] - state: 'created' [13:13:40.979] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:40.980] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:40.980] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:40.981] - Field: 'label' [13:13:40.981] - Field: 'local' [13:13:40.981] - Field: 'owner' [13:13:40.981] - Field: 'envir' [13:13:40.981] - Field: 'packages' [13:13:40.981] - Field: 'gc' [13:13:40.981] - Field: 'conditions' [13:13:40.981] - Field: 'expr' [13:13:40.982] - Field: 'uuid' [13:13:40.982] - Field: 'seed' [13:13:40.982] - Field: 'version' [13:13:40.982] - Field: 'result' [13:13:40.982] - Field: 'asynchronous' [13:13:40.982] - Field: 'calls' [13:13:40.982] - Field: 'globals' [13:13:40.982] - Field: 'stdout' [13:13:40.983] - Field: 'earlySignal' [13:13:40.983] - Field: 'lazy' [13:13:40.983] - Field: 'state' [13:13:40.983] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:40.983] - Launch lazy future ... [13:13:40.983] Packages needed by the future expression (n = 0): [13:13:40.983] Packages needed by future strategies (n = 0): [13:13:40.984] { [13:13:40.984] { [13:13:40.984] { [13:13:40.984] ...future.startTime <- base::Sys.time() [13:13:40.984] { [13:13:40.984] { [13:13:40.984] { [13:13:40.984] base::local({ [13:13:40.984] has_future <- base::requireNamespace("future", [13:13:40.984] quietly = TRUE) [13:13:40.984] if (has_future) { [13:13:40.984] ns <- base::getNamespace("future") [13:13:40.984] version <- ns[[".package"]][["version"]] [13:13:40.984] if (is.null(version)) [13:13:40.984] version <- utils::packageVersion("future") [13:13:40.984] } [13:13:40.984] else { [13:13:40.984] version <- NULL [13:13:40.984] } [13:13:40.984] if (!has_future || version < "1.8.0") { [13:13:40.984] info <- base::c(r_version = base::gsub("R version ", [13:13:40.984] "", base::R.version$version.string), [13:13:40.984] platform = base::sprintf("%s (%s-bit)", [13:13:40.984] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:40.984] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:40.984] "release", "version")], collapse = " "), [13:13:40.984] hostname = base::Sys.info()[["nodename"]]) [13:13:40.984] info <- base::sprintf("%s: %s", base::names(info), [13:13:40.984] info) [13:13:40.984] info <- base::paste(info, collapse = "; ") [13:13:40.984] if (!has_future) { [13:13:40.984] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:40.984] info) [13:13:40.984] } [13:13:40.984] else { [13:13:40.984] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:40.984] info, version) [13:13:40.984] } [13:13:40.984] base::stop(msg) [13:13:40.984] } [13:13:40.984] }) [13:13:40.984] } [13:13:40.984] options(future.plan = NULL) [13:13:40.984] Sys.unsetenv("R_FUTURE_PLAN") [13:13:40.984] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:40.984] } [13:13:40.984] ...future.workdir <- getwd() [13:13:40.984] } [13:13:40.984] ...future.oldOptions <- base::as.list(base::.Options) [13:13:40.984] ...future.oldEnvVars <- base::Sys.getenv() [13:13:40.984] } [13:13:40.984] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:40.984] future.globals.maxSize = 2097152000, future.globals.method = NULL, [13:13:40.984] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:40.984] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:40.984] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:40.984] future.stdout.windows.reencode = NULL, width = 80L) [13:13:40.984] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:40.984] base::names(...future.oldOptions)) [13:13:40.984] } [13:13:40.984] if (FALSE) { [13:13:40.984] } [13:13:40.984] else { [13:13:40.984] if (TRUE) { [13:13:40.984] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:40.984] open = "w") [13:13:40.984] } [13:13:40.984] else { [13:13:40.984] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:40.984] windows = "NUL", "/dev/null"), open = "w") [13:13:40.984] } [13:13:40.984] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:40.984] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:40.984] base::sink(type = "output", split = FALSE) [13:13:40.984] base::close(...future.stdout) [13:13:40.984] }, add = TRUE) [13:13:40.984] } [13:13:40.984] ...future.frame <- base::sys.nframe() [13:13:40.984] ...future.conditions <- base::list() [13:13:40.984] ...future.rng <- base::globalenv()$.Random.seed [13:13:40.984] if (FALSE) { [13:13:40.984] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:40.984] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:40.984] } [13:13:40.984] ...future.result <- base::tryCatch({ [13:13:40.984] base::withCallingHandlers({ [13:13:40.984] ...future.value <- base::withVisible(base::local({ [13:13:40.984] do.call(function(...) { [13:13:40.984] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:40.984] if (!identical(...future.globals.maxSize.org, [13:13:40.984] ...future.globals.maxSize)) { [13:13:40.984] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:40.984] on.exit(options(oopts), add = TRUE) [13:13:40.984] } [13:13:40.984] { [13:13:40.984] lapply(seq_along(...future.elements_ii), [13:13:40.984] FUN = function(jj) { [13:13:40.984] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:40.984] ...future.FUN(...future.X_jj, ...) [13:13:40.984] }) [13:13:40.984] } [13:13:40.984] }, args = future.call.arguments) [13:13:40.984] })) [13:13:40.984] future::FutureResult(value = ...future.value$value, [13:13:40.984] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:40.984] ...future.rng), globalenv = if (FALSE) [13:13:40.984] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:40.984] ...future.globalenv.names)) [13:13:40.984] else NULL, started = ...future.startTime, version = "1.8") [13:13:40.984] }, condition = base::local({ [13:13:40.984] c <- base::c [13:13:40.984] inherits <- base::inherits [13:13:40.984] invokeRestart <- base::invokeRestart [13:13:40.984] length <- base::length [13:13:40.984] list <- base::list [13:13:40.984] seq.int <- base::seq.int [13:13:40.984] signalCondition <- base::signalCondition [13:13:40.984] sys.calls <- base::sys.calls [13:13:40.984] `[[` <- base::`[[` [13:13:40.984] `+` <- base::`+` [13:13:40.984] `<<-` <- base::`<<-` [13:13:40.984] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:40.984] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:40.984] 3L)] [13:13:40.984] } [13:13:40.984] function(cond) { [13:13:40.984] is_error <- inherits(cond, "error") [13:13:40.984] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:40.984] NULL) [13:13:40.984] if (is_error) { [13:13:40.984] sessionInformation <- function() { [13:13:40.984] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:40.984] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:40.984] search = base::search(), system = base::Sys.info()) [13:13:40.984] } [13:13:40.984] ...future.conditions[[length(...future.conditions) + [13:13:40.984] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:40.984] cond$call), session = sessionInformation(), [13:13:40.984] timestamp = base::Sys.time(), signaled = 0L) [13:13:40.984] signalCondition(cond) [13:13:40.984] } [13:13:40.984] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:40.984] "immediateCondition"))) { [13:13:40.984] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:40.984] ...future.conditions[[length(...future.conditions) + [13:13:40.984] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:40.984] if (TRUE && !signal) { [13:13:40.984] muffleCondition <- function (cond, pattern = "^muffle") [13:13:40.984] { [13:13:40.984] inherits <- base::inherits [13:13:40.984] invokeRestart <- base::invokeRestart [13:13:40.984] is.null <- base::is.null [13:13:40.984] muffled <- FALSE [13:13:40.984] if (inherits(cond, "message")) { [13:13:40.984] muffled <- grepl(pattern, "muffleMessage") [13:13:40.984] if (muffled) [13:13:40.984] invokeRestart("muffleMessage") [13:13:40.984] } [13:13:40.984] else if (inherits(cond, "warning")) { [13:13:40.984] muffled <- grepl(pattern, "muffleWarning") [13:13:40.984] if (muffled) [13:13:40.984] invokeRestart("muffleWarning") [13:13:40.984] } [13:13:40.984] else if (inherits(cond, "condition")) { [13:13:40.984] if (!is.null(pattern)) { [13:13:40.984] computeRestarts <- base::computeRestarts [13:13:40.984] grepl <- base::grepl [13:13:40.984] restarts <- computeRestarts(cond) [13:13:40.984] for (restart in restarts) { [13:13:40.984] name <- restart$name [13:13:40.984] if (is.null(name)) [13:13:40.984] next [13:13:40.984] if (!grepl(pattern, name)) [13:13:40.984] next [13:13:40.984] invokeRestart(restart) [13:13:40.984] muffled <- TRUE [13:13:40.984] break [13:13:40.984] } [13:13:40.984] } [13:13:40.984] } [13:13:40.984] invisible(muffled) [13:13:40.984] } [13:13:40.984] muffleCondition(cond, pattern = "^muffle") [13:13:40.984] } [13:13:40.984] } [13:13:40.984] else { [13:13:40.984] if (TRUE) { [13:13:40.984] muffleCondition <- function (cond, pattern = "^muffle") [13:13:40.984] { [13:13:40.984] inherits <- base::inherits [13:13:40.984] invokeRestart <- base::invokeRestart [13:13:40.984] is.null <- base::is.null [13:13:40.984] muffled <- FALSE [13:13:40.984] if (inherits(cond, "message")) { [13:13:40.984] muffled <- grepl(pattern, "muffleMessage") [13:13:40.984] if (muffled) [13:13:40.984] invokeRestart("muffleMessage") [13:13:40.984] } [13:13:40.984] else if (inherits(cond, "warning")) { [13:13:40.984] muffled <- grepl(pattern, "muffleWarning") [13:13:40.984] if (muffled) [13:13:40.984] invokeRestart("muffleWarning") [13:13:40.984] } [13:13:40.984] else if (inherits(cond, "condition")) { [13:13:40.984] if (!is.null(pattern)) { [13:13:40.984] computeRestarts <- base::computeRestarts [13:13:40.984] grepl <- base::grepl [13:13:40.984] restarts <- computeRestarts(cond) [13:13:40.984] for (restart in restarts) { [13:13:40.984] name <- restart$name [13:13:40.984] if (is.null(name)) [13:13:40.984] next [13:13:40.984] if (!grepl(pattern, name)) [13:13:40.984] next [13:13:40.984] invokeRestart(restart) [13:13:40.984] muffled <- TRUE [13:13:40.984] break [13:13:40.984] } [13:13:40.984] } [13:13:40.984] } [13:13:40.984] invisible(muffled) [13:13:40.984] } [13:13:40.984] muffleCondition(cond, pattern = "^muffle") [13:13:40.984] } [13:13:40.984] } [13:13:40.984] } [13:13:40.984] })) [13:13:40.984] }, error = function(ex) { [13:13:40.984] base::structure(base::list(value = NULL, visible = NULL, [13:13:40.984] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:40.984] ...future.rng), started = ...future.startTime, [13:13:40.984] finished = Sys.time(), session_uuid = NA_character_, [13:13:40.984] version = "1.8"), class = "FutureResult") [13:13:40.984] }, finally = { [13:13:40.984] if (!identical(...future.workdir, getwd())) [13:13:40.984] setwd(...future.workdir) [13:13:40.984] { [13:13:40.984] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:40.984] ...future.oldOptions$nwarnings <- NULL [13:13:40.984] } [13:13:40.984] base::options(...future.oldOptions) [13:13:40.984] if (.Platform$OS.type == "windows") { [13:13:40.984] old_names <- names(...future.oldEnvVars) [13:13:40.984] envs <- base::Sys.getenv() [13:13:40.984] names <- names(envs) [13:13:40.984] common <- intersect(names, old_names) [13:13:40.984] added <- setdiff(names, old_names) [13:13:40.984] removed <- setdiff(old_names, names) [13:13:40.984] changed <- common[...future.oldEnvVars[common] != [13:13:40.984] envs[common]] [13:13:40.984] NAMES <- toupper(changed) [13:13:40.984] args <- list() [13:13:40.984] for (kk in seq_along(NAMES)) { [13:13:40.984] name <- changed[[kk]] [13:13:40.984] NAME <- NAMES[[kk]] [13:13:40.984] if (name != NAME && is.element(NAME, old_names)) [13:13:40.984] next [13:13:40.984] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:40.984] } [13:13:40.984] NAMES <- toupper(added) [13:13:40.984] for (kk in seq_along(NAMES)) { [13:13:40.984] name <- added[[kk]] [13:13:40.984] NAME <- NAMES[[kk]] [13:13:40.984] if (name != NAME && is.element(NAME, old_names)) [13:13:40.984] next [13:13:40.984] args[[name]] <- "" [13:13:40.984] } [13:13:40.984] NAMES <- toupper(removed) [13:13:40.984] for (kk in seq_along(NAMES)) { [13:13:40.984] name <- removed[[kk]] [13:13:40.984] NAME <- NAMES[[kk]] [13:13:40.984] if (name != NAME && is.element(NAME, old_names)) [13:13:40.984] next [13:13:40.984] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:40.984] } [13:13:40.984] if (length(args) > 0) [13:13:40.984] base::do.call(base::Sys.setenv, args = args) [13:13:40.984] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:40.984] } [13:13:40.984] else { [13:13:40.984] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:40.984] } [13:13:40.984] { [13:13:40.984] if (base::length(...future.futureOptionsAdded) > [13:13:40.984] 0L) { [13:13:40.984] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:40.984] base::names(opts) <- ...future.futureOptionsAdded [13:13:40.984] base::options(opts) [13:13:40.984] } [13:13:40.984] { [13:13:40.984] { [13:13:40.984] NULL [13:13:40.984] RNGkind("Mersenne-Twister") [13:13:40.984] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:40.984] inherits = FALSE) [13:13:40.984] } [13:13:40.984] options(future.plan = NULL) [13:13:40.984] if (is.na(NA_character_)) [13:13:40.984] Sys.unsetenv("R_FUTURE_PLAN") [13:13:40.984] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:40.984] future::plan(list(function (..., workers = availableCores(), [13:13:40.984] lazy = FALSE, rscript_libs = .libPaths(), [13:13:40.984] envir = parent.frame()) [13:13:40.984] { [13:13:40.984] if (is.function(workers)) [13:13:40.984] workers <- workers() [13:13:40.984] workers <- structure(as.integer(workers), [13:13:40.984] class = class(workers)) [13:13:40.984] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:40.984] workers >= 1) [13:13:40.984] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:40.984] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:40.984] } [13:13:40.984] future <- MultisessionFuture(..., workers = workers, [13:13:40.984] lazy = lazy, rscript_libs = rscript_libs, [13:13:40.984] envir = envir) [13:13:40.984] if (!future$lazy) [13:13:40.984] future <- run(future) [13:13:40.984] invisible(future) [13:13:40.984] }), .cleanup = FALSE, .init = FALSE) [13:13:40.984] } [13:13:40.984] } [13:13:40.984] } [13:13:40.984] }) [13:13:40.984] if (TRUE) { [13:13:40.984] base::sink(type = "output", split = FALSE) [13:13:40.984] if (TRUE) { [13:13:40.984] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:40.984] } [13:13:40.984] else { [13:13:40.984] ...future.result["stdout"] <- base::list(NULL) [13:13:40.984] } [13:13:40.984] base::close(...future.stdout) [13:13:40.984] ...future.stdout <- NULL [13:13:40.984] } [13:13:40.984] ...future.result$conditions <- ...future.conditions [13:13:40.984] ...future.result$finished <- base::Sys.time() [13:13:40.984] ...future.result [13:13:40.984] } [13:13:40.987] assign_globals() ... [13:13:40.987] List of 5 [13:13:40.987] $ ...future.FUN :function (mode = "logical", length = 0L) [13:13:40.987] $ future.call.arguments :List of 1 [13:13:40.987] ..$ length: int 2 [13:13:40.987] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:40.987] $ ...future.elements_ii :List of 1 [13:13:40.987] ..$ a: chr "integer" [13:13:40.987] $ ...future.seeds_ii : NULL [13:13:40.987] $ ...future.globals.maxSize: NULL [13:13:40.987] - attr(*, "where")=List of 5 [13:13:40.987] ..$ ...future.FUN : [13:13:40.987] ..$ future.call.arguments : [13:13:40.987] ..$ ...future.elements_ii : [13:13:40.987] ..$ ...future.seeds_ii : [13:13:40.987] ..$ ...future.globals.maxSize: [13:13:40.987] - attr(*, "resolved")= logi FALSE [13:13:40.987] - attr(*, "total_size")= num 2240 [13:13:40.987] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:40.987] - attr(*, "already-done")= logi TRUE [13:13:40.991] - copied '...future.FUN' to environment [13:13:40.991] - copied 'future.call.arguments' to environment [13:13:40.992] - copied '...future.elements_ii' to environment [13:13:40.992] - copied '...future.seeds_ii' to environment [13:13:40.992] - copied '...future.globals.maxSize' to environment [13:13:40.992] assign_globals() ... done [13:13:40.992] plan(): Setting new future strategy stack: [13:13:40.992] List of future strategies: [13:13:40.992] 1. sequential: [13:13:40.992] - args: function (..., envir = parent.frame(), workers = "") [13:13:40.992] - tweaked: FALSE [13:13:40.992] - call: NULL [13:13:40.993] plan(): nbrOfWorkers() = 1 [13:13:40.994] plan(): Setting new future strategy stack: [13:13:40.994] List of future strategies: [13:13:40.994] 1. multisession: [13:13:40.994] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [13:13:40.994] - tweaked: FALSE [13:13:40.994] - call: plan(strategy) [13:13:40.995] plan(): nbrOfWorkers() = 1 [13:13:40.996] SequentialFuture started (and completed) [13:13:40.996] - Launch lazy future ... done [13:13:40.996] run() for 'SequentialFuture' ... done [13:13:40.996] Created future: [13:13:40.996] SequentialFuture: [13:13:40.996] Label: 'future_lapply-1' [13:13:40.996] Expression: [13:13:40.996] { [13:13:40.996] do.call(function(...) { [13:13:40.996] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:40.996] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:40.996] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:40.996] on.exit(options(oopts), add = TRUE) [13:13:40.996] } [13:13:40.996] { [13:13:40.996] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:40.996] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:40.996] ...future.FUN(...future.X_jj, ...) [13:13:40.996] }) [13:13:40.996] } [13:13:40.996] }, args = future.call.arguments) [13:13:40.996] } [13:13:40.996] Lazy evaluation: FALSE [13:13:40.996] Asynchronous evaluation: FALSE [13:13:40.996] Local evaluation: TRUE [13:13:40.996] Environment: R_GlobalEnv [13:13:40.996] Capture standard output: TRUE [13:13:40.996] Capture condition classes: 'condition' (excluding 'nothing') [13:13:40.996] 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) [13:13:40.996] Packages: [13:13:40.996] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:40.996] Resolved: TRUE [13:13:40.996] Value: 56 bytes of class 'list' [13:13:40.996] Early signaling: FALSE [13:13:40.996] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:40.996] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:40.997] Chunk #1 of 4 ... DONE [13:13:40.997] Chunk #2 of 4 ... [13:13:40.997] - Finding globals in 'X' for chunk #2 ... [13:13:40.998] getGlobalsAndPackages() ... [13:13:40.998] Searching for globals... [13:13:40.998] [13:13:40.998] Searching for globals ... DONE [13:13:40.998] - globals: [0] [13:13:40.998] getGlobalsAndPackages() ... DONE [13:13:40.998] + additional globals found: [n=0] [13:13:40.998] + additional namespaces needed: [n=0] [13:13:40.999] - Finding globals in 'X' for chunk #2 ... DONE [13:13:40.999] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [13:13:40.999] - seeds: [13:13:40.999] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:40.999] getGlobalsAndPackages() ... [13:13:40.999] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:40.999] Resolving globals: FALSE [13:13:40.999] Tweak future expression to call with '...' arguments ... [13:13:41.000] { [13:13:41.000] do.call(function(...) { [13:13:41.000] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:41.000] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:41.000] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:41.000] on.exit(options(oopts), add = TRUE) [13:13:41.000] } [13:13:41.000] { [13:13:41.000] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:41.000] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:41.000] ...future.FUN(...future.X_jj, ...) [13:13:41.000] }) [13:13:41.000] } [13:13:41.000] }, args = future.call.arguments) [13:13:41.000] } [13:13:41.000] Tweak future expression to call with '...' arguments ... DONE [13:13:41.000] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:41.000] [13:13:41.000] getGlobalsAndPackages() ... DONE [13:13:41.001] run() for 'Future' ... [13:13:41.001] - state: 'created' [13:13:41.001] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:41.003] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:41.003] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:41.003] - Field: 'label' [13:13:41.003] - Field: 'local' [13:13:41.003] - Field: 'owner' [13:13:41.003] - Field: 'envir' [13:13:41.003] - Field: 'packages' [13:13:41.004] - Field: 'gc' [13:13:41.004] - Field: 'conditions' [13:13:41.004] - Field: 'expr' [13:13:41.004] - Field: 'uuid' [13:13:41.004] - Field: 'seed' [13:13:41.004] - Field: 'version' [13:13:41.004] - Field: 'result' [13:13:41.004] - Field: 'asynchronous' [13:13:41.005] - Field: 'calls' [13:13:41.005] - Field: 'globals' [13:13:41.005] - Field: 'stdout' [13:13:41.005] - Field: 'earlySignal' [13:13:41.005] - Field: 'lazy' [13:13:41.005] - Field: 'state' [13:13:41.005] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:41.006] - Launch lazy future ... [13:13:41.006] Packages needed by the future expression (n = 0): [13:13:41.006] Packages needed by future strategies (n = 0): [13:13:41.006] { [13:13:41.006] { [13:13:41.006] { [13:13:41.006] ...future.startTime <- base::Sys.time() [13:13:41.006] { [13:13:41.006] { [13:13:41.006] { [13:13:41.006] base::local({ [13:13:41.006] has_future <- base::requireNamespace("future", [13:13:41.006] quietly = TRUE) [13:13:41.006] if (has_future) { [13:13:41.006] ns <- base::getNamespace("future") [13:13:41.006] version <- ns[[".package"]][["version"]] [13:13:41.006] if (is.null(version)) [13:13:41.006] version <- utils::packageVersion("future") [13:13:41.006] } [13:13:41.006] else { [13:13:41.006] version <- NULL [13:13:41.006] } [13:13:41.006] if (!has_future || version < "1.8.0") { [13:13:41.006] info <- base::c(r_version = base::gsub("R version ", [13:13:41.006] "", base::R.version$version.string), [13:13:41.006] platform = base::sprintf("%s (%s-bit)", [13:13:41.006] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:41.006] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:41.006] "release", "version")], collapse = " "), [13:13:41.006] hostname = base::Sys.info()[["nodename"]]) [13:13:41.006] info <- base::sprintf("%s: %s", base::names(info), [13:13:41.006] info) [13:13:41.006] info <- base::paste(info, collapse = "; ") [13:13:41.006] if (!has_future) { [13:13:41.006] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:41.006] info) [13:13:41.006] } [13:13:41.006] else { [13:13:41.006] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:41.006] info, version) [13:13:41.006] } [13:13:41.006] base::stop(msg) [13:13:41.006] } [13:13:41.006] }) [13:13:41.006] } [13:13:41.006] options(future.plan = NULL) [13:13:41.006] Sys.unsetenv("R_FUTURE_PLAN") [13:13:41.006] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:41.006] } [13:13:41.006] ...future.workdir <- getwd() [13:13:41.006] } [13:13:41.006] ...future.oldOptions <- base::as.list(base::.Options) [13:13:41.006] ...future.oldEnvVars <- base::Sys.getenv() [13:13:41.006] } [13:13:41.006] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:41.006] future.globals.maxSize = 2097152000, future.globals.method = NULL, [13:13:41.006] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:41.006] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:41.006] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:41.006] future.stdout.windows.reencode = NULL, width = 80L) [13:13:41.006] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:41.006] base::names(...future.oldOptions)) [13:13:41.006] } [13:13:41.006] if (FALSE) { [13:13:41.006] } [13:13:41.006] else { [13:13:41.006] if (TRUE) { [13:13:41.006] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:41.006] open = "w") [13:13:41.006] } [13:13:41.006] else { [13:13:41.006] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:41.006] windows = "NUL", "/dev/null"), open = "w") [13:13:41.006] } [13:13:41.006] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:41.006] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:41.006] base::sink(type = "output", split = FALSE) [13:13:41.006] base::close(...future.stdout) [13:13:41.006] }, add = TRUE) [13:13:41.006] } [13:13:41.006] ...future.frame <- base::sys.nframe() [13:13:41.006] ...future.conditions <- base::list() [13:13:41.006] ...future.rng <- base::globalenv()$.Random.seed [13:13:41.006] if (FALSE) { [13:13:41.006] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:41.006] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:41.006] } [13:13:41.006] ...future.result <- base::tryCatch({ [13:13:41.006] base::withCallingHandlers({ [13:13:41.006] ...future.value <- base::withVisible(base::local({ [13:13:41.006] do.call(function(...) { [13:13:41.006] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:41.006] if (!identical(...future.globals.maxSize.org, [13:13:41.006] ...future.globals.maxSize)) { [13:13:41.006] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:41.006] on.exit(options(oopts), add = TRUE) [13:13:41.006] } [13:13:41.006] { [13:13:41.006] lapply(seq_along(...future.elements_ii), [13:13:41.006] FUN = function(jj) { [13:13:41.006] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:41.006] ...future.FUN(...future.X_jj, ...) [13:13:41.006] }) [13:13:41.006] } [13:13:41.006] }, args = future.call.arguments) [13:13:41.006] })) [13:13:41.006] future::FutureResult(value = ...future.value$value, [13:13:41.006] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:41.006] ...future.rng), globalenv = if (FALSE) [13:13:41.006] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:41.006] ...future.globalenv.names)) [13:13:41.006] else NULL, started = ...future.startTime, version = "1.8") [13:13:41.006] }, condition = base::local({ [13:13:41.006] c <- base::c [13:13:41.006] inherits <- base::inherits [13:13:41.006] invokeRestart <- base::invokeRestart [13:13:41.006] length <- base::length [13:13:41.006] list <- base::list [13:13:41.006] seq.int <- base::seq.int [13:13:41.006] signalCondition <- base::signalCondition [13:13:41.006] sys.calls <- base::sys.calls [13:13:41.006] `[[` <- base::`[[` [13:13:41.006] `+` <- base::`+` [13:13:41.006] `<<-` <- base::`<<-` [13:13:41.006] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:41.006] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:41.006] 3L)] [13:13:41.006] } [13:13:41.006] function(cond) { [13:13:41.006] is_error <- inherits(cond, "error") [13:13:41.006] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:41.006] NULL) [13:13:41.006] if (is_error) { [13:13:41.006] sessionInformation <- function() { [13:13:41.006] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:41.006] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:41.006] search = base::search(), system = base::Sys.info()) [13:13:41.006] } [13:13:41.006] ...future.conditions[[length(...future.conditions) + [13:13:41.006] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:41.006] cond$call), session = sessionInformation(), [13:13:41.006] timestamp = base::Sys.time(), signaled = 0L) [13:13:41.006] signalCondition(cond) [13:13:41.006] } [13:13:41.006] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:41.006] "immediateCondition"))) { [13:13:41.006] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:41.006] ...future.conditions[[length(...future.conditions) + [13:13:41.006] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:41.006] if (TRUE && !signal) { [13:13:41.006] muffleCondition <- function (cond, pattern = "^muffle") [13:13:41.006] { [13:13:41.006] inherits <- base::inherits [13:13:41.006] invokeRestart <- base::invokeRestart [13:13:41.006] is.null <- base::is.null [13:13:41.006] muffled <- FALSE [13:13:41.006] if (inherits(cond, "message")) { [13:13:41.006] muffled <- grepl(pattern, "muffleMessage") [13:13:41.006] if (muffled) [13:13:41.006] invokeRestart("muffleMessage") [13:13:41.006] } [13:13:41.006] else if (inherits(cond, "warning")) { [13:13:41.006] muffled <- grepl(pattern, "muffleWarning") [13:13:41.006] if (muffled) [13:13:41.006] invokeRestart("muffleWarning") [13:13:41.006] } [13:13:41.006] else if (inherits(cond, "condition")) { [13:13:41.006] if (!is.null(pattern)) { [13:13:41.006] computeRestarts <- base::computeRestarts [13:13:41.006] grepl <- base::grepl [13:13:41.006] restarts <- computeRestarts(cond) [13:13:41.006] for (restart in restarts) { [13:13:41.006] name <- restart$name [13:13:41.006] if (is.null(name)) [13:13:41.006] next [13:13:41.006] if (!grepl(pattern, name)) [13:13:41.006] next [13:13:41.006] invokeRestart(restart) [13:13:41.006] muffled <- TRUE [13:13:41.006] break [13:13:41.006] } [13:13:41.006] } [13:13:41.006] } [13:13:41.006] invisible(muffled) [13:13:41.006] } [13:13:41.006] muffleCondition(cond, pattern = "^muffle") [13:13:41.006] } [13:13:41.006] } [13:13:41.006] else { [13:13:41.006] if (TRUE) { [13:13:41.006] muffleCondition <- function (cond, pattern = "^muffle") [13:13:41.006] { [13:13:41.006] inherits <- base::inherits [13:13:41.006] invokeRestart <- base::invokeRestart [13:13:41.006] is.null <- base::is.null [13:13:41.006] muffled <- FALSE [13:13:41.006] if (inherits(cond, "message")) { [13:13:41.006] muffled <- grepl(pattern, "muffleMessage") [13:13:41.006] if (muffled) [13:13:41.006] invokeRestart("muffleMessage") [13:13:41.006] } [13:13:41.006] else if (inherits(cond, "warning")) { [13:13:41.006] muffled <- grepl(pattern, "muffleWarning") [13:13:41.006] if (muffled) [13:13:41.006] invokeRestart("muffleWarning") [13:13:41.006] } [13:13:41.006] else if (inherits(cond, "condition")) { [13:13:41.006] if (!is.null(pattern)) { [13:13:41.006] computeRestarts <- base::computeRestarts [13:13:41.006] grepl <- base::grepl [13:13:41.006] restarts <- computeRestarts(cond) [13:13:41.006] for (restart in restarts) { [13:13:41.006] name <- restart$name [13:13:41.006] if (is.null(name)) [13:13:41.006] next [13:13:41.006] if (!grepl(pattern, name)) [13:13:41.006] next [13:13:41.006] invokeRestart(restart) [13:13:41.006] muffled <- TRUE [13:13:41.006] break [13:13:41.006] } [13:13:41.006] } [13:13:41.006] } [13:13:41.006] invisible(muffled) [13:13:41.006] } [13:13:41.006] muffleCondition(cond, pattern = "^muffle") [13:13:41.006] } [13:13:41.006] } [13:13:41.006] } [13:13:41.006] })) [13:13:41.006] }, error = function(ex) { [13:13:41.006] base::structure(base::list(value = NULL, visible = NULL, [13:13:41.006] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:41.006] ...future.rng), started = ...future.startTime, [13:13:41.006] finished = Sys.time(), session_uuid = NA_character_, [13:13:41.006] version = "1.8"), class = "FutureResult") [13:13:41.006] }, finally = { [13:13:41.006] if (!identical(...future.workdir, getwd())) [13:13:41.006] setwd(...future.workdir) [13:13:41.006] { [13:13:41.006] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:41.006] ...future.oldOptions$nwarnings <- NULL [13:13:41.006] } [13:13:41.006] base::options(...future.oldOptions) [13:13:41.006] if (.Platform$OS.type == "windows") { [13:13:41.006] old_names <- names(...future.oldEnvVars) [13:13:41.006] envs <- base::Sys.getenv() [13:13:41.006] names <- names(envs) [13:13:41.006] common <- intersect(names, old_names) [13:13:41.006] added <- setdiff(names, old_names) [13:13:41.006] removed <- setdiff(old_names, names) [13:13:41.006] changed <- common[...future.oldEnvVars[common] != [13:13:41.006] envs[common]] [13:13:41.006] NAMES <- toupper(changed) [13:13:41.006] args <- list() [13:13:41.006] for (kk in seq_along(NAMES)) { [13:13:41.006] name <- changed[[kk]] [13:13:41.006] NAME <- NAMES[[kk]] [13:13:41.006] if (name != NAME && is.element(NAME, old_names)) [13:13:41.006] next [13:13:41.006] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:41.006] } [13:13:41.006] NAMES <- toupper(added) [13:13:41.006] for (kk in seq_along(NAMES)) { [13:13:41.006] name <- added[[kk]] [13:13:41.006] NAME <- NAMES[[kk]] [13:13:41.006] if (name != NAME && is.element(NAME, old_names)) [13:13:41.006] next [13:13:41.006] args[[name]] <- "" [13:13:41.006] } [13:13:41.006] NAMES <- toupper(removed) [13:13:41.006] for (kk in seq_along(NAMES)) { [13:13:41.006] name <- removed[[kk]] [13:13:41.006] NAME <- NAMES[[kk]] [13:13:41.006] if (name != NAME && is.element(NAME, old_names)) [13:13:41.006] next [13:13:41.006] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:41.006] } [13:13:41.006] if (length(args) > 0) [13:13:41.006] base::do.call(base::Sys.setenv, args = args) [13:13:41.006] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:41.006] } [13:13:41.006] else { [13:13:41.006] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:41.006] } [13:13:41.006] { [13:13:41.006] if (base::length(...future.futureOptionsAdded) > [13:13:41.006] 0L) { [13:13:41.006] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:41.006] base::names(opts) <- ...future.futureOptionsAdded [13:13:41.006] base::options(opts) [13:13:41.006] } [13:13:41.006] { [13:13:41.006] { [13:13:41.006] NULL [13:13:41.006] RNGkind("Mersenne-Twister") [13:13:41.006] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:41.006] inherits = FALSE) [13:13:41.006] } [13:13:41.006] options(future.plan = NULL) [13:13:41.006] if (is.na(NA_character_)) [13:13:41.006] Sys.unsetenv("R_FUTURE_PLAN") [13:13:41.006] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:41.006] future::plan(list(function (..., workers = availableCores(), [13:13:41.006] lazy = FALSE, rscript_libs = .libPaths(), [13:13:41.006] envir = parent.frame()) [13:13:41.006] { [13:13:41.006] if (is.function(workers)) [13:13:41.006] workers <- workers() [13:13:41.006] workers <- structure(as.integer(workers), [13:13:41.006] class = class(workers)) [13:13:41.006] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:41.006] workers >= 1) [13:13:41.006] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:41.006] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:41.006] } [13:13:41.006] future <- MultisessionFuture(..., workers = workers, [13:13:41.006] lazy = lazy, rscript_libs = rscript_libs, [13:13:41.006] envir = envir) [13:13:41.006] if (!future$lazy) [13:13:41.006] future <- run(future) [13:13:41.006] invisible(future) [13:13:41.006] }), .cleanup = FALSE, .init = FALSE) [13:13:41.006] } [13:13:41.006] } [13:13:41.006] } [13:13:41.006] }) [13:13:41.006] if (TRUE) { [13:13:41.006] base::sink(type = "output", split = FALSE) [13:13:41.006] if (TRUE) { [13:13:41.006] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:41.006] } [13:13:41.006] else { [13:13:41.006] ...future.result["stdout"] <- base::list(NULL) [13:13:41.006] } [13:13:41.006] base::close(...future.stdout) [13:13:41.006] ...future.stdout <- NULL [13:13:41.006] } [13:13:41.006] ...future.result$conditions <- ...future.conditions [13:13:41.006] ...future.result$finished <- base::Sys.time() [13:13:41.006] ...future.result [13:13:41.006] } [13:13:41.009] assign_globals() ... [13:13:41.009] List of 5 [13:13:41.009] $ ...future.FUN :function (mode = "logical", length = 0L) [13:13:41.009] $ future.call.arguments :List of 1 [13:13:41.009] ..$ length: int 2 [13:13:41.009] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:41.009] $ ...future.elements_ii :List of 1 [13:13:41.009] ..$ b: chr "numeric" [13:13:41.009] $ ...future.seeds_ii : NULL [13:13:41.009] $ ...future.globals.maxSize: NULL [13:13:41.009] - attr(*, "where")=List of 5 [13:13:41.009] ..$ ...future.FUN : [13:13:41.009] ..$ future.call.arguments : [13:13:41.009] ..$ ...future.elements_ii : [13:13:41.009] ..$ ...future.seeds_ii : [13:13:41.009] ..$ ...future.globals.maxSize: [13:13:41.009] - attr(*, "resolved")= logi FALSE [13:13:41.009] - attr(*, "total_size")= num 2240 [13:13:41.009] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:41.009] - attr(*, "already-done")= logi TRUE [13:13:41.014] - copied '...future.FUN' to environment [13:13:41.014] - copied 'future.call.arguments' to environment [13:13:41.014] - copied '...future.elements_ii' to environment [13:13:41.014] - copied '...future.seeds_ii' to environment [13:13:41.014] - copied '...future.globals.maxSize' to environment [13:13:41.014] assign_globals() ... done [13:13:41.015] plan(): Setting new future strategy stack: [13:13:41.015] List of future strategies: [13:13:41.015] 1. sequential: [13:13:41.015] - args: function (..., envir = parent.frame(), workers = "") [13:13:41.015] - tweaked: FALSE [13:13:41.015] - call: NULL [13:13:41.015] plan(): nbrOfWorkers() = 1 [13:13:41.016] plan(): Setting new future strategy stack: [13:13:41.016] List of future strategies: [13:13:41.016] 1. multisession: [13:13:41.016] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [13:13:41.016] - tweaked: FALSE [13:13:41.016] - call: plan(strategy) [13:13:41.018] plan(): nbrOfWorkers() = 1 [13:13:41.018] SequentialFuture started (and completed) [13:13:41.018] - Launch lazy future ... done [13:13:41.018] run() for 'SequentialFuture' ... done [13:13:41.018] Created future: [13:13:41.019] SequentialFuture: [13:13:41.019] Label: 'future_lapply-2' [13:13:41.019] Expression: [13:13:41.019] { [13:13:41.019] do.call(function(...) { [13:13:41.019] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:41.019] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:41.019] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:41.019] on.exit(options(oopts), add = TRUE) [13:13:41.019] } [13:13:41.019] { [13:13:41.019] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:41.019] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:41.019] ...future.FUN(...future.X_jj, ...) [13:13:41.019] }) [13:13:41.019] } [13:13:41.019] }, args = future.call.arguments) [13:13:41.019] } [13:13:41.019] Lazy evaluation: FALSE [13:13:41.019] Asynchronous evaluation: FALSE [13:13:41.019] Local evaluation: TRUE [13:13:41.019] Environment: R_GlobalEnv [13:13:41.019] Capture standard output: TRUE [13:13:41.019] Capture condition classes: 'condition' (excluding 'nothing') [13:13:41.019] 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) [13:13:41.019] Packages: [13:13:41.019] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:41.019] Resolved: TRUE [13:13:41.019] Value: 64 bytes of class 'list' [13:13:41.019] Early signaling: FALSE [13:13:41.019] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:41.019] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:41.019] Chunk #2 of 4 ... DONE [13:13:41.020] Chunk #3 of 4 ... [13:13:41.020] - Finding globals in 'X' for chunk #3 ... [13:13:41.020] getGlobalsAndPackages() ... [13:13:41.020] Searching for globals... [13:13:41.020] [13:13:41.020] Searching for globals ... DONE [13:13:41.020] - globals: [0] [13:13:41.021] getGlobalsAndPackages() ... DONE [13:13:41.021] + additional globals found: [n=0] [13:13:41.021] + additional namespaces needed: [n=0] [13:13:41.021] - Finding globals in 'X' for chunk #3 ... DONE [13:13:41.021] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [13:13:41.021] - seeds: [13:13:41.021] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:41.021] getGlobalsAndPackages() ... [13:13:41.021] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:41.022] Resolving globals: FALSE [13:13:41.022] Tweak future expression to call with '...' arguments ... [13:13:41.022] { [13:13:41.022] do.call(function(...) { [13:13:41.022] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:41.022] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:41.022] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:41.022] on.exit(options(oopts), add = TRUE) [13:13:41.022] } [13:13:41.022] { [13:13:41.022] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:41.022] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:41.022] ...future.FUN(...future.X_jj, ...) [13:13:41.022] }) [13:13:41.022] } [13:13:41.022] }, args = future.call.arguments) [13:13:41.022] } [13:13:41.022] Tweak future expression to call with '...' arguments ... DONE [13:13:41.023] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:41.023] [13:13:41.023] getGlobalsAndPackages() ... DONE [13:13:41.023] run() for 'Future' ... [13:13:41.023] - state: 'created' [13:13:41.023] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:41.025] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:41.025] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:41.025] - Field: 'label' [13:13:41.025] - Field: 'local' [13:13:41.026] - Field: 'owner' [13:13:41.026] - Field: 'envir' [13:13:41.026] - Field: 'packages' [13:13:41.026] - Field: 'gc' [13:13:41.026] - Field: 'conditions' [13:13:41.026] - Field: 'expr' [13:13:41.026] - Field: 'uuid' [13:13:41.026] - Field: 'seed' [13:13:41.027] - Field: 'version' [13:13:41.027] - Field: 'result' [13:13:41.027] - Field: 'asynchronous' [13:13:41.027] - Field: 'calls' [13:13:41.027] - Field: 'globals' [13:13:41.027] - Field: 'stdout' [13:13:41.027] - Field: 'earlySignal' [13:13:41.027] - Field: 'lazy' [13:13:41.028] - Field: 'state' [13:13:41.028] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:41.028] - Launch lazy future ... [13:13:41.028] Packages needed by the future expression (n = 0): [13:13:41.028] Packages needed by future strategies (n = 0): [13:13:41.029] { [13:13:41.029] { [13:13:41.029] { [13:13:41.029] ...future.startTime <- base::Sys.time() [13:13:41.029] { [13:13:41.029] { [13:13:41.029] { [13:13:41.029] base::local({ [13:13:41.029] has_future <- base::requireNamespace("future", [13:13:41.029] quietly = TRUE) [13:13:41.029] if (has_future) { [13:13:41.029] ns <- base::getNamespace("future") [13:13:41.029] version <- ns[[".package"]][["version"]] [13:13:41.029] if (is.null(version)) [13:13:41.029] version <- utils::packageVersion("future") [13:13:41.029] } [13:13:41.029] else { [13:13:41.029] version <- NULL [13:13:41.029] } [13:13:41.029] if (!has_future || version < "1.8.0") { [13:13:41.029] info <- base::c(r_version = base::gsub("R version ", [13:13:41.029] "", base::R.version$version.string), [13:13:41.029] platform = base::sprintf("%s (%s-bit)", [13:13:41.029] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:41.029] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:41.029] "release", "version")], collapse = " "), [13:13:41.029] hostname = base::Sys.info()[["nodename"]]) [13:13:41.029] info <- base::sprintf("%s: %s", base::names(info), [13:13:41.029] info) [13:13:41.029] info <- base::paste(info, collapse = "; ") [13:13:41.029] if (!has_future) { [13:13:41.029] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:41.029] info) [13:13:41.029] } [13:13:41.029] else { [13:13:41.029] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:41.029] info, version) [13:13:41.029] } [13:13:41.029] base::stop(msg) [13:13:41.029] } [13:13:41.029] }) [13:13:41.029] } [13:13:41.029] options(future.plan = NULL) [13:13:41.029] Sys.unsetenv("R_FUTURE_PLAN") [13:13:41.029] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:41.029] } [13:13:41.029] ...future.workdir <- getwd() [13:13:41.029] } [13:13:41.029] ...future.oldOptions <- base::as.list(base::.Options) [13:13:41.029] ...future.oldEnvVars <- base::Sys.getenv() [13:13:41.029] } [13:13:41.029] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:41.029] future.globals.maxSize = 2097152000, future.globals.method = NULL, [13:13:41.029] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:41.029] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:41.029] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:41.029] future.stdout.windows.reencode = NULL, width = 80L) [13:13:41.029] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:41.029] base::names(...future.oldOptions)) [13:13:41.029] } [13:13:41.029] if (FALSE) { [13:13:41.029] } [13:13:41.029] else { [13:13:41.029] if (TRUE) { [13:13:41.029] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:41.029] open = "w") [13:13:41.029] } [13:13:41.029] else { [13:13:41.029] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:41.029] windows = "NUL", "/dev/null"), open = "w") [13:13:41.029] } [13:13:41.029] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:41.029] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:41.029] base::sink(type = "output", split = FALSE) [13:13:41.029] base::close(...future.stdout) [13:13:41.029] }, add = TRUE) [13:13:41.029] } [13:13:41.029] ...future.frame <- base::sys.nframe() [13:13:41.029] ...future.conditions <- base::list() [13:13:41.029] ...future.rng <- base::globalenv()$.Random.seed [13:13:41.029] if (FALSE) { [13:13:41.029] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:41.029] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:41.029] } [13:13:41.029] ...future.result <- base::tryCatch({ [13:13:41.029] base::withCallingHandlers({ [13:13:41.029] ...future.value <- base::withVisible(base::local({ [13:13:41.029] do.call(function(...) { [13:13:41.029] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:41.029] if (!identical(...future.globals.maxSize.org, [13:13:41.029] ...future.globals.maxSize)) { [13:13:41.029] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:41.029] on.exit(options(oopts), add = TRUE) [13:13:41.029] } [13:13:41.029] { [13:13:41.029] lapply(seq_along(...future.elements_ii), [13:13:41.029] FUN = function(jj) { [13:13:41.029] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:41.029] ...future.FUN(...future.X_jj, ...) [13:13:41.029] }) [13:13:41.029] } [13:13:41.029] }, args = future.call.arguments) [13:13:41.029] })) [13:13:41.029] future::FutureResult(value = ...future.value$value, [13:13:41.029] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:41.029] ...future.rng), globalenv = if (FALSE) [13:13:41.029] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:41.029] ...future.globalenv.names)) [13:13:41.029] else NULL, started = ...future.startTime, version = "1.8") [13:13:41.029] }, condition = base::local({ [13:13:41.029] c <- base::c [13:13:41.029] inherits <- base::inherits [13:13:41.029] invokeRestart <- base::invokeRestart [13:13:41.029] length <- base::length [13:13:41.029] list <- base::list [13:13:41.029] seq.int <- base::seq.int [13:13:41.029] signalCondition <- base::signalCondition [13:13:41.029] sys.calls <- base::sys.calls [13:13:41.029] `[[` <- base::`[[` [13:13:41.029] `+` <- base::`+` [13:13:41.029] `<<-` <- base::`<<-` [13:13:41.029] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:41.029] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:41.029] 3L)] [13:13:41.029] } [13:13:41.029] function(cond) { [13:13:41.029] is_error <- inherits(cond, "error") [13:13:41.029] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:41.029] NULL) [13:13:41.029] if (is_error) { [13:13:41.029] sessionInformation <- function() { [13:13:41.029] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:41.029] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:41.029] search = base::search(), system = base::Sys.info()) [13:13:41.029] } [13:13:41.029] ...future.conditions[[length(...future.conditions) + [13:13:41.029] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:41.029] cond$call), session = sessionInformation(), [13:13:41.029] timestamp = base::Sys.time(), signaled = 0L) [13:13:41.029] signalCondition(cond) [13:13:41.029] } [13:13:41.029] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:41.029] "immediateCondition"))) { [13:13:41.029] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:41.029] ...future.conditions[[length(...future.conditions) + [13:13:41.029] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:41.029] if (TRUE && !signal) { [13:13:41.029] muffleCondition <- function (cond, pattern = "^muffle") [13:13:41.029] { [13:13:41.029] inherits <- base::inherits [13:13:41.029] invokeRestart <- base::invokeRestart [13:13:41.029] is.null <- base::is.null [13:13:41.029] muffled <- FALSE [13:13:41.029] if (inherits(cond, "message")) { [13:13:41.029] muffled <- grepl(pattern, "muffleMessage") [13:13:41.029] if (muffled) [13:13:41.029] invokeRestart("muffleMessage") [13:13:41.029] } [13:13:41.029] else if (inherits(cond, "warning")) { [13:13:41.029] muffled <- grepl(pattern, "muffleWarning") [13:13:41.029] if (muffled) [13:13:41.029] invokeRestart("muffleWarning") [13:13:41.029] } [13:13:41.029] else if (inherits(cond, "condition")) { [13:13:41.029] if (!is.null(pattern)) { [13:13:41.029] computeRestarts <- base::computeRestarts [13:13:41.029] grepl <- base::grepl [13:13:41.029] restarts <- computeRestarts(cond) [13:13:41.029] for (restart in restarts) { [13:13:41.029] name <- restart$name [13:13:41.029] if (is.null(name)) [13:13:41.029] next [13:13:41.029] if (!grepl(pattern, name)) [13:13:41.029] next [13:13:41.029] invokeRestart(restart) [13:13:41.029] muffled <- TRUE [13:13:41.029] break [13:13:41.029] } [13:13:41.029] } [13:13:41.029] } [13:13:41.029] invisible(muffled) [13:13:41.029] } [13:13:41.029] muffleCondition(cond, pattern = "^muffle") [13:13:41.029] } [13:13:41.029] } [13:13:41.029] else { [13:13:41.029] if (TRUE) { [13:13:41.029] muffleCondition <- function (cond, pattern = "^muffle") [13:13:41.029] { [13:13:41.029] inherits <- base::inherits [13:13:41.029] invokeRestart <- base::invokeRestart [13:13:41.029] is.null <- base::is.null [13:13:41.029] muffled <- FALSE [13:13:41.029] if (inherits(cond, "message")) { [13:13:41.029] muffled <- grepl(pattern, "muffleMessage") [13:13:41.029] if (muffled) [13:13:41.029] invokeRestart("muffleMessage") [13:13:41.029] } [13:13:41.029] else if (inherits(cond, "warning")) { [13:13:41.029] muffled <- grepl(pattern, "muffleWarning") [13:13:41.029] if (muffled) [13:13:41.029] invokeRestart("muffleWarning") [13:13:41.029] } [13:13:41.029] else if (inherits(cond, "condition")) { [13:13:41.029] if (!is.null(pattern)) { [13:13:41.029] computeRestarts <- base::computeRestarts [13:13:41.029] grepl <- base::grepl [13:13:41.029] restarts <- computeRestarts(cond) [13:13:41.029] for (restart in restarts) { [13:13:41.029] name <- restart$name [13:13:41.029] if (is.null(name)) [13:13:41.029] next [13:13:41.029] if (!grepl(pattern, name)) [13:13:41.029] next [13:13:41.029] invokeRestart(restart) [13:13:41.029] muffled <- TRUE [13:13:41.029] break [13:13:41.029] } [13:13:41.029] } [13:13:41.029] } [13:13:41.029] invisible(muffled) [13:13:41.029] } [13:13:41.029] muffleCondition(cond, pattern = "^muffle") [13:13:41.029] } [13:13:41.029] } [13:13:41.029] } [13:13:41.029] })) [13:13:41.029] }, error = function(ex) { [13:13:41.029] base::structure(base::list(value = NULL, visible = NULL, [13:13:41.029] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:41.029] ...future.rng), started = ...future.startTime, [13:13:41.029] finished = Sys.time(), session_uuid = NA_character_, [13:13:41.029] version = "1.8"), class = "FutureResult") [13:13:41.029] }, finally = { [13:13:41.029] if (!identical(...future.workdir, getwd())) [13:13:41.029] setwd(...future.workdir) [13:13:41.029] { [13:13:41.029] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:41.029] ...future.oldOptions$nwarnings <- NULL [13:13:41.029] } [13:13:41.029] base::options(...future.oldOptions) [13:13:41.029] if (.Platform$OS.type == "windows") { [13:13:41.029] old_names <- names(...future.oldEnvVars) [13:13:41.029] envs <- base::Sys.getenv() [13:13:41.029] names <- names(envs) [13:13:41.029] common <- intersect(names, old_names) [13:13:41.029] added <- setdiff(names, old_names) [13:13:41.029] removed <- setdiff(old_names, names) [13:13:41.029] changed <- common[...future.oldEnvVars[common] != [13:13:41.029] envs[common]] [13:13:41.029] NAMES <- toupper(changed) [13:13:41.029] args <- list() [13:13:41.029] for (kk in seq_along(NAMES)) { [13:13:41.029] name <- changed[[kk]] [13:13:41.029] NAME <- NAMES[[kk]] [13:13:41.029] if (name != NAME && is.element(NAME, old_names)) [13:13:41.029] next [13:13:41.029] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:41.029] } [13:13:41.029] NAMES <- toupper(added) [13:13:41.029] for (kk in seq_along(NAMES)) { [13:13:41.029] name <- added[[kk]] [13:13:41.029] NAME <- NAMES[[kk]] [13:13:41.029] if (name != NAME && is.element(NAME, old_names)) [13:13:41.029] next [13:13:41.029] args[[name]] <- "" [13:13:41.029] } [13:13:41.029] NAMES <- toupper(removed) [13:13:41.029] for (kk in seq_along(NAMES)) { [13:13:41.029] name <- removed[[kk]] [13:13:41.029] NAME <- NAMES[[kk]] [13:13:41.029] if (name != NAME && is.element(NAME, old_names)) [13:13:41.029] next [13:13:41.029] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:41.029] } [13:13:41.029] if (length(args) > 0) [13:13:41.029] base::do.call(base::Sys.setenv, args = args) [13:13:41.029] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:41.029] } [13:13:41.029] else { [13:13:41.029] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:41.029] } [13:13:41.029] { [13:13:41.029] if (base::length(...future.futureOptionsAdded) > [13:13:41.029] 0L) { [13:13:41.029] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:41.029] base::names(opts) <- ...future.futureOptionsAdded [13:13:41.029] base::options(opts) [13:13:41.029] } [13:13:41.029] { [13:13:41.029] { [13:13:41.029] NULL [13:13:41.029] RNGkind("Mersenne-Twister") [13:13:41.029] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:41.029] inherits = FALSE) [13:13:41.029] } [13:13:41.029] options(future.plan = NULL) [13:13:41.029] if (is.na(NA_character_)) [13:13:41.029] Sys.unsetenv("R_FUTURE_PLAN") [13:13:41.029] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:41.029] future::plan(list(function (..., workers = availableCores(), [13:13:41.029] lazy = FALSE, rscript_libs = .libPaths(), [13:13:41.029] envir = parent.frame()) [13:13:41.029] { [13:13:41.029] if (is.function(workers)) [13:13:41.029] workers <- workers() [13:13:41.029] workers <- structure(as.integer(workers), [13:13:41.029] class = class(workers)) [13:13:41.029] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:41.029] workers >= 1) [13:13:41.029] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:41.029] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:41.029] } [13:13:41.029] future <- MultisessionFuture(..., workers = workers, [13:13:41.029] lazy = lazy, rscript_libs = rscript_libs, [13:13:41.029] envir = envir) [13:13:41.029] if (!future$lazy) [13:13:41.029] future <- run(future) [13:13:41.029] invisible(future) [13:13:41.029] }), .cleanup = FALSE, .init = FALSE) [13:13:41.029] } [13:13:41.029] } [13:13:41.029] } [13:13:41.029] }) [13:13:41.029] if (TRUE) { [13:13:41.029] base::sink(type = "output", split = FALSE) [13:13:41.029] if (TRUE) { [13:13:41.029] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:41.029] } [13:13:41.029] else { [13:13:41.029] ...future.result["stdout"] <- base::list(NULL) [13:13:41.029] } [13:13:41.029] base::close(...future.stdout) [13:13:41.029] ...future.stdout <- NULL [13:13:41.029] } [13:13:41.029] ...future.result$conditions <- ...future.conditions [13:13:41.029] ...future.result$finished <- base::Sys.time() [13:13:41.029] ...future.result [13:13:41.029] } [13:13:41.031] assign_globals() ... [13:13:41.032] List of 5 [13:13:41.032] $ ...future.FUN :function (mode = "logical", length = 0L) [13:13:41.032] $ future.call.arguments :List of 1 [13:13:41.032] ..$ length: int 2 [13:13:41.032] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:41.032] $ ...future.elements_ii :List of 1 [13:13:41.032] ..$ c: chr "character" [13:13:41.032] $ ...future.seeds_ii : NULL [13:13:41.032] $ ...future.globals.maxSize: NULL [13:13:41.032] - attr(*, "where")=List of 5 [13:13:41.032] ..$ ...future.FUN : [13:13:41.032] ..$ future.call.arguments : [13:13:41.032] ..$ ...future.elements_ii : [13:13:41.032] ..$ ...future.seeds_ii : [13:13:41.032] ..$ ...future.globals.maxSize: [13:13:41.032] - attr(*, "resolved")= logi FALSE [13:13:41.032] - attr(*, "total_size")= num 2240 [13:13:41.032] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:41.032] - attr(*, "already-done")= logi TRUE [13:13:41.037] - copied '...future.FUN' to environment [13:13:41.038] - copied 'future.call.arguments' to environment [13:13:41.038] - copied '...future.elements_ii' to environment [13:13:41.038] - copied '...future.seeds_ii' to environment [13:13:41.038] - copied '...future.globals.maxSize' to environment [13:13:41.038] assign_globals() ... done [13:13:41.038] plan(): Setting new future strategy stack: [13:13:41.038] List of future strategies: [13:13:41.038] 1. sequential: [13:13:41.038] - args: function (..., envir = parent.frame(), workers = "") [13:13:41.038] - tweaked: FALSE [13:13:41.038] - call: NULL [13:13:41.039] plan(): nbrOfWorkers() = 1 [13:13:41.040] plan(): Setting new future strategy stack: [13:13:41.040] List of future strategies: [13:13:41.040] 1. multisession: [13:13:41.040] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [13:13:41.040] - tweaked: FALSE [13:13:41.040] - call: plan(strategy) [13:13:41.042] plan(): nbrOfWorkers() = 1 [13:13:41.042] SequentialFuture started (and completed) [13:13:41.042] - Launch lazy future ... done [13:13:41.042] run() for 'SequentialFuture' ... done [13:13:41.042] Created future: [13:13:41.042] SequentialFuture: [13:13:41.042] Label: 'future_lapply-3' [13:13:41.042] Expression: [13:13:41.042] { [13:13:41.042] do.call(function(...) { [13:13:41.042] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:41.042] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:41.042] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:41.042] on.exit(options(oopts), add = TRUE) [13:13:41.042] } [13:13:41.042] { [13:13:41.042] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:41.042] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:41.042] ...future.FUN(...future.X_jj, ...) [13:13:41.042] }) [13:13:41.042] } [13:13:41.042] }, args = future.call.arguments) [13:13:41.042] } [13:13:41.042] Lazy evaluation: FALSE [13:13:41.042] Asynchronous evaluation: FALSE [13:13:41.042] Local evaluation: TRUE [13:13:41.042] Environment: R_GlobalEnv [13:13:41.042] Capture standard output: TRUE [13:13:41.042] Capture condition classes: 'condition' (excluding 'nothing') [13:13:41.042] 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) [13:13:41.042] Packages: [13:13:41.042] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:41.042] Resolved: TRUE [13:13:41.042] Value: 120 bytes of class 'list' [13:13:41.042] Early signaling: FALSE [13:13:41.042] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:41.042] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:41.043] Chunk #3 of 4 ... DONE [13:13:41.043] Chunk #4 of 4 ... [13:13:41.043] - Finding globals in 'X' for chunk #4 ... [13:13:41.044] getGlobalsAndPackages() ... [13:13:41.044] Searching for globals... [13:13:41.044] [13:13:41.044] Searching for globals ... DONE [13:13:41.044] - globals: [0] [13:13:41.044] getGlobalsAndPackages() ... DONE [13:13:41.044] + additional globals found: [n=0] [13:13:41.044] + additional namespaces needed: [n=0] [13:13:41.045] - Finding globals in 'X' for chunk #4 ... DONE [13:13:41.045] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [13:13:41.045] - seeds: [13:13:41.045] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:41.045] getGlobalsAndPackages() ... [13:13:41.045] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:41.045] Resolving globals: FALSE [13:13:41.045] Tweak future expression to call with '...' arguments ... [13:13:41.046] { [13:13:41.046] do.call(function(...) { [13:13:41.046] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:41.046] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:41.046] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:41.046] on.exit(options(oopts), add = TRUE) [13:13:41.046] } [13:13:41.046] { [13:13:41.046] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:41.046] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:41.046] ...future.FUN(...future.X_jj, ...) [13:13:41.046] }) [13:13:41.046] } [13:13:41.046] }, args = future.call.arguments) [13:13:41.046] } [13:13:41.046] Tweak future expression to call with '...' arguments ... DONE [13:13:41.046] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:41.046] [13:13:41.046] getGlobalsAndPackages() ... DONE [13:13:41.047] run() for 'Future' ... [13:13:41.047] - state: 'created' [13:13:41.047] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:41.049] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:41.049] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:41.049] - Field: 'label' [13:13:41.049] - Field: 'local' [13:13:41.049] - Field: 'owner' [13:13:41.049] - Field: 'envir' [13:13:41.049] - Field: 'packages' [13:13:41.049] - Field: 'gc' [13:13:41.050] - Field: 'conditions' [13:13:41.050] - Field: 'expr' [13:13:41.050] - Field: 'uuid' [13:13:41.050] - Field: 'seed' [13:13:41.050] - Field: 'version' [13:13:41.050] - Field: 'result' [13:13:41.050] - Field: 'asynchronous' [13:13:41.050] - Field: 'calls' [13:13:41.051] - Field: 'globals' [13:13:41.051] - Field: 'stdout' [13:13:41.051] - Field: 'earlySignal' [13:13:41.051] - Field: 'lazy' [13:13:41.051] - Field: 'state' [13:13:41.051] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:41.051] - Launch lazy future ... [13:13:41.052] Packages needed by the future expression (n = 0): [13:13:41.052] Packages needed by future strategies (n = 0): [13:13:41.052] { [13:13:41.052] { [13:13:41.052] { [13:13:41.052] ...future.startTime <- base::Sys.time() [13:13:41.052] { [13:13:41.052] { [13:13:41.052] { [13:13:41.052] base::local({ [13:13:41.052] has_future <- base::requireNamespace("future", [13:13:41.052] quietly = TRUE) [13:13:41.052] if (has_future) { [13:13:41.052] ns <- base::getNamespace("future") [13:13:41.052] version <- ns[[".package"]][["version"]] [13:13:41.052] if (is.null(version)) [13:13:41.052] version <- utils::packageVersion("future") [13:13:41.052] } [13:13:41.052] else { [13:13:41.052] version <- NULL [13:13:41.052] } [13:13:41.052] if (!has_future || version < "1.8.0") { [13:13:41.052] info <- base::c(r_version = base::gsub("R version ", [13:13:41.052] "", base::R.version$version.string), [13:13:41.052] platform = base::sprintf("%s (%s-bit)", [13:13:41.052] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:41.052] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:41.052] "release", "version")], collapse = " "), [13:13:41.052] hostname = base::Sys.info()[["nodename"]]) [13:13:41.052] info <- base::sprintf("%s: %s", base::names(info), [13:13:41.052] info) [13:13:41.052] info <- base::paste(info, collapse = "; ") [13:13:41.052] if (!has_future) { [13:13:41.052] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:41.052] info) [13:13:41.052] } [13:13:41.052] else { [13:13:41.052] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:41.052] info, version) [13:13:41.052] } [13:13:41.052] base::stop(msg) [13:13:41.052] } [13:13:41.052] }) [13:13:41.052] } [13:13:41.052] options(future.plan = NULL) [13:13:41.052] Sys.unsetenv("R_FUTURE_PLAN") [13:13:41.052] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:41.052] } [13:13:41.052] ...future.workdir <- getwd() [13:13:41.052] } [13:13:41.052] ...future.oldOptions <- base::as.list(base::.Options) [13:13:41.052] ...future.oldEnvVars <- base::Sys.getenv() [13:13:41.052] } [13:13:41.052] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:41.052] future.globals.maxSize = 2097152000, future.globals.method = NULL, [13:13:41.052] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:41.052] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:41.052] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:41.052] future.stdout.windows.reencode = NULL, width = 80L) [13:13:41.052] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:41.052] base::names(...future.oldOptions)) [13:13:41.052] } [13:13:41.052] if (FALSE) { [13:13:41.052] } [13:13:41.052] else { [13:13:41.052] if (TRUE) { [13:13:41.052] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:41.052] open = "w") [13:13:41.052] } [13:13:41.052] else { [13:13:41.052] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:41.052] windows = "NUL", "/dev/null"), open = "w") [13:13:41.052] } [13:13:41.052] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:41.052] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:41.052] base::sink(type = "output", split = FALSE) [13:13:41.052] base::close(...future.stdout) [13:13:41.052] }, add = TRUE) [13:13:41.052] } [13:13:41.052] ...future.frame <- base::sys.nframe() [13:13:41.052] ...future.conditions <- base::list() [13:13:41.052] ...future.rng <- base::globalenv()$.Random.seed [13:13:41.052] if (FALSE) { [13:13:41.052] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:41.052] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:41.052] } [13:13:41.052] ...future.result <- base::tryCatch({ [13:13:41.052] base::withCallingHandlers({ [13:13:41.052] ...future.value <- base::withVisible(base::local({ [13:13:41.052] do.call(function(...) { [13:13:41.052] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:41.052] if (!identical(...future.globals.maxSize.org, [13:13:41.052] ...future.globals.maxSize)) { [13:13:41.052] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:41.052] on.exit(options(oopts), add = TRUE) [13:13:41.052] } [13:13:41.052] { [13:13:41.052] lapply(seq_along(...future.elements_ii), [13:13:41.052] FUN = function(jj) { [13:13:41.052] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:41.052] ...future.FUN(...future.X_jj, ...) [13:13:41.052] }) [13:13:41.052] } [13:13:41.052] }, args = future.call.arguments) [13:13:41.052] })) [13:13:41.052] future::FutureResult(value = ...future.value$value, [13:13:41.052] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:41.052] ...future.rng), globalenv = if (FALSE) [13:13:41.052] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:41.052] ...future.globalenv.names)) [13:13:41.052] else NULL, started = ...future.startTime, version = "1.8") [13:13:41.052] }, condition = base::local({ [13:13:41.052] c <- base::c [13:13:41.052] inherits <- base::inherits [13:13:41.052] invokeRestart <- base::invokeRestart [13:13:41.052] length <- base::length [13:13:41.052] list <- base::list [13:13:41.052] seq.int <- base::seq.int [13:13:41.052] signalCondition <- base::signalCondition [13:13:41.052] sys.calls <- base::sys.calls [13:13:41.052] `[[` <- base::`[[` [13:13:41.052] `+` <- base::`+` [13:13:41.052] `<<-` <- base::`<<-` [13:13:41.052] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:41.052] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:41.052] 3L)] [13:13:41.052] } [13:13:41.052] function(cond) { [13:13:41.052] is_error <- inherits(cond, "error") [13:13:41.052] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:41.052] NULL) [13:13:41.052] if (is_error) { [13:13:41.052] sessionInformation <- function() { [13:13:41.052] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:41.052] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:41.052] search = base::search(), system = base::Sys.info()) [13:13:41.052] } [13:13:41.052] ...future.conditions[[length(...future.conditions) + [13:13:41.052] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:41.052] cond$call), session = sessionInformation(), [13:13:41.052] timestamp = base::Sys.time(), signaled = 0L) [13:13:41.052] signalCondition(cond) [13:13:41.052] } [13:13:41.052] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:41.052] "immediateCondition"))) { [13:13:41.052] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:41.052] ...future.conditions[[length(...future.conditions) + [13:13:41.052] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:41.052] if (TRUE && !signal) { [13:13:41.052] muffleCondition <- function (cond, pattern = "^muffle") [13:13:41.052] { [13:13:41.052] inherits <- base::inherits [13:13:41.052] invokeRestart <- base::invokeRestart [13:13:41.052] is.null <- base::is.null [13:13:41.052] muffled <- FALSE [13:13:41.052] if (inherits(cond, "message")) { [13:13:41.052] muffled <- grepl(pattern, "muffleMessage") [13:13:41.052] if (muffled) [13:13:41.052] invokeRestart("muffleMessage") [13:13:41.052] } [13:13:41.052] else if (inherits(cond, "warning")) { [13:13:41.052] muffled <- grepl(pattern, "muffleWarning") [13:13:41.052] if (muffled) [13:13:41.052] invokeRestart("muffleWarning") [13:13:41.052] } [13:13:41.052] else if (inherits(cond, "condition")) { [13:13:41.052] if (!is.null(pattern)) { [13:13:41.052] computeRestarts <- base::computeRestarts [13:13:41.052] grepl <- base::grepl [13:13:41.052] restarts <- computeRestarts(cond) [13:13:41.052] for (restart in restarts) { [13:13:41.052] name <- restart$name [13:13:41.052] if (is.null(name)) [13:13:41.052] next [13:13:41.052] if (!grepl(pattern, name)) [13:13:41.052] next [13:13:41.052] invokeRestart(restart) [13:13:41.052] muffled <- TRUE [13:13:41.052] break [13:13:41.052] } [13:13:41.052] } [13:13:41.052] } [13:13:41.052] invisible(muffled) [13:13:41.052] } [13:13:41.052] muffleCondition(cond, pattern = "^muffle") [13:13:41.052] } [13:13:41.052] } [13:13:41.052] else { [13:13:41.052] if (TRUE) { [13:13:41.052] muffleCondition <- function (cond, pattern = "^muffle") [13:13:41.052] { [13:13:41.052] inherits <- base::inherits [13:13:41.052] invokeRestart <- base::invokeRestart [13:13:41.052] is.null <- base::is.null [13:13:41.052] muffled <- FALSE [13:13:41.052] if (inherits(cond, "message")) { [13:13:41.052] muffled <- grepl(pattern, "muffleMessage") [13:13:41.052] if (muffled) [13:13:41.052] invokeRestart("muffleMessage") [13:13:41.052] } [13:13:41.052] else if (inherits(cond, "warning")) { [13:13:41.052] muffled <- grepl(pattern, "muffleWarning") [13:13:41.052] if (muffled) [13:13:41.052] invokeRestart("muffleWarning") [13:13:41.052] } [13:13:41.052] else if (inherits(cond, "condition")) { [13:13:41.052] if (!is.null(pattern)) { [13:13:41.052] computeRestarts <- base::computeRestarts [13:13:41.052] grepl <- base::grepl [13:13:41.052] restarts <- computeRestarts(cond) [13:13:41.052] for (restart in restarts) { [13:13:41.052] name <- restart$name [13:13:41.052] if (is.null(name)) [13:13:41.052] next [13:13:41.052] if (!grepl(pattern, name)) [13:13:41.052] next [13:13:41.052] invokeRestart(restart) [13:13:41.052] muffled <- TRUE [13:13:41.052] break [13:13:41.052] } [13:13:41.052] } [13:13:41.052] } [13:13:41.052] invisible(muffled) [13:13:41.052] } [13:13:41.052] muffleCondition(cond, pattern = "^muffle") [13:13:41.052] } [13:13:41.052] } [13:13:41.052] } [13:13:41.052] })) [13:13:41.052] }, error = function(ex) { [13:13:41.052] base::structure(base::list(value = NULL, visible = NULL, [13:13:41.052] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:41.052] ...future.rng), started = ...future.startTime, [13:13:41.052] finished = Sys.time(), session_uuid = NA_character_, [13:13:41.052] version = "1.8"), class = "FutureResult") [13:13:41.052] }, finally = { [13:13:41.052] if (!identical(...future.workdir, getwd())) [13:13:41.052] setwd(...future.workdir) [13:13:41.052] { [13:13:41.052] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:41.052] ...future.oldOptions$nwarnings <- NULL [13:13:41.052] } [13:13:41.052] base::options(...future.oldOptions) [13:13:41.052] if (.Platform$OS.type == "windows") { [13:13:41.052] old_names <- names(...future.oldEnvVars) [13:13:41.052] envs <- base::Sys.getenv() [13:13:41.052] names <- names(envs) [13:13:41.052] common <- intersect(names, old_names) [13:13:41.052] added <- setdiff(names, old_names) [13:13:41.052] removed <- setdiff(old_names, names) [13:13:41.052] changed <- common[...future.oldEnvVars[common] != [13:13:41.052] envs[common]] [13:13:41.052] NAMES <- toupper(changed) [13:13:41.052] args <- list() [13:13:41.052] for (kk in seq_along(NAMES)) { [13:13:41.052] name <- changed[[kk]] [13:13:41.052] NAME <- NAMES[[kk]] [13:13:41.052] if (name != NAME && is.element(NAME, old_names)) [13:13:41.052] next [13:13:41.052] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:41.052] } [13:13:41.052] NAMES <- toupper(added) [13:13:41.052] for (kk in seq_along(NAMES)) { [13:13:41.052] name <- added[[kk]] [13:13:41.052] NAME <- NAMES[[kk]] [13:13:41.052] if (name != NAME && is.element(NAME, old_names)) [13:13:41.052] next [13:13:41.052] args[[name]] <- "" [13:13:41.052] } [13:13:41.052] NAMES <- toupper(removed) [13:13:41.052] for (kk in seq_along(NAMES)) { [13:13:41.052] name <- removed[[kk]] [13:13:41.052] NAME <- NAMES[[kk]] [13:13:41.052] if (name != NAME && is.element(NAME, old_names)) [13:13:41.052] next [13:13:41.052] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:41.052] } [13:13:41.052] if (length(args) > 0) [13:13:41.052] base::do.call(base::Sys.setenv, args = args) [13:13:41.052] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:41.052] } [13:13:41.052] else { [13:13:41.052] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:41.052] } [13:13:41.052] { [13:13:41.052] if (base::length(...future.futureOptionsAdded) > [13:13:41.052] 0L) { [13:13:41.052] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:41.052] base::names(opts) <- ...future.futureOptionsAdded [13:13:41.052] base::options(opts) [13:13:41.052] } [13:13:41.052] { [13:13:41.052] { [13:13:41.052] NULL [13:13:41.052] RNGkind("Mersenne-Twister") [13:13:41.052] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:41.052] inherits = FALSE) [13:13:41.052] } [13:13:41.052] options(future.plan = NULL) [13:13:41.052] if (is.na(NA_character_)) [13:13:41.052] Sys.unsetenv("R_FUTURE_PLAN") [13:13:41.052] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:41.052] future::plan(list(function (..., workers = availableCores(), [13:13:41.052] lazy = FALSE, rscript_libs = .libPaths(), [13:13:41.052] envir = parent.frame()) [13:13:41.052] { [13:13:41.052] if (is.function(workers)) [13:13:41.052] workers <- workers() [13:13:41.052] workers <- structure(as.integer(workers), [13:13:41.052] class = class(workers)) [13:13:41.052] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:41.052] workers >= 1) [13:13:41.052] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:41.052] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:41.052] } [13:13:41.052] future <- MultisessionFuture(..., workers = workers, [13:13:41.052] lazy = lazy, rscript_libs = rscript_libs, [13:13:41.052] envir = envir) [13:13:41.052] if (!future$lazy) [13:13:41.052] future <- run(future) [13:13:41.052] invisible(future) [13:13:41.052] }), .cleanup = FALSE, .init = FALSE) [13:13:41.052] } [13:13:41.052] } [13:13:41.052] } [13:13:41.052] }) [13:13:41.052] if (TRUE) { [13:13:41.052] base::sink(type = "output", split = FALSE) [13:13:41.052] if (TRUE) { [13:13:41.052] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:41.052] } [13:13:41.052] else { [13:13:41.052] ...future.result["stdout"] <- base::list(NULL) [13:13:41.052] } [13:13:41.052] base::close(...future.stdout) [13:13:41.052] ...future.stdout <- NULL [13:13:41.052] } [13:13:41.052] ...future.result$conditions <- ...future.conditions [13:13:41.052] ...future.result$finished <- base::Sys.time() [13:13:41.052] ...future.result [13:13:41.052] } [13:13:41.055] assign_globals() ... [13:13:41.055] List of 5 [13:13:41.055] $ ...future.FUN :function (mode = "logical", length = 0L) [13:13:41.055] $ future.call.arguments :List of 1 [13:13:41.055] ..$ length: int 2 [13:13:41.055] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:41.055] $ ...future.elements_ii :List of 1 [13:13:41.055] ..$ c: chr "list" [13:13:41.055] $ ...future.seeds_ii : NULL [13:13:41.055] $ ...future.globals.maxSize: NULL [13:13:41.055] - attr(*, "where")=List of 5 [13:13:41.055] ..$ ...future.FUN : [13:13:41.055] ..$ future.call.arguments : [13:13:41.055] ..$ ...future.elements_ii : [13:13:41.055] ..$ ...future.seeds_ii : [13:13:41.055] ..$ ...future.globals.maxSize: [13:13:41.055] - attr(*, "resolved")= logi FALSE [13:13:41.055] - attr(*, "total_size")= num 2240 [13:13:41.055] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:41.055] - attr(*, "already-done")= logi TRUE [13:13:41.059] - copied '...future.FUN' to environment [13:13:41.060] - copied 'future.call.arguments' to environment [13:13:41.060] - copied '...future.elements_ii' to environment [13:13:41.060] - copied '...future.seeds_ii' to environment [13:13:41.060] - copied '...future.globals.maxSize' to environment [13:13:41.060] assign_globals() ... done [13:13:41.060] plan(): Setting new future strategy stack: [13:13:41.060] List of future strategies: [13:13:41.060] 1. sequential: [13:13:41.060] - args: function (..., envir = parent.frame(), workers = "") [13:13:41.060] - tweaked: FALSE [13:13:41.060] - call: NULL [13:13:41.061] plan(): nbrOfWorkers() = 1 [13:13:41.062] plan(): Setting new future strategy stack: [13:13:41.062] List of future strategies: [13:13:41.062] 1. multisession: [13:13:41.062] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [13:13:41.062] - tweaked: FALSE [13:13:41.062] - call: plan(strategy) [13:13:41.063] plan(): nbrOfWorkers() = 1 [13:13:41.064] SequentialFuture started (and completed) [13:13:41.064] - Launch lazy future ... done [13:13:41.064] run() for 'SequentialFuture' ... done [13:13:41.064] Created future: [13:13:41.064] SequentialFuture: [13:13:41.064] Label: 'future_lapply-4' [13:13:41.064] Expression: [13:13:41.064] { [13:13:41.064] do.call(function(...) { [13:13:41.064] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:41.064] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:41.064] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:41.064] on.exit(options(oopts), add = TRUE) [13:13:41.064] } [13:13:41.064] { [13:13:41.064] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:41.064] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:41.064] ...future.FUN(...future.X_jj, ...) [13:13:41.064] }) [13:13:41.064] } [13:13:41.064] }, args = future.call.arguments) [13:13:41.064] } [13:13:41.064] Lazy evaluation: FALSE [13:13:41.064] Asynchronous evaluation: FALSE [13:13:41.064] Local evaluation: TRUE [13:13:41.064] Environment: R_GlobalEnv [13:13:41.064] Capture standard output: TRUE [13:13:41.064] Capture condition classes: 'condition' (excluding 'nothing') [13:13:41.064] 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) [13:13:41.064] Packages: [13:13:41.064] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:41.064] Resolved: TRUE [13:13:41.064] Value: 0 bytes of class 'list' [13:13:41.064] Early signaling: FALSE [13:13:41.064] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:41.064] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:41.065] Chunk #4 of 4 ... DONE [13:13:41.065] Launching 4 futures (chunks) ... DONE [13:13:41.065] Resolving 4 futures (chunks) ... [13:13:41.065] resolve() on list ... [13:13:41.066] recursive: 0 [13:13:41.066] length: 4 [13:13:41.066] [13:13:41.066] resolved() for 'SequentialFuture' ... [13:13:41.066] - state: 'finished' [13:13:41.066] - run: TRUE [13:13:41.066] - result: 'FutureResult' [13:13:41.066] resolved() for 'SequentialFuture' ... done [13:13:41.067] Future #1 [13:13:41.067] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:41.067] - nx: 4 [13:13:41.067] - relay: TRUE [13:13:41.067] - stdout: TRUE [13:13:41.067] - signal: TRUE [13:13:41.067] - resignal: FALSE [13:13:41.067] - force: TRUE [13:13:41.068] - relayed: [n=4] FALSE, FALSE, FALSE, FALSE [13:13:41.068] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [13:13:41.068] - until=1 [13:13:41.068] - relaying element #1 [13:13:41.068] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [13:13:41.068] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [13:13:41.068] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:41.068] length: 3 (resolved future 1) [13:13:41.069] resolved() for 'SequentialFuture' ... [13:13:41.069] - state: 'finished' [13:13:41.069] - run: TRUE [13:13:41.069] - result: 'FutureResult' [13:13:41.069] resolved() for 'SequentialFuture' ... done [13:13:41.069] Future #2 [13:13:41.070] signalConditionsASAP(SequentialFuture, pos=2) ... [13:13:41.070] - nx: 4 [13:13:41.070] - relay: TRUE [13:13:41.070] - stdout: TRUE [13:13:41.070] - signal: TRUE [13:13:41.070] - resignal: FALSE [13:13:41.070] - force: TRUE [13:13:41.071] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [13:13:41.071] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [13:13:41.071] - until=2 [13:13:41.071] - relaying element #2 [13:13:41.071] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [13:13:41.071] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [13:13:41.072] signalConditionsASAP(SequentialFuture, pos=2) ... done [13:13:41.072] length: 2 (resolved future 2) [13:13:41.072] resolved() for 'SequentialFuture' ... [13:13:41.072] - state: 'finished' [13:13:41.072] - run: TRUE [13:13:41.073] - result: 'FutureResult' [13:13:41.073] resolved() for 'SequentialFuture' ... done [13:13:41.073] Future #3 [13:13:41.073] signalConditionsASAP(SequentialFuture, pos=3) ... [13:13:41.073] - nx: 4 [13:13:41.073] - relay: TRUE [13:13:41.074] - stdout: TRUE [13:13:41.074] - signal: TRUE [13:13:41.074] - resignal: FALSE [13:13:41.074] - force: TRUE [13:13:41.074] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [13:13:41.074] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [13:13:41.075] - until=3 [13:13:41.075] - relaying element #3 [13:13:41.075] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [13:13:41.075] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [13:13:41.075] signalConditionsASAP(SequentialFuture, pos=3) ... done [13:13:41.076] length: 1 (resolved future 3) [13:13:41.076] resolved() for 'SequentialFuture' ... [13:13:41.076] - state: 'finished' [13:13:41.076] - run: TRUE [13:13:41.076] - result: 'FutureResult' [13:13:41.076] resolved() for 'SequentialFuture' ... done [13:13:41.077] Future #4 [13:13:41.077] signalConditionsASAP(SequentialFuture, pos=4) ... [13:13:41.077] - nx: 4 [13:13:41.077] - relay: TRUE [13:13:41.077] - stdout: TRUE [13:13:41.078] - signal: TRUE [13:13:41.078] - resignal: FALSE [13:13:41.078] - force: TRUE [13:13:41.078] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [13:13:41.078] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [13:13:41.078] - until=4 [13:13:41.078] - relaying element #4 [13:13:41.079] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [13:13:41.079] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [13:13:41.079] signalConditionsASAP(SequentialFuture, pos=4) ... done [13:13:41.079] length: 0 (resolved future 4) [13:13:41.079] Relaying remaining futures [13:13:41.080] signalConditionsASAP(NULL, pos=0) ... [13:13:41.080] - nx: 4 [13:13:41.080] - relay: TRUE [13:13:41.080] - stdout: TRUE [13:13:41.080] - signal: TRUE [13:13:41.080] - resignal: FALSE [13:13:41.080] - force: TRUE [13:13:41.081] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [13:13:41.081] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE - flush all [13:13:41.081] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [13:13:41.081] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [13:13:41.081] signalConditionsASAP(NULL, pos=0) ... done [13:13:41.081] resolve() on list ... DONE [13:13:41.082] - Number of value chunks collected: 4 [13:13:41.082] Resolving 4 futures (chunks) ... DONE [13:13:41.082] Reducing values from 4 chunks ... [13:13:41.082] - Number of values collected after concatenation: 4 [13:13:41.082] - Number of values expected: 4 [13:13:41.083] Reducing values from 4 chunks ... DONE [13:13:41.083] 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, ...) ... [13:13:41.086] future_lapply() ... [13:13:41.096] Number of chunks: 1 [13:13:41.096] getGlobalsAndPackagesXApply() ... [13:13:41.097] - future.globals: TRUE [13:13:41.097] getGlobalsAndPackages() ... [13:13:41.097] Searching for globals... [13:13:41.107] - globals found: [22] 'FUN', 'if', 'missing', 'is.finite', '{', 'is.null', '<-', 'paste', 'length', '==', 'return', '>', '+', '[', 'seq_len', 'rev', 'c', '&&', '!', ':', '(', '-' [13:13:41.107] Searching for globals ... DONE [13:13:41.107] Resolving globals: FALSE [13:13:41.108] The total size of the 1 globals is 69.62 KiB (71288 bytes) [13:13:41.109] 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') [13:13:41.109] - globals: [1] 'FUN' [13:13:41.109] - packages: [1] 'future' [13:13:41.109] getGlobalsAndPackages() ... DONE [13:13:41.109] - globals found/used: [n=1] 'FUN' [13:13:41.110] - needed namespaces: [n=1] 'future' [13:13:41.110] Finding globals ... DONE [13:13:41.110] - use_args: TRUE [13:13:41.110] - Getting '...' globals ... [13:13:41.111] resolve() on list ... [13:13:41.111] recursive: 0 [13:13:41.111] length: 1 [13:13:41.111] elements: '...' [13:13:41.111] length: 0 (resolved future 1) [13:13:41.111] resolve() on list ... DONE [13:13:41.112] - '...' content: [n=2] 'collapse', 'maxHead' [13:13:41.112] List of 1 [13:13:41.112] $ ...:List of 2 [13:13:41.112] ..$ collapse: chr "; " [13:13:41.112] ..$ maxHead : int 3 [13:13:41.112] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:41.112] - attr(*, "where")=List of 1 [13:13:41.112] ..$ ...: [13:13:41.112] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:41.112] - attr(*, "resolved")= logi TRUE [13:13:41.112] - attr(*, "total_size")= num NA [13:13:41.116] - Getting '...' globals ... DONE [13:13:41.116] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:41.116] List of 2 [13:13:41.116] $ ...future.FUN:function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [13:13:41.116] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [13:13:41.116] $ ... :List of 2 [13:13:41.116] ..$ collapse: chr "; " [13:13:41.116] ..$ maxHead : int 3 [13:13:41.116] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:41.116] - attr(*, "where")=List of 2 [13:13:41.116] ..$ ...future.FUN: [13:13:41.116] ..$ ... : [13:13:41.116] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:41.116] - attr(*, "resolved")= logi FALSE [13:13:41.116] - attr(*, "total_size")= num 71456 [13:13:41.120] Packages to be attached in all futures: [n=1] 'future' [13:13:41.120] getGlobalsAndPackagesXApply() ... DONE [13:13:41.121] Number of futures (= number of chunks): 1 [13:13:41.121] Launching 1 futures (chunks) ... [13:13:41.121] Chunk #1 of 1 ... [13:13:41.121] - Finding globals in 'X' for chunk #1 ... [13:13:41.121] getGlobalsAndPackages() ... [13:13:41.121] Searching for globals... [13:13:41.122] [13:13:41.122] Searching for globals ... DONE [13:13:41.122] - globals: [0] [13:13:41.122] getGlobalsAndPackages() ... DONE [13:13:41.122] + additional globals found: [n=0] [13:13:41.123] + additional namespaces needed: [n=0] [13:13:41.123] - Finding globals in 'X' for chunk #1 ... DONE [13:13:41.123] - seeds: [13:13:41.123] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:41.123] getGlobalsAndPackages() ... [13:13:41.123] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:41.124] Resolving globals: FALSE [13:13:41.124] Tweak future expression to call with '...' arguments ... [13:13:41.124] { [13:13:41.124] do.call(function(...) { [13:13:41.124] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:41.124] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:41.124] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:41.124] on.exit(options(oopts), add = TRUE) [13:13:41.124] } [13:13:41.124] { [13:13:41.124] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:41.124] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:41.124] ...future.FUN(...future.X_jj, ...) [13:13:41.124] }) [13:13:41.124] } [13:13:41.124] }, args = future.call.arguments) [13:13:41.124] } [13:13:41.124] Tweak future expression to call with '...' arguments ... DONE [13:13:41.125] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:41.125] - packages: [1] 'future' [13:13:41.125] getGlobalsAndPackages() ... DONE [13:13:41.126] run() for 'Future' ... [13:13:41.126] - state: 'created' [13:13:41.126] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:41.128] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:41.129] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:41.129] - Field: 'label' [13:13:41.129] - Field: 'local' [13:13:41.129] - Field: 'owner' [13:13:41.129] - Field: 'envir' [13:13:41.129] - Field: 'packages' [13:13:41.130] - Field: 'gc' [13:13:41.130] - Field: 'conditions' [13:13:41.130] - Field: 'expr' [13:13:41.130] - Field: 'uuid' [13:13:41.130] - Field: 'seed' [13:13:41.130] - Field: 'version' [13:13:41.131] - Field: 'result' [13:13:41.131] - Field: 'asynchronous' [13:13:41.131] - Field: 'calls' [13:13:41.131] - Field: 'globals' [13:13:41.131] - Field: 'stdout' [13:13:41.132] - Field: 'earlySignal' [13:13:41.132] - Field: 'lazy' [13:13:41.134] - Field: 'state' [13:13:41.134] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:41.134] - Launch lazy future ... [13:13:41.134] Packages needed by the future expression (n = 1): 'future' [13:13:41.135] Packages needed by future strategies (n = 0): [13:13:41.135] { [13:13:41.135] { [13:13:41.135] { [13:13:41.135] ...future.startTime <- base::Sys.time() [13:13:41.135] { [13:13:41.135] { [13:13:41.135] { [13:13:41.135] { [13:13:41.135] base::local({ [13:13:41.135] has_future <- base::requireNamespace("future", [13:13:41.135] quietly = TRUE) [13:13:41.135] if (has_future) { [13:13:41.135] ns <- base::getNamespace("future") [13:13:41.135] version <- ns[[".package"]][["version"]] [13:13:41.135] if (is.null(version)) [13:13:41.135] version <- utils::packageVersion("future") [13:13:41.135] } [13:13:41.135] else { [13:13:41.135] version <- NULL [13:13:41.135] } [13:13:41.135] if (!has_future || version < "1.8.0") { [13:13:41.135] info <- base::c(r_version = base::gsub("R version ", [13:13:41.135] "", base::R.version$version.string), [13:13:41.135] platform = base::sprintf("%s (%s-bit)", [13:13:41.135] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:41.135] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:41.135] "release", "version")], collapse = " "), [13:13:41.135] hostname = base::Sys.info()[["nodename"]]) [13:13:41.135] info <- base::sprintf("%s: %s", base::names(info), [13:13:41.135] info) [13:13:41.135] info <- base::paste(info, collapse = "; ") [13:13:41.135] if (!has_future) { [13:13:41.135] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:41.135] info) [13:13:41.135] } [13:13:41.135] else { [13:13:41.135] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:41.135] info, version) [13:13:41.135] } [13:13:41.135] base::stop(msg) [13:13:41.135] } [13:13:41.135] }) [13:13:41.135] } [13:13:41.135] base::local({ [13:13:41.135] for (pkg in "future") { [13:13:41.135] base::loadNamespace(pkg) [13:13:41.135] base::library(pkg, character.only = TRUE) [13:13:41.135] } [13:13:41.135] }) [13:13:41.135] } [13:13:41.135] options(future.plan = NULL) [13:13:41.135] Sys.unsetenv("R_FUTURE_PLAN") [13:13:41.135] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:41.135] } [13:13:41.135] ...future.workdir <- getwd() [13:13:41.135] } [13:13:41.135] ...future.oldOptions <- base::as.list(base::.Options) [13:13:41.135] ...future.oldEnvVars <- base::Sys.getenv() [13:13:41.135] } [13:13:41.135] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:41.135] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:41.135] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:41.135] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:41.135] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:41.135] future.stdout.windows.reencode = NULL, width = 80L) [13:13:41.135] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:41.135] base::names(...future.oldOptions)) [13:13:41.135] } [13:13:41.135] if (FALSE) { [13:13:41.135] } [13:13:41.135] else { [13:13:41.135] if (TRUE) { [13:13:41.135] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:41.135] open = "w") [13:13:41.135] } [13:13:41.135] else { [13:13:41.135] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:41.135] windows = "NUL", "/dev/null"), open = "w") [13:13:41.135] } [13:13:41.135] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:41.135] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:41.135] base::sink(type = "output", split = FALSE) [13:13:41.135] base::close(...future.stdout) [13:13:41.135] }, add = TRUE) [13:13:41.135] } [13:13:41.135] ...future.frame <- base::sys.nframe() [13:13:41.135] ...future.conditions <- base::list() [13:13:41.135] ...future.rng <- base::globalenv()$.Random.seed [13:13:41.135] if (FALSE) { [13:13:41.135] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:41.135] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:41.135] } [13:13:41.135] ...future.result <- base::tryCatch({ [13:13:41.135] base::withCallingHandlers({ [13:13:41.135] ...future.value <- base::withVisible(base::local({ [13:13:41.135] do.call(function(...) { [13:13:41.135] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:41.135] if (!identical(...future.globals.maxSize.org, [13:13:41.135] ...future.globals.maxSize)) { [13:13:41.135] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:41.135] on.exit(options(oopts), add = TRUE) [13:13:41.135] } [13:13:41.135] { [13:13:41.135] lapply(seq_along(...future.elements_ii), [13:13:41.135] FUN = function(jj) { [13:13:41.135] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:41.135] ...future.FUN(...future.X_jj, ...) [13:13:41.135] }) [13:13:41.135] } [13:13:41.135] }, args = future.call.arguments) [13:13:41.135] })) [13:13:41.135] future::FutureResult(value = ...future.value$value, [13:13:41.135] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:41.135] ...future.rng), globalenv = if (FALSE) [13:13:41.135] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:41.135] ...future.globalenv.names)) [13:13:41.135] else NULL, started = ...future.startTime, version = "1.8") [13:13:41.135] }, condition = base::local({ [13:13:41.135] c <- base::c [13:13:41.135] inherits <- base::inherits [13:13:41.135] invokeRestart <- base::invokeRestart [13:13:41.135] length <- base::length [13:13:41.135] list <- base::list [13:13:41.135] seq.int <- base::seq.int [13:13:41.135] signalCondition <- base::signalCondition [13:13:41.135] sys.calls <- base::sys.calls [13:13:41.135] `[[` <- base::`[[` [13:13:41.135] `+` <- base::`+` [13:13:41.135] `<<-` <- base::`<<-` [13:13:41.135] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:41.135] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:41.135] 3L)] [13:13:41.135] } [13:13:41.135] function(cond) { [13:13:41.135] is_error <- inherits(cond, "error") [13:13:41.135] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:41.135] NULL) [13:13:41.135] if (is_error) { [13:13:41.135] sessionInformation <- function() { [13:13:41.135] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:41.135] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:41.135] search = base::search(), system = base::Sys.info()) [13:13:41.135] } [13:13:41.135] ...future.conditions[[length(...future.conditions) + [13:13:41.135] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:41.135] cond$call), session = sessionInformation(), [13:13:41.135] timestamp = base::Sys.time(), signaled = 0L) [13:13:41.135] signalCondition(cond) [13:13:41.135] } [13:13:41.135] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:41.135] "immediateCondition"))) { [13:13:41.135] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:41.135] ...future.conditions[[length(...future.conditions) + [13:13:41.135] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:41.135] if (TRUE && !signal) { [13:13:41.135] muffleCondition <- function (cond, pattern = "^muffle") [13:13:41.135] { [13:13:41.135] inherits <- base::inherits [13:13:41.135] invokeRestart <- base::invokeRestart [13:13:41.135] is.null <- base::is.null [13:13:41.135] muffled <- FALSE [13:13:41.135] if (inherits(cond, "message")) { [13:13:41.135] muffled <- grepl(pattern, "muffleMessage") [13:13:41.135] if (muffled) [13:13:41.135] invokeRestart("muffleMessage") [13:13:41.135] } [13:13:41.135] else if (inherits(cond, "warning")) { [13:13:41.135] muffled <- grepl(pattern, "muffleWarning") [13:13:41.135] if (muffled) [13:13:41.135] invokeRestart("muffleWarning") [13:13:41.135] } [13:13:41.135] else if (inherits(cond, "condition")) { [13:13:41.135] if (!is.null(pattern)) { [13:13:41.135] computeRestarts <- base::computeRestarts [13:13:41.135] grepl <- base::grepl [13:13:41.135] restarts <- computeRestarts(cond) [13:13:41.135] for (restart in restarts) { [13:13:41.135] name <- restart$name [13:13:41.135] if (is.null(name)) [13:13:41.135] next [13:13:41.135] if (!grepl(pattern, name)) [13:13:41.135] next [13:13:41.135] invokeRestart(restart) [13:13:41.135] muffled <- TRUE [13:13:41.135] break [13:13:41.135] } [13:13:41.135] } [13:13:41.135] } [13:13:41.135] invisible(muffled) [13:13:41.135] } [13:13:41.135] muffleCondition(cond, pattern = "^muffle") [13:13:41.135] } [13:13:41.135] } [13:13:41.135] else { [13:13:41.135] if (TRUE) { [13:13:41.135] muffleCondition <- function (cond, pattern = "^muffle") [13:13:41.135] { [13:13:41.135] inherits <- base::inherits [13:13:41.135] invokeRestart <- base::invokeRestart [13:13:41.135] is.null <- base::is.null [13:13:41.135] muffled <- FALSE [13:13:41.135] if (inherits(cond, "message")) { [13:13:41.135] muffled <- grepl(pattern, "muffleMessage") [13:13:41.135] if (muffled) [13:13:41.135] invokeRestart("muffleMessage") [13:13:41.135] } [13:13:41.135] else if (inherits(cond, "warning")) { [13:13:41.135] muffled <- grepl(pattern, "muffleWarning") [13:13:41.135] if (muffled) [13:13:41.135] invokeRestart("muffleWarning") [13:13:41.135] } [13:13:41.135] else if (inherits(cond, "condition")) { [13:13:41.135] if (!is.null(pattern)) { [13:13:41.135] computeRestarts <- base::computeRestarts [13:13:41.135] grepl <- base::grepl [13:13:41.135] restarts <- computeRestarts(cond) [13:13:41.135] for (restart in restarts) { [13:13:41.135] name <- restart$name [13:13:41.135] if (is.null(name)) [13:13:41.135] next [13:13:41.135] if (!grepl(pattern, name)) [13:13:41.135] next [13:13:41.135] invokeRestart(restart) [13:13:41.135] muffled <- TRUE [13:13:41.135] break [13:13:41.135] } [13:13:41.135] } [13:13:41.135] } [13:13:41.135] invisible(muffled) [13:13:41.135] } [13:13:41.135] muffleCondition(cond, pattern = "^muffle") [13:13:41.135] } [13:13:41.135] } [13:13:41.135] } [13:13:41.135] })) [13:13:41.135] }, error = function(ex) { [13:13:41.135] base::structure(base::list(value = NULL, visible = NULL, [13:13:41.135] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:41.135] ...future.rng), started = ...future.startTime, [13:13:41.135] finished = Sys.time(), session_uuid = NA_character_, [13:13:41.135] version = "1.8"), class = "FutureResult") [13:13:41.135] }, finally = { [13:13:41.135] if (!identical(...future.workdir, getwd())) [13:13:41.135] setwd(...future.workdir) [13:13:41.135] { [13:13:41.135] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:41.135] ...future.oldOptions$nwarnings <- NULL [13:13:41.135] } [13:13:41.135] base::options(...future.oldOptions) [13:13:41.135] if (.Platform$OS.type == "windows") { [13:13:41.135] old_names <- names(...future.oldEnvVars) [13:13:41.135] envs <- base::Sys.getenv() [13:13:41.135] names <- names(envs) [13:13:41.135] common <- intersect(names, old_names) [13:13:41.135] added <- setdiff(names, old_names) [13:13:41.135] removed <- setdiff(old_names, names) [13:13:41.135] changed <- common[...future.oldEnvVars[common] != [13:13:41.135] envs[common]] [13:13:41.135] NAMES <- toupper(changed) [13:13:41.135] args <- list() [13:13:41.135] for (kk in seq_along(NAMES)) { [13:13:41.135] name <- changed[[kk]] [13:13:41.135] NAME <- NAMES[[kk]] [13:13:41.135] if (name != NAME && is.element(NAME, old_names)) [13:13:41.135] next [13:13:41.135] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:41.135] } [13:13:41.135] NAMES <- toupper(added) [13:13:41.135] for (kk in seq_along(NAMES)) { [13:13:41.135] name <- added[[kk]] [13:13:41.135] NAME <- NAMES[[kk]] [13:13:41.135] if (name != NAME && is.element(NAME, old_names)) [13:13:41.135] next [13:13:41.135] args[[name]] <- "" [13:13:41.135] } [13:13:41.135] NAMES <- toupper(removed) [13:13:41.135] for (kk in seq_along(NAMES)) { [13:13:41.135] name <- removed[[kk]] [13:13:41.135] NAME <- NAMES[[kk]] [13:13:41.135] if (name != NAME && is.element(NAME, old_names)) [13:13:41.135] next [13:13:41.135] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:41.135] } [13:13:41.135] if (length(args) > 0) [13:13:41.135] base::do.call(base::Sys.setenv, args = args) [13:13:41.135] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:41.135] } [13:13:41.135] else { [13:13:41.135] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:41.135] } [13:13:41.135] { [13:13:41.135] if (base::length(...future.futureOptionsAdded) > [13:13:41.135] 0L) { [13:13:41.135] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:41.135] base::names(opts) <- ...future.futureOptionsAdded [13:13:41.135] base::options(opts) [13:13:41.135] } [13:13:41.135] { [13:13:41.135] { [13:13:41.135] NULL [13:13:41.135] RNGkind("Mersenne-Twister") [13:13:41.135] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:41.135] inherits = FALSE) [13:13:41.135] } [13:13:41.135] options(future.plan = NULL) [13:13:41.135] if (is.na(NA_character_)) [13:13:41.135] Sys.unsetenv("R_FUTURE_PLAN") [13:13:41.135] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:41.135] future::plan(list(function (..., workers = availableCores(), [13:13:41.135] lazy = FALSE, rscript_libs = .libPaths(), [13:13:41.135] envir = parent.frame()) [13:13:41.135] { [13:13:41.135] if (is.function(workers)) [13:13:41.135] workers <- workers() [13:13:41.135] workers <- structure(as.integer(workers), [13:13:41.135] class = class(workers)) [13:13:41.135] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:41.135] workers >= 1) [13:13:41.135] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:41.135] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:41.135] } [13:13:41.135] future <- MultisessionFuture(..., workers = workers, [13:13:41.135] lazy = lazy, rscript_libs = rscript_libs, [13:13:41.135] envir = envir) [13:13:41.135] if (!future$lazy) [13:13:41.135] future <- run(future) [13:13:41.135] invisible(future) [13:13:41.135] }), .cleanup = FALSE, .init = FALSE) [13:13:41.135] } [13:13:41.135] } [13:13:41.135] } [13:13:41.135] }) [13:13:41.135] if (TRUE) { [13:13:41.135] base::sink(type = "output", split = FALSE) [13:13:41.135] if (TRUE) { [13:13:41.135] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:41.135] } [13:13:41.135] else { [13:13:41.135] ...future.result["stdout"] <- base::list(NULL) [13:13:41.135] } [13:13:41.135] base::close(...future.stdout) [13:13:41.135] ...future.stdout <- NULL [13:13:41.135] } [13:13:41.135] ...future.result$conditions <- ...future.conditions [13:13:41.135] ...future.result$finished <- base::Sys.time() [13:13:41.135] ...future.result [13:13:41.135] } [13:13:41.139] assign_globals() ... [13:13:41.139] List of 5 [13:13:41.139] $ ...future.FUN :function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [13:13:41.139] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [13:13:41.139] $ future.call.arguments :List of 2 [13:13:41.139] ..$ collapse: chr "; " [13:13:41.139] ..$ maxHead : int 3 [13:13:41.139] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:41.139] $ ...future.elements_ii :List of 1 [13:13:41.139] ..$ a: Named chr [1:101] "hello" "1" "2" "3" ... [13:13:41.139] .. ..- attr(*, "names")= chr [1:101] "" "b1" "b2" "b3" ... [13:13:41.139] $ ...future.seeds_ii : NULL [13:13:41.139] $ ...future.globals.maxSize: NULL [13:13:41.139] - attr(*, "where")=List of 5 [13:13:41.139] ..$ ...future.FUN : [13:13:41.139] ..$ future.call.arguments : [13:13:41.139] ..$ ...future.elements_ii : [13:13:41.139] ..$ ...future.seeds_ii : [13:13:41.139] ..$ ...future.globals.maxSize: [13:13:41.139] - attr(*, "resolved")= logi FALSE [13:13:41.139] - attr(*, "total_size")= num 71456 [13:13:41.139] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:41.139] - attr(*, "already-done")= logi TRUE [13:13:41.146] - copied '...future.FUN' to environment [13:13:41.146] - copied 'future.call.arguments' to environment [13:13:41.147] - copied '...future.elements_ii' to environment [13:13:41.147] - copied '...future.seeds_ii' to environment [13:13:41.147] - copied '...future.globals.maxSize' to environment [13:13:41.147] assign_globals() ... done [13:13:41.148] plan(): Setting new future strategy stack: [13:13:41.148] List of future strategies: [13:13:41.148] 1. sequential: [13:13:41.148] - args: function (..., envir = parent.frame(), workers = "") [13:13:41.148] - tweaked: FALSE [13:13:41.148] - call: NULL [13:13:41.148] plan(): nbrOfWorkers() = 1 [13:13:41.150] plan(): Setting new future strategy stack: [13:13:41.150] List of future strategies: [13:13:41.150] 1. multisession: [13:13:41.150] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [13:13:41.150] - tweaked: FALSE [13:13:41.150] - call: plan(strategy) [13:13:41.152] plan(): nbrOfWorkers() = 1 [13:13:41.152] SequentialFuture started (and completed) [13:13:41.153] - Launch lazy future ... done [13:13:41.153] run() for 'SequentialFuture' ... done [13:13:41.153] Created future: [13:13:41.153] SequentialFuture: [13:13:41.153] Label: 'future_lapply-1' [13:13:41.153] Expression: [13:13:41.153] { [13:13:41.153] do.call(function(...) { [13:13:41.153] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:41.153] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:41.153] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:41.153] on.exit(options(oopts), add = TRUE) [13:13:41.153] } [13:13:41.153] { [13:13:41.153] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:41.153] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:41.153] ...future.FUN(...future.X_jj, ...) [13:13:41.153] }) [13:13:41.153] } [13:13:41.153] }, args = future.call.arguments) [13:13:41.153] } [13:13:41.153] Lazy evaluation: FALSE [13:13:41.153] Asynchronous evaluation: FALSE [13:13:41.153] Local evaluation: TRUE [13:13:41.153] Environment: R_GlobalEnv [13:13:41.153] Capture standard output: TRUE [13:13:41.153] Capture condition classes: 'condition' (excluding 'nothing') [13:13:41.153] 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) [13:13:41.153] Packages: 1 packages ('future') [13:13:41.153] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:41.153] Resolved: TRUE [13:13:41.153] Value: 136 bytes of class 'list' [13:13:41.153] Early signaling: FALSE [13:13:41.153] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:41.153] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:41.155] Chunk #1 of 1 ... DONE [13:13:41.155] Launching 1 futures (chunks) ... DONE [13:13:41.155] Resolving 1 futures (chunks) ... [13:13:41.155] resolve() on list ... [13:13:41.155] recursive: 0 [13:13:41.155] length: 1 [13:13:41.156] [13:13:41.156] resolved() for 'SequentialFuture' ... [13:13:41.156] - state: 'finished' [13:13:41.156] - run: TRUE [13:13:41.156] - result: 'FutureResult' [13:13:41.156] resolved() for 'SequentialFuture' ... done [13:13:41.157] Future #1 [13:13:41.157] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:41.157] - nx: 1 [13:13:41.157] - relay: TRUE [13:13:41.157] - stdout: TRUE [13:13:41.157] - signal: TRUE [13:13:41.158] - resignal: FALSE [13:13:41.158] - force: TRUE [13:13:41.158] - relayed: [n=1] FALSE [13:13:41.158] - queued futures: [n=1] FALSE [13:13:41.158] - until=1 [13:13:41.158] - relaying element #1 [13:13:41.159] - relayed: [n=1] TRUE [13:13:41.159] - queued futures: [n=1] TRUE [13:13:41.159] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:41.159] length: 0 (resolved future 1) [13:13:41.159] Relaying remaining futures [13:13:41.160] signalConditionsASAP(NULL, pos=0) ... [13:13:41.160] - nx: 1 [13:13:41.160] - relay: TRUE [13:13:41.160] - stdout: TRUE [13:13:41.160] - signal: TRUE [13:13:41.160] - resignal: FALSE [13:13:41.160] - force: TRUE [13:13:41.161] - relayed: [n=1] TRUE [13:13:41.161] - queued futures: [n=1] TRUE - flush all [13:13:41.161] - relayed: [n=1] TRUE [13:13:41.161] - queued futures: [n=1] TRUE [13:13:41.161] signalConditionsASAP(NULL, pos=0) ... done [13:13:41.161] resolve() on list ... DONE [13:13:41.162] - Number of value chunks collected: 1 [13:13:41.162] Resolving 1 futures (chunks) ... DONE [13:13:41.162] Reducing values from 1 chunks ... [13:13:41.162] - Number of values collected after concatenation: 1 [13:13:41.162] - Number of values expected: 1 [13:13:41.162] Reducing values from 1 chunks ... DONE [13:13:41.163] future_lapply() ... DONE List of 1 $ y:List of 1 ..$ a: chr "hello; 1; 2; ...; 100" - future_lapply(x, FUN = listenv::listenv, ...) ... [13:13:41.164] future_lapply() ... [13:13:41.167] Number of chunks: 2 [13:13:41.167] getGlobalsAndPackagesXApply() ... [13:13:41.167] - future.globals: TRUE [13:13:41.167] getGlobalsAndPackages() ... [13:13:41.167] Searching for globals... [13:13:41.169] - globals found: [4] 'FUN', '{', 'get', 'parent.env' [13:13:41.169] Searching for globals ... DONE [13:13:41.169] Resolving globals: FALSE [13:13:41.170] The total size of the 1 globals is 4.85 KiB (4968 bytes) [13:13:41.170] 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') [13:13:41.170] - globals: [1] 'FUN' [13:13:41.171] - packages: [1] 'listenv' [13:13:41.171] getGlobalsAndPackages() ... DONE [13:13:41.171] - globals found/used: [n=1] 'FUN' [13:13:41.171] - needed namespaces: [n=1] 'listenv' [13:13:41.171] Finding globals ... DONE [13:13:41.171] - use_args: TRUE [13:13:41.172] - Getting '...' globals ... [13:13:41.172] resolve() on list ... [13:13:41.172] recursive: 0 [13:13:41.172] length: 1 [13:13:41.172] elements: '...' [13:13:41.173] length: 0 (resolved future 1) [13:13:41.173] resolve() on list ... DONE [13:13:41.173] - '...' content: [n=0] [13:13:41.173] List of 1 [13:13:41.173] $ ...: list() [13:13:41.173] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:41.173] - attr(*, "where")=List of 1 [13:13:41.173] ..$ ...: [13:13:41.173] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:41.173] - attr(*, "resolved")= logi TRUE [13:13:41.173] - attr(*, "total_size")= num NA [13:13:41.176] - Getting '...' globals ... DONE [13:13:41.176] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:41.177] List of 2 [13:13:41.177] $ ...future.FUN:function (x, ...) [13:13:41.177] $ ... : list() [13:13:41.177] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:41.177] - attr(*, "where")=List of 2 [13:13:41.177] ..$ ...future.FUN: [13:13:41.177] ..$ ... : [13:13:41.177] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:41.177] - attr(*, "resolved")= logi FALSE [13:13:41.177] - attr(*, "total_size")= num 4968 [13:13:41.180] Packages to be attached in all futures: [n=1] 'listenv' [13:13:41.180] getGlobalsAndPackagesXApply() ... DONE [13:13:41.181] Number of futures (= number of chunks): 2 [13:13:41.181] Launching 2 futures (chunks) ... [13:13:41.181] Chunk #1 of 2 ... [13:13:41.181] - Finding globals in 'X' for chunk #1 ... [13:13:41.181] getGlobalsAndPackages() ... [13:13:41.181] Searching for globals... [13:13:41.182] [13:13:41.182] Searching for globals ... DONE [13:13:41.182] - globals: [0] [13:13:41.182] getGlobalsAndPackages() ... DONE [13:13:41.183] + additional globals found: [n=0] [13:13:41.183] + additional namespaces needed: [n=0] [13:13:41.183] - Finding globals in 'X' for chunk #1 ... DONE [13:13:41.183] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:13:41.183] - seeds: [13:13:41.183] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:41.184] getGlobalsAndPackages() ... [13:13:41.184] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:41.184] Resolving globals: FALSE [13:13:41.184] Tweak future expression to call with '...' arguments ... [13:13:41.184] { [13:13:41.184] do.call(function(...) { [13:13:41.184] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:41.184] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:41.184] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:41.184] on.exit(options(oopts), add = TRUE) [13:13:41.184] } [13:13:41.184] { [13:13:41.184] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:41.184] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:41.184] ...future.FUN(...future.X_jj, ...) [13:13:41.184] }) [13:13:41.184] } [13:13:41.184] }, args = future.call.arguments) [13:13:41.184] } [13:13:41.185] Tweak future expression to call with '...' arguments ... DONE [13:13:41.185] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:41.185] - packages: [1] 'listenv' [13:13:41.186] getGlobalsAndPackages() ... DONE [13:13:41.186] run() for 'Future' ... [13:13:41.186] - state: 'created' [13:13:41.186] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:41.189] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:41.189] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:41.189] - Field: 'label' [13:13:41.189] - Field: 'local' [13:13:41.190] - Field: 'owner' [13:13:41.190] - Field: 'envir' [13:13:41.190] - Field: 'packages' [13:13:41.190] - Field: 'gc' [13:13:41.190] - Field: 'conditions' [13:13:41.190] - Field: 'expr' [13:13:41.191] - Field: 'uuid' [13:13:41.191] - Field: 'seed' [13:13:41.191] - Field: 'version' [13:13:41.191] - Field: 'result' [13:13:41.191] - Field: 'asynchronous' [13:13:41.191] - Field: 'calls' [13:13:41.192] - Field: 'globals' [13:13:41.192] - Field: 'stdout' [13:13:41.192] - Field: 'earlySignal' [13:13:41.192] - Field: 'lazy' [13:13:41.192] - Field: 'state' [13:13:41.192] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:41.193] - Launch lazy future ... [13:13:41.193] Packages needed by the future expression (n = 1): 'listenv' [13:13:41.193] Packages needed by future strategies (n = 0): [13:13:41.194] { [13:13:41.194] { [13:13:41.194] { [13:13:41.194] ...future.startTime <- base::Sys.time() [13:13:41.194] { [13:13:41.194] { [13:13:41.194] { [13:13:41.194] { [13:13:41.194] base::local({ [13:13:41.194] has_future <- base::requireNamespace("future", [13:13:41.194] quietly = TRUE) [13:13:41.194] if (has_future) { [13:13:41.194] ns <- base::getNamespace("future") [13:13:41.194] version <- ns[[".package"]][["version"]] [13:13:41.194] if (is.null(version)) [13:13:41.194] version <- utils::packageVersion("future") [13:13:41.194] } [13:13:41.194] else { [13:13:41.194] version <- NULL [13:13:41.194] } [13:13:41.194] if (!has_future || version < "1.8.0") { [13:13:41.194] info <- base::c(r_version = base::gsub("R version ", [13:13:41.194] "", base::R.version$version.string), [13:13:41.194] platform = base::sprintf("%s (%s-bit)", [13:13:41.194] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:41.194] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:41.194] "release", "version")], collapse = " "), [13:13:41.194] hostname = base::Sys.info()[["nodename"]]) [13:13:41.194] info <- base::sprintf("%s: %s", base::names(info), [13:13:41.194] info) [13:13:41.194] info <- base::paste(info, collapse = "; ") [13:13:41.194] if (!has_future) { [13:13:41.194] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:41.194] info) [13:13:41.194] } [13:13:41.194] else { [13:13:41.194] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:41.194] info, version) [13:13:41.194] } [13:13:41.194] base::stop(msg) [13:13:41.194] } [13:13:41.194] }) [13:13:41.194] } [13:13:41.194] base::local({ [13:13:41.194] for (pkg in "listenv") { [13:13:41.194] base::loadNamespace(pkg) [13:13:41.194] base::library(pkg, character.only = TRUE) [13:13:41.194] } [13:13:41.194] }) [13:13:41.194] } [13:13:41.194] options(future.plan = NULL) [13:13:41.194] Sys.unsetenv("R_FUTURE_PLAN") [13:13:41.194] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:41.194] } [13:13:41.194] ...future.workdir <- getwd() [13:13:41.194] } [13:13:41.194] ...future.oldOptions <- base::as.list(base::.Options) [13:13:41.194] ...future.oldEnvVars <- base::Sys.getenv() [13:13:41.194] } [13:13:41.194] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:41.194] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:13:41.194] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:41.194] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:41.194] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:41.194] future.stdout.windows.reencode = NULL, width = 80L) [13:13:41.194] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:41.194] base::names(...future.oldOptions)) [13:13:41.194] } [13:13:41.194] if (FALSE) { [13:13:41.194] } [13:13:41.194] else { [13:13:41.194] if (TRUE) { [13:13:41.194] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:41.194] open = "w") [13:13:41.194] } [13:13:41.194] else { [13:13:41.194] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:41.194] windows = "NUL", "/dev/null"), open = "w") [13:13:41.194] } [13:13:41.194] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:41.194] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:41.194] base::sink(type = "output", split = FALSE) [13:13:41.194] base::close(...future.stdout) [13:13:41.194] }, add = TRUE) [13:13:41.194] } [13:13:41.194] ...future.frame <- base::sys.nframe() [13:13:41.194] ...future.conditions <- base::list() [13:13:41.194] ...future.rng <- base::globalenv()$.Random.seed [13:13:41.194] if (FALSE) { [13:13:41.194] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:41.194] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:41.194] } [13:13:41.194] ...future.result <- base::tryCatch({ [13:13:41.194] base::withCallingHandlers({ [13:13:41.194] ...future.value <- base::withVisible(base::local({ [13:13:41.194] do.call(function(...) { [13:13:41.194] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:41.194] if (!identical(...future.globals.maxSize.org, [13:13:41.194] ...future.globals.maxSize)) { [13:13:41.194] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:41.194] on.exit(options(oopts), add = TRUE) [13:13:41.194] } [13:13:41.194] { [13:13:41.194] lapply(seq_along(...future.elements_ii), [13:13:41.194] FUN = function(jj) { [13:13:41.194] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:41.194] ...future.FUN(...future.X_jj, ...) [13:13:41.194] }) [13:13:41.194] } [13:13:41.194] }, args = future.call.arguments) [13:13:41.194] })) [13:13:41.194] future::FutureResult(value = ...future.value$value, [13:13:41.194] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:41.194] ...future.rng), globalenv = if (FALSE) [13:13:41.194] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:41.194] ...future.globalenv.names)) [13:13:41.194] else NULL, started = ...future.startTime, version = "1.8") [13:13:41.194] }, condition = base::local({ [13:13:41.194] c <- base::c [13:13:41.194] inherits <- base::inherits [13:13:41.194] invokeRestart <- base::invokeRestart [13:13:41.194] length <- base::length [13:13:41.194] list <- base::list [13:13:41.194] seq.int <- base::seq.int [13:13:41.194] signalCondition <- base::signalCondition [13:13:41.194] sys.calls <- base::sys.calls [13:13:41.194] `[[` <- base::`[[` [13:13:41.194] `+` <- base::`+` [13:13:41.194] `<<-` <- base::`<<-` [13:13:41.194] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:41.194] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:41.194] 3L)] [13:13:41.194] } [13:13:41.194] function(cond) { [13:13:41.194] is_error <- inherits(cond, "error") [13:13:41.194] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:41.194] NULL) [13:13:41.194] if (is_error) { [13:13:41.194] sessionInformation <- function() { [13:13:41.194] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:41.194] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:41.194] search = base::search(), system = base::Sys.info()) [13:13:41.194] } [13:13:41.194] ...future.conditions[[length(...future.conditions) + [13:13:41.194] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:41.194] cond$call), session = sessionInformation(), [13:13:41.194] timestamp = base::Sys.time(), signaled = 0L) [13:13:41.194] signalCondition(cond) [13:13:41.194] } [13:13:41.194] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:41.194] "immediateCondition"))) { [13:13:41.194] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:41.194] ...future.conditions[[length(...future.conditions) + [13:13:41.194] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:41.194] if (TRUE && !signal) { [13:13:41.194] muffleCondition <- function (cond, pattern = "^muffle") [13:13:41.194] { [13:13:41.194] inherits <- base::inherits [13:13:41.194] invokeRestart <- base::invokeRestart [13:13:41.194] is.null <- base::is.null [13:13:41.194] muffled <- FALSE [13:13:41.194] if (inherits(cond, "message")) { [13:13:41.194] muffled <- grepl(pattern, "muffleMessage") [13:13:41.194] if (muffled) [13:13:41.194] invokeRestart("muffleMessage") [13:13:41.194] } [13:13:41.194] else if (inherits(cond, "warning")) { [13:13:41.194] muffled <- grepl(pattern, "muffleWarning") [13:13:41.194] if (muffled) [13:13:41.194] invokeRestart("muffleWarning") [13:13:41.194] } [13:13:41.194] else if (inherits(cond, "condition")) { [13:13:41.194] if (!is.null(pattern)) { [13:13:41.194] computeRestarts <- base::computeRestarts [13:13:41.194] grepl <- base::grepl [13:13:41.194] restarts <- computeRestarts(cond) [13:13:41.194] for (restart in restarts) { [13:13:41.194] name <- restart$name [13:13:41.194] if (is.null(name)) [13:13:41.194] next [13:13:41.194] if (!grepl(pattern, name)) [13:13:41.194] next [13:13:41.194] invokeRestart(restart) [13:13:41.194] muffled <- TRUE [13:13:41.194] break [13:13:41.194] } [13:13:41.194] } [13:13:41.194] } [13:13:41.194] invisible(muffled) [13:13:41.194] } [13:13:41.194] muffleCondition(cond, pattern = "^muffle") [13:13:41.194] } [13:13:41.194] } [13:13:41.194] else { [13:13:41.194] if (TRUE) { [13:13:41.194] muffleCondition <- function (cond, pattern = "^muffle") [13:13:41.194] { [13:13:41.194] inherits <- base::inherits [13:13:41.194] invokeRestart <- base::invokeRestart [13:13:41.194] is.null <- base::is.null [13:13:41.194] muffled <- FALSE [13:13:41.194] if (inherits(cond, "message")) { [13:13:41.194] muffled <- grepl(pattern, "muffleMessage") [13:13:41.194] if (muffled) [13:13:41.194] invokeRestart("muffleMessage") [13:13:41.194] } [13:13:41.194] else if (inherits(cond, "warning")) { [13:13:41.194] muffled <- grepl(pattern, "muffleWarning") [13:13:41.194] if (muffled) [13:13:41.194] invokeRestart("muffleWarning") [13:13:41.194] } [13:13:41.194] else if (inherits(cond, "condition")) { [13:13:41.194] if (!is.null(pattern)) { [13:13:41.194] computeRestarts <- base::computeRestarts [13:13:41.194] grepl <- base::grepl [13:13:41.194] restarts <- computeRestarts(cond) [13:13:41.194] for (restart in restarts) { [13:13:41.194] name <- restart$name [13:13:41.194] if (is.null(name)) [13:13:41.194] next [13:13:41.194] if (!grepl(pattern, name)) [13:13:41.194] next [13:13:41.194] invokeRestart(restart) [13:13:41.194] muffled <- TRUE [13:13:41.194] break [13:13:41.194] } [13:13:41.194] } [13:13:41.194] } [13:13:41.194] invisible(muffled) [13:13:41.194] } [13:13:41.194] muffleCondition(cond, pattern = "^muffle") [13:13:41.194] } [13:13:41.194] } [13:13:41.194] } [13:13:41.194] })) [13:13:41.194] }, error = function(ex) { [13:13:41.194] base::structure(base::list(value = NULL, visible = NULL, [13:13:41.194] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:41.194] ...future.rng), started = ...future.startTime, [13:13:41.194] finished = Sys.time(), session_uuid = NA_character_, [13:13:41.194] version = "1.8"), class = "FutureResult") [13:13:41.194] }, finally = { [13:13:41.194] if (!identical(...future.workdir, getwd())) [13:13:41.194] setwd(...future.workdir) [13:13:41.194] { [13:13:41.194] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:41.194] ...future.oldOptions$nwarnings <- NULL [13:13:41.194] } [13:13:41.194] base::options(...future.oldOptions) [13:13:41.194] if (.Platform$OS.type == "windows") { [13:13:41.194] old_names <- names(...future.oldEnvVars) [13:13:41.194] envs <- base::Sys.getenv() [13:13:41.194] names <- names(envs) [13:13:41.194] common <- intersect(names, old_names) [13:13:41.194] added <- setdiff(names, old_names) [13:13:41.194] removed <- setdiff(old_names, names) [13:13:41.194] changed <- common[...future.oldEnvVars[common] != [13:13:41.194] envs[common]] [13:13:41.194] NAMES <- toupper(changed) [13:13:41.194] args <- list() [13:13:41.194] for (kk in seq_along(NAMES)) { [13:13:41.194] name <- changed[[kk]] [13:13:41.194] NAME <- NAMES[[kk]] [13:13:41.194] if (name != NAME && is.element(NAME, old_names)) [13:13:41.194] next [13:13:41.194] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:41.194] } [13:13:41.194] NAMES <- toupper(added) [13:13:41.194] for (kk in seq_along(NAMES)) { [13:13:41.194] name <- added[[kk]] [13:13:41.194] NAME <- NAMES[[kk]] [13:13:41.194] if (name != NAME && is.element(NAME, old_names)) [13:13:41.194] next [13:13:41.194] args[[name]] <- "" [13:13:41.194] } [13:13:41.194] NAMES <- toupper(removed) [13:13:41.194] for (kk in seq_along(NAMES)) { [13:13:41.194] name <- removed[[kk]] [13:13:41.194] NAME <- NAMES[[kk]] [13:13:41.194] if (name != NAME && is.element(NAME, old_names)) [13:13:41.194] next [13:13:41.194] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:41.194] } [13:13:41.194] if (length(args) > 0) [13:13:41.194] base::do.call(base::Sys.setenv, args = args) [13:13:41.194] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:41.194] } [13:13:41.194] else { [13:13:41.194] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:41.194] } [13:13:41.194] { [13:13:41.194] if (base::length(...future.futureOptionsAdded) > [13:13:41.194] 0L) { [13:13:41.194] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:41.194] base::names(opts) <- ...future.futureOptionsAdded [13:13:41.194] base::options(opts) [13:13:41.194] } [13:13:41.194] { [13:13:41.194] { [13:13:41.194] NULL [13:13:41.194] RNGkind("Mersenne-Twister") [13:13:41.194] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:41.194] inherits = FALSE) [13:13:41.194] } [13:13:41.194] options(future.plan = NULL) [13:13:41.194] if (is.na(NA_character_)) [13:13:41.194] Sys.unsetenv("R_FUTURE_PLAN") [13:13:41.194] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:41.194] future::plan(list(function (..., workers = availableCores(), [13:13:41.194] lazy = FALSE, rscript_libs = .libPaths(), [13:13:41.194] envir = parent.frame()) [13:13:41.194] { [13:13:41.194] if (is.function(workers)) [13:13:41.194] workers <- workers() [13:13:41.194] workers <- structure(as.integer(workers), [13:13:41.194] class = class(workers)) [13:13:41.194] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:41.194] workers >= 1) [13:13:41.194] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:41.194] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:41.194] } [13:13:41.194] future <- MultisessionFuture(..., workers = workers, [13:13:41.194] lazy = lazy, rscript_libs = rscript_libs, [13:13:41.194] envir = envir) [13:13:41.194] if (!future$lazy) [13:13:41.194] future <- run(future) [13:13:41.194] invisible(future) [13:13:41.194] }), .cleanup = FALSE, .init = FALSE) [13:13:41.194] } [13:13:41.194] } [13:13:41.194] } [13:13:41.194] }) [13:13:41.194] if (TRUE) { [13:13:41.194] base::sink(type = "output", split = FALSE) [13:13:41.194] if (TRUE) { [13:13:41.194] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:41.194] } [13:13:41.194] else { [13:13:41.194] ...future.result["stdout"] <- base::list(NULL) [13:13:41.194] } [13:13:41.194] base::close(...future.stdout) [13:13:41.194] ...future.stdout <- NULL [13:13:41.194] } [13:13:41.194] ...future.result$conditions <- ...future.conditions [13:13:41.194] ...future.result$finished <- base::Sys.time() [13:13:41.194] ...future.result [13:13:41.194] } [13:13:41.198] assign_globals() ... [13:13:41.198] List of 5 [13:13:41.198] $ ...future.FUN :function (x, ...) [13:13:41.198] $ future.call.arguments : list() [13:13:41.198] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:41.198] $ ...future.elements_ii :List of 1 [13:13:41.198] ..$ a:Classes 'listenv', 'environment' [13:13:41.198] $ ...future.seeds_ii : NULL [13:13:41.198] $ ...future.globals.maxSize: NULL [13:13:41.198] - attr(*, "where")=List of 5 [13:13:41.198] ..$ ...future.FUN : [13:13:41.198] ..$ future.call.arguments : [13:13:41.198] ..$ ...future.elements_ii : [13:13:41.198] ..$ ...future.seeds_ii : [13:13:41.198] ..$ ...future.globals.maxSize: [13:13:41.198] - attr(*, "resolved")= logi FALSE [13:13:41.198] - attr(*, "total_size")= num 4968 [13:13:41.198] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:41.198] - attr(*, "already-done")= logi TRUE [13:13:41.204] - copied '...future.FUN' to environment [13:13:41.204] - copied 'future.call.arguments' to environment [13:13:41.204] - copied '...future.elements_ii' to environment [13:13:41.204] - copied '...future.seeds_ii' to environment [13:13:41.204] - copied '...future.globals.maxSize' to environment [13:13:41.205] assign_globals() ... done [13:13:41.205] plan(): Setting new future strategy stack: [13:13:41.205] List of future strategies: [13:13:41.205] 1. sequential: [13:13:41.205] - args: function (..., envir = parent.frame(), workers = "") [13:13:41.205] - tweaked: FALSE [13:13:41.205] - call: NULL [13:13:41.206] plan(): nbrOfWorkers() = 1 [13:13:41.207] plan(): Setting new future strategy stack: [13:13:41.207] List of future strategies: [13:13:41.207] 1. multisession: [13:13:41.207] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [13:13:41.207] - tweaked: FALSE [13:13:41.207] - call: plan(strategy) [13:13:41.210] plan(): nbrOfWorkers() = 1 [13:13:41.210] SequentialFuture started (and completed) [13:13:41.210] - Launch lazy future ... done [13:13:41.210] run() for 'SequentialFuture' ... done [13:13:41.211] Created future: [13:13:41.211] SequentialFuture: [13:13:41.211] Label: 'future_lapply-1' [13:13:41.211] Expression: [13:13:41.211] { [13:13:41.211] do.call(function(...) { [13:13:41.211] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:41.211] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:41.211] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:41.211] on.exit(options(oopts), add = TRUE) [13:13:41.211] } [13:13:41.211] { [13:13:41.211] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:41.211] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:41.211] ...future.FUN(...future.X_jj, ...) [13:13:41.211] }) [13:13:41.211] } [13:13:41.211] }, args = future.call.arguments) [13:13:41.211] } [13:13:41.211] Lazy evaluation: FALSE [13:13:41.211] Asynchronous evaluation: FALSE [13:13:41.211] Local evaluation: TRUE [13:13:41.211] Environment: R_GlobalEnv [13:13:41.211] Capture standard output: TRUE [13:13:41.211] Capture condition classes: 'condition' (excluding 'nothing') [13:13:41.211] 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) [13:13:41.211] Packages: 1 packages ('listenv') [13:13:41.211] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:41.211] Resolved: TRUE [13:13:41.211] Value: 336 bytes of class 'list' [13:13:41.211] Early signaling: FALSE [13:13:41.211] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:41.211] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:41.212] Chunk #1 of 2 ... DONE [13:13:41.212] Chunk #2 of 2 ... [13:13:41.213] - Finding globals in 'X' for chunk #2 ... [13:13:41.213] getGlobalsAndPackages() ... [13:13:41.213] Searching for globals... [13:13:41.213] [13:13:41.214] Searching for globals ... DONE [13:13:41.214] - globals: [0] [13:13:41.214] getGlobalsAndPackages() ... DONE [13:13:41.214] + additional globals found: [n=0] [13:13:41.214] + additional namespaces needed: [n=0] [13:13:41.214] - Finding globals in 'X' for chunk #2 ... DONE [13:13:41.214] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:13:41.215] - seeds: [13:13:41.215] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:41.215] getGlobalsAndPackages() ... [13:13:41.215] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:41.215] Resolving globals: FALSE [13:13:41.216] Tweak future expression to call with '...' arguments ... [13:13:41.216] { [13:13:41.216] do.call(function(...) { [13:13:41.216] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:41.216] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:41.216] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:41.216] on.exit(options(oopts), add = TRUE) [13:13:41.216] } [13:13:41.216] { [13:13:41.216] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:41.216] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:41.216] ...future.FUN(...future.X_jj, ...) [13:13:41.216] }) [13:13:41.216] } [13:13:41.216] }, args = future.call.arguments) [13:13:41.216] } [13:13:41.216] Tweak future expression to call with '...' arguments ... DONE [13:13:41.217] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:41.217] - packages: [1] 'listenv' [13:13:41.217] getGlobalsAndPackages() ... DONE [13:13:41.217] run() for 'Future' ... [13:13:41.218] - state: 'created' [13:13:41.218] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:41.220] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:41.220] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:41.220] - Field: 'label' [13:13:41.221] - Field: 'local' [13:13:41.221] - Field: 'owner' [13:13:41.221] - Field: 'envir' [13:13:41.221] - Field: 'packages' [13:13:41.221] - Field: 'gc' [13:13:41.222] - Field: 'conditions' [13:13:41.222] - Field: 'expr' [13:13:41.222] - Field: 'uuid' [13:13:41.222] - Field: 'seed' [13:13:41.222] - Field: 'version' [13:13:41.222] - Field: 'result' [13:13:41.223] - Field: 'asynchronous' [13:13:41.223] - Field: 'calls' [13:13:41.223] - Field: 'globals' [13:13:41.223] - Field: 'stdout' [13:13:41.223] - Field: 'earlySignal' [13:13:41.223] - Field: 'lazy' [13:13:41.224] - Field: 'state' [13:13:41.224] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:41.224] - Launch lazy future ... [13:13:41.224] Packages needed by the future expression (n = 1): 'listenv' [13:13:41.224] Packages needed by future strategies (n = 0): [13:13:41.225] { [13:13:41.225] { [13:13:41.225] { [13:13:41.225] ...future.startTime <- base::Sys.time() [13:13:41.225] { [13:13:41.225] { [13:13:41.225] { [13:13:41.225] { [13:13:41.225] base::local({ [13:13:41.225] has_future <- base::requireNamespace("future", [13:13:41.225] quietly = TRUE) [13:13:41.225] if (has_future) { [13:13:41.225] ns <- base::getNamespace("future") [13:13:41.225] version <- ns[[".package"]][["version"]] [13:13:41.225] if (is.null(version)) [13:13:41.225] version <- utils::packageVersion("future") [13:13:41.225] } [13:13:41.225] else { [13:13:41.225] version <- NULL [13:13:41.225] } [13:13:41.225] if (!has_future || version < "1.8.0") { [13:13:41.225] info <- base::c(r_version = base::gsub("R version ", [13:13:41.225] "", base::R.version$version.string), [13:13:41.225] platform = base::sprintf("%s (%s-bit)", [13:13:41.225] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:41.225] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:41.225] "release", "version")], collapse = " "), [13:13:41.225] hostname = base::Sys.info()[["nodename"]]) [13:13:41.225] info <- base::sprintf("%s: %s", base::names(info), [13:13:41.225] info) [13:13:41.225] info <- base::paste(info, collapse = "; ") [13:13:41.225] if (!has_future) { [13:13:41.225] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:41.225] info) [13:13:41.225] } [13:13:41.225] else { [13:13:41.225] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:41.225] info, version) [13:13:41.225] } [13:13:41.225] base::stop(msg) [13:13:41.225] } [13:13:41.225] }) [13:13:41.225] } [13:13:41.225] base::local({ [13:13:41.225] for (pkg in "listenv") { [13:13:41.225] base::loadNamespace(pkg) [13:13:41.225] base::library(pkg, character.only = TRUE) [13:13:41.225] } [13:13:41.225] }) [13:13:41.225] } [13:13:41.225] options(future.plan = NULL) [13:13:41.225] Sys.unsetenv("R_FUTURE_PLAN") [13:13:41.225] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:41.225] } [13:13:41.225] ...future.workdir <- getwd() [13:13:41.225] } [13:13:41.225] ...future.oldOptions <- base::as.list(base::.Options) [13:13:41.225] ...future.oldEnvVars <- base::Sys.getenv() [13:13:41.225] } [13:13:41.225] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:41.225] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:13:41.225] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:41.225] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:41.225] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:41.225] future.stdout.windows.reencode = NULL, width = 80L) [13:13:41.225] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:41.225] base::names(...future.oldOptions)) [13:13:41.225] } [13:13:41.225] if (FALSE) { [13:13:41.225] } [13:13:41.225] else { [13:13:41.225] if (TRUE) { [13:13:41.225] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:41.225] open = "w") [13:13:41.225] } [13:13:41.225] else { [13:13:41.225] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:41.225] windows = "NUL", "/dev/null"), open = "w") [13:13:41.225] } [13:13:41.225] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:41.225] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:41.225] base::sink(type = "output", split = FALSE) [13:13:41.225] base::close(...future.stdout) [13:13:41.225] }, add = TRUE) [13:13:41.225] } [13:13:41.225] ...future.frame <- base::sys.nframe() [13:13:41.225] ...future.conditions <- base::list() [13:13:41.225] ...future.rng <- base::globalenv()$.Random.seed [13:13:41.225] if (FALSE) { [13:13:41.225] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:41.225] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:41.225] } [13:13:41.225] ...future.result <- base::tryCatch({ [13:13:41.225] base::withCallingHandlers({ [13:13:41.225] ...future.value <- base::withVisible(base::local({ [13:13:41.225] do.call(function(...) { [13:13:41.225] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:41.225] if (!identical(...future.globals.maxSize.org, [13:13:41.225] ...future.globals.maxSize)) { [13:13:41.225] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:41.225] on.exit(options(oopts), add = TRUE) [13:13:41.225] } [13:13:41.225] { [13:13:41.225] lapply(seq_along(...future.elements_ii), [13:13:41.225] FUN = function(jj) { [13:13:41.225] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:41.225] ...future.FUN(...future.X_jj, ...) [13:13:41.225] }) [13:13:41.225] } [13:13:41.225] }, args = future.call.arguments) [13:13:41.225] })) [13:13:41.225] future::FutureResult(value = ...future.value$value, [13:13:41.225] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:41.225] ...future.rng), globalenv = if (FALSE) [13:13:41.225] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:41.225] ...future.globalenv.names)) [13:13:41.225] else NULL, started = ...future.startTime, version = "1.8") [13:13:41.225] }, condition = base::local({ [13:13:41.225] c <- base::c [13:13:41.225] inherits <- base::inherits [13:13:41.225] invokeRestart <- base::invokeRestart [13:13:41.225] length <- base::length [13:13:41.225] list <- base::list [13:13:41.225] seq.int <- base::seq.int [13:13:41.225] signalCondition <- base::signalCondition [13:13:41.225] sys.calls <- base::sys.calls [13:13:41.225] `[[` <- base::`[[` [13:13:41.225] `+` <- base::`+` [13:13:41.225] `<<-` <- base::`<<-` [13:13:41.225] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:41.225] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:41.225] 3L)] [13:13:41.225] } [13:13:41.225] function(cond) { [13:13:41.225] is_error <- inherits(cond, "error") [13:13:41.225] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:41.225] NULL) [13:13:41.225] if (is_error) { [13:13:41.225] sessionInformation <- function() { [13:13:41.225] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:41.225] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:41.225] search = base::search(), system = base::Sys.info()) [13:13:41.225] } [13:13:41.225] ...future.conditions[[length(...future.conditions) + [13:13:41.225] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:41.225] cond$call), session = sessionInformation(), [13:13:41.225] timestamp = base::Sys.time(), signaled = 0L) [13:13:41.225] signalCondition(cond) [13:13:41.225] } [13:13:41.225] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:41.225] "immediateCondition"))) { [13:13:41.225] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:41.225] ...future.conditions[[length(...future.conditions) + [13:13:41.225] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:41.225] if (TRUE && !signal) { [13:13:41.225] muffleCondition <- function (cond, pattern = "^muffle") [13:13:41.225] { [13:13:41.225] inherits <- base::inherits [13:13:41.225] invokeRestart <- base::invokeRestart [13:13:41.225] is.null <- base::is.null [13:13:41.225] muffled <- FALSE [13:13:41.225] if (inherits(cond, "message")) { [13:13:41.225] muffled <- grepl(pattern, "muffleMessage") [13:13:41.225] if (muffled) [13:13:41.225] invokeRestart("muffleMessage") [13:13:41.225] } [13:13:41.225] else if (inherits(cond, "warning")) { [13:13:41.225] muffled <- grepl(pattern, "muffleWarning") [13:13:41.225] if (muffled) [13:13:41.225] invokeRestart("muffleWarning") [13:13:41.225] } [13:13:41.225] else if (inherits(cond, "condition")) { [13:13:41.225] if (!is.null(pattern)) { [13:13:41.225] computeRestarts <- base::computeRestarts [13:13:41.225] grepl <- base::grepl [13:13:41.225] restarts <- computeRestarts(cond) [13:13:41.225] for (restart in restarts) { [13:13:41.225] name <- restart$name [13:13:41.225] if (is.null(name)) [13:13:41.225] next [13:13:41.225] if (!grepl(pattern, name)) [13:13:41.225] next [13:13:41.225] invokeRestart(restart) [13:13:41.225] muffled <- TRUE [13:13:41.225] break [13:13:41.225] } [13:13:41.225] } [13:13:41.225] } [13:13:41.225] invisible(muffled) [13:13:41.225] } [13:13:41.225] muffleCondition(cond, pattern = "^muffle") [13:13:41.225] } [13:13:41.225] } [13:13:41.225] else { [13:13:41.225] if (TRUE) { [13:13:41.225] muffleCondition <- function (cond, pattern = "^muffle") [13:13:41.225] { [13:13:41.225] inherits <- base::inherits [13:13:41.225] invokeRestart <- base::invokeRestart [13:13:41.225] is.null <- base::is.null [13:13:41.225] muffled <- FALSE [13:13:41.225] if (inherits(cond, "message")) { [13:13:41.225] muffled <- grepl(pattern, "muffleMessage") [13:13:41.225] if (muffled) [13:13:41.225] invokeRestart("muffleMessage") [13:13:41.225] } [13:13:41.225] else if (inherits(cond, "warning")) { [13:13:41.225] muffled <- grepl(pattern, "muffleWarning") [13:13:41.225] if (muffled) [13:13:41.225] invokeRestart("muffleWarning") [13:13:41.225] } [13:13:41.225] else if (inherits(cond, "condition")) { [13:13:41.225] if (!is.null(pattern)) { [13:13:41.225] computeRestarts <- base::computeRestarts [13:13:41.225] grepl <- base::grepl [13:13:41.225] restarts <- computeRestarts(cond) [13:13:41.225] for (restart in restarts) { [13:13:41.225] name <- restart$name [13:13:41.225] if (is.null(name)) [13:13:41.225] next [13:13:41.225] if (!grepl(pattern, name)) [13:13:41.225] next [13:13:41.225] invokeRestart(restart) [13:13:41.225] muffled <- TRUE [13:13:41.225] break [13:13:41.225] } [13:13:41.225] } [13:13:41.225] } [13:13:41.225] invisible(muffled) [13:13:41.225] } [13:13:41.225] muffleCondition(cond, pattern = "^muffle") [13:13:41.225] } [13:13:41.225] } [13:13:41.225] } [13:13:41.225] })) [13:13:41.225] }, error = function(ex) { [13:13:41.225] base::structure(base::list(value = NULL, visible = NULL, [13:13:41.225] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:41.225] ...future.rng), started = ...future.startTime, [13:13:41.225] finished = Sys.time(), session_uuid = NA_character_, [13:13:41.225] version = "1.8"), class = "FutureResult") [13:13:41.225] }, finally = { [13:13:41.225] if (!identical(...future.workdir, getwd())) [13:13:41.225] setwd(...future.workdir) [13:13:41.225] { [13:13:41.225] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:41.225] ...future.oldOptions$nwarnings <- NULL [13:13:41.225] } [13:13:41.225] base::options(...future.oldOptions) [13:13:41.225] if (.Platform$OS.type == "windows") { [13:13:41.225] old_names <- names(...future.oldEnvVars) [13:13:41.225] envs <- base::Sys.getenv() [13:13:41.225] names <- names(envs) [13:13:41.225] common <- intersect(names, old_names) [13:13:41.225] added <- setdiff(names, old_names) [13:13:41.225] removed <- setdiff(old_names, names) [13:13:41.225] changed <- common[...future.oldEnvVars[common] != [13:13:41.225] envs[common]] [13:13:41.225] NAMES <- toupper(changed) [13:13:41.225] args <- list() [13:13:41.225] for (kk in seq_along(NAMES)) { [13:13:41.225] name <- changed[[kk]] [13:13:41.225] NAME <- NAMES[[kk]] [13:13:41.225] if (name != NAME && is.element(NAME, old_names)) [13:13:41.225] next [13:13:41.225] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:41.225] } [13:13:41.225] NAMES <- toupper(added) [13:13:41.225] for (kk in seq_along(NAMES)) { [13:13:41.225] name <- added[[kk]] [13:13:41.225] NAME <- NAMES[[kk]] [13:13:41.225] if (name != NAME && is.element(NAME, old_names)) [13:13:41.225] next [13:13:41.225] args[[name]] <- "" [13:13:41.225] } [13:13:41.225] NAMES <- toupper(removed) [13:13:41.225] for (kk in seq_along(NAMES)) { [13:13:41.225] name <- removed[[kk]] [13:13:41.225] NAME <- NAMES[[kk]] [13:13:41.225] if (name != NAME && is.element(NAME, old_names)) [13:13:41.225] next [13:13:41.225] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:41.225] } [13:13:41.225] if (length(args) > 0) [13:13:41.225] base::do.call(base::Sys.setenv, args = args) [13:13:41.225] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:41.225] } [13:13:41.225] else { [13:13:41.225] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:41.225] } [13:13:41.225] { [13:13:41.225] if (base::length(...future.futureOptionsAdded) > [13:13:41.225] 0L) { [13:13:41.225] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:41.225] base::names(opts) <- ...future.futureOptionsAdded [13:13:41.225] base::options(opts) [13:13:41.225] } [13:13:41.225] { [13:13:41.225] { [13:13:41.225] NULL [13:13:41.225] RNGkind("Mersenne-Twister") [13:13:41.225] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:41.225] inherits = FALSE) [13:13:41.225] } [13:13:41.225] options(future.plan = NULL) [13:13:41.225] if (is.na(NA_character_)) [13:13:41.225] Sys.unsetenv("R_FUTURE_PLAN") [13:13:41.225] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:41.225] future::plan(list(function (..., workers = availableCores(), [13:13:41.225] lazy = FALSE, rscript_libs = .libPaths(), [13:13:41.225] envir = parent.frame()) [13:13:41.225] { [13:13:41.225] if (is.function(workers)) [13:13:41.225] workers <- workers() [13:13:41.225] workers <- structure(as.integer(workers), [13:13:41.225] class = class(workers)) [13:13:41.225] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:41.225] workers >= 1) [13:13:41.225] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:41.225] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:41.225] } [13:13:41.225] future <- MultisessionFuture(..., workers = workers, [13:13:41.225] lazy = lazy, rscript_libs = rscript_libs, [13:13:41.225] envir = envir) [13:13:41.225] if (!future$lazy) [13:13:41.225] future <- run(future) [13:13:41.225] invisible(future) [13:13:41.225] }), .cleanup = FALSE, .init = FALSE) [13:13:41.225] } [13:13:41.225] } [13:13:41.225] } [13:13:41.225] }) [13:13:41.225] if (TRUE) { [13:13:41.225] base::sink(type = "output", split = FALSE) [13:13:41.225] if (TRUE) { [13:13:41.225] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:41.225] } [13:13:41.225] else { [13:13:41.225] ...future.result["stdout"] <- base::list(NULL) [13:13:41.225] } [13:13:41.225] base::close(...future.stdout) [13:13:41.225] ...future.stdout <- NULL [13:13:41.225] } [13:13:41.225] ...future.result$conditions <- ...future.conditions [13:13:41.225] ...future.result$finished <- base::Sys.time() [13:13:41.225] ...future.result [13:13:41.225] } [13:13:41.229] assign_globals() ... [13:13:41.230] List of 5 [13:13:41.230] $ ...future.FUN :function (x, ...) [13:13:41.230] $ future.call.arguments : list() [13:13:41.230] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:41.230] $ ...future.elements_ii :List of 1 [13:13:41.230] ..$ b:Classes 'listenv', 'environment' [13:13:41.230] $ ...future.seeds_ii : NULL [13:13:41.230] $ ...future.globals.maxSize: NULL [13:13:41.230] - attr(*, "where")=List of 5 [13:13:41.230] ..$ ...future.FUN : [13:13:41.230] ..$ future.call.arguments : [13:13:41.230] ..$ ...future.elements_ii : [13:13:41.230] ..$ ...future.seeds_ii : [13:13:41.230] ..$ ...future.globals.maxSize: [13:13:41.230] - attr(*, "resolved")= logi FALSE [13:13:41.230] - attr(*, "total_size")= num 4968 [13:13:41.230] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:41.230] - attr(*, "already-done")= logi TRUE [13:13:41.235] - copied '...future.FUN' to environment [13:13:41.235] - copied 'future.call.arguments' to environment [13:13:41.236] - copied '...future.elements_ii' to environment [13:13:41.236] - copied '...future.seeds_ii' to environment [13:13:41.236] - copied '...future.globals.maxSize' to environment [13:13:41.236] assign_globals() ... done [13:13:41.237] plan(): Setting new future strategy stack: [13:13:41.237] List of future strategies: [13:13:41.237] 1. sequential: [13:13:41.237] - args: function (..., envir = parent.frame(), workers = "") [13:13:41.237] - tweaked: FALSE [13:13:41.237] - call: NULL [13:13:41.237] plan(): nbrOfWorkers() = 1 [13:13:41.239] plan(): Setting new future strategy stack: [13:13:41.239] List of future strategies: [13:13:41.239] 1. multisession: [13:13:41.239] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [13:13:41.239] - tweaked: FALSE [13:13:41.239] - call: plan(strategy) [13:13:41.241] plan(): nbrOfWorkers() = 1 [13:13:41.241] SequentialFuture started (and completed) [13:13:41.242] - Launch lazy future ... done [13:13:41.242] run() for 'SequentialFuture' ... done [13:13:41.242] Created future: [13:13:41.242] SequentialFuture: [13:13:41.242] Label: 'future_lapply-2' [13:13:41.242] Expression: [13:13:41.242] { [13:13:41.242] do.call(function(...) { [13:13:41.242] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:41.242] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:41.242] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:41.242] on.exit(options(oopts), add = TRUE) [13:13:41.242] } [13:13:41.242] { [13:13:41.242] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:41.242] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:41.242] ...future.FUN(...future.X_jj, ...) [13:13:41.242] }) [13:13:41.242] } [13:13:41.242] }, args = future.call.arguments) [13:13:41.242] } [13:13:41.242] Lazy evaluation: FALSE [13:13:41.242] Asynchronous evaluation: FALSE [13:13:41.242] Local evaluation: TRUE [13:13:41.242] Environment: R_GlobalEnv [13:13:41.242] Capture standard output: TRUE [13:13:41.242] Capture condition classes: 'condition' (excluding 'nothing') [13:13:41.242] 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) [13:13:41.242] Packages: 1 packages ('listenv') [13:13:41.242] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:41.242] Resolved: TRUE [13:13:41.242] Value: 464 bytes of class 'list' [13:13:41.242] Early signaling: FALSE [13:13:41.242] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:41.242] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:41.244] Chunk #2 of 2 ... DONE [13:13:41.244] Launching 2 futures (chunks) ... DONE [13:13:41.244] Resolving 2 futures (chunks) ... [13:13:41.244] resolve() on list ... [13:13:41.244] recursive: 0 [13:13:41.245] length: 2 [13:13:41.245] [13:13:41.245] resolved() for 'SequentialFuture' ... [13:13:41.245] - state: 'finished' [13:13:41.245] - run: TRUE [13:13:41.246] - result: 'FutureResult' [13:13:41.246] resolved() for 'SequentialFuture' ... done [13:13:41.246] Future #1 [13:13:41.246] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:41.246] - nx: 2 [13:13:41.246] - relay: TRUE [13:13:41.247] - stdout: TRUE [13:13:41.247] - signal: TRUE [13:13:41.247] - resignal: FALSE [13:13:41.247] - force: TRUE [13:13:41.247] - relayed: [n=2] FALSE, FALSE [13:13:41.247] - queued futures: [n=2] FALSE, FALSE [13:13:41.248] - until=1 [13:13:41.248] - relaying element #1 [13:13:41.248] - relayed: [n=2] TRUE, FALSE [13:13:41.248] - queued futures: [n=2] TRUE, FALSE [13:13:41.248] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:41.248] length: 1 (resolved future 1) [13:13:41.249] resolved() for 'SequentialFuture' ... [13:13:41.249] - state: 'finished' [13:13:41.249] - run: TRUE [13:13:41.249] - result: 'FutureResult' [13:13:41.249] resolved() for 'SequentialFuture' ... done [13:13:41.250] Future #2 [13:13:41.250] signalConditionsASAP(SequentialFuture, pos=2) ... [13:13:41.250] - nx: 2 [13:13:41.250] - relay: TRUE [13:13:41.250] - stdout: TRUE [13:13:41.250] - signal: TRUE [13:13:41.251] - resignal: FALSE [13:13:41.251] - force: TRUE [13:13:41.251] - relayed: [n=2] TRUE, FALSE [13:13:41.251] - queued futures: [n=2] TRUE, FALSE [13:13:41.251] - until=2 [13:13:41.251] - relaying element #2 [13:13:41.252] - relayed: [n=2] TRUE, TRUE [13:13:41.252] - queued futures: [n=2] TRUE, TRUE [13:13:41.252] signalConditionsASAP(SequentialFuture, pos=2) ... done [13:13:41.252] length: 0 (resolved future 2) [13:13:41.252] Relaying remaining futures [13:13:41.252] signalConditionsASAP(NULL, pos=0) ... [13:13:41.253] - nx: 2 [13:13:41.253] - relay: TRUE [13:13:41.253] - stdout: TRUE [13:13:41.253] - signal: TRUE [13:13:41.253] - resignal: FALSE [13:13:41.253] - force: TRUE [13:13:41.253] - relayed: [n=2] TRUE, TRUE [13:13:41.255] - queued futures: [n=2] TRUE, TRUE - flush all [13:13:41.256] - relayed: [n=2] TRUE, TRUE [13:13:41.256] - queued futures: [n=2] TRUE, TRUE [13:13:41.256] signalConditionsASAP(NULL, pos=0) ... done [13:13:41.256] resolve() on list ... DONE [13:13:41.256] - Number of value chunks collected: 2 [13:13:41.257] Resolving 2 futures (chunks) ... DONE [13:13:41.257] Reducing values from 2 chunks ... [13:13:41.257] - Number of values collected after concatenation: 2 [13:13:41.257] - Number of values expected: 2 [13:13:41.257] Reducing values from 2 chunks ... DONE [13:13:41.257] 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, ...) ... [13:13:41.259] future_lapply() ... [13:13:41.262] Number of chunks: 1 [13:13:41.262] getGlobalsAndPackagesXApply() ... [13:13:41.262] - future.globals: TRUE [13:13:41.263] getGlobalsAndPackages() ... [13:13:41.263] Searching for globals... [13:13:41.264] - globals found: [2] 'FUN', '.Internal' [13:13:41.264] Searching for globals ... DONE [13:13:41.265] Resolving globals: FALSE [13:13:41.265] The total size of the 1 globals is 2.13 KiB (2184 bytes) [13:13:41.265] 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') [13:13:41.266] - globals: [1] 'FUN' [13:13:41.266] [13:13:41.266] getGlobalsAndPackages() ... DONE [13:13:41.266] - globals found/used: [n=1] 'FUN' [13:13:41.266] - needed namespaces: [n=0] [13:13:41.266] Finding globals ... DONE [13:13:41.267] - use_args: TRUE [13:13:41.267] - Getting '...' globals ... [13:13:41.267] resolve() on list ... [13:13:41.267] recursive: 0 [13:13:41.267] length: 1 [13:13:41.268] elements: '...' [13:13:41.268] length: 0 (resolved future 1) [13:13:41.268] resolve() on list ... DONE [13:13:41.268] - '...' content: [n=1] 'length' [13:13:41.268] List of 1 [13:13:41.268] $ ...:List of 1 [13:13:41.268] ..$ length: int 2 [13:13:41.268] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:41.268] - attr(*, "where")=List of 1 [13:13:41.268] ..$ ...: [13:13:41.268] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:41.268] - attr(*, "resolved")= logi TRUE [13:13:41.268] - attr(*, "total_size")= num NA [13:13:41.272] - Getting '...' globals ... DONE [13:13:41.272] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:41.272] List of 2 [13:13:41.272] $ ...future.FUN:function (mode = "logical", length = 0L) [13:13:41.272] $ ... :List of 1 [13:13:41.272] ..$ length: int 2 [13:13:41.272] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:41.272] - attr(*, "where")=List of 2 [13:13:41.272] ..$ ...future.FUN: [13:13:41.272] ..$ ... : [13:13:41.272] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:41.272] - attr(*, "resolved")= logi FALSE [13:13:41.272] - attr(*, "total_size")= num 2240 [13:13:41.276] Packages to be attached in all futures: [n=0] [13:13:41.276] getGlobalsAndPackagesXApply() ... DONE [13:13:41.277] Number of futures (= number of chunks): 1 [13:13:41.277] Launching 1 futures (chunks) ... [13:13:41.277] Chunk #1 of 1 ... [13:13:41.277] - Finding globals in 'X' for chunk #1 ... [13:13:41.277] getGlobalsAndPackages() ... [13:13:41.277] Searching for globals... [13:13:41.278] [13:13:41.278] Searching for globals ... DONE [13:13:41.278] - globals: [0] [13:13:41.278] getGlobalsAndPackages() ... DONE [13:13:41.278] + additional globals found: [n=0] [13:13:41.279] + additional namespaces needed: [n=0] [13:13:41.279] - Finding globals in 'X' for chunk #1 ... DONE [13:13:41.279] - seeds: [13:13:41.279] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:41.279] getGlobalsAndPackages() ... [13:13:41.279] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:41.280] Resolving globals: FALSE [13:13:41.280] Tweak future expression to call with '...' arguments ... [13:13:41.280] { [13:13:41.280] do.call(function(...) { [13:13:41.280] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:41.280] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:41.280] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:41.280] on.exit(options(oopts), add = TRUE) [13:13:41.280] } [13:13:41.280] { [13:13:41.280] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:41.280] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:41.280] ...future.FUN(...future.X_jj, ...) [13:13:41.280] }) [13:13:41.280] } [13:13:41.280] }, args = future.call.arguments) [13:13:41.280] } [13:13:41.280] Tweak future expression to call with '...' arguments ... DONE [13:13:41.281] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:41.281] [13:13:41.281] getGlobalsAndPackages() ... DONE [13:13:41.281] run() for 'Future' ... [13:13:41.282] - state: 'created' [13:13:41.282] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:41.284] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:41.284] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:41.285] - Field: 'label' [13:13:41.285] - Field: 'local' [13:13:41.285] - Field: 'owner' [13:13:41.285] - Field: 'envir' [13:13:41.285] - Field: 'packages' [13:13:41.286] - Field: 'gc' [13:13:41.286] - Field: 'conditions' [13:13:41.286] - Field: 'expr' [13:13:41.286] - Field: 'uuid' [13:13:41.286] - Field: 'seed' [13:13:41.286] - Field: 'version' [13:13:41.287] - Field: 'result' [13:13:41.287] - Field: 'asynchronous' [13:13:41.287] - Field: 'calls' [13:13:41.287] - Field: 'globals' [13:13:41.287] - Field: 'stdout' [13:13:41.287] - Field: 'earlySignal' [13:13:41.288] - Field: 'lazy' [13:13:41.288] - Field: 'state' [13:13:41.288] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:41.288] - Launch lazy future ... [13:13:41.288] Packages needed by the future expression (n = 0): [13:13:41.289] Packages needed by future strategies (n = 0): [13:13:41.289] { [13:13:41.289] { [13:13:41.289] { [13:13:41.289] ...future.startTime <- base::Sys.time() [13:13:41.289] { [13:13:41.289] { [13:13:41.289] { [13:13:41.289] base::local({ [13:13:41.289] has_future <- base::requireNamespace("future", [13:13:41.289] quietly = TRUE) [13:13:41.289] if (has_future) { [13:13:41.289] ns <- base::getNamespace("future") [13:13:41.289] version <- ns[[".package"]][["version"]] [13:13:41.289] if (is.null(version)) [13:13:41.289] version <- utils::packageVersion("future") [13:13:41.289] } [13:13:41.289] else { [13:13:41.289] version <- NULL [13:13:41.289] } [13:13:41.289] if (!has_future || version < "1.8.0") { [13:13:41.289] info <- base::c(r_version = base::gsub("R version ", [13:13:41.289] "", base::R.version$version.string), [13:13:41.289] platform = base::sprintf("%s (%s-bit)", [13:13:41.289] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:41.289] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:41.289] "release", "version")], collapse = " "), [13:13:41.289] hostname = base::Sys.info()[["nodename"]]) [13:13:41.289] info <- base::sprintf("%s: %s", base::names(info), [13:13:41.289] info) [13:13:41.289] info <- base::paste(info, collapse = "; ") [13:13:41.289] if (!has_future) { [13:13:41.289] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:41.289] info) [13:13:41.289] } [13:13:41.289] else { [13:13:41.289] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:41.289] info, version) [13:13:41.289] } [13:13:41.289] base::stop(msg) [13:13:41.289] } [13:13:41.289] }) [13:13:41.289] } [13:13:41.289] options(future.plan = NULL) [13:13:41.289] Sys.unsetenv("R_FUTURE_PLAN") [13:13:41.289] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:41.289] } [13:13:41.289] ...future.workdir <- getwd() [13:13:41.289] } [13:13:41.289] ...future.oldOptions <- base::as.list(base::.Options) [13:13:41.289] ...future.oldEnvVars <- base::Sys.getenv() [13:13:41.289] } [13:13:41.289] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:41.289] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:41.289] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:41.289] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:41.289] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:41.289] future.stdout.windows.reencode = NULL, width = 80L) [13:13:41.289] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:41.289] base::names(...future.oldOptions)) [13:13:41.289] } [13:13:41.289] if (FALSE) { [13:13:41.289] } [13:13:41.289] else { [13:13:41.289] if (TRUE) { [13:13:41.289] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:41.289] open = "w") [13:13:41.289] } [13:13:41.289] else { [13:13:41.289] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:41.289] windows = "NUL", "/dev/null"), open = "w") [13:13:41.289] } [13:13:41.289] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:41.289] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:41.289] base::sink(type = "output", split = FALSE) [13:13:41.289] base::close(...future.stdout) [13:13:41.289] }, add = TRUE) [13:13:41.289] } [13:13:41.289] ...future.frame <- base::sys.nframe() [13:13:41.289] ...future.conditions <- base::list() [13:13:41.289] ...future.rng <- base::globalenv()$.Random.seed [13:13:41.289] if (FALSE) { [13:13:41.289] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:41.289] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:41.289] } [13:13:41.289] ...future.result <- base::tryCatch({ [13:13:41.289] base::withCallingHandlers({ [13:13:41.289] ...future.value <- base::withVisible(base::local({ [13:13:41.289] do.call(function(...) { [13:13:41.289] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:41.289] if (!identical(...future.globals.maxSize.org, [13:13:41.289] ...future.globals.maxSize)) { [13:13:41.289] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:41.289] on.exit(options(oopts), add = TRUE) [13:13:41.289] } [13:13:41.289] { [13:13:41.289] lapply(seq_along(...future.elements_ii), [13:13:41.289] FUN = function(jj) { [13:13:41.289] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:41.289] ...future.FUN(...future.X_jj, ...) [13:13:41.289] }) [13:13:41.289] } [13:13:41.289] }, args = future.call.arguments) [13:13:41.289] })) [13:13:41.289] future::FutureResult(value = ...future.value$value, [13:13:41.289] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:41.289] ...future.rng), globalenv = if (FALSE) [13:13:41.289] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:41.289] ...future.globalenv.names)) [13:13:41.289] else NULL, started = ...future.startTime, version = "1.8") [13:13:41.289] }, condition = base::local({ [13:13:41.289] c <- base::c [13:13:41.289] inherits <- base::inherits [13:13:41.289] invokeRestart <- base::invokeRestart [13:13:41.289] length <- base::length [13:13:41.289] list <- base::list [13:13:41.289] seq.int <- base::seq.int [13:13:41.289] signalCondition <- base::signalCondition [13:13:41.289] sys.calls <- base::sys.calls [13:13:41.289] `[[` <- base::`[[` [13:13:41.289] `+` <- base::`+` [13:13:41.289] `<<-` <- base::`<<-` [13:13:41.289] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:41.289] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:41.289] 3L)] [13:13:41.289] } [13:13:41.289] function(cond) { [13:13:41.289] is_error <- inherits(cond, "error") [13:13:41.289] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:41.289] NULL) [13:13:41.289] if (is_error) { [13:13:41.289] sessionInformation <- function() { [13:13:41.289] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:41.289] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:41.289] search = base::search(), system = base::Sys.info()) [13:13:41.289] } [13:13:41.289] ...future.conditions[[length(...future.conditions) + [13:13:41.289] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:41.289] cond$call), session = sessionInformation(), [13:13:41.289] timestamp = base::Sys.time(), signaled = 0L) [13:13:41.289] signalCondition(cond) [13:13:41.289] } [13:13:41.289] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:41.289] "immediateCondition"))) { [13:13:41.289] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:41.289] ...future.conditions[[length(...future.conditions) + [13:13:41.289] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:41.289] if (TRUE && !signal) { [13:13:41.289] muffleCondition <- function (cond, pattern = "^muffle") [13:13:41.289] { [13:13:41.289] inherits <- base::inherits [13:13:41.289] invokeRestart <- base::invokeRestart [13:13:41.289] is.null <- base::is.null [13:13:41.289] muffled <- FALSE [13:13:41.289] if (inherits(cond, "message")) { [13:13:41.289] muffled <- grepl(pattern, "muffleMessage") [13:13:41.289] if (muffled) [13:13:41.289] invokeRestart("muffleMessage") [13:13:41.289] } [13:13:41.289] else if (inherits(cond, "warning")) { [13:13:41.289] muffled <- grepl(pattern, "muffleWarning") [13:13:41.289] if (muffled) [13:13:41.289] invokeRestart("muffleWarning") [13:13:41.289] } [13:13:41.289] else if (inherits(cond, "condition")) { [13:13:41.289] if (!is.null(pattern)) { [13:13:41.289] computeRestarts <- base::computeRestarts [13:13:41.289] grepl <- base::grepl [13:13:41.289] restarts <- computeRestarts(cond) [13:13:41.289] for (restart in restarts) { [13:13:41.289] name <- restart$name [13:13:41.289] if (is.null(name)) [13:13:41.289] next [13:13:41.289] if (!grepl(pattern, name)) [13:13:41.289] next [13:13:41.289] invokeRestart(restart) [13:13:41.289] muffled <- TRUE [13:13:41.289] break [13:13:41.289] } [13:13:41.289] } [13:13:41.289] } [13:13:41.289] invisible(muffled) [13:13:41.289] } [13:13:41.289] muffleCondition(cond, pattern = "^muffle") [13:13:41.289] } [13:13:41.289] } [13:13:41.289] else { [13:13:41.289] if (TRUE) { [13:13:41.289] muffleCondition <- function (cond, pattern = "^muffle") [13:13:41.289] { [13:13:41.289] inherits <- base::inherits [13:13:41.289] invokeRestart <- base::invokeRestart [13:13:41.289] is.null <- base::is.null [13:13:41.289] muffled <- FALSE [13:13:41.289] if (inherits(cond, "message")) { [13:13:41.289] muffled <- grepl(pattern, "muffleMessage") [13:13:41.289] if (muffled) [13:13:41.289] invokeRestart("muffleMessage") [13:13:41.289] } [13:13:41.289] else if (inherits(cond, "warning")) { [13:13:41.289] muffled <- grepl(pattern, "muffleWarning") [13:13:41.289] if (muffled) [13:13:41.289] invokeRestart("muffleWarning") [13:13:41.289] } [13:13:41.289] else if (inherits(cond, "condition")) { [13:13:41.289] if (!is.null(pattern)) { [13:13:41.289] computeRestarts <- base::computeRestarts [13:13:41.289] grepl <- base::grepl [13:13:41.289] restarts <- computeRestarts(cond) [13:13:41.289] for (restart in restarts) { [13:13:41.289] name <- restart$name [13:13:41.289] if (is.null(name)) [13:13:41.289] next [13:13:41.289] if (!grepl(pattern, name)) [13:13:41.289] next [13:13:41.289] invokeRestart(restart) [13:13:41.289] muffled <- TRUE [13:13:41.289] break [13:13:41.289] } [13:13:41.289] } [13:13:41.289] } [13:13:41.289] invisible(muffled) [13:13:41.289] } [13:13:41.289] muffleCondition(cond, pattern = "^muffle") [13:13:41.289] } [13:13:41.289] } [13:13:41.289] } [13:13:41.289] })) [13:13:41.289] }, error = function(ex) { [13:13:41.289] base::structure(base::list(value = NULL, visible = NULL, [13:13:41.289] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:41.289] ...future.rng), started = ...future.startTime, [13:13:41.289] finished = Sys.time(), session_uuid = NA_character_, [13:13:41.289] version = "1.8"), class = "FutureResult") [13:13:41.289] }, finally = { [13:13:41.289] if (!identical(...future.workdir, getwd())) [13:13:41.289] setwd(...future.workdir) [13:13:41.289] { [13:13:41.289] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:41.289] ...future.oldOptions$nwarnings <- NULL [13:13:41.289] } [13:13:41.289] base::options(...future.oldOptions) [13:13:41.289] if (.Platform$OS.type == "windows") { [13:13:41.289] old_names <- names(...future.oldEnvVars) [13:13:41.289] envs <- base::Sys.getenv() [13:13:41.289] names <- names(envs) [13:13:41.289] common <- intersect(names, old_names) [13:13:41.289] added <- setdiff(names, old_names) [13:13:41.289] removed <- setdiff(old_names, names) [13:13:41.289] changed <- common[...future.oldEnvVars[common] != [13:13:41.289] envs[common]] [13:13:41.289] NAMES <- toupper(changed) [13:13:41.289] args <- list() [13:13:41.289] for (kk in seq_along(NAMES)) { [13:13:41.289] name <- changed[[kk]] [13:13:41.289] NAME <- NAMES[[kk]] [13:13:41.289] if (name != NAME && is.element(NAME, old_names)) [13:13:41.289] next [13:13:41.289] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:41.289] } [13:13:41.289] NAMES <- toupper(added) [13:13:41.289] for (kk in seq_along(NAMES)) { [13:13:41.289] name <- added[[kk]] [13:13:41.289] NAME <- NAMES[[kk]] [13:13:41.289] if (name != NAME && is.element(NAME, old_names)) [13:13:41.289] next [13:13:41.289] args[[name]] <- "" [13:13:41.289] } [13:13:41.289] NAMES <- toupper(removed) [13:13:41.289] for (kk in seq_along(NAMES)) { [13:13:41.289] name <- removed[[kk]] [13:13:41.289] NAME <- NAMES[[kk]] [13:13:41.289] if (name != NAME && is.element(NAME, old_names)) [13:13:41.289] next [13:13:41.289] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:41.289] } [13:13:41.289] if (length(args) > 0) [13:13:41.289] base::do.call(base::Sys.setenv, args = args) [13:13:41.289] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:41.289] } [13:13:41.289] else { [13:13:41.289] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:41.289] } [13:13:41.289] { [13:13:41.289] if (base::length(...future.futureOptionsAdded) > [13:13:41.289] 0L) { [13:13:41.289] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:41.289] base::names(opts) <- ...future.futureOptionsAdded [13:13:41.289] base::options(opts) [13:13:41.289] } [13:13:41.289] { [13:13:41.289] { [13:13:41.289] NULL [13:13:41.289] RNGkind("Mersenne-Twister") [13:13:41.289] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:41.289] inherits = FALSE) [13:13:41.289] } [13:13:41.289] options(future.plan = NULL) [13:13:41.289] if (is.na(NA_character_)) [13:13:41.289] Sys.unsetenv("R_FUTURE_PLAN") [13:13:41.289] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:41.289] future::plan(list(function (..., workers = availableCores(), [13:13:41.289] lazy = FALSE, rscript_libs = .libPaths(), [13:13:41.289] envir = parent.frame()) [13:13:41.289] { [13:13:41.289] if (is.function(workers)) [13:13:41.289] workers <- workers() [13:13:41.289] workers <- structure(as.integer(workers), [13:13:41.289] class = class(workers)) [13:13:41.289] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:41.289] workers >= 1) [13:13:41.289] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:41.289] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:41.289] } [13:13:41.289] future <- MultisessionFuture(..., workers = workers, [13:13:41.289] lazy = lazy, rscript_libs = rscript_libs, [13:13:41.289] envir = envir) [13:13:41.289] if (!future$lazy) [13:13:41.289] future <- run(future) [13:13:41.289] invisible(future) [13:13:41.289] }), .cleanup = FALSE, .init = FALSE) [13:13:41.289] } [13:13:41.289] } [13:13:41.289] } [13:13:41.289] }) [13:13:41.289] if (TRUE) { [13:13:41.289] base::sink(type = "output", split = FALSE) [13:13:41.289] if (TRUE) { [13:13:41.289] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:41.289] } [13:13:41.289] else { [13:13:41.289] ...future.result["stdout"] <- base::list(NULL) [13:13:41.289] } [13:13:41.289] base::close(...future.stdout) [13:13:41.289] ...future.stdout <- NULL [13:13:41.289] } [13:13:41.289] ...future.result$conditions <- ...future.conditions [13:13:41.289] ...future.result$finished <- base::Sys.time() [13:13:41.289] ...future.result [13:13:41.289] } [13:13:41.293] assign_globals() ... [13:13:41.293] List of 5 [13:13:41.293] $ ...future.FUN :function (mode = "logical", length = 0L) [13:13:41.293] $ future.call.arguments :List of 1 [13:13:41.293] ..$ length: int 2 [13:13:41.293] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:41.293] $ ...future.elements_ii :List of 4 [13:13:41.293] ..$ a: chr "integer" [13:13:41.293] ..$ b: chr "numeric" [13:13:41.293] ..$ c: chr "character" [13:13:41.293] ..$ c: chr "list" [13:13:41.293] $ ...future.seeds_ii : NULL [13:13:41.293] $ ...future.globals.maxSize: NULL [13:13:41.293] - attr(*, "where")=List of 5 [13:13:41.293] ..$ ...future.FUN : [13:13:41.293] ..$ future.call.arguments : [13:13:41.293] ..$ ...future.elements_ii : [13:13:41.293] ..$ ...future.seeds_ii : [13:13:41.293] ..$ ...future.globals.maxSize: [13:13:41.293] - attr(*, "resolved")= logi FALSE [13:13:41.293] - attr(*, "total_size")= num 2240 [13:13:41.293] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:41.293] - attr(*, "already-done")= logi TRUE [13:13:41.300] - copied '...future.FUN' to environment [13:13:41.301] - copied 'future.call.arguments' to environment [13:13:41.301] - copied '...future.elements_ii' to environment [13:13:41.301] - copied '...future.seeds_ii' to environment [13:13:41.301] - copied '...future.globals.maxSize' to environment [13:13:41.301] assign_globals() ... done [13:13:41.302] plan(): Setting new future strategy stack: [13:13:41.302] List of future strategies: [13:13:41.302] 1. sequential: [13:13:41.302] - args: function (..., envir = parent.frame(), workers = "") [13:13:41.302] - tweaked: FALSE [13:13:41.302] - call: NULL [13:13:41.302] plan(): nbrOfWorkers() = 1 [13:13:41.304] plan(): Setting new future strategy stack: [13:13:41.304] List of future strategies: [13:13:41.304] 1. multisession: [13:13:41.304] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [13:13:41.304] - tweaked: FALSE [13:13:41.304] - call: plan(strategy) [13:13:41.306] plan(): nbrOfWorkers() = 1 [13:13:41.306] SequentialFuture started (and completed) [13:13:41.307] - Launch lazy future ... done [13:13:41.307] run() for 'SequentialFuture' ... done [13:13:41.307] Created future: [13:13:41.307] SequentialFuture: [13:13:41.307] Label: 'future_lapply-1' [13:13:41.307] Expression: [13:13:41.307] { [13:13:41.307] do.call(function(...) { [13:13:41.307] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:41.307] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:41.307] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:41.307] on.exit(options(oopts), add = TRUE) [13:13:41.307] } [13:13:41.307] { [13:13:41.307] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:41.307] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:41.307] ...future.FUN(...future.X_jj, ...) [13:13:41.307] }) [13:13:41.307] } [13:13:41.307] }, args = future.call.arguments) [13:13:41.307] } [13:13:41.307] Lazy evaluation: FALSE [13:13:41.307] Asynchronous evaluation: FALSE [13:13:41.307] Local evaluation: TRUE [13:13:41.307] Environment: R_GlobalEnv [13:13:41.307] Capture standard output: TRUE [13:13:41.307] Capture condition classes: 'condition' (excluding 'nothing') [13:13:41.307] 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) [13:13:41.307] Packages: [13:13:41.307] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:41.307] Resolved: TRUE [13:13:41.307] Value: 240 bytes of class 'list' [13:13:41.307] Early signaling: FALSE [13:13:41.307] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:41.307] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:41.309] Chunk #1 of 1 ... DONE [13:13:41.309] Launching 1 futures (chunks) ... DONE [13:13:41.309] Resolving 1 futures (chunks) ... [13:13:41.309] resolve() on list ... [13:13:41.309] recursive: 0 [13:13:41.309] length: 1 [13:13:41.310] [13:13:41.310] resolved() for 'SequentialFuture' ... [13:13:41.310] - state: 'finished' [13:13:41.310] - run: TRUE [13:13:41.310] - result: 'FutureResult' [13:13:41.310] resolved() for 'SequentialFuture' ... done [13:13:41.311] Future #1 [13:13:41.311] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:41.311] - nx: 1 [13:13:41.311] - relay: TRUE [13:13:41.311] - stdout: TRUE [13:13:41.311] - signal: TRUE [13:13:41.312] - resignal: FALSE [13:13:41.312] - force: TRUE [13:13:41.312] - relayed: [n=1] FALSE [13:13:41.312] - queued futures: [n=1] FALSE [13:13:41.312] - until=1 [13:13:41.312] - relaying element #1 [13:13:41.313] - relayed: [n=1] TRUE [13:13:41.313] - queued futures: [n=1] TRUE [13:13:41.313] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:41.313] length: 0 (resolved future 1) [13:13:41.313] Relaying remaining futures [13:13:41.313] signalConditionsASAP(NULL, pos=0) ... [13:13:41.314] - nx: 1 [13:13:41.314] - relay: TRUE [13:13:41.314] - stdout: TRUE [13:13:41.314] - signal: TRUE [13:13:41.314] - resignal: FALSE [13:13:41.314] - force: TRUE [13:13:41.315] - relayed: [n=1] TRUE [13:13:41.315] - queued futures: [n=1] TRUE - flush all [13:13:41.315] - relayed: [n=1] TRUE [13:13:41.315] - queued futures: [n=1] TRUE [13:13:41.315] signalConditionsASAP(NULL, pos=0) ... done [13:13:41.315] resolve() on list ... DONE [13:13:41.316] - Number of value chunks collected: 1 [13:13:41.316] Resolving 1 futures (chunks) ... DONE [13:13:41.316] Reducing values from 1 chunks ... [13:13:41.316] - Number of values collected after concatenation: 4 [13:13:41.316] - Number of values expected: 4 [13:13:41.316] Reducing values from 1 chunks ... DONE [13:13:41.317] 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 [13:13:41.319] future_lapply() ... [13:13:41.322] Number of chunks: 1 [13:13:41.322] getGlobalsAndPackagesXApply() ... [13:13:41.322] - future.globals: TRUE [13:13:41.322] getGlobalsAndPackages() ... [13:13:41.322] Searching for globals... [13:13:41.324] - globals found: [2] 'FUN', '.Internal' [13:13:41.324] Searching for globals ... DONE [13:13:41.324] Resolving globals: FALSE [13:13:41.325] The total size of the 1 globals is 2.13 KiB (2184 bytes) [13:13:41.325] 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') [13:13:41.325] - globals: [1] 'FUN' [13:13:41.325] [13:13:41.326] getGlobalsAndPackages() ... DONE [13:13:41.326] - globals found/used: [n=1] 'FUN' [13:13:41.326] - needed namespaces: [n=0] [13:13:41.326] Finding globals ... DONE [13:13:41.326] - use_args: TRUE [13:13:41.326] - Getting '...' globals ... [13:13:41.327] resolve() on list ... [13:13:41.327] recursive: 0 [13:13:41.327] length: 1 [13:13:41.327] elements: '...' [13:13:41.327] length: 0 (resolved future 1) [13:13:41.328] resolve() on list ... DONE [13:13:41.328] - '...' content: [n=1] 'length' [13:13:41.328] List of 1 [13:13:41.328] $ ...:List of 1 [13:13:41.328] ..$ length: int 2 [13:13:41.328] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:41.328] - attr(*, "where")=List of 1 [13:13:41.328] ..$ ...: [13:13:41.328] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:41.328] - attr(*, "resolved")= logi TRUE [13:13:41.328] - attr(*, "total_size")= num NA [13:13:41.332] - Getting '...' globals ... DONE [13:13:41.332] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:41.332] List of 2 [13:13:41.332] $ ...future.FUN:function (mode = "logical", length = 0L) [13:13:41.332] $ ... :List of 1 [13:13:41.332] ..$ length: int 2 [13:13:41.332] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:41.332] - attr(*, "where")=List of 2 [13:13:41.332] ..$ ...future.FUN: [13:13:41.332] ..$ ... : [13:13:41.332] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:41.332] - attr(*, "resolved")= logi FALSE [13:13:41.332] - attr(*, "total_size")= num 2240 [13:13:41.336] Packages to be attached in all futures: [n=0] [13:13:41.336] getGlobalsAndPackagesXApply() ... DONE [13:13:41.336] Number of futures (= number of chunks): 1 [13:13:41.336] Launching 1 futures (chunks) ... [13:13:41.337] Chunk #1 of 1 ... [13:13:41.337] - Finding globals in 'X' for chunk #1 ... [13:13:41.337] getGlobalsAndPackages() ... [13:13:41.337] Searching for globals... [13:13:41.338] [13:13:41.338] Searching for globals ... DONE [13:13:41.338] - globals: [0] [13:13:41.338] getGlobalsAndPackages() ... DONE [13:13:41.338] + additional globals found: [n=0] [13:13:41.338] + additional namespaces needed: [n=0] [13:13:41.338] - Finding globals in 'X' for chunk #1 ... DONE [13:13:41.339] - seeds: [13:13:41.339] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:41.339] getGlobalsAndPackages() ... [13:13:41.339] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:41.339] Resolving globals: FALSE [13:13:41.339] Tweak future expression to call with '...' arguments ... [13:13:41.340] { [13:13:41.340] do.call(function(...) { [13:13:41.340] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:41.340] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:41.340] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:41.340] on.exit(options(oopts), add = TRUE) [13:13:41.340] } [13:13:41.340] { [13:13:41.340] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:41.340] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:41.340] ...future.FUN(...future.X_jj, ...) [13:13:41.340] }) [13:13:41.340] } [13:13:41.340] }, args = future.call.arguments) [13:13:41.340] } [13:13:41.340] Tweak future expression to call with '...' arguments ... DONE [13:13:41.341] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:41.341] [13:13:41.341] getGlobalsAndPackages() ... DONE [13:13:41.341] run() for 'Future' ... [13:13:41.341] - state: 'created' [13:13:41.342] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:41.344] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:41.344] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:41.344] - Field: 'label' [13:13:41.345] - Field: 'local' [13:13:41.345] - Field: 'owner' [13:13:41.345] - Field: 'envir' [13:13:41.345] - Field: 'packages' [13:13:41.345] - Field: 'gc' [13:13:41.345] - Field: 'conditions' [13:13:41.346] - Field: 'expr' [13:13:41.346] - Field: 'uuid' [13:13:41.346] - Field: 'seed' [13:13:41.346] - Field: 'version' [13:13:41.346] - Field: 'result' [13:13:41.347] - Field: 'asynchronous' [13:13:41.347] - Field: 'calls' [13:13:41.347] - Field: 'globals' [13:13:41.347] - Field: 'stdout' [13:13:41.347] - Field: 'earlySignal' [13:13:41.347] - Field: 'lazy' [13:13:41.348] - Field: 'state' [13:13:41.348] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:41.348] - Launch lazy future ... [13:13:41.348] Packages needed by the future expression (n = 0): [13:13:41.348] Packages needed by future strategies (n = 0): [13:13:41.349] { [13:13:41.349] { [13:13:41.349] { [13:13:41.349] ...future.startTime <- base::Sys.time() [13:13:41.349] { [13:13:41.349] { [13:13:41.349] { [13:13:41.349] base::local({ [13:13:41.349] has_future <- base::requireNamespace("future", [13:13:41.349] quietly = TRUE) [13:13:41.349] if (has_future) { [13:13:41.349] ns <- base::getNamespace("future") [13:13:41.349] version <- ns[[".package"]][["version"]] [13:13:41.349] if (is.null(version)) [13:13:41.349] version <- utils::packageVersion("future") [13:13:41.349] } [13:13:41.349] else { [13:13:41.349] version <- NULL [13:13:41.349] } [13:13:41.349] if (!has_future || version < "1.8.0") { [13:13:41.349] info <- base::c(r_version = base::gsub("R version ", [13:13:41.349] "", base::R.version$version.string), [13:13:41.349] platform = base::sprintf("%s (%s-bit)", [13:13:41.349] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:41.349] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:41.349] "release", "version")], collapse = " "), [13:13:41.349] hostname = base::Sys.info()[["nodename"]]) [13:13:41.349] info <- base::sprintf("%s: %s", base::names(info), [13:13:41.349] info) [13:13:41.349] info <- base::paste(info, collapse = "; ") [13:13:41.349] if (!has_future) { [13:13:41.349] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:41.349] info) [13:13:41.349] } [13:13:41.349] else { [13:13:41.349] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:41.349] info, version) [13:13:41.349] } [13:13:41.349] base::stop(msg) [13:13:41.349] } [13:13:41.349] }) [13:13:41.349] } [13:13:41.349] options(future.plan = NULL) [13:13:41.349] Sys.unsetenv("R_FUTURE_PLAN") [13:13:41.349] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:41.349] } [13:13:41.349] ...future.workdir <- getwd() [13:13:41.349] } [13:13:41.349] ...future.oldOptions <- base::as.list(base::.Options) [13:13:41.349] ...future.oldEnvVars <- base::Sys.getenv() [13:13:41.349] } [13:13:41.349] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:41.349] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:41.349] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:41.349] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:41.349] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:41.349] future.stdout.windows.reencode = NULL, width = 80L) [13:13:41.349] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:41.349] base::names(...future.oldOptions)) [13:13:41.349] } [13:13:41.349] if (FALSE) { [13:13:41.349] } [13:13:41.349] else { [13:13:41.349] if (TRUE) { [13:13:41.349] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:41.349] open = "w") [13:13:41.349] } [13:13:41.349] else { [13:13:41.349] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:41.349] windows = "NUL", "/dev/null"), open = "w") [13:13:41.349] } [13:13:41.349] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:41.349] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:41.349] base::sink(type = "output", split = FALSE) [13:13:41.349] base::close(...future.stdout) [13:13:41.349] }, add = TRUE) [13:13:41.349] } [13:13:41.349] ...future.frame <- base::sys.nframe() [13:13:41.349] ...future.conditions <- base::list() [13:13:41.349] ...future.rng <- base::globalenv()$.Random.seed [13:13:41.349] if (FALSE) { [13:13:41.349] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:41.349] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:41.349] } [13:13:41.349] ...future.result <- base::tryCatch({ [13:13:41.349] base::withCallingHandlers({ [13:13:41.349] ...future.value <- base::withVisible(base::local({ [13:13:41.349] do.call(function(...) { [13:13:41.349] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:41.349] if (!identical(...future.globals.maxSize.org, [13:13:41.349] ...future.globals.maxSize)) { [13:13:41.349] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:41.349] on.exit(options(oopts), add = TRUE) [13:13:41.349] } [13:13:41.349] { [13:13:41.349] lapply(seq_along(...future.elements_ii), [13:13:41.349] FUN = function(jj) { [13:13:41.349] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:41.349] ...future.FUN(...future.X_jj, ...) [13:13:41.349] }) [13:13:41.349] } [13:13:41.349] }, args = future.call.arguments) [13:13:41.349] })) [13:13:41.349] future::FutureResult(value = ...future.value$value, [13:13:41.349] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:41.349] ...future.rng), globalenv = if (FALSE) [13:13:41.349] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:41.349] ...future.globalenv.names)) [13:13:41.349] else NULL, started = ...future.startTime, version = "1.8") [13:13:41.349] }, condition = base::local({ [13:13:41.349] c <- base::c [13:13:41.349] inherits <- base::inherits [13:13:41.349] invokeRestart <- base::invokeRestart [13:13:41.349] length <- base::length [13:13:41.349] list <- base::list [13:13:41.349] seq.int <- base::seq.int [13:13:41.349] signalCondition <- base::signalCondition [13:13:41.349] sys.calls <- base::sys.calls [13:13:41.349] `[[` <- base::`[[` [13:13:41.349] `+` <- base::`+` [13:13:41.349] `<<-` <- base::`<<-` [13:13:41.349] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:41.349] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:41.349] 3L)] [13:13:41.349] } [13:13:41.349] function(cond) { [13:13:41.349] is_error <- inherits(cond, "error") [13:13:41.349] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:41.349] NULL) [13:13:41.349] if (is_error) { [13:13:41.349] sessionInformation <- function() { [13:13:41.349] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:41.349] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:41.349] search = base::search(), system = base::Sys.info()) [13:13:41.349] } [13:13:41.349] ...future.conditions[[length(...future.conditions) + [13:13:41.349] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:41.349] cond$call), session = sessionInformation(), [13:13:41.349] timestamp = base::Sys.time(), signaled = 0L) [13:13:41.349] signalCondition(cond) [13:13:41.349] } [13:13:41.349] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:41.349] "immediateCondition"))) { [13:13:41.349] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:41.349] ...future.conditions[[length(...future.conditions) + [13:13:41.349] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:41.349] if (TRUE && !signal) { [13:13:41.349] muffleCondition <- function (cond, pattern = "^muffle") [13:13:41.349] { [13:13:41.349] inherits <- base::inherits [13:13:41.349] invokeRestart <- base::invokeRestart [13:13:41.349] is.null <- base::is.null [13:13:41.349] muffled <- FALSE [13:13:41.349] if (inherits(cond, "message")) { [13:13:41.349] muffled <- grepl(pattern, "muffleMessage") [13:13:41.349] if (muffled) [13:13:41.349] invokeRestart("muffleMessage") [13:13:41.349] } [13:13:41.349] else if (inherits(cond, "warning")) { [13:13:41.349] muffled <- grepl(pattern, "muffleWarning") [13:13:41.349] if (muffled) [13:13:41.349] invokeRestart("muffleWarning") [13:13:41.349] } [13:13:41.349] else if (inherits(cond, "condition")) { [13:13:41.349] if (!is.null(pattern)) { [13:13:41.349] computeRestarts <- base::computeRestarts [13:13:41.349] grepl <- base::grepl [13:13:41.349] restarts <- computeRestarts(cond) [13:13:41.349] for (restart in restarts) { [13:13:41.349] name <- restart$name [13:13:41.349] if (is.null(name)) [13:13:41.349] next [13:13:41.349] if (!grepl(pattern, name)) [13:13:41.349] next [13:13:41.349] invokeRestart(restart) [13:13:41.349] muffled <- TRUE [13:13:41.349] break [13:13:41.349] } [13:13:41.349] } [13:13:41.349] } [13:13:41.349] invisible(muffled) [13:13:41.349] } [13:13:41.349] muffleCondition(cond, pattern = "^muffle") [13:13:41.349] } [13:13:41.349] } [13:13:41.349] else { [13:13:41.349] if (TRUE) { [13:13:41.349] muffleCondition <- function (cond, pattern = "^muffle") [13:13:41.349] { [13:13:41.349] inherits <- base::inherits [13:13:41.349] invokeRestart <- base::invokeRestart [13:13:41.349] is.null <- base::is.null [13:13:41.349] muffled <- FALSE [13:13:41.349] if (inherits(cond, "message")) { [13:13:41.349] muffled <- grepl(pattern, "muffleMessage") [13:13:41.349] if (muffled) [13:13:41.349] invokeRestart("muffleMessage") [13:13:41.349] } [13:13:41.349] else if (inherits(cond, "warning")) { [13:13:41.349] muffled <- grepl(pattern, "muffleWarning") [13:13:41.349] if (muffled) [13:13:41.349] invokeRestart("muffleWarning") [13:13:41.349] } [13:13:41.349] else if (inherits(cond, "condition")) { [13:13:41.349] if (!is.null(pattern)) { [13:13:41.349] computeRestarts <- base::computeRestarts [13:13:41.349] grepl <- base::grepl [13:13:41.349] restarts <- computeRestarts(cond) [13:13:41.349] for (restart in restarts) { [13:13:41.349] name <- restart$name [13:13:41.349] if (is.null(name)) [13:13:41.349] next [13:13:41.349] if (!grepl(pattern, name)) [13:13:41.349] next [13:13:41.349] invokeRestart(restart) [13:13:41.349] muffled <- TRUE [13:13:41.349] break [13:13:41.349] } [13:13:41.349] } [13:13:41.349] } [13:13:41.349] invisible(muffled) [13:13:41.349] } [13:13:41.349] muffleCondition(cond, pattern = "^muffle") [13:13:41.349] } [13:13:41.349] } [13:13:41.349] } [13:13:41.349] })) [13:13:41.349] }, error = function(ex) { [13:13:41.349] base::structure(base::list(value = NULL, visible = NULL, [13:13:41.349] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:41.349] ...future.rng), started = ...future.startTime, [13:13:41.349] finished = Sys.time(), session_uuid = NA_character_, [13:13:41.349] version = "1.8"), class = "FutureResult") [13:13:41.349] }, finally = { [13:13:41.349] if (!identical(...future.workdir, getwd())) [13:13:41.349] setwd(...future.workdir) [13:13:41.349] { [13:13:41.349] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:41.349] ...future.oldOptions$nwarnings <- NULL [13:13:41.349] } [13:13:41.349] base::options(...future.oldOptions) [13:13:41.349] if (.Platform$OS.type == "windows") { [13:13:41.349] old_names <- names(...future.oldEnvVars) [13:13:41.349] envs <- base::Sys.getenv() [13:13:41.349] names <- names(envs) [13:13:41.349] common <- intersect(names, old_names) [13:13:41.349] added <- setdiff(names, old_names) [13:13:41.349] removed <- setdiff(old_names, names) [13:13:41.349] changed <- common[...future.oldEnvVars[common] != [13:13:41.349] envs[common]] [13:13:41.349] NAMES <- toupper(changed) [13:13:41.349] args <- list() [13:13:41.349] for (kk in seq_along(NAMES)) { [13:13:41.349] name <- changed[[kk]] [13:13:41.349] NAME <- NAMES[[kk]] [13:13:41.349] if (name != NAME && is.element(NAME, old_names)) [13:13:41.349] next [13:13:41.349] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:41.349] } [13:13:41.349] NAMES <- toupper(added) [13:13:41.349] for (kk in seq_along(NAMES)) { [13:13:41.349] name <- added[[kk]] [13:13:41.349] NAME <- NAMES[[kk]] [13:13:41.349] if (name != NAME && is.element(NAME, old_names)) [13:13:41.349] next [13:13:41.349] args[[name]] <- "" [13:13:41.349] } [13:13:41.349] NAMES <- toupper(removed) [13:13:41.349] for (kk in seq_along(NAMES)) { [13:13:41.349] name <- removed[[kk]] [13:13:41.349] NAME <- NAMES[[kk]] [13:13:41.349] if (name != NAME && is.element(NAME, old_names)) [13:13:41.349] next [13:13:41.349] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:41.349] } [13:13:41.349] if (length(args) > 0) [13:13:41.349] base::do.call(base::Sys.setenv, args = args) [13:13:41.349] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:41.349] } [13:13:41.349] else { [13:13:41.349] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:41.349] } [13:13:41.349] { [13:13:41.349] if (base::length(...future.futureOptionsAdded) > [13:13:41.349] 0L) { [13:13:41.349] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:41.349] base::names(opts) <- ...future.futureOptionsAdded [13:13:41.349] base::options(opts) [13:13:41.349] } [13:13:41.349] { [13:13:41.349] { [13:13:41.349] NULL [13:13:41.349] RNGkind("Mersenne-Twister") [13:13:41.349] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:41.349] inherits = FALSE) [13:13:41.349] } [13:13:41.349] options(future.plan = NULL) [13:13:41.349] if (is.na(NA_character_)) [13:13:41.349] Sys.unsetenv("R_FUTURE_PLAN") [13:13:41.349] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:41.349] future::plan(list(function (..., workers = availableCores(), [13:13:41.349] lazy = FALSE, rscript_libs = .libPaths(), [13:13:41.349] envir = parent.frame()) [13:13:41.349] { [13:13:41.349] if (is.function(workers)) [13:13:41.349] workers <- workers() [13:13:41.349] workers <- structure(as.integer(workers), [13:13:41.349] class = class(workers)) [13:13:41.349] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:41.349] workers >= 1) [13:13:41.349] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:41.349] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:41.349] } [13:13:41.349] future <- MultisessionFuture(..., workers = workers, [13:13:41.349] lazy = lazy, rscript_libs = rscript_libs, [13:13:41.349] envir = envir) [13:13:41.349] if (!future$lazy) [13:13:41.349] future <- run(future) [13:13:41.349] invisible(future) [13:13:41.349] }), .cleanup = FALSE, .init = FALSE) [13:13:41.349] } [13:13:41.349] } [13:13:41.349] } [13:13:41.349] }) [13:13:41.349] if (TRUE) { [13:13:41.349] base::sink(type = "output", split = FALSE) [13:13:41.349] if (TRUE) { [13:13:41.349] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:41.349] } [13:13:41.349] else { [13:13:41.349] ...future.result["stdout"] <- base::list(NULL) [13:13:41.349] } [13:13:41.349] base::close(...future.stdout) [13:13:41.349] ...future.stdout <- NULL [13:13:41.349] } [13:13:41.349] ...future.result$conditions <- ...future.conditions [13:13:41.349] ...future.result$finished <- base::Sys.time() [13:13:41.349] ...future.result [13:13:41.349] } [13:13:41.353] assign_globals() ... [13:13:41.353] List of 5 [13:13:41.353] $ ...future.FUN :function (mode = "logical", length = 0L) [13:13:41.353] $ future.call.arguments :List of 1 [13:13:41.353] ..$ length: int 2 [13:13:41.353] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:41.353] $ ...future.elements_ii :List of 4 [13:13:41.353] ..$ a: chr "integer" [13:13:41.353] ..$ b: chr "numeric" [13:13:41.353] ..$ c: chr "character" [13:13:41.353] ..$ c: chr "list" [13:13:41.353] $ ...future.seeds_ii : NULL [13:13:41.353] $ ...future.globals.maxSize: NULL [13:13:41.353] - attr(*, "where")=List of 5 [13:13:41.353] ..$ ...future.FUN : [13:13:41.353] ..$ future.call.arguments : [13:13:41.353] ..$ ...future.elements_ii : [13:13:41.353] ..$ ...future.seeds_ii : [13:13:41.353] ..$ ...future.globals.maxSize: [13:13:41.353] - attr(*, "resolved")= logi FALSE [13:13:41.353] - attr(*, "total_size")= num 2240 [13:13:41.353] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:41.353] - attr(*, "already-done")= logi TRUE [13:13:41.360] - copied '...future.FUN' to environment [13:13:41.360] - copied 'future.call.arguments' to environment [13:13:41.361] - copied '...future.elements_ii' to environment [13:13:41.361] - copied '...future.seeds_ii' to environment [13:13:41.361] - copied '...future.globals.maxSize' to environment [13:13:41.361] assign_globals() ... done [13:13:41.361] plan(): Setting new future strategy stack: [13:13:41.362] List of future strategies: [13:13:41.362] 1. sequential: [13:13:41.362] - args: function (..., envir = parent.frame(), workers = "") [13:13:41.362] - tweaked: FALSE [13:13:41.362] - call: NULL [13:13:41.362] plan(): nbrOfWorkers() = 1 [13:13:41.363] plan(): Setting new future strategy stack: [13:13:41.363] List of future strategies: [13:13:41.363] 1. multisession: [13:13:41.363] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [13:13:41.363] - tweaked: FALSE [13:13:41.363] - call: plan(strategy) [13:13:41.366] plan(): nbrOfWorkers() = 1 [13:13:41.366] SequentialFuture started (and completed) [13:13:41.368] - Launch lazy future ... done [13:13:41.368] run() for 'SequentialFuture' ... done [13:13:41.369] Created future: [13:13:41.369] SequentialFuture: [13:13:41.369] Label: 'future_lapply-1' [13:13:41.369] Expression: [13:13:41.369] { [13:13:41.369] do.call(function(...) { [13:13:41.369] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:41.369] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:41.369] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:41.369] on.exit(options(oopts), add = TRUE) [13:13:41.369] } [13:13:41.369] { [13:13:41.369] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:41.369] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:41.369] ...future.FUN(...future.X_jj, ...) [13:13:41.369] }) [13:13:41.369] } [13:13:41.369] }, args = future.call.arguments) [13:13:41.369] } [13:13:41.369] Lazy evaluation: FALSE [13:13:41.369] Asynchronous evaluation: FALSE [13:13:41.369] Local evaluation: TRUE [13:13:41.369] Environment: R_GlobalEnv [13:13:41.369] Capture standard output: TRUE [13:13:41.369] Capture condition classes: 'condition' (excluding 'nothing') [13:13:41.369] 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) [13:13:41.369] Packages: [13:13:41.369] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:41.369] Resolved: TRUE [13:13:41.369] Value: 240 bytes of class 'list' [13:13:41.369] Early signaling: FALSE [13:13:41.369] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:41.369] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:41.370] Chunk #1 of 1 ... DONE [13:13:41.370] Launching 1 futures (chunks) ... DONE [13:13:41.370] Resolving 1 futures (chunks) ... [13:13:41.371] resolve() on list ... [13:13:41.371] recursive: 0 [13:13:41.371] length: 1 [13:13:41.371] [13:13:41.371] resolved() for 'SequentialFuture' ... [13:13:41.371] - state: 'finished' [13:13:41.372] - run: TRUE [13:13:41.372] - result: 'FutureResult' [13:13:41.372] resolved() for 'SequentialFuture' ... done [13:13:41.372] Future #1 [13:13:41.372] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:41.372] - nx: 1 [13:13:41.373] - relay: TRUE [13:13:41.373] - stdout: TRUE [13:13:41.373] - signal: TRUE [13:13:41.373] - resignal: FALSE [13:13:41.373] - force: TRUE [13:13:41.373] - relayed: [n=1] FALSE [13:13:41.373] - queued futures: [n=1] FALSE [13:13:41.374] - until=1 [13:13:41.374] - relaying element #1 [13:13:41.374] - relayed: [n=1] TRUE [13:13:41.374] - queued futures: [n=1] TRUE [13:13:41.374] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:41.375] length: 0 (resolved future 1) [13:13:41.375] Relaying remaining futures [13:13:41.375] signalConditionsASAP(NULL, pos=0) ... [13:13:41.375] - nx: 1 [13:13:41.375] - relay: TRUE [13:13:41.375] - stdout: TRUE [13:13:41.375] - signal: TRUE [13:13:41.376] - resignal: FALSE [13:13:41.376] - force: TRUE [13:13:41.376] - relayed: [n=1] TRUE [13:13:41.376] - queued futures: [n=1] TRUE - flush all [13:13:41.376] - relayed: [n=1] TRUE [13:13:41.376] - queued futures: [n=1] TRUE [13:13:41.377] signalConditionsASAP(NULL, pos=0) ... done [13:13:41.377] resolve() on list ... DONE [13:13:41.377] - Number of value chunks collected: 1 [13:13:41.377] Resolving 1 futures (chunks) ... DONE [13:13:41.377] Reducing values from 1 chunks ... [13:13:41.377] - Number of values collected after concatenation: 4 [13:13:41.378] - Number of values expected: 4 [13:13:41.378] Reducing values from 1 chunks ... DONE [13:13:41.378] 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, ...) ... [13:13:41.381] future_lapply() ... [13:13:41.383] Number of chunks: 1 [13:13:41.384] getGlobalsAndPackagesXApply() ... [13:13:41.384] - future.globals: TRUE [13:13:41.384] getGlobalsAndPackages() ... [13:13:41.384] Searching for globals... [13:13:41.385] - globals found: [2] 'FUN', '.Internal' [13:13:41.386] Searching for globals ... DONE [13:13:41.386] Resolving globals: FALSE [13:13:41.386] The total size of the 1 globals is 2.13 KiB (2184 bytes) [13:13:41.387] 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') [13:13:41.387] - globals: [1] 'FUN' [13:13:41.387] [13:13:41.387] getGlobalsAndPackages() ... DONE [13:13:41.387] - globals found/used: [n=1] 'FUN' [13:13:41.387] - needed namespaces: [n=0] [13:13:41.388] Finding globals ... DONE [13:13:41.388] - use_args: TRUE [13:13:41.388] - Getting '...' globals ... [13:13:41.388] resolve() on list ... [13:13:41.389] recursive: 0 [13:13:41.389] length: 1 [13:13:41.389] elements: '...' [13:13:41.389] length: 0 (resolved future 1) [13:13:41.389] resolve() on list ... DONE [13:13:41.389] - '...' content: [n=1] 'length' [13:13:41.390] List of 1 [13:13:41.390] $ ...:List of 1 [13:13:41.390] ..$ length: int 2 [13:13:41.390] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:41.390] - attr(*, "where")=List of 1 [13:13:41.390] ..$ ...: [13:13:41.390] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:41.390] - attr(*, "resolved")= logi TRUE [13:13:41.390] - attr(*, "total_size")= num NA [13:13:41.393] - Getting '...' globals ... DONE [13:13:41.393] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:41.393] List of 2 [13:13:41.393] $ ...future.FUN:function (mode = "logical", length = 0L) [13:13:41.393] $ ... :List of 1 [13:13:41.393] ..$ length: int 2 [13:13:41.393] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:41.393] - attr(*, "where")=List of 2 [13:13:41.393] ..$ ...future.FUN: [13:13:41.393] ..$ ... : [13:13:41.393] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:41.393] - attr(*, "resolved")= logi FALSE [13:13:41.393] - attr(*, "total_size")= num 2240 [13:13:41.397] Packages to be attached in all futures: [n=0] [13:13:41.397] getGlobalsAndPackagesXApply() ... DONE [13:13:41.398] Number of futures (= number of chunks): 1 [13:13:41.398] Launching 1 futures (chunks) ... [13:13:41.398] Chunk #1 of 1 ... [13:13:41.398] - Finding globals in 'X' for chunk #1 ... [13:13:41.398] getGlobalsAndPackages() ... [13:13:41.399] Searching for globals... [13:13:41.399] [13:13:41.399] Searching for globals ... DONE [13:13:41.399] - globals: [0] [13:13:41.399] getGlobalsAndPackages() ... DONE [13:13:41.400] + additional globals found: [n=0] [13:13:41.400] + additional namespaces needed: [n=0] [13:13:41.400] - Finding globals in 'X' for chunk #1 ... DONE [13:13:41.400] - seeds: [13:13:41.400] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:41.400] getGlobalsAndPackages() ... [13:13:41.401] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:41.401] Resolving globals: FALSE [13:13:41.401] Tweak future expression to call with '...' arguments ... [13:13:41.401] { [13:13:41.401] do.call(function(...) { [13:13:41.401] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:41.401] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:41.401] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:41.401] on.exit(options(oopts), add = TRUE) [13:13:41.401] } [13:13:41.401] { [13:13:41.401] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:41.401] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:41.401] ...future.FUN(...future.X_jj, ...) [13:13:41.401] }) [13:13:41.401] } [13:13:41.401] }, args = future.call.arguments) [13:13:41.401] } [13:13:41.402] Tweak future expression to call with '...' arguments ... DONE [13:13:41.402] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:41.402] [13:13:41.402] getGlobalsAndPackages() ... DONE [13:13:41.403] run() for 'Future' ... [13:13:41.403] - state: 'created' [13:13:41.403] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:41.405] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:41.406] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:41.406] - Field: 'label' [13:13:41.406] - Field: 'local' [13:13:41.406] - Field: 'owner' [13:13:41.406] - Field: 'envir' [13:13:41.407] - Field: 'packages' [13:13:41.407] - Field: 'gc' [13:13:41.407] - Field: 'conditions' [13:13:41.407] - Field: 'expr' [13:13:41.407] - Field: 'uuid' [13:13:41.407] - Field: 'seed' [13:13:41.408] - Field: 'version' [13:13:41.408] - Field: 'result' [13:13:41.408] - Field: 'asynchronous' [13:13:41.408] - Field: 'calls' [13:13:41.408] - Field: 'globals' [13:13:41.408] - Field: 'stdout' [13:13:41.409] - Field: 'earlySignal' [13:13:41.409] - Field: 'lazy' [13:13:41.409] - Field: 'state' [13:13:41.409] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:41.409] - Launch lazy future ... [13:13:41.410] Packages needed by the future expression (n = 0): [13:13:41.410] Packages needed by future strategies (n = 0): [13:13:41.410] { [13:13:41.410] { [13:13:41.410] { [13:13:41.410] ...future.startTime <- base::Sys.time() [13:13:41.410] { [13:13:41.410] { [13:13:41.410] { [13:13:41.410] base::local({ [13:13:41.410] has_future <- base::requireNamespace("future", [13:13:41.410] quietly = TRUE) [13:13:41.410] if (has_future) { [13:13:41.410] ns <- base::getNamespace("future") [13:13:41.410] version <- ns[[".package"]][["version"]] [13:13:41.410] if (is.null(version)) [13:13:41.410] version <- utils::packageVersion("future") [13:13:41.410] } [13:13:41.410] else { [13:13:41.410] version <- NULL [13:13:41.410] } [13:13:41.410] if (!has_future || version < "1.8.0") { [13:13:41.410] info <- base::c(r_version = base::gsub("R version ", [13:13:41.410] "", base::R.version$version.string), [13:13:41.410] platform = base::sprintf("%s (%s-bit)", [13:13:41.410] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:41.410] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:41.410] "release", "version")], collapse = " "), [13:13:41.410] hostname = base::Sys.info()[["nodename"]]) [13:13:41.410] info <- base::sprintf("%s: %s", base::names(info), [13:13:41.410] info) [13:13:41.410] info <- base::paste(info, collapse = "; ") [13:13:41.410] if (!has_future) { [13:13:41.410] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:41.410] info) [13:13:41.410] } [13:13:41.410] else { [13:13:41.410] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:41.410] info, version) [13:13:41.410] } [13:13:41.410] base::stop(msg) [13:13:41.410] } [13:13:41.410] }) [13:13:41.410] } [13:13:41.410] options(future.plan = NULL) [13:13:41.410] Sys.unsetenv("R_FUTURE_PLAN") [13:13:41.410] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:41.410] } [13:13:41.410] ...future.workdir <- getwd() [13:13:41.410] } [13:13:41.410] ...future.oldOptions <- base::as.list(base::.Options) [13:13:41.410] ...future.oldEnvVars <- base::Sys.getenv() [13:13:41.410] } [13:13:41.410] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:41.410] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:41.410] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:41.410] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:41.410] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:41.410] future.stdout.windows.reencode = NULL, width = 80L) [13:13:41.410] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:41.410] base::names(...future.oldOptions)) [13:13:41.410] } [13:13:41.410] if (FALSE) { [13:13:41.410] } [13:13:41.410] else { [13:13:41.410] if (TRUE) { [13:13:41.410] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:41.410] open = "w") [13:13:41.410] } [13:13:41.410] else { [13:13:41.410] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:41.410] windows = "NUL", "/dev/null"), open = "w") [13:13:41.410] } [13:13:41.410] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:41.410] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:41.410] base::sink(type = "output", split = FALSE) [13:13:41.410] base::close(...future.stdout) [13:13:41.410] }, add = TRUE) [13:13:41.410] } [13:13:41.410] ...future.frame <- base::sys.nframe() [13:13:41.410] ...future.conditions <- base::list() [13:13:41.410] ...future.rng <- base::globalenv()$.Random.seed [13:13:41.410] if (FALSE) { [13:13:41.410] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:41.410] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:41.410] } [13:13:41.410] ...future.result <- base::tryCatch({ [13:13:41.410] base::withCallingHandlers({ [13:13:41.410] ...future.value <- base::withVisible(base::local({ [13:13:41.410] do.call(function(...) { [13:13:41.410] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:41.410] if (!identical(...future.globals.maxSize.org, [13:13:41.410] ...future.globals.maxSize)) { [13:13:41.410] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:41.410] on.exit(options(oopts), add = TRUE) [13:13:41.410] } [13:13:41.410] { [13:13:41.410] lapply(seq_along(...future.elements_ii), [13:13:41.410] FUN = function(jj) { [13:13:41.410] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:41.410] ...future.FUN(...future.X_jj, ...) [13:13:41.410] }) [13:13:41.410] } [13:13:41.410] }, args = future.call.arguments) [13:13:41.410] })) [13:13:41.410] future::FutureResult(value = ...future.value$value, [13:13:41.410] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:41.410] ...future.rng), globalenv = if (FALSE) [13:13:41.410] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:41.410] ...future.globalenv.names)) [13:13:41.410] else NULL, started = ...future.startTime, version = "1.8") [13:13:41.410] }, condition = base::local({ [13:13:41.410] c <- base::c [13:13:41.410] inherits <- base::inherits [13:13:41.410] invokeRestart <- base::invokeRestart [13:13:41.410] length <- base::length [13:13:41.410] list <- base::list [13:13:41.410] seq.int <- base::seq.int [13:13:41.410] signalCondition <- base::signalCondition [13:13:41.410] sys.calls <- base::sys.calls [13:13:41.410] `[[` <- base::`[[` [13:13:41.410] `+` <- base::`+` [13:13:41.410] `<<-` <- base::`<<-` [13:13:41.410] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:41.410] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:41.410] 3L)] [13:13:41.410] } [13:13:41.410] function(cond) { [13:13:41.410] is_error <- inherits(cond, "error") [13:13:41.410] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:41.410] NULL) [13:13:41.410] if (is_error) { [13:13:41.410] sessionInformation <- function() { [13:13:41.410] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:41.410] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:41.410] search = base::search(), system = base::Sys.info()) [13:13:41.410] } [13:13:41.410] ...future.conditions[[length(...future.conditions) + [13:13:41.410] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:41.410] cond$call), session = sessionInformation(), [13:13:41.410] timestamp = base::Sys.time(), signaled = 0L) [13:13:41.410] signalCondition(cond) [13:13:41.410] } [13:13:41.410] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:41.410] "immediateCondition"))) { [13:13:41.410] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:41.410] ...future.conditions[[length(...future.conditions) + [13:13:41.410] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:41.410] if (TRUE && !signal) { [13:13:41.410] muffleCondition <- function (cond, pattern = "^muffle") [13:13:41.410] { [13:13:41.410] inherits <- base::inherits [13:13:41.410] invokeRestart <- base::invokeRestart [13:13:41.410] is.null <- base::is.null [13:13:41.410] muffled <- FALSE [13:13:41.410] if (inherits(cond, "message")) { [13:13:41.410] muffled <- grepl(pattern, "muffleMessage") [13:13:41.410] if (muffled) [13:13:41.410] invokeRestart("muffleMessage") [13:13:41.410] } [13:13:41.410] else if (inherits(cond, "warning")) { [13:13:41.410] muffled <- grepl(pattern, "muffleWarning") [13:13:41.410] if (muffled) [13:13:41.410] invokeRestart("muffleWarning") [13:13:41.410] } [13:13:41.410] else if (inherits(cond, "condition")) { [13:13:41.410] if (!is.null(pattern)) { [13:13:41.410] computeRestarts <- base::computeRestarts [13:13:41.410] grepl <- base::grepl [13:13:41.410] restarts <- computeRestarts(cond) [13:13:41.410] for (restart in restarts) { [13:13:41.410] name <- restart$name [13:13:41.410] if (is.null(name)) [13:13:41.410] next [13:13:41.410] if (!grepl(pattern, name)) [13:13:41.410] next [13:13:41.410] invokeRestart(restart) [13:13:41.410] muffled <- TRUE [13:13:41.410] break [13:13:41.410] } [13:13:41.410] } [13:13:41.410] } [13:13:41.410] invisible(muffled) [13:13:41.410] } [13:13:41.410] muffleCondition(cond, pattern = "^muffle") [13:13:41.410] } [13:13:41.410] } [13:13:41.410] else { [13:13:41.410] if (TRUE) { [13:13:41.410] muffleCondition <- function (cond, pattern = "^muffle") [13:13:41.410] { [13:13:41.410] inherits <- base::inherits [13:13:41.410] invokeRestart <- base::invokeRestart [13:13:41.410] is.null <- base::is.null [13:13:41.410] muffled <- FALSE [13:13:41.410] if (inherits(cond, "message")) { [13:13:41.410] muffled <- grepl(pattern, "muffleMessage") [13:13:41.410] if (muffled) [13:13:41.410] invokeRestart("muffleMessage") [13:13:41.410] } [13:13:41.410] else if (inherits(cond, "warning")) { [13:13:41.410] muffled <- grepl(pattern, "muffleWarning") [13:13:41.410] if (muffled) [13:13:41.410] invokeRestart("muffleWarning") [13:13:41.410] } [13:13:41.410] else if (inherits(cond, "condition")) { [13:13:41.410] if (!is.null(pattern)) { [13:13:41.410] computeRestarts <- base::computeRestarts [13:13:41.410] grepl <- base::grepl [13:13:41.410] restarts <- computeRestarts(cond) [13:13:41.410] for (restart in restarts) { [13:13:41.410] name <- restart$name [13:13:41.410] if (is.null(name)) [13:13:41.410] next [13:13:41.410] if (!grepl(pattern, name)) [13:13:41.410] next [13:13:41.410] invokeRestart(restart) [13:13:41.410] muffled <- TRUE [13:13:41.410] break [13:13:41.410] } [13:13:41.410] } [13:13:41.410] } [13:13:41.410] invisible(muffled) [13:13:41.410] } [13:13:41.410] muffleCondition(cond, pattern = "^muffle") [13:13:41.410] } [13:13:41.410] } [13:13:41.410] } [13:13:41.410] })) [13:13:41.410] }, error = function(ex) { [13:13:41.410] base::structure(base::list(value = NULL, visible = NULL, [13:13:41.410] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:41.410] ...future.rng), started = ...future.startTime, [13:13:41.410] finished = Sys.time(), session_uuid = NA_character_, [13:13:41.410] version = "1.8"), class = "FutureResult") [13:13:41.410] }, finally = { [13:13:41.410] if (!identical(...future.workdir, getwd())) [13:13:41.410] setwd(...future.workdir) [13:13:41.410] { [13:13:41.410] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:41.410] ...future.oldOptions$nwarnings <- NULL [13:13:41.410] } [13:13:41.410] base::options(...future.oldOptions) [13:13:41.410] if (.Platform$OS.type == "windows") { [13:13:41.410] old_names <- names(...future.oldEnvVars) [13:13:41.410] envs <- base::Sys.getenv() [13:13:41.410] names <- names(envs) [13:13:41.410] common <- intersect(names, old_names) [13:13:41.410] added <- setdiff(names, old_names) [13:13:41.410] removed <- setdiff(old_names, names) [13:13:41.410] changed <- common[...future.oldEnvVars[common] != [13:13:41.410] envs[common]] [13:13:41.410] NAMES <- toupper(changed) [13:13:41.410] args <- list() [13:13:41.410] for (kk in seq_along(NAMES)) { [13:13:41.410] name <- changed[[kk]] [13:13:41.410] NAME <- NAMES[[kk]] [13:13:41.410] if (name != NAME && is.element(NAME, old_names)) [13:13:41.410] next [13:13:41.410] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:41.410] } [13:13:41.410] NAMES <- toupper(added) [13:13:41.410] for (kk in seq_along(NAMES)) { [13:13:41.410] name <- added[[kk]] [13:13:41.410] NAME <- NAMES[[kk]] [13:13:41.410] if (name != NAME && is.element(NAME, old_names)) [13:13:41.410] next [13:13:41.410] args[[name]] <- "" [13:13:41.410] } [13:13:41.410] NAMES <- toupper(removed) [13:13:41.410] for (kk in seq_along(NAMES)) { [13:13:41.410] name <- removed[[kk]] [13:13:41.410] NAME <- NAMES[[kk]] [13:13:41.410] if (name != NAME && is.element(NAME, old_names)) [13:13:41.410] next [13:13:41.410] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:41.410] } [13:13:41.410] if (length(args) > 0) [13:13:41.410] base::do.call(base::Sys.setenv, args = args) [13:13:41.410] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:41.410] } [13:13:41.410] else { [13:13:41.410] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:41.410] } [13:13:41.410] { [13:13:41.410] if (base::length(...future.futureOptionsAdded) > [13:13:41.410] 0L) { [13:13:41.410] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:41.410] base::names(opts) <- ...future.futureOptionsAdded [13:13:41.410] base::options(opts) [13:13:41.410] } [13:13:41.410] { [13:13:41.410] { [13:13:41.410] NULL [13:13:41.410] RNGkind("Mersenne-Twister") [13:13:41.410] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:41.410] inherits = FALSE) [13:13:41.410] } [13:13:41.410] options(future.plan = NULL) [13:13:41.410] if (is.na(NA_character_)) [13:13:41.410] Sys.unsetenv("R_FUTURE_PLAN") [13:13:41.410] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:41.410] future::plan(list(function (..., workers = availableCores(), [13:13:41.410] lazy = FALSE, rscript_libs = .libPaths(), [13:13:41.410] envir = parent.frame()) [13:13:41.410] { [13:13:41.410] if (is.function(workers)) [13:13:41.410] workers <- workers() [13:13:41.410] workers <- structure(as.integer(workers), [13:13:41.410] class = class(workers)) [13:13:41.410] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:41.410] workers >= 1) [13:13:41.410] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:41.410] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:41.410] } [13:13:41.410] future <- MultisessionFuture(..., workers = workers, [13:13:41.410] lazy = lazy, rscript_libs = rscript_libs, [13:13:41.410] envir = envir) [13:13:41.410] if (!future$lazy) [13:13:41.410] future <- run(future) [13:13:41.410] invisible(future) [13:13:41.410] }), .cleanup = FALSE, .init = FALSE) [13:13:41.410] } [13:13:41.410] } [13:13:41.410] } [13:13:41.410] }) [13:13:41.410] if (TRUE) { [13:13:41.410] base::sink(type = "output", split = FALSE) [13:13:41.410] if (TRUE) { [13:13:41.410] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:41.410] } [13:13:41.410] else { [13:13:41.410] ...future.result["stdout"] <- base::list(NULL) [13:13:41.410] } [13:13:41.410] base::close(...future.stdout) [13:13:41.410] ...future.stdout <- NULL [13:13:41.410] } [13:13:41.410] ...future.result$conditions <- ...future.conditions [13:13:41.410] ...future.result$finished <- base::Sys.time() [13:13:41.410] ...future.result [13:13:41.410] } [13:13:41.414] assign_globals() ... [13:13:41.415] List of 5 [13:13:41.415] $ ...future.FUN :function (mode = "logical", length = 0L) [13:13:41.415] $ future.call.arguments :List of 1 [13:13:41.415] ..$ length: int 2 [13:13:41.415] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:41.415] $ ...future.elements_ii :List of 4 [13:13:41.415] ..$ a: chr "integer" [13:13:41.415] ..$ b: chr "numeric" [13:13:41.415] ..$ c: chr "character" [13:13:41.415] ..$ c: chr "list" [13:13:41.415] $ ...future.seeds_ii : NULL [13:13:41.415] $ ...future.globals.maxSize: NULL [13:13:41.415] - attr(*, "where")=List of 5 [13:13:41.415] ..$ ...future.FUN : [13:13:41.415] ..$ future.call.arguments : [13:13:41.415] ..$ ...future.elements_ii : [13:13:41.415] ..$ ...future.seeds_ii : [13:13:41.415] ..$ ...future.globals.maxSize: [13:13:41.415] - attr(*, "resolved")= logi FALSE [13:13:41.415] - attr(*, "total_size")= num 2240 [13:13:41.415] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:41.415] - attr(*, "already-done")= logi TRUE [13:13:41.422] - copied '...future.FUN' to environment [13:13:41.422] - copied 'future.call.arguments' to environment [13:13:41.422] - copied '...future.elements_ii' to environment [13:13:41.422] - copied '...future.seeds_ii' to environment [13:13:41.422] - copied '...future.globals.maxSize' to environment [13:13:41.422] assign_globals() ... done [13:13:41.423] plan(): Setting new future strategy stack: [13:13:41.423] List of future strategies: [13:13:41.423] 1. sequential: [13:13:41.423] - args: function (..., envir = parent.frame(), workers = "") [13:13:41.423] - tweaked: FALSE [13:13:41.423] - call: NULL [13:13:41.424] plan(): nbrOfWorkers() = 1 [13:13:41.425] plan(): Setting new future strategy stack: [13:13:41.425] List of future strategies: [13:13:41.425] 1. multisession: [13:13:41.425] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [13:13:41.425] - tweaked: FALSE [13:13:41.425] - call: plan(strategy) [13:13:41.427] plan(): nbrOfWorkers() = 1 [13:13:41.428] SequentialFuture started (and completed) [13:13:41.428] - Launch lazy future ... done [13:13:41.428] run() for 'SequentialFuture' ... done [13:13:41.428] Created future: [13:13:41.428] SequentialFuture: [13:13:41.428] Label: 'future_lapply-1' [13:13:41.428] Expression: [13:13:41.428] { [13:13:41.428] do.call(function(...) { [13:13:41.428] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:41.428] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:41.428] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:41.428] on.exit(options(oopts), add = TRUE) [13:13:41.428] } [13:13:41.428] { [13:13:41.428] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:41.428] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:41.428] ...future.FUN(...future.X_jj, ...) [13:13:41.428] }) [13:13:41.428] } [13:13:41.428] }, args = future.call.arguments) [13:13:41.428] } [13:13:41.428] Lazy evaluation: FALSE [13:13:41.428] Asynchronous evaluation: FALSE [13:13:41.428] Local evaluation: TRUE [13:13:41.428] Environment: R_GlobalEnv [13:13:41.428] Capture standard output: TRUE [13:13:41.428] Capture condition classes: 'condition' (excluding 'nothing') [13:13:41.428] 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) [13:13:41.428] Packages: [13:13:41.428] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:41.428] Resolved: TRUE [13:13:41.428] Value: 240 bytes of class 'list' [13:13:41.428] Early signaling: FALSE [13:13:41.428] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:41.428] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:41.430] Chunk #1 of 1 ... DONE [13:13:41.430] Launching 1 futures (chunks) ... DONE [13:13:41.430] Resolving 1 futures (chunks) ... [13:13:41.430] resolve() on list ... [13:13:41.430] recursive: 0 [13:13:41.431] length: 1 [13:13:41.431] [13:13:41.431] resolved() for 'SequentialFuture' ... [13:13:41.431] - state: 'finished' [13:13:41.431] - run: TRUE [13:13:41.431] - result: 'FutureResult' [13:13:41.432] resolved() for 'SequentialFuture' ... done [13:13:41.432] Future #1 [13:13:41.432] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:41.432] - nx: 1 [13:13:41.432] - relay: TRUE [13:13:41.432] - stdout: TRUE [13:13:41.433] - signal: TRUE [13:13:41.433] - resignal: FALSE [13:13:41.433] - force: TRUE [13:13:41.433] - relayed: [n=1] FALSE [13:13:41.433] - queued futures: [n=1] FALSE [13:13:41.433] - until=1 [13:13:41.434] - relaying element #1 [13:13:41.434] - relayed: [n=1] TRUE [13:13:41.434] - queued futures: [n=1] TRUE [13:13:41.434] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:41.434] length: 0 (resolved future 1) [13:13:41.435] Relaying remaining futures [13:13:41.435] signalConditionsASAP(NULL, pos=0) ... [13:13:41.435] - nx: 1 [13:13:41.435] - relay: TRUE [13:13:41.435] - stdout: TRUE [13:13:41.435] - signal: TRUE [13:13:41.435] - resignal: FALSE [13:13:41.436] - force: TRUE [13:13:41.436] - relayed: [n=1] TRUE [13:13:41.436] - queued futures: [n=1] TRUE - flush all [13:13:41.436] - relayed: [n=1] TRUE [13:13:41.436] - queued futures: [n=1] TRUE [13:13:41.436] signalConditionsASAP(NULL, pos=0) ... done [13:13:41.437] resolve() on list ... DONE [13:13:41.437] - Number of value chunks collected: 1 [13:13:41.437] Resolving 1 futures (chunks) ... DONE [13:13:41.437] Reducing values from 1 chunks ... [13:13:41.437] - Number of values collected after concatenation: 4 [13:13:41.437] - Number of values expected: 4 [13:13:41.438] Reducing values from 1 chunks ... DONE [13:13:41.438] 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, ...) ... [13:13:41.440] future_lapply() ... [13:13:41.451] Number of chunks: 1 [13:13:41.451] getGlobalsAndPackagesXApply() ... [13:13:41.451] - future.globals: TRUE [13:13:41.451] getGlobalsAndPackages() ... [13:13:41.452] Searching for globals... [13:13:41.461] - globals found: [22] 'FUN', 'if', 'missing', 'is.finite', '{', 'is.null', '<-', 'paste', 'length', '==', 'return', '>', '+', '[', 'seq_len', 'rev', 'c', '&&', '!', ':', '(', '-' [13:13:41.462] Searching for globals ... DONE [13:13:41.462] Resolving globals: FALSE [13:13:41.463] The total size of the 1 globals is 69.62 KiB (71288 bytes) [13:13:41.463] 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') [13:13:41.464] - globals: [1] 'FUN' [13:13:41.464] - packages: [1] 'future' [13:13:41.464] getGlobalsAndPackages() ... DONE [13:13:41.464] - globals found/used: [n=1] 'FUN' [13:13:41.464] - needed namespaces: [n=1] 'future' [13:13:41.464] Finding globals ... DONE [13:13:41.465] - use_args: TRUE [13:13:41.465] - Getting '...' globals ... [13:13:41.465] resolve() on list ... [13:13:41.465] recursive: 0 [13:13:41.465] length: 1 [13:13:41.466] elements: '...' [13:13:41.466] length: 0 (resolved future 1) [13:13:41.466] resolve() on list ... DONE [13:13:41.466] - '...' content: [n=2] 'collapse', 'maxHead' [13:13:41.466] List of 1 [13:13:41.466] $ ...:List of 2 [13:13:41.466] ..$ collapse: chr "; " [13:13:41.466] ..$ maxHead : int 3 [13:13:41.466] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:41.466] - attr(*, "where")=List of 1 [13:13:41.466] ..$ ...: [13:13:41.466] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:41.466] - attr(*, "resolved")= logi TRUE [13:13:41.466] - attr(*, "total_size")= num NA [13:13:41.472] - Getting '...' globals ... DONE [13:13:41.472] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:41.472] List of 2 [13:13:41.472] $ ...future.FUN:function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [13:13:41.472] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [13:13:41.472] $ ... :List of 2 [13:13:41.472] ..$ collapse: chr "; " [13:13:41.472] ..$ maxHead : int 3 [13:13:41.472] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:41.472] - attr(*, "where")=List of 2 [13:13:41.472] ..$ ...future.FUN: [13:13:41.472] ..$ ... : [13:13:41.472] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:41.472] - attr(*, "resolved")= logi FALSE [13:13:41.472] - attr(*, "total_size")= num 71456 [13:13:41.476] Packages to be attached in all futures: [n=1] 'future' [13:13:41.477] getGlobalsAndPackagesXApply() ... DONE [13:13:41.477] Number of futures (= number of chunks): 1 [13:13:41.477] Launching 1 futures (chunks) ... [13:13:41.477] Chunk #1 of 1 ... [13:13:41.477] - Finding globals in 'X' for chunk #1 ... [13:13:41.478] getGlobalsAndPackages() ... [13:13:41.478] Searching for globals... [13:13:41.478] [13:13:41.478] Searching for globals ... DONE [13:13:41.478] - globals: [0] [13:13:41.479] getGlobalsAndPackages() ... DONE [13:13:41.479] + additional globals found: [n=0] [13:13:41.479] + additional namespaces needed: [n=0] [13:13:41.479] - Finding globals in 'X' for chunk #1 ... DONE [13:13:41.479] - seeds: [13:13:41.479] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:41.479] getGlobalsAndPackages() ... [13:13:41.480] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:41.480] Resolving globals: FALSE [13:13:41.480] Tweak future expression to call with '...' arguments ... [13:13:41.480] { [13:13:41.480] do.call(function(...) { [13:13:41.480] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:41.480] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:41.480] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:41.480] on.exit(options(oopts), add = TRUE) [13:13:41.480] } [13:13:41.480] { [13:13:41.480] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:41.480] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:41.480] ...future.FUN(...future.X_jj, ...) [13:13:41.480] }) [13:13:41.480] } [13:13:41.480] }, args = future.call.arguments) [13:13:41.480] } [13:13:41.481] Tweak future expression to call with '...' arguments ... DONE [13:13:41.481] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:41.481] - packages: [1] 'future' [13:13:41.481] getGlobalsAndPackages() ... DONE [13:13:41.482] run() for 'Future' ... [13:13:41.482] - state: 'created' [13:13:41.482] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:41.485] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:41.485] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:41.485] - Field: 'label' [13:13:41.485] - Field: 'local' [13:13:41.485] - Field: 'owner' [13:13:41.485] - Field: 'envir' [13:13:41.486] - Field: 'packages' [13:13:41.486] - Field: 'gc' [13:13:41.486] - Field: 'conditions' [13:13:41.486] - Field: 'expr' [13:13:41.486] - Field: 'uuid' [13:13:41.487] - Field: 'seed' [13:13:41.487] - Field: 'version' [13:13:41.487] - Field: 'result' [13:13:41.487] - Field: 'asynchronous' [13:13:41.487] - Field: 'calls' [13:13:41.487] - Field: 'globals' [13:13:41.488] - Field: 'stdout' [13:13:41.488] - Field: 'earlySignal' [13:13:41.488] - Field: 'lazy' [13:13:41.488] - Field: 'state' [13:13:41.488] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:41.488] - Launch lazy future ... [13:13:41.489] Packages needed by the future expression (n = 1): 'future' [13:13:41.489] Packages needed by future strategies (n = 0): [13:13:41.490] { [13:13:41.490] { [13:13:41.490] { [13:13:41.490] ...future.startTime <- base::Sys.time() [13:13:41.490] { [13:13:41.490] { [13:13:41.490] { [13:13:41.490] { [13:13:41.490] base::local({ [13:13:41.490] has_future <- base::requireNamespace("future", [13:13:41.490] quietly = TRUE) [13:13:41.490] if (has_future) { [13:13:41.490] ns <- base::getNamespace("future") [13:13:41.490] version <- ns[[".package"]][["version"]] [13:13:41.490] if (is.null(version)) [13:13:41.490] version <- utils::packageVersion("future") [13:13:41.490] } [13:13:41.490] else { [13:13:41.490] version <- NULL [13:13:41.490] } [13:13:41.490] if (!has_future || version < "1.8.0") { [13:13:41.490] info <- base::c(r_version = base::gsub("R version ", [13:13:41.490] "", base::R.version$version.string), [13:13:41.490] platform = base::sprintf("%s (%s-bit)", [13:13:41.490] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:41.490] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:41.490] "release", "version")], collapse = " "), [13:13:41.490] hostname = base::Sys.info()[["nodename"]]) [13:13:41.490] info <- base::sprintf("%s: %s", base::names(info), [13:13:41.490] info) [13:13:41.490] info <- base::paste(info, collapse = "; ") [13:13:41.490] if (!has_future) { [13:13:41.490] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:41.490] info) [13:13:41.490] } [13:13:41.490] else { [13:13:41.490] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:41.490] info, version) [13:13:41.490] } [13:13:41.490] base::stop(msg) [13:13:41.490] } [13:13:41.490] }) [13:13:41.490] } [13:13:41.490] base::local({ [13:13:41.490] for (pkg in "future") { [13:13:41.490] base::loadNamespace(pkg) [13:13:41.490] base::library(pkg, character.only = TRUE) [13:13:41.490] } [13:13:41.490] }) [13:13:41.490] } [13:13:41.490] options(future.plan = NULL) [13:13:41.490] Sys.unsetenv("R_FUTURE_PLAN") [13:13:41.490] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:41.490] } [13:13:41.490] ...future.workdir <- getwd() [13:13:41.490] } [13:13:41.490] ...future.oldOptions <- base::as.list(base::.Options) [13:13:41.490] ...future.oldEnvVars <- base::Sys.getenv() [13:13:41.490] } [13:13:41.490] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:41.490] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:41.490] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:41.490] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:41.490] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:41.490] future.stdout.windows.reencode = NULL, width = 80L) [13:13:41.490] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:41.490] base::names(...future.oldOptions)) [13:13:41.490] } [13:13:41.490] if (FALSE) { [13:13:41.490] } [13:13:41.490] else { [13:13:41.490] if (TRUE) { [13:13:41.490] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:41.490] open = "w") [13:13:41.490] } [13:13:41.490] else { [13:13:41.490] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:41.490] windows = "NUL", "/dev/null"), open = "w") [13:13:41.490] } [13:13:41.490] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:41.490] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:41.490] base::sink(type = "output", split = FALSE) [13:13:41.490] base::close(...future.stdout) [13:13:41.490] }, add = TRUE) [13:13:41.490] } [13:13:41.490] ...future.frame <- base::sys.nframe() [13:13:41.490] ...future.conditions <- base::list() [13:13:41.490] ...future.rng <- base::globalenv()$.Random.seed [13:13:41.490] if (FALSE) { [13:13:41.490] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:41.490] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:41.490] } [13:13:41.490] ...future.result <- base::tryCatch({ [13:13:41.490] base::withCallingHandlers({ [13:13:41.490] ...future.value <- base::withVisible(base::local({ [13:13:41.490] do.call(function(...) { [13:13:41.490] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:41.490] if (!identical(...future.globals.maxSize.org, [13:13:41.490] ...future.globals.maxSize)) { [13:13:41.490] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:41.490] on.exit(options(oopts), add = TRUE) [13:13:41.490] } [13:13:41.490] { [13:13:41.490] lapply(seq_along(...future.elements_ii), [13:13:41.490] FUN = function(jj) { [13:13:41.490] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:41.490] ...future.FUN(...future.X_jj, ...) [13:13:41.490] }) [13:13:41.490] } [13:13:41.490] }, args = future.call.arguments) [13:13:41.490] })) [13:13:41.490] future::FutureResult(value = ...future.value$value, [13:13:41.490] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:41.490] ...future.rng), globalenv = if (FALSE) [13:13:41.490] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:41.490] ...future.globalenv.names)) [13:13:41.490] else NULL, started = ...future.startTime, version = "1.8") [13:13:41.490] }, condition = base::local({ [13:13:41.490] c <- base::c [13:13:41.490] inherits <- base::inherits [13:13:41.490] invokeRestart <- base::invokeRestart [13:13:41.490] length <- base::length [13:13:41.490] list <- base::list [13:13:41.490] seq.int <- base::seq.int [13:13:41.490] signalCondition <- base::signalCondition [13:13:41.490] sys.calls <- base::sys.calls [13:13:41.490] `[[` <- base::`[[` [13:13:41.490] `+` <- base::`+` [13:13:41.490] `<<-` <- base::`<<-` [13:13:41.490] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:41.490] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:41.490] 3L)] [13:13:41.490] } [13:13:41.490] function(cond) { [13:13:41.490] is_error <- inherits(cond, "error") [13:13:41.490] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:41.490] NULL) [13:13:41.490] if (is_error) { [13:13:41.490] sessionInformation <- function() { [13:13:41.490] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:41.490] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:41.490] search = base::search(), system = base::Sys.info()) [13:13:41.490] } [13:13:41.490] ...future.conditions[[length(...future.conditions) + [13:13:41.490] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:41.490] cond$call), session = sessionInformation(), [13:13:41.490] timestamp = base::Sys.time(), signaled = 0L) [13:13:41.490] signalCondition(cond) [13:13:41.490] } [13:13:41.490] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:41.490] "immediateCondition"))) { [13:13:41.490] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:41.490] ...future.conditions[[length(...future.conditions) + [13:13:41.490] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:41.490] if (TRUE && !signal) { [13:13:41.490] muffleCondition <- function (cond, pattern = "^muffle") [13:13:41.490] { [13:13:41.490] inherits <- base::inherits [13:13:41.490] invokeRestart <- base::invokeRestart [13:13:41.490] is.null <- base::is.null [13:13:41.490] muffled <- FALSE [13:13:41.490] if (inherits(cond, "message")) { [13:13:41.490] muffled <- grepl(pattern, "muffleMessage") [13:13:41.490] if (muffled) [13:13:41.490] invokeRestart("muffleMessage") [13:13:41.490] } [13:13:41.490] else if (inherits(cond, "warning")) { [13:13:41.490] muffled <- grepl(pattern, "muffleWarning") [13:13:41.490] if (muffled) [13:13:41.490] invokeRestart("muffleWarning") [13:13:41.490] } [13:13:41.490] else if (inherits(cond, "condition")) { [13:13:41.490] if (!is.null(pattern)) { [13:13:41.490] computeRestarts <- base::computeRestarts [13:13:41.490] grepl <- base::grepl [13:13:41.490] restarts <- computeRestarts(cond) [13:13:41.490] for (restart in restarts) { [13:13:41.490] name <- restart$name [13:13:41.490] if (is.null(name)) [13:13:41.490] next [13:13:41.490] if (!grepl(pattern, name)) [13:13:41.490] next [13:13:41.490] invokeRestart(restart) [13:13:41.490] muffled <- TRUE [13:13:41.490] break [13:13:41.490] } [13:13:41.490] } [13:13:41.490] } [13:13:41.490] invisible(muffled) [13:13:41.490] } [13:13:41.490] muffleCondition(cond, pattern = "^muffle") [13:13:41.490] } [13:13:41.490] } [13:13:41.490] else { [13:13:41.490] if (TRUE) { [13:13:41.490] muffleCondition <- function (cond, pattern = "^muffle") [13:13:41.490] { [13:13:41.490] inherits <- base::inherits [13:13:41.490] invokeRestart <- base::invokeRestart [13:13:41.490] is.null <- base::is.null [13:13:41.490] muffled <- FALSE [13:13:41.490] if (inherits(cond, "message")) { [13:13:41.490] muffled <- grepl(pattern, "muffleMessage") [13:13:41.490] if (muffled) [13:13:41.490] invokeRestart("muffleMessage") [13:13:41.490] } [13:13:41.490] else if (inherits(cond, "warning")) { [13:13:41.490] muffled <- grepl(pattern, "muffleWarning") [13:13:41.490] if (muffled) [13:13:41.490] invokeRestart("muffleWarning") [13:13:41.490] } [13:13:41.490] else if (inherits(cond, "condition")) { [13:13:41.490] if (!is.null(pattern)) { [13:13:41.490] computeRestarts <- base::computeRestarts [13:13:41.490] grepl <- base::grepl [13:13:41.490] restarts <- computeRestarts(cond) [13:13:41.490] for (restart in restarts) { [13:13:41.490] name <- restart$name [13:13:41.490] if (is.null(name)) [13:13:41.490] next [13:13:41.490] if (!grepl(pattern, name)) [13:13:41.490] next [13:13:41.490] invokeRestart(restart) [13:13:41.490] muffled <- TRUE [13:13:41.490] break [13:13:41.490] } [13:13:41.490] } [13:13:41.490] } [13:13:41.490] invisible(muffled) [13:13:41.490] } [13:13:41.490] muffleCondition(cond, pattern = "^muffle") [13:13:41.490] } [13:13:41.490] } [13:13:41.490] } [13:13:41.490] })) [13:13:41.490] }, error = function(ex) { [13:13:41.490] base::structure(base::list(value = NULL, visible = NULL, [13:13:41.490] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:41.490] ...future.rng), started = ...future.startTime, [13:13:41.490] finished = Sys.time(), session_uuid = NA_character_, [13:13:41.490] version = "1.8"), class = "FutureResult") [13:13:41.490] }, finally = { [13:13:41.490] if (!identical(...future.workdir, getwd())) [13:13:41.490] setwd(...future.workdir) [13:13:41.490] { [13:13:41.490] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:41.490] ...future.oldOptions$nwarnings <- NULL [13:13:41.490] } [13:13:41.490] base::options(...future.oldOptions) [13:13:41.490] if (.Platform$OS.type == "windows") { [13:13:41.490] old_names <- names(...future.oldEnvVars) [13:13:41.490] envs <- base::Sys.getenv() [13:13:41.490] names <- names(envs) [13:13:41.490] common <- intersect(names, old_names) [13:13:41.490] added <- setdiff(names, old_names) [13:13:41.490] removed <- setdiff(old_names, names) [13:13:41.490] changed <- common[...future.oldEnvVars[common] != [13:13:41.490] envs[common]] [13:13:41.490] NAMES <- toupper(changed) [13:13:41.490] args <- list() [13:13:41.490] for (kk in seq_along(NAMES)) { [13:13:41.490] name <- changed[[kk]] [13:13:41.490] NAME <- NAMES[[kk]] [13:13:41.490] if (name != NAME && is.element(NAME, old_names)) [13:13:41.490] next [13:13:41.490] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:41.490] } [13:13:41.490] NAMES <- toupper(added) [13:13:41.490] for (kk in seq_along(NAMES)) { [13:13:41.490] name <- added[[kk]] [13:13:41.490] NAME <- NAMES[[kk]] [13:13:41.490] if (name != NAME && is.element(NAME, old_names)) [13:13:41.490] next [13:13:41.490] args[[name]] <- "" [13:13:41.490] } [13:13:41.490] NAMES <- toupper(removed) [13:13:41.490] for (kk in seq_along(NAMES)) { [13:13:41.490] name <- removed[[kk]] [13:13:41.490] NAME <- NAMES[[kk]] [13:13:41.490] if (name != NAME && is.element(NAME, old_names)) [13:13:41.490] next [13:13:41.490] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:41.490] } [13:13:41.490] if (length(args) > 0) [13:13:41.490] base::do.call(base::Sys.setenv, args = args) [13:13:41.490] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:41.490] } [13:13:41.490] else { [13:13:41.490] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:41.490] } [13:13:41.490] { [13:13:41.490] if (base::length(...future.futureOptionsAdded) > [13:13:41.490] 0L) { [13:13:41.490] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:41.490] base::names(opts) <- ...future.futureOptionsAdded [13:13:41.490] base::options(opts) [13:13:41.490] } [13:13:41.490] { [13:13:41.490] { [13:13:41.490] NULL [13:13:41.490] RNGkind("Mersenne-Twister") [13:13:41.490] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:41.490] inherits = FALSE) [13:13:41.490] } [13:13:41.490] options(future.plan = NULL) [13:13:41.490] if (is.na(NA_character_)) [13:13:41.490] Sys.unsetenv("R_FUTURE_PLAN") [13:13:41.490] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:41.490] future::plan(list(function (..., workers = availableCores(), [13:13:41.490] lazy = FALSE, rscript_libs = .libPaths(), [13:13:41.490] envir = parent.frame()) [13:13:41.490] { [13:13:41.490] if (is.function(workers)) [13:13:41.490] workers <- workers() [13:13:41.490] workers <- structure(as.integer(workers), [13:13:41.490] class = class(workers)) [13:13:41.490] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:41.490] workers >= 1) [13:13:41.490] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:41.490] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:41.490] } [13:13:41.490] future <- MultisessionFuture(..., workers = workers, [13:13:41.490] lazy = lazy, rscript_libs = rscript_libs, [13:13:41.490] envir = envir) [13:13:41.490] if (!future$lazy) [13:13:41.490] future <- run(future) [13:13:41.490] invisible(future) [13:13:41.490] }), .cleanup = FALSE, .init = FALSE) [13:13:41.490] } [13:13:41.490] } [13:13:41.490] } [13:13:41.490] }) [13:13:41.490] if (TRUE) { [13:13:41.490] base::sink(type = "output", split = FALSE) [13:13:41.490] if (TRUE) { [13:13:41.490] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:41.490] } [13:13:41.490] else { [13:13:41.490] ...future.result["stdout"] <- base::list(NULL) [13:13:41.490] } [13:13:41.490] base::close(...future.stdout) [13:13:41.490] ...future.stdout <- NULL [13:13:41.490] } [13:13:41.490] ...future.result$conditions <- ...future.conditions [13:13:41.490] ...future.result$finished <- base::Sys.time() [13:13:41.490] ...future.result [13:13:41.490] } [13:13:41.494] assign_globals() ... [13:13:41.494] List of 5 [13:13:41.494] $ ...future.FUN :function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [13:13:41.494] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [13:13:41.494] $ future.call.arguments :List of 2 [13:13:41.494] ..$ collapse: chr "; " [13:13:41.494] ..$ maxHead : int 3 [13:13:41.494] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:41.494] $ ...future.elements_ii :List of 1 [13:13:41.494] ..$ a: Named chr [1:101] "hello" "1" "2" "3" ... [13:13:41.494] .. ..- attr(*, "names")= chr [1:101] "" "b1" "b2" "b3" ... [13:13:41.494] $ ...future.seeds_ii : NULL [13:13:41.494] $ ...future.globals.maxSize: NULL [13:13:41.494] - attr(*, "where")=List of 5 [13:13:41.494] ..$ ...future.FUN : [13:13:41.494] ..$ future.call.arguments : [13:13:41.494] ..$ ...future.elements_ii : [13:13:41.494] ..$ ...future.seeds_ii : [13:13:41.494] ..$ ...future.globals.maxSize: [13:13:41.494] - attr(*, "resolved")= logi FALSE [13:13:41.494] - attr(*, "total_size")= num 71456 [13:13:41.494] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:41.494] - attr(*, "already-done")= logi TRUE [13:13:41.501] - copied '...future.FUN' to environment [13:13:41.501] - copied 'future.call.arguments' to environment [13:13:41.501] - copied '...future.elements_ii' to environment [13:13:41.501] - copied '...future.seeds_ii' to environment [13:13:41.501] - copied '...future.globals.maxSize' to environment [13:13:41.502] assign_globals() ... done [13:13:41.502] plan(): Setting new future strategy stack: [13:13:41.502] List of future strategies: [13:13:41.502] 1. sequential: [13:13:41.502] - args: function (..., envir = parent.frame(), workers = "") [13:13:41.502] - tweaked: FALSE [13:13:41.502] - call: NULL [13:13:41.503] plan(): nbrOfWorkers() = 1 [13:13:41.504] plan(): Setting new future strategy stack: [13:13:41.504] List of future strategies: [13:13:41.504] 1. multisession: [13:13:41.504] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [13:13:41.504] - tweaked: FALSE [13:13:41.504] - call: plan(strategy) [13:13:41.507] plan(): nbrOfWorkers() = 1 [13:13:41.507] SequentialFuture started (and completed) [13:13:41.507] - Launch lazy future ... done [13:13:41.507] run() for 'SequentialFuture' ... done [13:13:41.508] Created future: [13:13:41.508] SequentialFuture: [13:13:41.508] Label: 'future_lapply-1' [13:13:41.508] Expression: [13:13:41.508] { [13:13:41.508] do.call(function(...) { [13:13:41.508] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:41.508] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:41.508] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:41.508] on.exit(options(oopts), add = TRUE) [13:13:41.508] } [13:13:41.508] { [13:13:41.508] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:41.508] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:41.508] ...future.FUN(...future.X_jj, ...) [13:13:41.508] }) [13:13:41.508] } [13:13:41.508] }, args = future.call.arguments) [13:13:41.508] } [13:13:41.508] Lazy evaluation: FALSE [13:13:41.508] Asynchronous evaluation: FALSE [13:13:41.508] Local evaluation: TRUE [13:13:41.508] Environment: R_GlobalEnv [13:13:41.508] Capture standard output: TRUE [13:13:41.508] Capture condition classes: 'condition' (excluding 'nothing') [13:13:41.508] 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) [13:13:41.508] Packages: 1 packages ('future') [13:13:41.508] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:41.508] Resolved: TRUE [13:13:41.508] Value: 136 bytes of class 'list' [13:13:41.508] Early signaling: FALSE [13:13:41.508] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:41.508] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:41.509] Chunk #1 of 1 ... DONE [13:13:41.509] Launching 1 futures (chunks) ... DONE [13:13:41.510] Resolving 1 futures (chunks) ... [13:13:41.510] resolve() on list ... [13:13:41.510] recursive: 0 [13:13:41.510] length: 1 [13:13:41.510] [13:13:41.510] resolved() for 'SequentialFuture' ... [13:13:41.511] - state: 'finished' [13:13:41.511] - run: TRUE [13:13:41.511] - result: 'FutureResult' [13:13:41.511] resolved() for 'SequentialFuture' ... done [13:13:41.511] Future #1 [13:13:41.512] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:41.512] - nx: 1 [13:13:41.512] - relay: TRUE [13:13:41.512] - stdout: TRUE [13:13:41.512] - signal: TRUE [13:13:41.512] - resignal: FALSE [13:13:41.512] - force: TRUE [13:13:41.513] - relayed: [n=1] FALSE [13:13:41.513] - queued futures: [n=1] FALSE [13:13:41.513] - until=1 [13:13:41.513] - relaying element #1 [13:13:41.513] - relayed: [n=1] TRUE [13:13:41.514] - queued futures: [n=1] TRUE [13:13:41.514] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:41.514] length: 0 (resolved future 1) [13:13:41.514] Relaying remaining futures [13:13:41.514] signalConditionsASAP(NULL, pos=0) ... [13:13:41.514] - nx: 1 [13:13:41.515] - relay: TRUE [13:13:41.515] - stdout: TRUE [13:13:41.515] - signal: TRUE [13:13:41.515] - resignal: FALSE [13:13:41.515] - force: TRUE [13:13:41.515] - relayed: [n=1] TRUE [13:13:41.515] - queued futures: [n=1] TRUE - flush all [13:13:41.516] - relayed: [n=1] TRUE [13:13:41.516] - queued futures: [n=1] TRUE [13:13:41.516] signalConditionsASAP(NULL, pos=0) ... done [13:13:41.516] resolve() on list ... DONE [13:13:41.516] - Number of value chunks collected: 1 [13:13:41.517] Resolving 1 futures (chunks) ... DONE [13:13:41.517] Reducing values from 1 chunks ... [13:13:41.517] - Number of values collected after concatenation: 1 [13:13:41.517] - Number of values expected: 1 [13:13:41.517] Reducing values from 1 chunks ... DONE [13:13:41.517] future_lapply() ... DONE List of 1 $ y:List of 1 ..$ a: chr "hello; 1; 2; ...; 100" - future_lapply(x, FUN = listenv::listenv, ...) ... [13:13:41.518] future_lapply() ... [13:13:41.521] Number of chunks: 1 [13:13:41.521] getGlobalsAndPackagesXApply() ... [13:13:41.521] - future.globals: TRUE [13:13:41.522] getGlobalsAndPackages() ... [13:13:41.522] Searching for globals... [13:13:41.523] - globals found: [4] 'FUN', '{', 'get', 'parent.env' [13:13:41.524] Searching for globals ... DONE [13:13:41.524] Resolving globals: FALSE [13:13:41.524] The total size of the 1 globals is 4.85 KiB (4968 bytes) [13:13:41.525] 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') [13:13:41.525] - globals: [1] 'FUN' [13:13:41.525] - packages: [1] 'listenv' [13:13:41.525] getGlobalsAndPackages() ... DONE [13:13:41.525] - globals found/used: [n=1] 'FUN' [13:13:41.526] - needed namespaces: [n=1] 'listenv' [13:13:41.526] Finding globals ... DONE [13:13:41.526] - use_args: TRUE [13:13:41.526] - Getting '...' globals ... [13:13:41.527] resolve() on list ... [13:13:41.527] recursive: 0 [13:13:41.527] length: 1 [13:13:41.527] elements: '...' [13:13:41.527] length: 0 (resolved future 1) [13:13:41.527] resolve() on list ... DONE [13:13:41.528] - '...' content: [n=0] [13:13:41.528] List of 1 [13:13:41.528] $ ...: list() [13:13:41.528] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:41.528] - attr(*, "where")=List of 1 [13:13:41.528] ..$ ...: [13:13:41.528] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:41.528] - attr(*, "resolved")= logi TRUE [13:13:41.528] - attr(*, "total_size")= num NA [13:13:41.531] - Getting '...' globals ... DONE [13:13:41.531] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:41.531] List of 2 [13:13:41.531] $ ...future.FUN:function (x, ...) [13:13:41.531] $ ... : list() [13:13:41.531] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:41.531] - attr(*, "where")=List of 2 [13:13:41.531] ..$ ...future.FUN: [13:13:41.531] ..$ ... : [13:13:41.531] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:41.531] - attr(*, "resolved")= logi FALSE [13:13:41.531] - attr(*, "total_size")= num 4968 [13:13:41.534] Packages to be attached in all futures: [n=1] 'listenv' [13:13:41.535] getGlobalsAndPackagesXApply() ... DONE [13:13:41.535] Number of futures (= number of chunks): 1 [13:13:41.535] Launching 1 futures (chunks) ... [13:13:41.535] Chunk #1 of 1 ... [13:13:41.535] - Finding globals in 'X' for chunk #1 ... [13:13:41.536] getGlobalsAndPackages() ... [13:13:41.536] Searching for globals... [13:13:41.536] [13:13:41.537] Searching for globals ... DONE [13:13:41.537] - globals: [0] [13:13:41.537] getGlobalsAndPackages() ... DONE [13:13:41.537] + additional globals found: [n=0] [13:13:41.537] + additional namespaces needed: [n=0] [13:13:41.537] - Finding globals in 'X' for chunk #1 ... DONE [13:13:41.537] - seeds: [13:13:41.538] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:41.538] getGlobalsAndPackages() ... [13:13:41.538] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:41.538] Resolving globals: FALSE [13:13:41.538] Tweak future expression to call with '...' arguments ... [13:13:41.539] { [13:13:41.539] do.call(function(...) { [13:13:41.539] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:41.539] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:41.539] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:41.539] on.exit(options(oopts), add = TRUE) [13:13:41.539] } [13:13:41.539] { [13:13:41.539] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:41.539] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:41.539] ...future.FUN(...future.X_jj, ...) [13:13:41.539] }) [13:13:41.539] } [13:13:41.539] }, args = future.call.arguments) [13:13:41.539] } [13:13:41.539] Tweak future expression to call with '...' arguments ... DONE [13:13:41.539] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:41.540] - packages: [1] 'listenv' [13:13:41.540] getGlobalsAndPackages() ... DONE [13:13:41.540] run() for 'Future' ... [13:13:41.540] - state: 'created' [13:13:41.541] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:41.543] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:41.543] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:41.543] - Field: 'label' [13:13:41.544] - Field: 'local' [13:13:41.544] - Field: 'owner' [13:13:41.544] - Field: 'envir' [13:13:41.544] - Field: 'packages' [13:13:41.544] - Field: 'gc' [13:13:41.544] - Field: 'conditions' [13:13:41.545] - Field: 'expr' [13:13:41.545] - Field: 'uuid' [13:13:41.545] - Field: 'seed' [13:13:41.545] - Field: 'version' [13:13:41.545] - Field: 'result' [13:13:41.545] - Field: 'asynchronous' [13:13:41.546] - Field: 'calls' [13:13:41.546] - Field: 'globals' [13:13:41.546] - Field: 'stdout' [13:13:41.546] - Field: 'earlySignal' [13:13:41.546] - Field: 'lazy' [13:13:41.546] - Field: 'state' [13:13:41.547] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:41.547] - Launch lazy future ... [13:13:41.547] Packages needed by the future expression (n = 1): 'listenv' [13:13:41.547] Packages needed by future strategies (n = 0): [13:13:41.548] { [13:13:41.548] { [13:13:41.548] { [13:13:41.548] ...future.startTime <- base::Sys.time() [13:13:41.548] { [13:13:41.548] { [13:13:41.548] { [13:13:41.548] { [13:13:41.548] base::local({ [13:13:41.548] has_future <- base::requireNamespace("future", [13:13:41.548] quietly = TRUE) [13:13:41.548] if (has_future) { [13:13:41.548] ns <- base::getNamespace("future") [13:13:41.548] version <- ns[[".package"]][["version"]] [13:13:41.548] if (is.null(version)) [13:13:41.548] version <- utils::packageVersion("future") [13:13:41.548] } [13:13:41.548] else { [13:13:41.548] version <- NULL [13:13:41.548] } [13:13:41.548] if (!has_future || version < "1.8.0") { [13:13:41.548] info <- base::c(r_version = base::gsub("R version ", [13:13:41.548] "", base::R.version$version.string), [13:13:41.548] platform = base::sprintf("%s (%s-bit)", [13:13:41.548] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:41.548] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:41.548] "release", "version")], collapse = " "), [13:13:41.548] hostname = base::Sys.info()[["nodename"]]) [13:13:41.548] info <- base::sprintf("%s: %s", base::names(info), [13:13:41.548] info) [13:13:41.548] info <- base::paste(info, collapse = "; ") [13:13:41.548] if (!has_future) { [13:13:41.548] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:41.548] info) [13:13:41.548] } [13:13:41.548] else { [13:13:41.548] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:41.548] info, version) [13:13:41.548] } [13:13:41.548] base::stop(msg) [13:13:41.548] } [13:13:41.548] }) [13:13:41.548] } [13:13:41.548] base::local({ [13:13:41.548] for (pkg in "listenv") { [13:13:41.548] base::loadNamespace(pkg) [13:13:41.548] base::library(pkg, character.only = TRUE) [13:13:41.548] } [13:13:41.548] }) [13:13:41.548] } [13:13:41.548] options(future.plan = NULL) [13:13:41.548] Sys.unsetenv("R_FUTURE_PLAN") [13:13:41.548] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:41.548] } [13:13:41.548] ...future.workdir <- getwd() [13:13:41.548] } [13:13:41.548] ...future.oldOptions <- base::as.list(base::.Options) [13:13:41.548] ...future.oldEnvVars <- base::Sys.getenv() [13:13:41.548] } [13:13:41.548] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:41.548] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:41.548] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:41.548] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:41.548] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:41.548] future.stdout.windows.reencode = NULL, width = 80L) [13:13:41.548] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:41.548] base::names(...future.oldOptions)) [13:13:41.548] } [13:13:41.548] if (FALSE) { [13:13:41.548] } [13:13:41.548] else { [13:13:41.548] if (TRUE) { [13:13:41.548] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:41.548] open = "w") [13:13:41.548] } [13:13:41.548] else { [13:13:41.548] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:41.548] windows = "NUL", "/dev/null"), open = "w") [13:13:41.548] } [13:13:41.548] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:41.548] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:41.548] base::sink(type = "output", split = FALSE) [13:13:41.548] base::close(...future.stdout) [13:13:41.548] }, add = TRUE) [13:13:41.548] } [13:13:41.548] ...future.frame <- base::sys.nframe() [13:13:41.548] ...future.conditions <- base::list() [13:13:41.548] ...future.rng <- base::globalenv()$.Random.seed [13:13:41.548] if (FALSE) { [13:13:41.548] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:41.548] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:41.548] } [13:13:41.548] ...future.result <- base::tryCatch({ [13:13:41.548] base::withCallingHandlers({ [13:13:41.548] ...future.value <- base::withVisible(base::local({ [13:13:41.548] do.call(function(...) { [13:13:41.548] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:41.548] if (!identical(...future.globals.maxSize.org, [13:13:41.548] ...future.globals.maxSize)) { [13:13:41.548] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:41.548] on.exit(options(oopts), add = TRUE) [13:13:41.548] } [13:13:41.548] { [13:13:41.548] lapply(seq_along(...future.elements_ii), [13:13:41.548] FUN = function(jj) { [13:13:41.548] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:41.548] ...future.FUN(...future.X_jj, ...) [13:13:41.548] }) [13:13:41.548] } [13:13:41.548] }, args = future.call.arguments) [13:13:41.548] })) [13:13:41.548] future::FutureResult(value = ...future.value$value, [13:13:41.548] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:41.548] ...future.rng), globalenv = if (FALSE) [13:13:41.548] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:41.548] ...future.globalenv.names)) [13:13:41.548] else NULL, started = ...future.startTime, version = "1.8") [13:13:41.548] }, condition = base::local({ [13:13:41.548] c <- base::c [13:13:41.548] inherits <- base::inherits [13:13:41.548] invokeRestart <- base::invokeRestart [13:13:41.548] length <- base::length [13:13:41.548] list <- base::list [13:13:41.548] seq.int <- base::seq.int [13:13:41.548] signalCondition <- base::signalCondition [13:13:41.548] sys.calls <- base::sys.calls [13:13:41.548] `[[` <- base::`[[` [13:13:41.548] `+` <- base::`+` [13:13:41.548] `<<-` <- base::`<<-` [13:13:41.548] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:41.548] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:41.548] 3L)] [13:13:41.548] } [13:13:41.548] function(cond) { [13:13:41.548] is_error <- inherits(cond, "error") [13:13:41.548] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:41.548] NULL) [13:13:41.548] if (is_error) { [13:13:41.548] sessionInformation <- function() { [13:13:41.548] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:41.548] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:41.548] search = base::search(), system = base::Sys.info()) [13:13:41.548] } [13:13:41.548] ...future.conditions[[length(...future.conditions) + [13:13:41.548] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:41.548] cond$call), session = sessionInformation(), [13:13:41.548] timestamp = base::Sys.time(), signaled = 0L) [13:13:41.548] signalCondition(cond) [13:13:41.548] } [13:13:41.548] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:41.548] "immediateCondition"))) { [13:13:41.548] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:41.548] ...future.conditions[[length(...future.conditions) + [13:13:41.548] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:41.548] if (TRUE && !signal) { [13:13:41.548] muffleCondition <- function (cond, pattern = "^muffle") [13:13:41.548] { [13:13:41.548] inherits <- base::inherits [13:13:41.548] invokeRestart <- base::invokeRestart [13:13:41.548] is.null <- base::is.null [13:13:41.548] muffled <- FALSE [13:13:41.548] if (inherits(cond, "message")) { [13:13:41.548] muffled <- grepl(pattern, "muffleMessage") [13:13:41.548] if (muffled) [13:13:41.548] invokeRestart("muffleMessage") [13:13:41.548] } [13:13:41.548] else if (inherits(cond, "warning")) { [13:13:41.548] muffled <- grepl(pattern, "muffleWarning") [13:13:41.548] if (muffled) [13:13:41.548] invokeRestart("muffleWarning") [13:13:41.548] } [13:13:41.548] else if (inherits(cond, "condition")) { [13:13:41.548] if (!is.null(pattern)) { [13:13:41.548] computeRestarts <- base::computeRestarts [13:13:41.548] grepl <- base::grepl [13:13:41.548] restarts <- computeRestarts(cond) [13:13:41.548] for (restart in restarts) { [13:13:41.548] name <- restart$name [13:13:41.548] if (is.null(name)) [13:13:41.548] next [13:13:41.548] if (!grepl(pattern, name)) [13:13:41.548] next [13:13:41.548] invokeRestart(restart) [13:13:41.548] muffled <- TRUE [13:13:41.548] break [13:13:41.548] } [13:13:41.548] } [13:13:41.548] } [13:13:41.548] invisible(muffled) [13:13:41.548] } [13:13:41.548] muffleCondition(cond, pattern = "^muffle") [13:13:41.548] } [13:13:41.548] } [13:13:41.548] else { [13:13:41.548] if (TRUE) { [13:13:41.548] muffleCondition <- function (cond, pattern = "^muffle") [13:13:41.548] { [13:13:41.548] inherits <- base::inherits [13:13:41.548] invokeRestart <- base::invokeRestart [13:13:41.548] is.null <- base::is.null [13:13:41.548] muffled <- FALSE [13:13:41.548] if (inherits(cond, "message")) { [13:13:41.548] muffled <- grepl(pattern, "muffleMessage") [13:13:41.548] if (muffled) [13:13:41.548] invokeRestart("muffleMessage") [13:13:41.548] } [13:13:41.548] else if (inherits(cond, "warning")) { [13:13:41.548] muffled <- grepl(pattern, "muffleWarning") [13:13:41.548] if (muffled) [13:13:41.548] invokeRestart("muffleWarning") [13:13:41.548] } [13:13:41.548] else if (inherits(cond, "condition")) { [13:13:41.548] if (!is.null(pattern)) { [13:13:41.548] computeRestarts <- base::computeRestarts [13:13:41.548] grepl <- base::grepl [13:13:41.548] restarts <- computeRestarts(cond) [13:13:41.548] for (restart in restarts) { [13:13:41.548] name <- restart$name [13:13:41.548] if (is.null(name)) [13:13:41.548] next [13:13:41.548] if (!grepl(pattern, name)) [13:13:41.548] next [13:13:41.548] invokeRestart(restart) [13:13:41.548] muffled <- TRUE [13:13:41.548] break [13:13:41.548] } [13:13:41.548] } [13:13:41.548] } [13:13:41.548] invisible(muffled) [13:13:41.548] } [13:13:41.548] muffleCondition(cond, pattern = "^muffle") [13:13:41.548] } [13:13:41.548] } [13:13:41.548] } [13:13:41.548] })) [13:13:41.548] }, error = function(ex) { [13:13:41.548] base::structure(base::list(value = NULL, visible = NULL, [13:13:41.548] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:41.548] ...future.rng), started = ...future.startTime, [13:13:41.548] finished = Sys.time(), session_uuid = NA_character_, [13:13:41.548] version = "1.8"), class = "FutureResult") [13:13:41.548] }, finally = { [13:13:41.548] if (!identical(...future.workdir, getwd())) [13:13:41.548] setwd(...future.workdir) [13:13:41.548] { [13:13:41.548] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:41.548] ...future.oldOptions$nwarnings <- NULL [13:13:41.548] } [13:13:41.548] base::options(...future.oldOptions) [13:13:41.548] if (.Platform$OS.type == "windows") { [13:13:41.548] old_names <- names(...future.oldEnvVars) [13:13:41.548] envs <- base::Sys.getenv() [13:13:41.548] names <- names(envs) [13:13:41.548] common <- intersect(names, old_names) [13:13:41.548] added <- setdiff(names, old_names) [13:13:41.548] removed <- setdiff(old_names, names) [13:13:41.548] changed <- common[...future.oldEnvVars[common] != [13:13:41.548] envs[common]] [13:13:41.548] NAMES <- toupper(changed) [13:13:41.548] args <- list() [13:13:41.548] for (kk in seq_along(NAMES)) { [13:13:41.548] name <- changed[[kk]] [13:13:41.548] NAME <- NAMES[[kk]] [13:13:41.548] if (name != NAME && is.element(NAME, old_names)) [13:13:41.548] next [13:13:41.548] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:41.548] } [13:13:41.548] NAMES <- toupper(added) [13:13:41.548] for (kk in seq_along(NAMES)) { [13:13:41.548] name <- added[[kk]] [13:13:41.548] NAME <- NAMES[[kk]] [13:13:41.548] if (name != NAME && is.element(NAME, old_names)) [13:13:41.548] next [13:13:41.548] args[[name]] <- "" [13:13:41.548] } [13:13:41.548] NAMES <- toupper(removed) [13:13:41.548] for (kk in seq_along(NAMES)) { [13:13:41.548] name <- removed[[kk]] [13:13:41.548] NAME <- NAMES[[kk]] [13:13:41.548] if (name != NAME && is.element(NAME, old_names)) [13:13:41.548] next [13:13:41.548] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:41.548] } [13:13:41.548] if (length(args) > 0) [13:13:41.548] base::do.call(base::Sys.setenv, args = args) [13:13:41.548] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:41.548] } [13:13:41.548] else { [13:13:41.548] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:41.548] } [13:13:41.548] { [13:13:41.548] if (base::length(...future.futureOptionsAdded) > [13:13:41.548] 0L) { [13:13:41.548] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:41.548] base::names(opts) <- ...future.futureOptionsAdded [13:13:41.548] base::options(opts) [13:13:41.548] } [13:13:41.548] { [13:13:41.548] { [13:13:41.548] NULL [13:13:41.548] RNGkind("Mersenne-Twister") [13:13:41.548] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:41.548] inherits = FALSE) [13:13:41.548] } [13:13:41.548] options(future.plan = NULL) [13:13:41.548] if (is.na(NA_character_)) [13:13:41.548] Sys.unsetenv("R_FUTURE_PLAN") [13:13:41.548] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:41.548] future::plan(list(function (..., workers = availableCores(), [13:13:41.548] lazy = FALSE, rscript_libs = .libPaths(), [13:13:41.548] envir = parent.frame()) [13:13:41.548] { [13:13:41.548] if (is.function(workers)) [13:13:41.548] workers <- workers() [13:13:41.548] workers <- structure(as.integer(workers), [13:13:41.548] class = class(workers)) [13:13:41.548] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:41.548] workers >= 1) [13:13:41.548] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:41.548] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:41.548] } [13:13:41.548] future <- MultisessionFuture(..., workers = workers, [13:13:41.548] lazy = lazy, rscript_libs = rscript_libs, [13:13:41.548] envir = envir) [13:13:41.548] if (!future$lazy) [13:13:41.548] future <- run(future) [13:13:41.548] invisible(future) [13:13:41.548] }), .cleanup = FALSE, .init = FALSE) [13:13:41.548] } [13:13:41.548] } [13:13:41.548] } [13:13:41.548] }) [13:13:41.548] if (TRUE) { [13:13:41.548] base::sink(type = "output", split = FALSE) [13:13:41.548] if (TRUE) { [13:13:41.548] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:41.548] } [13:13:41.548] else { [13:13:41.548] ...future.result["stdout"] <- base::list(NULL) [13:13:41.548] } [13:13:41.548] base::close(...future.stdout) [13:13:41.548] ...future.stdout <- NULL [13:13:41.548] } [13:13:41.548] ...future.result$conditions <- ...future.conditions [13:13:41.548] ...future.result$finished <- base::Sys.time() [13:13:41.548] ...future.result [13:13:41.548] } [13:13:41.552] assign_globals() ... [13:13:41.552] List of 5 [13:13:41.552] $ ...future.FUN :function (x, ...) [13:13:41.552] $ future.call.arguments : list() [13:13:41.552] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:41.552] $ ...future.elements_ii :List of 2 [13:13:41.552] ..$ a:Classes 'listenv', 'environment' [13:13:41.552] ..$ b:Classes 'listenv', 'environment' [13:13:41.552] $ ...future.seeds_ii : NULL [13:13:41.552] $ ...future.globals.maxSize: NULL [13:13:41.552] - attr(*, "where")=List of 5 [13:13:41.552] ..$ ...future.FUN : [13:13:41.552] ..$ future.call.arguments : [13:13:41.552] ..$ ...future.elements_ii : [13:13:41.552] ..$ ...future.seeds_ii : [13:13:41.552] ..$ ...future.globals.maxSize: [13:13:41.552] - attr(*, "resolved")= logi FALSE [13:13:41.552] - attr(*, "total_size")= num 4968 [13:13:41.552] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:41.552] - attr(*, "already-done")= logi TRUE [13:13:41.558] - copied '...future.FUN' to environment [13:13:41.558] - copied 'future.call.arguments' to environment [13:13:41.558] - copied '...future.elements_ii' to environment [13:13:41.559] - copied '...future.seeds_ii' to environment [13:13:41.559] - copied '...future.globals.maxSize' to environment [13:13:41.559] assign_globals() ... done [13:13:41.559] plan(): Setting new future strategy stack: [13:13:41.560] List of future strategies: [13:13:41.560] 1. sequential: [13:13:41.560] - args: function (..., envir = parent.frame(), workers = "") [13:13:41.560] - tweaked: FALSE [13:13:41.560] - call: NULL [13:13:41.560] plan(): nbrOfWorkers() = 1 [13:13:41.561] plan(): Setting new future strategy stack: [13:13:41.562] List of future strategies: [13:13:41.562] 1. multisession: [13:13:41.562] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [13:13:41.562] - tweaked: FALSE [13:13:41.562] - call: plan(strategy) [13:13:41.564] plan(): nbrOfWorkers() = 1 [13:13:41.564] SequentialFuture started (and completed) [13:13:41.565] - Launch lazy future ... done [13:13:41.565] run() for 'SequentialFuture' ... done [13:13:41.565] Created future: [13:13:41.565] SequentialFuture: [13:13:41.565] Label: 'future_lapply-1' [13:13:41.565] Expression: [13:13:41.565] { [13:13:41.565] do.call(function(...) { [13:13:41.565] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:41.565] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:41.565] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:41.565] on.exit(options(oopts), add = TRUE) [13:13:41.565] } [13:13:41.565] { [13:13:41.565] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:41.565] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:41.565] ...future.FUN(...future.X_jj, ...) [13:13:41.565] }) [13:13:41.565] } [13:13:41.565] }, args = future.call.arguments) [13:13:41.565] } [13:13:41.565] Lazy evaluation: FALSE [13:13:41.565] Asynchronous evaluation: FALSE [13:13:41.565] Local evaluation: TRUE [13:13:41.565] Environment: R_GlobalEnv [13:13:41.565] Capture standard output: TRUE [13:13:41.565] Capture condition classes: 'condition' (excluding 'nothing') [13:13:41.565] 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) [13:13:41.565] Packages: 1 packages ('listenv') [13:13:41.565] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:41.565] Resolved: TRUE [13:13:41.565] Value: 800 bytes of class 'list' [13:13:41.565] Early signaling: FALSE [13:13:41.565] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:41.565] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:41.567] Chunk #1 of 1 ... DONE [13:13:41.567] Launching 1 futures (chunks) ... DONE [13:13:41.567] Resolving 1 futures (chunks) ... [13:13:41.567] resolve() on list ... [13:13:41.567] recursive: 0 [13:13:41.567] length: 1 [13:13:41.568] [13:13:41.568] resolved() for 'SequentialFuture' ... [13:13:41.568] - state: 'finished' [13:13:41.568] - run: TRUE [13:13:41.568] - result: 'FutureResult' [13:13:41.568] resolved() for 'SequentialFuture' ... done [13:13:41.569] Future #1 [13:13:41.569] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:41.569] - nx: 1 [13:13:41.569] - relay: TRUE [13:13:41.569] - stdout: TRUE [13:13:41.570] - signal: TRUE [13:13:41.570] - resignal: FALSE [13:13:41.570] - force: TRUE [13:13:41.570] - relayed: [n=1] FALSE [13:13:41.570] - queued futures: [n=1] FALSE [13:13:41.570] - until=1 [13:13:41.570] - relaying element #1 [13:13:41.571] - relayed: [n=1] TRUE [13:13:41.571] - queued futures: [n=1] TRUE [13:13:41.571] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:41.571] length: 0 (resolved future 1) [13:13:41.571] Relaying remaining futures [13:13:41.572] signalConditionsASAP(NULL, pos=0) ... [13:13:41.572] - nx: 1 [13:13:41.572] - relay: TRUE [13:13:41.572] - stdout: TRUE [13:13:41.572] - signal: TRUE [13:13:41.572] - resignal: FALSE [13:13:41.572] - force: TRUE [13:13:41.573] - relayed: [n=1] TRUE [13:13:41.573] - queued futures: [n=1] TRUE - flush all [13:13:41.573] - relayed: [n=1] TRUE [13:13:41.573] - queued futures: [n=1] TRUE [13:13:41.573] signalConditionsASAP(NULL, pos=0) ... done [13:13:41.574] resolve() on list ... DONE [13:13:41.574] - Number of value chunks collected: 1 [13:13:41.574] Resolving 1 futures (chunks) ... DONE [13:13:41.574] Reducing values from 1 chunks ... [13:13:41.574] - Number of values collected after concatenation: 2 [13:13:41.574] - Number of values expected: 2 [13:13:41.575] Reducing values from 1 chunks ... DONE [13:13:41.575] 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, ...) ... [13:13:41.577] future_lapply() ... [13:13:41.579] Number of chunks: 1 [13:13:41.580] Index remapping (attribute 'ordering'): [n = 4] 4, 1, 3, 2 [13:13:41.580] getGlobalsAndPackagesXApply() ... [13:13:41.580] - future.globals: TRUE [13:13:41.580] getGlobalsAndPackages() ... [13:13:41.580] Searching for globals... [13:13:41.582] - globals found: [2] 'FUN', '.Internal' [13:13:41.582] Searching for globals ... DONE [13:13:41.582] Resolving globals: FALSE [13:13:41.583] The total size of the 1 globals is 2.13 KiB (2184 bytes) [13:13:41.583] 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') [13:13:41.583] - globals: [1] 'FUN' [13:13:41.583] [13:13:41.584] getGlobalsAndPackages() ... DONE [13:13:41.584] - globals found/used: [n=1] 'FUN' [13:13:41.584] - needed namespaces: [n=0] [13:13:41.584] Finding globals ... DONE [13:13:41.584] - use_args: TRUE [13:13:41.584] - Getting '...' globals ... [13:13:41.585] resolve() on list ... [13:13:41.585] recursive: 0 [13:13:41.585] length: 1 [13:13:41.585] elements: '...' [13:13:41.587] length: 0 (resolved future 1) [13:13:41.587] resolve() on list ... DONE [13:13:41.588] - '...' content: [n=1] 'length' [13:13:41.588] List of 1 [13:13:41.588] $ ...:List of 1 [13:13:41.588] ..$ length: int 2 [13:13:41.588] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:41.588] - attr(*, "where")=List of 1 [13:13:41.588] ..$ ...: [13:13:41.588] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:41.588] - attr(*, "resolved")= logi TRUE [13:13:41.588] - attr(*, "total_size")= num NA [13:13:41.591] - Getting '...' globals ... DONE [13:13:41.592] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:41.592] List of 2 [13:13:41.592] $ ...future.FUN:function (mode = "logical", length = 0L) [13:13:41.592] $ ... :List of 1 [13:13:41.592] ..$ length: int 2 [13:13:41.592] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:41.592] - attr(*, "where")=List of 2 [13:13:41.592] ..$ ...future.FUN: [13:13:41.592] ..$ ... : [13:13:41.592] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:41.592] - attr(*, "resolved")= logi FALSE [13:13:41.592] - attr(*, "total_size")= num 2240 [13:13:41.595] Packages to be attached in all futures: [n=0] [13:13:41.596] getGlobalsAndPackagesXApply() ... DONE [13:13:41.596] Number of futures (= number of chunks): 1 [13:13:41.596] Launching 1 futures (chunks) ... [13:13:41.596] Chunk #1 of 1 ... [13:13:41.596] - Finding globals in 'X' for chunk #1 ... [13:13:41.597] getGlobalsAndPackages() ... [13:13:41.597] Searching for globals... [13:13:41.597] [13:13:41.597] Searching for globals ... DONE [13:13:41.597] - globals: [0] [13:13:41.598] getGlobalsAndPackages() ... DONE [13:13:41.598] + additional globals found: [n=0] [13:13:41.598] + additional namespaces needed: [n=0] [13:13:41.598] - Finding globals in 'X' for chunk #1 ... DONE [13:13:41.598] - seeds: [13:13:41.598] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:41.599] getGlobalsAndPackages() ... [13:13:41.599] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:41.599] Resolving globals: FALSE [13:13:41.599] Tweak future expression to call with '...' arguments ... [13:13:41.599] { [13:13:41.599] do.call(function(...) { [13:13:41.599] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:41.599] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:41.599] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:41.599] on.exit(options(oopts), add = TRUE) [13:13:41.599] } [13:13:41.599] { [13:13:41.599] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:41.599] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:41.599] ...future.FUN(...future.X_jj, ...) [13:13:41.599] }) [13:13:41.599] } [13:13:41.599] }, args = future.call.arguments) [13:13:41.599] } [13:13:41.600] Tweak future expression to call with '...' arguments ... DONE [13:13:41.600] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:41.600] [13:13:41.601] getGlobalsAndPackages() ... DONE [13:13:41.601] run() for 'Future' ... [13:13:41.601] - state: 'created' [13:13:41.601] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:41.604] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:41.604] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:41.604] - Field: 'label' [13:13:41.604] - Field: 'local' [13:13:41.604] - Field: 'owner' [13:13:41.605] - Field: 'envir' [13:13:41.605] - Field: 'packages' [13:13:41.605] - Field: 'gc' [13:13:41.605] - Field: 'conditions' [13:13:41.605] - Field: 'expr' [13:13:41.605] - Field: 'uuid' [13:13:41.606] - Field: 'seed' [13:13:41.606] - Field: 'version' [13:13:41.606] - Field: 'result' [13:13:41.606] - Field: 'asynchronous' [13:13:41.606] - Field: 'calls' [13:13:41.607] - Field: 'globals' [13:13:41.607] - Field: 'stdout' [13:13:41.607] - Field: 'earlySignal' [13:13:41.607] - Field: 'lazy' [13:13:41.607] - Field: 'state' [13:13:41.607] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:41.608] - Launch lazy future ... [13:13:41.608] Packages needed by the future expression (n = 0): [13:13:41.608] Packages needed by future strategies (n = 0): [13:13:41.609] { [13:13:41.609] { [13:13:41.609] { [13:13:41.609] ...future.startTime <- base::Sys.time() [13:13:41.609] { [13:13:41.609] { [13:13:41.609] { [13:13:41.609] base::local({ [13:13:41.609] has_future <- base::requireNamespace("future", [13:13:41.609] quietly = TRUE) [13:13:41.609] if (has_future) { [13:13:41.609] ns <- base::getNamespace("future") [13:13:41.609] version <- ns[[".package"]][["version"]] [13:13:41.609] if (is.null(version)) [13:13:41.609] version <- utils::packageVersion("future") [13:13:41.609] } [13:13:41.609] else { [13:13:41.609] version <- NULL [13:13:41.609] } [13:13:41.609] if (!has_future || version < "1.8.0") { [13:13:41.609] info <- base::c(r_version = base::gsub("R version ", [13:13:41.609] "", base::R.version$version.string), [13:13:41.609] platform = base::sprintf("%s (%s-bit)", [13:13:41.609] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:41.609] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:41.609] "release", "version")], collapse = " "), [13:13:41.609] hostname = base::Sys.info()[["nodename"]]) [13:13:41.609] info <- base::sprintf("%s: %s", base::names(info), [13:13:41.609] info) [13:13:41.609] info <- base::paste(info, collapse = "; ") [13:13:41.609] if (!has_future) { [13:13:41.609] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:41.609] info) [13:13:41.609] } [13:13:41.609] else { [13:13:41.609] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:41.609] info, version) [13:13:41.609] } [13:13:41.609] base::stop(msg) [13:13:41.609] } [13:13:41.609] }) [13:13:41.609] } [13:13:41.609] options(future.plan = NULL) [13:13:41.609] Sys.unsetenv("R_FUTURE_PLAN") [13:13:41.609] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:41.609] } [13:13:41.609] ...future.workdir <- getwd() [13:13:41.609] } [13:13:41.609] ...future.oldOptions <- base::as.list(base::.Options) [13:13:41.609] ...future.oldEnvVars <- base::Sys.getenv() [13:13:41.609] } [13:13:41.609] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:41.609] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:41.609] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:41.609] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:41.609] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:41.609] future.stdout.windows.reencode = NULL, width = 80L) [13:13:41.609] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:41.609] base::names(...future.oldOptions)) [13:13:41.609] } [13:13:41.609] if (FALSE) { [13:13:41.609] } [13:13:41.609] else { [13:13:41.609] if (TRUE) { [13:13:41.609] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:41.609] open = "w") [13:13:41.609] } [13:13:41.609] else { [13:13:41.609] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:41.609] windows = "NUL", "/dev/null"), open = "w") [13:13:41.609] } [13:13:41.609] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:41.609] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:41.609] base::sink(type = "output", split = FALSE) [13:13:41.609] base::close(...future.stdout) [13:13:41.609] }, add = TRUE) [13:13:41.609] } [13:13:41.609] ...future.frame <- base::sys.nframe() [13:13:41.609] ...future.conditions <- base::list() [13:13:41.609] ...future.rng <- base::globalenv()$.Random.seed [13:13:41.609] if (FALSE) { [13:13:41.609] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:41.609] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:41.609] } [13:13:41.609] ...future.result <- base::tryCatch({ [13:13:41.609] base::withCallingHandlers({ [13:13:41.609] ...future.value <- base::withVisible(base::local({ [13:13:41.609] do.call(function(...) { [13:13:41.609] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:41.609] if (!identical(...future.globals.maxSize.org, [13:13:41.609] ...future.globals.maxSize)) { [13:13:41.609] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:41.609] on.exit(options(oopts), add = TRUE) [13:13:41.609] } [13:13:41.609] { [13:13:41.609] lapply(seq_along(...future.elements_ii), [13:13:41.609] FUN = function(jj) { [13:13:41.609] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:41.609] ...future.FUN(...future.X_jj, ...) [13:13:41.609] }) [13:13:41.609] } [13:13:41.609] }, args = future.call.arguments) [13:13:41.609] })) [13:13:41.609] future::FutureResult(value = ...future.value$value, [13:13:41.609] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:41.609] ...future.rng), globalenv = if (FALSE) [13:13:41.609] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:41.609] ...future.globalenv.names)) [13:13:41.609] else NULL, started = ...future.startTime, version = "1.8") [13:13:41.609] }, condition = base::local({ [13:13:41.609] c <- base::c [13:13:41.609] inherits <- base::inherits [13:13:41.609] invokeRestart <- base::invokeRestart [13:13:41.609] length <- base::length [13:13:41.609] list <- base::list [13:13:41.609] seq.int <- base::seq.int [13:13:41.609] signalCondition <- base::signalCondition [13:13:41.609] sys.calls <- base::sys.calls [13:13:41.609] `[[` <- base::`[[` [13:13:41.609] `+` <- base::`+` [13:13:41.609] `<<-` <- base::`<<-` [13:13:41.609] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:41.609] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:41.609] 3L)] [13:13:41.609] } [13:13:41.609] function(cond) { [13:13:41.609] is_error <- inherits(cond, "error") [13:13:41.609] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:41.609] NULL) [13:13:41.609] if (is_error) { [13:13:41.609] sessionInformation <- function() { [13:13:41.609] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:41.609] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:41.609] search = base::search(), system = base::Sys.info()) [13:13:41.609] } [13:13:41.609] ...future.conditions[[length(...future.conditions) + [13:13:41.609] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:41.609] cond$call), session = sessionInformation(), [13:13:41.609] timestamp = base::Sys.time(), signaled = 0L) [13:13:41.609] signalCondition(cond) [13:13:41.609] } [13:13:41.609] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:41.609] "immediateCondition"))) { [13:13:41.609] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:41.609] ...future.conditions[[length(...future.conditions) + [13:13:41.609] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:41.609] if (TRUE && !signal) { [13:13:41.609] muffleCondition <- function (cond, pattern = "^muffle") [13:13:41.609] { [13:13:41.609] inherits <- base::inherits [13:13:41.609] invokeRestart <- base::invokeRestart [13:13:41.609] is.null <- base::is.null [13:13:41.609] muffled <- FALSE [13:13:41.609] if (inherits(cond, "message")) { [13:13:41.609] muffled <- grepl(pattern, "muffleMessage") [13:13:41.609] if (muffled) [13:13:41.609] invokeRestart("muffleMessage") [13:13:41.609] } [13:13:41.609] else if (inherits(cond, "warning")) { [13:13:41.609] muffled <- grepl(pattern, "muffleWarning") [13:13:41.609] if (muffled) [13:13:41.609] invokeRestart("muffleWarning") [13:13:41.609] } [13:13:41.609] else if (inherits(cond, "condition")) { [13:13:41.609] if (!is.null(pattern)) { [13:13:41.609] computeRestarts <- base::computeRestarts [13:13:41.609] grepl <- base::grepl [13:13:41.609] restarts <- computeRestarts(cond) [13:13:41.609] for (restart in restarts) { [13:13:41.609] name <- restart$name [13:13:41.609] if (is.null(name)) [13:13:41.609] next [13:13:41.609] if (!grepl(pattern, name)) [13:13:41.609] next [13:13:41.609] invokeRestart(restart) [13:13:41.609] muffled <- TRUE [13:13:41.609] break [13:13:41.609] } [13:13:41.609] } [13:13:41.609] } [13:13:41.609] invisible(muffled) [13:13:41.609] } [13:13:41.609] muffleCondition(cond, pattern = "^muffle") [13:13:41.609] } [13:13:41.609] } [13:13:41.609] else { [13:13:41.609] if (TRUE) { [13:13:41.609] muffleCondition <- function (cond, pattern = "^muffle") [13:13:41.609] { [13:13:41.609] inherits <- base::inherits [13:13:41.609] invokeRestart <- base::invokeRestart [13:13:41.609] is.null <- base::is.null [13:13:41.609] muffled <- FALSE [13:13:41.609] if (inherits(cond, "message")) { [13:13:41.609] muffled <- grepl(pattern, "muffleMessage") [13:13:41.609] if (muffled) [13:13:41.609] invokeRestart("muffleMessage") [13:13:41.609] } [13:13:41.609] else if (inherits(cond, "warning")) { [13:13:41.609] muffled <- grepl(pattern, "muffleWarning") [13:13:41.609] if (muffled) [13:13:41.609] invokeRestart("muffleWarning") [13:13:41.609] } [13:13:41.609] else if (inherits(cond, "condition")) { [13:13:41.609] if (!is.null(pattern)) { [13:13:41.609] computeRestarts <- base::computeRestarts [13:13:41.609] grepl <- base::grepl [13:13:41.609] restarts <- computeRestarts(cond) [13:13:41.609] for (restart in restarts) { [13:13:41.609] name <- restart$name [13:13:41.609] if (is.null(name)) [13:13:41.609] next [13:13:41.609] if (!grepl(pattern, name)) [13:13:41.609] next [13:13:41.609] invokeRestart(restart) [13:13:41.609] muffled <- TRUE [13:13:41.609] break [13:13:41.609] } [13:13:41.609] } [13:13:41.609] } [13:13:41.609] invisible(muffled) [13:13:41.609] } [13:13:41.609] muffleCondition(cond, pattern = "^muffle") [13:13:41.609] } [13:13:41.609] } [13:13:41.609] } [13:13:41.609] })) [13:13:41.609] }, error = function(ex) { [13:13:41.609] base::structure(base::list(value = NULL, visible = NULL, [13:13:41.609] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:41.609] ...future.rng), started = ...future.startTime, [13:13:41.609] finished = Sys.time(), session_uuid = NA_character_, [13:13:41.609] version = "1.8"), class = "FutureResult") [13:13:41.609] }, finally = { [13:13:41.609] if (!identical(...future.workdir, getwd())) [13:13:41.609] setwd(...future.workdir) [13:13:41.609] { [13:13:41.609] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:41.609] ...future.oldOptions$nwarnings <- NULL [13:13:41.609] } [13:13:41.609] base::options(...future.oldOptions) [13:13:41.609] if (.Platform$OS.type == "windows") { [13:13:41.609] old_names <- names(...future.oldEnvVars) [13:13:41.609] envs <- base::Sys.getenv() [13:13:41.609] names <- names(envs) [13:13:41.609] common <- intersect(names, old_names) [13:13:41.609] added <- setdiff(names, old_names) [13:13:41.609] removed <- setdiff(old_names, names) [13:13:41.609] changed <- common[...future.oldEnvVars[common] != [13:13:41.609] envs[common]] [13:13:41.609] NAMES <- toupper(changed) [13:13:41.609] args <- list() [13:13:41.609] for (kk in seq_along(NAMES)) { [13:13:41.609] name <- changed[[kk]] [13:13:41.609] NAME <- NAMES[[kk]] [13:13:41.609] if (name != NAME && is.element(NAME, old_names)) [13:13:41.609] next [13:13:41.609] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:41.609] } [13:13:41.609] NAMES <- toupper(added) [13:13:41.609] for (kk in seq_along(NAMES)) { [13:13:41.609] name <- added[[kk]] [13:13:41.609] NAME <- NAMES[[kk]] [13:13:41.609] if (name != NAME && is.element(NAME, old_names)) [13:13:41.609] next [13:13:41.609] args[[name]] <- "" [13:13:41.609] } [13:13:41.609] NAMES <- toupper(removed) [13:13:41.609] for (kk in seq_along(NAMES)) { [13:13:41.609] name <- removed[[kk]] [13:13:41.609] NAME <- NAMES[[kk]] [13:13:41.609] if (name != NAME && is.element(NAME, old_names)) [13:13:41.609] next [13:13:41.609] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:41.609] } [13:13:41.609] if (length(args) > 0) [13:13:41.609] base::do.call(base::Sys.setenv, args = args) [13:13:41.609] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:41.609] } [13:13:41.609] else { [13:13:41.609] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:41.609] } [13:13:41.609] { [13:13:41.609] if (base::length(...future.futureOptionsAdded) > [13:13:41.609] 0L) { [13:13:41.609] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:41.609] base::names(opts) <- ...future.futureOptionsAdded [13:13:41.609] base::options(opts) [13:13:41.609] } [13:13:41.609] { [13:13:41.609] { [13:13:41.609] NULL [13:13:41.609] RNGkind("Mersenne-Twister") [13:13:41.609] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:41.609] inherits = FALSE) [13:13:41.609] } [13:13:41.609] options(future.plan = NULL) [13:13:41.609] if (is.na(NA_character_)) [13:13:41.609] Sys.unsetenv("R_FUTURE_PLAN") [13:13:41.609] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:41.609] future::plan(list(function (..., workers = availableCores(), [13:13:41.609] lazy = FALSE, rscript_libs = .libPaths(), [13:13:41.609] envir = parent.frame()) [13:13:41.609] { [13:13:41.609] if (is.function(workers)) [13:13:41.609] workers <- workers() [13:13:41.609] workers <- structure(as.integer(workers), [13:13:41.609] class = class(workers)) [13:13:41.609] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:41.609] workers >= 1) [13:13:41.609] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:41.609] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:41.609] } [13:13:41.609] future <- MultisessionFuture(..., workers = workers, [13:13:41.609] lazy = lazy, rscript_libs = rscript_libs, [13:13:41.609] envir = envir) [13:13:41.609] if (!future$lazy) [13:13:41.609] future <- run(future) [13:13:41.609] invisible(future) [13:13:41.609] }), .cleanup = FALSE, .init = FALSE) [13:13:41.609] } [13:13:41.609] } [13:13:41.609] } [13:13:41.609] }) [13:13:41.609] if (TRUE) { [13:13:41.609] base::sink(type = "output", split = FALSE) [13:13:41.609] if (TRUE) { [13:13:41.609] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:41.609] } [13:13:41.609] else { [13:13:41.609] ...future.result["stdout"] <- base::list(NULL) [13:13:41.609] } [13:13:41.609] base::close(...future.stdout) [13:13:41.609] ...future.stdout <- NULL [13:13:41.609] } [13:13:41.609] ...future.result$conditions <- ...future.conditions [13:13:41.609] ...future.result$finished <- base::Sys.time() [13:13:41.609] ...future.result [13:13:41.609] } [13:13:41.613] assign_globals() ... [13:13:41.613] List of 5 [13:13:41.613] $ ...future.FUN :function (mode = "logical", length = 0L) [13:13:41.613] $ future.call.arguments :List of 1 [13:13:41.613] ..$ length: int 2 [13:13:41.613] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:41.613] $ ...future.elements_ii :List of 4 [13:13:41.613] ..$ c: chr "list" [13:13:41.613] ..$ a: chr "integer" [13:13:41.613] ..$ c: chr "character" [13:13:41.613] ..$ b: chr "numeric" [13:13:41.613] $ ...future.seeds_ii : NULL [13:13:41.613] $ ...future.globals.maxSize: NULL [13:13:41.613] - attr(*, "where")=List of 5 [13:13:41.613] ..$ ...future.FUN : [13:13:41.613] ..$ future.call.arguments : [13:13:41.613] ..$ ...future.elements_ii : [13:13:41.613] ..$ ...future.seeds_ii : [13:13:41.613] ..$ ...future.globals.maxSize: [13:13:41.613] - attr(*, "resolved")= logi FALSE [13:13:41.613] - attr(*, "total_size")= num 2240 [13:13:41.613] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:41.613] - attr(*, "already-done")= logi TRUE [13:13:41.620] - copied '...future.FUN' to environment [13:13:41.620] - copied 'future.call.arguments' to environment [13:13:41.620] - copied '...future.elements_ii' to environment [13:13:41.620] - copied '...future.seeds_ii' to environment [13:13:41.621] - copied '...future.globals.maxSize' to environment [13:13:41.621] assign_globals() ... done [13:13:41.621] plan(): Setting new future strategy stack: [13:13:41.621] List of future strategies: [13:13:41.621] 1. sequential: [13:13:41.621] - args: function (..., envir = parent.frame(), workers = "") [13:13:41.621] - tweaked: FALSE [13:13:41.621] - call: NULL [13:13:41.622] plan(): nbrOfWorkers() = 1 [13:13:41.623] plan(): Setting new future strategy stack: [13:13:41.623] List of future strategies: [13:13:41.623] 1. multisession: [13:13:41.623] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [13:13:41.623] - tweaked: FALSE [13:13:41.623] - call: plan(strategy) [13:13:41.626] plan(): nbrOfWorkers() = 1 [13:13:41.626] SequentialFuture started (and completed) [13:13:41.626] - Launch lazy future ... done [13:13:41.626] run() for 'SequentialFuture' ... done [13:13:41.626] Created future: [13:13:41.627] SequentialFuture: [13:13:41.627] Label: 'future_lapply-1' [13:13:41.627] Expression: [13:13:41.627] { [13:13:41.627] do.call(function(...) { [13:13:41.627] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:41.627] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:41.627] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:41.627] on.exit(options(oopts), add = TRUE) [13:13:41.627] } [13:13:41.627] { [13:13:41.627] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:41.627] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:41.627] ...future.FUN(...future.X_jj, ...) [13:13:41.627] }) [13:13:41.627] } [13:13:41.627] }, args = future.call.arguments) [13:13:41.627] } [13:13:41.627] Lazy evaluation: FALSE [13:13:41.627] Asynchronous evaluation: FALSE [13:13:41.627] Local evaluation: TRUE [13:13:41.627] Environment: R_GlobalEnv [13:13:41.627] Capture standard output: TRUE [13:13:41.627] Capture condition classes: 'condition' (excluding 'nothing') [13:13:41.627] 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) [13:13:41.627] Packages: [13:13:41.627] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:41.627] Resolved: TRUE [13:13:41.627] Value: 240 bytes of class 'list' [13:13:41.627] Early signaling: FALSE [13:13:41.627] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:41.627] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:41.628] Chunk #1 of 1 ... DONE [13:13:41.628] Launching 1 futures (chunks) ... DONE [13:13:41.628] Resolving 1 futures (chunks) ... [13:13:41.628] resolve() on list ... [13:13:41.629] recursive: 0 [13:13:41.629] length: 1 [13:13:41.629] [13:13:41.629] resolved() for 'SequentialFuture' ... [13:13:41.629] - state: 'finished' [13:13:41.629] - run: TRUE [13:13:41.630] - result: 'FutureResult' [13:13:41.630] resolved() for 'SequentialFuture' ... done [13:13:41.630] Future #1 [13:13:41.630] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:41.630] - nx: 1 [13:13:41.631] - relay: TRUE [13:13:41.631] - stdout: TRUE [13:13:41.631] - signal: TRUE [13:13:41.631] - resignal: FALSE [13:13:41.631] - force: TRUE [13:13:41.631] - relayed: [n=1] FALSE [13:13:41.631] - queued futures: [n=1] FALSE [13:13:41.632] - until=1 [13:13:41.632] - relaying element #1 [13:13:41.632] - relayed: [n=1] TRUE [13:13:41.632] - queued futures: [n=1] TRUE [13:13:41.633] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:41.633] length: 0 (resolved future 1) [13:13:41.633] Relaying remaining futures [13:13:41.633] signalConditionsASAP(NULL, pos=0) ... [13:13:41.633] - nx: 1 [13:13:41.633] - relay: TRUE [13:13:41.633] - stdout: TRUE [13:13:41.634] - signal: TRUE [13:13:41.634] - resignal: FALSE [13:13:41.634] - force: TRUE [13:13:41.634] - relayed: [n=1] TRUE [13:13:41.634] - queued futures: [n=1] TRUE - flush all [13:13:41.634] - relayed: [n=1] TRUE [13:13:41.635] - queued futures: [n=1] TRUE [13:13:41.635] signalConditionsASAP(NULL, pos=0) ... done [13:13:41.635] resolve() on list ... DONE [13:13:41.635] - Number of value chunks collected: 1 [13:13:41.635] Resolving 1 futures (chunks) ... DONE [13:13:41.636] Reducing values from 1 chunks ... [13:13:41.636] - Number of values collected after concatenation: 4 [13:13:41.636] - Number of values expected: 4 [13:13:41.636] Reverse index remapping (attribute 'ordering'): [n = 4] 2, 4, 3, 1 [13:13:41.636] Reducing values from 1 chunks ... DONE [13:13:41.636] 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 [13:13:41.639] future_lapply() ... [13:13:41.642] Number of chunks: 1 [13:13:41.642] Index remapping (attribute 'ordering'): [n = 4] 1, 4, 2, 3 [13:13:41.642] getGlobalsAndPackagesXApply() ... [13:13:41.642] - future.globals: TRUE [13:13:41.642] getGlobalsAndPackages() ... [13:13:41.643] Searching for globals... [13:13:41.644] - globals found: [2] 'FUN', '.Internal' [13:13:41.644] Searching for globals ... DONE [13:13:41.644] Resolving globals: FALSE [13:13:41.645] The total size of the 1 globals is 2.13 KiB (2184 bytes) [13:13:41.645] 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') [13:13:41.645] - globals: [1] 'FUN' [13:13:41.646] [13:13:41.646] getGlobalsAndPackages() ... DONE [13:13:41.646] - globals found/used: [n=1] 'FUN' [13:13:41.646] - needed namespaces: [n=0] [13:13:41.646] Finding globals ... DONE [13:13:41.646] - use_args: TRUE [13:13:41.646] - Getting '...' globals ... [13:13:41.647] resolve() on list ... [13:13:41.647] recursive: 0 [13:13:41.647] length: 1 [13:13:41.647] elements: '...' [13:13:41.648] length: 0 (resolved future 1) [13:13:41.648] resolve() on list ... DONE [13:13:41.648] - '...' content: [n=1] 'length' [13:13:41.648] List of 1 [13:13:41.648] $ ...:List of 1 [13:13:41.648] ..$ length: int 2 [13:13:41.648] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:41.648] - attr(*, "where")=List of 1 [13:13:41.648] ..$ ...: [13:13:41.648] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:41.648] - attr(*, "resolved")= logi TRUE [13:13:41.648] - attr(*, "total_size")= num NA [13:13:41.652] - Getting '...' globals ... DONE [13:13:41.652] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:41.652] List of 2 [13:13:41.652] $ ...future.FUN:function (mode = "logical", length = 0L) [13:13:41.652] $ ... :List of 1 [13:13:41.652] ..$ length: int 2 [13:13:41.652] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:41.652] - attr(*, "where")=List of 2 [13:13:41.652] ..$ ...future.FUN: [13:13:41.652] ..$ ... : [13:13:41.652] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:41.652] - attr(*, "resolved")= logi FALSE [13:13:41.652] - attr(*, "total_size")= num 2240 [13:13:41.656] Packages to be attached in all futures: [n=0] [13:13:41.656] getGlobalsAndPackagesXApply() ... DONE [13:13:41.656] Number of futures (= number of chunks): 1 [13:13:41.657] Launching 1 futures (chunks) ... [13:13:41.657] Chunk #1 of 1 ... [13:13:41.657] - Finding globals in 'X' for chunk #1 ... [13:13:41.657] getGlobalsAndPackages() ... [13:13:41.657] Searching for globals... [13:13:41.658] [13:13:41.658] Searching for globals ... DONE [13:13:41.658] - globals: [0] [13:13:41.658] getGlobalsAndPackages() ... DONE [13:13:41.658] + additional globals found: [n=0] [13:13:41.658] + additional namespaces needed: [n=0] [13:13:41.658] - Finding globals in 'X' for chunk #1 ... DONE [13:13:41.659] - seeds: [13:13:41.659] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:41.659] getGlobalsAndPackages() ... [13:13:41.659] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:41.659] Resolving globals: FALSE [13:13:41.659] Tweak future expression to call with '...' arguments ... [13:13:41.660] { [13:13:41.660] do.call(function(...) { [13:13:41.660] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:41.660] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:41.660] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:41.660] on.exit(options(oopts), add = TRUE) [13:13:41.660] } [13:13:41.660] { [13:13:41.660] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:41.660] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:41.660] ...future.FUN(...future.X_jj, ...) [13:13:41.660] }) [13:13:41.660] } [13:13:41.660] }, args = future.call.arguments) [13:13:41.660] } [13:13:41.660] Tweak future expression to call with '...' arguments ... DONE [13:13:41.661] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:41.661] [13:13:41.661] getGlobalsAndPackages() ... DONE [13:13:41.661] run() for 'Future' ... [13:13:41.661] - state: 'created' [13:13:41.662] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:41.664] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:41.664] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:41.664] - Field: 'label' [13:13:41.665] - Field: 'local' [13:13:41.665] - Field: 'owner' [13:13:41.665] - Field: 'envir' [13:13:41.665] - Field: 'packages' [13:13:41.665] - Field: 'gc' [13:13:41.665] - Field: 'conditions' [13:13:41.666] - Field: 'expr' [13:13:41.666] - Field: 'uuid' [13:13:41.666] - Field: 'seed' [13:13:41.666] - Field: 'version' [13:13:41.666] - Field: 'result' [13:13:41.667] - Field: 'asynchronous' [13:13:41.667] - Field: 'calls' [13:13:41.667] - Field: 'globals' [13:13:41.667] - Field: 'stdout' [13:13:41.667] - Field: 'earlySignal' [13:13:41.667] - Field: 'lazy' [13:13:41.668] - Field: 'state' [13:13:41.668] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:41.668] - Launch lazy future ... [13:13:41.668] Packages needed by the future expression (n = 0): [13:13:41.668] Packages needed by future strategies (n = 0): [13:13:41.669] { [13:13:41.669] { [13:13:41.669] { [13:13:41.669] ...future.startTime <- base::Sys.time() [13:13:41.669] { [13:13:41.669] { [13:13:41.669] { [13:13:41.669] base::local({ [13:13:41.669] has_future <- base::requireNamespace("future", [13:13:41.669] quietly = TRUE) [13:13:41.669] if (has_future) { [13:13:41.669] ns <- base::getNamespace("future") [13:13:41.669] version <- ns[[".package"]][["version"]] [13:13:41.669] if (is.null(version)) [13:13:41.669] version <- utils::packageVersion("future") [13:13:41.669] } [13:13:41.669] else { [13:13:41.669] version <- NULL [13:13:41.669] } [13:13:41.669] if (!has_future || version < "1.8.0") { [13:13:41.669] info <- base::c(r_version = base::gsub("R version ", [13:13:41.669] "", base::R.version$version.string), [13:13:41.669] platform = base::sprintf("%s (%s-bit)", [13:13:41.669] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:41.669] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:41.669] "release", "version")], collapse = " "), [13:13:41.669] hostname = base::Sys.info()[["nodename"]]) [13:13:41.669] info <- base::sprintf("%s: %s", base::names(info), [13:13:41.669] info) [13:13:41.669] info <- base::paste(info, collapse = "; ") [13:13:41.669] if (!has_future) { [13:13:41.669] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:41.669] info) [13:13:41.669] } [13:13:41.669] else { [13:13:41.669] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:41.669] info, version) [13:13:41.669] } [13:13:41.669] base::stop(msg) [13:13:41.669] } [13:13:41.669] }) [13:13:41.669] } [13:13:41.669] options(future.plan = NULL) [13:13:41.669] Sys.unsetenv("R_FUTURE_PLAN") [13:13:41.669] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:41.669] } [13:13:41.669] ...future.workdir <- getwd() [13:13:41.669] } [13:13:41.669] ...future.oldOptions <- base::as.list(base::.Options) [13:13:41.669] ...future.oldEnvVars <- base::Sys.getenv() [13:13:41.669] } [13:13:41.669] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:41.669] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:41.669] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:41.669] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:41.669] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:41.669] future.stdout.windows.reencode = NULL, width = 80L) [13:13:41.669] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:41.669] base::names(...future.oldOptions)) [13:13:41.669] } [13:13:41.669] if (FALSE) { [13:13:41.669] } [13:13:41.669] else { [13:13:41.669] if (TRUE) { [13:13:41.669] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:41.669] open = "w") [13:13:41.669] } [13:13:41.669] else { [13:13:41.669] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:41.669] windows = "NUL", "/dev/null"), open = "w") [13:13:41.669] } [13:13:41.669] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:41.669] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:41.669] base::sink(type = "output", split = FALSE) [13:13:41.669] base::close(...future.stdout) [13:13:41.669] }, add = TRUE) [13:13:41.669] } [13:13:41.669] ...future.frame <- base::sys.nframe() [13:13:41.669] ...future.conditions <- base::list() [13:13:41.669] ...future.rng <- base::globalenv()$.Random.seed [13:13:41.669] if (FALSE) { [13:13:41.669] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:41.669] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:41.669] } [13:13:41.669] ...future.result <- base::tryCatch({ [13:13:41.669] base::withCallingHandlers({ [13:13:41.669] ...future.value <- base::withVisible(base::local({ [13:13:41.669] do.call(function(...) { [13:13:41.669] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:41.669] if (!identical(...future.globals.maxSize.org, [13:13:41.669] ...future.globals.maxSize)) { [13:13:41.669] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:41.669] on.exit(options(oopts), add = TRUE) [13:13:41.669] } [13:13:41.669] { [13:13:41.669] lapply(seq_along(...future.elements_ii), [13:13:41.669] FUN = function(jj) { [13:13:41.669] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:41.669] ...future.FUN(...future.X_jj, ...) [13:13:41.669] }) [13:13:41.669] } [13:13:41.669] }, args = future.call.arguments) [13:13:41.669] })) [13:13:41.669] future::FutureResult(value = ...future.value$value, [13:13:41.669] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:41.669] ...future.rng), globalenv = if (FALSE) [13:13:41.669] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:41.669] ...future.globalenv.names)) [13:13:41.669] else NULL, started = ...future.startTime, version = "1.8") [13:13:41.669] }, condition = base::local({ [13:13:41.669] c <- base::c [13:13:41.669] inherits <- base::inherits [13:13:41.669] invokeRestart <- base::invokeRestart [13:13:41.669] length <- base::length [13:13:41.669] list <- base::list [13:13:41.669] seq.int <- base::seq.int [13:13:41.669] signalCondition <- base::signalCondition [13:13:41.669] sys.calls <- base::sys.calls [13:13:41.669] `[[` <- base::`[[` [13:13:41.669] `+` <- base::`+` [13:13:41.669] `<<-` <- base::`<<-` [13:13:41.669] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:41.669] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:41.669] 3L)] [13:13:41.669] } [13:13:41.669] function(cond) { [13:13:41.669] is_error <- inherits(cond, "error") [13:13:41.669] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:41.669] NULL) [13:13:41.669] if (is_error) { [13:13:41.669] sessionInformation <- function() { [13:13:41.669] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:41.669] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:41.669] search = base::search(), system = base::Sys.info()) [13:13:41.669] } [13:13:41.669] ...future.conditions[[length(...future.conditions) + [13:13:41.669] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:41.669] cond$call), session = sessionInformation(), [13:13:41.669] timestamp = base::Sys.time(), signaled = 0L) [13:13:41.669] signalCondition(cond) [13:13:41.669] } [13:13:41.669] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:41.669] "immediateCondition"))) { [13:13:41.669] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:41.669] ...future.conditions[[length(...future.conditions) + [13:13:41.669] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:41.669] if (TRUE && !signal) { [13:13:41.669] muffleCondition <- function (cond, pattern = "^muffle") [13:13:41.669] { [13:13:41.669] inherits <- base::inherits [13:13:41.669] invokeRestart <- base::invokeRestart [13:13:41.669] is.null <- base::is.null [13:13:41.669] muffled <- FALSE [13:13:41.669] if (inherits(cond, "message")) { [13:13:41.669] muffled <- grepl(pattern, "muffleMessage") [13:13:41.669] if (muffled) [13:13:41.669] invokeRestart("muffleMessage") [13:13:41.669] } [13:13:41.669] else if (inherits(cond, "warning")) { [13:13:41.669] muffled <- grepl(pattern, "muffleWarning") [13:13:41.669] if (muffled) [13:13:41.669] invokeRestart("muffleWarning") [13:13:41.669] } [13:13:41.669] else if (inherits(cond, "condition")) { [13:13:41.669] if (!is.null(pattern)) { [13:13:41.669] computeRestarts <- base::computeRestarts [13:13:41.669] grepl <- base::grepl [13:13:41.669] restarts <- computeRestarts(cond) [13:13:41.669] for (restart in restarts) { [13:13:41.669] name <- restart$name [13:13:41.669] if (is.null(name)) [13:13:41.669] next [13:13:41.669] if (!grepl(pattern, name)) [13:13:41.669] next [13:13:41.669] invokeRestart(restart) [13:13:41.669] muffled <- TRUE [13:13:41.669] break [13:13:41.669] } [13:13:41.669] } [13:13:41.669] } [13:13:41.669] invisible(muffled) [13:13:41.669] } [13:13:41.669] muffleCondition(cond, pattern = "^muffle") [13:13:41.669] } [13:13:41.669] } [13:13:41.669] else { [13:13:41.669] if (TRUE) { [13:13:41.669] muffleCondition <- function (cond, pattern = "^muffle") [13:13:41.669] { [13:13:41.669] inherits <- base::inherits [13:13:41.669] invokeRestart <- base::invokeRestart [13:13:41.669] is.null <- base::is.null [13:13:41.669] muffled <- FALSE [13:13:41.669] if (inherits(cond, "message")) { [13:13:41.669] muffled <- grepl(pattern, "muffleMessage") [13:13:41.669] if (muffled) [13:13:41.669] invokeRestart("muffleMessage") [13:13:41.669] } [13:13:41.669] else if (inherits(cond, "warning")) { [13:13:41.669] muffled <- grepl(pattern, "muffleWarning") [13:13:41.669] if (muffled) [13:13:41.669] invokeRestart("muffleWarning") [13:13:41.669] } [13:13:41.669] else if (inherits(cond, "condition")) { [13:13:41.669] if (!is.null(pattern)) { [13:13:41.669] computeRestarts <- base::computeRestarts [13:13:41.669] grepl <- base::grepl [13:13:41.669] restarts <- computeRestarts(cond) [13:13:41.669] for (restart in restarts) { [13:13:41.669] name <- restart$name [13:13:41.669] if (is.null(name)) [13:13:41.669] next [13:13:41.669] if (!grepl(pattern, name)) [13:13:41.669] next [13:13:41.669] invokeRestart(restart) [13:13:41.669] muffled <- TRUE [13:13:41.669] break [13:13:41.669] } [13:13:41.669] } [13:13:41.669] } [13:13:41.669] invisible(muffled) [13:13:41.669] } [13:13:41.669] muffleCondition(cond, pattern = "^muffle") [13:13:41.669] } [13:13:41.669] } [13:13:41.669] } [13:13:41.669] })) [13:13:41.669] }, error = function(ex) { [13:13:41.669] base::structure(base::list(value = NULL, visible = NULL, [13:13:41.669] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:41.669] ...future.rng), started = ...future.startTime, [13:13:41.669] finished = Sys.time(), session_uuid = NA_character_, [13:13:41.669] version = "1.8"), class = "FutureResult") [13:13:41.669] }, finally = { [13:13:41.669] if (!identical(...future.workdir, getwd())) [13:13:41.669] setwd(...future.workdir) [13:13:41.669] { [13:13:41.669] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:41.669] ...future.oldOptions$nwarnings <- NULL [13:13:41.669] } [13:13:41.669] base::options(...future.oldOptions) [13:13:41.669] if (.Platform$OS.type == "windows") { [13:13:41.669] old_names <- names(...future.oldEnvVars) [13:13:41.669] envs <- base::Sys.getenv() [13:13:41.669] names <- names(envs) [13:13:41.669] common <- intersect(names, old_names) [13:13:41.669] added <- setdiff(names, old_names) [13:13:41.669] removed <- setdiff(old_names, names) [13:13:41.669] changed <- common[...future.oldEnvVars[common] != [13:13:41.669] envs[common]] [13:13:41.669] NAMES <- toupper(changed) [13:13:41.669] args <- list() [13:13:41.669] for (kk in seq_along(NAMES)) { [13:13:41.669] name <- changed[[kk]] [13:13:41.669] NAME <- NAMES[[kk]] [13:13:41.669] if (name != NAME && is.element(NAME, old_names)) [13:13:41.669] next [13:13:41.669] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:41.669] } [13:13:41.669] NAMES <- toupper(added) [13:13:41.669] for (kk in seq_along(NAMES)) { [13:13:41.669] name <- added[[kk]] [13:13:41.669] NAME <- NAMES[[kk]] [13:13:41.669] if (name != NAME && is.element(NAME, old_names)) [13:13:41.669] next [13:13:41.669] args[[name]] <- "" [13:13:41.669] } [13:13:41.669] NAMES <- toupper(removed) [13:13:41.669] for (kk in seq_along(NAMES)) { [13:13:41.669] name <- removed[[kk]] [13:13:41.669] NAME <- NAMES[[kk]] [13:13:41.669] if (name != NAME && is.element(NAME, old_names)) [13:13:41.669] next [13:13:41.669] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:41.669] } [13:13:41.669] if (length(args) > 0) [13:13:41.669] base::do.call(base::Sys.setenv, args = args) [13:13:41.669] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:41.669] } [13:13:41.669] else { [13:13:41.669] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:41.669] } [13:13:41.669] { [13:13:41.669] if (base::length(...future.futureOptionsAdded) > [13:13:41.669] 0L) { [13:13:41.669] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:41.669] base::names(opts) <- ...future.futureOptionsAdded [13:13:41.669] base::options(opts) [13:13:41.669] } [13:13:41.669] { [13:13:41.669] { [13:13:41.669] NULL [13:13:41.669] RNGkind("Mersenne-Twister") [13:13:41.669] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:41.669] inherits = FALSE) [13:13:41.669] } [13:13:41.669] options(future.plan = NULL) [13:13:41.669] if (is.na(NA_character_)) [13:13:41.669] Sys.unsetenv("R_FUTURE_PLAN") [13:13:41.669] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:41.669] future::plan(list(function (..., workers = availableCores(), [13:13:41.669] lazy = FALSE, rscript_libs = .libPaths(), [13:13:41.669] envir = parent.frame()) [13:13:41.669] { [13:13:41.669] if (is.function(workers)) [13:13:41.669] workers <- workers() [13:13:41.669] workers <- structure(as.integer(workers), [13:13:41.669] class = class(workers)) [13:13:41.669] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:41.669] workers >= 1) [13:13:41.669] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:41.669] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:41.669] } [13:13:41.669] future <- MultisessionFuture(..., workers = workers, [13:13:41.669] lazy = lazy, rscript_libs = rscript_libs, [13:13:41.669] envir = envir) [13:13:41.669] if (!future$lazy) [13:13:41.669] future <- run(future) [13:13:41.669] invisible(future) [13:13:41.669] }), .cleanup = FALSE, .init = FALSE) [13:13:41.669] } [13:13:41.669] } [13:13:41.669] } [13:13:41.669] }) [13:13:41.669] if (TRUE) { [13:13:41.669] base::sink(type = "output", split = FALSE) [13:13:41.669] if (TRUE) { [13:13:41.669] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:41.669] } [13:13:41.669] else { [13:13:41.669] ...future.result["stdout"] <- base::list(NULL) [13:13:41.669] } [13:13:41.669] base::close(...future.stdout) [13:13:41.669] ...future.stdout <- NULL [13:13:41.669] } [13:13:41.669] ...future.result$conditions <- ...future.conditions [13:13:41.669] ...future.result$finished <- base::Sys.time() [13:13:41.669] ...future.result [13:13:41.669] } [13:13:41.673] assign_globals() ... [13:13:41.673] List of 5 [13:13:41.673] $ ...future.FUN :function (mode = "logical", length = 0L) [13:13:41.673] $ future.call.arguments :List of 1 [13:13:41.673] ..$ length: int 2 [13:13:41.673] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:41.673] $ ...future.elements_ii :List of 4 [13:13:41.673] ..$ a: chr "integer" [13:13:41.673] ..$ c: chr "list" [13:13:41.673] ..$ b: chr "numeric" [13:13:41.673] ..$ c: chr "character" [13:13:41.673] $ ...future.seeds_ii : NULL [13:13:41.673] $ ...future.globals.maxSize: NULL [13:13:41.673] - attr(*, "where")=List of 5 [13:13:41.673] ..$ ...future.FUN : [13:13:41.673] ..$ future.call.arguments : [13:13:41.673] ..$ ...future.elements_ii : [13:13:41.673] ..$ ...future.seeds_ii : [13:13:41.673] ..$ ...future.globals.maxSize: [13:13:41.673] - attr(*, "resolved")= logi FALSE [13:13:41.673] - attr(*, "total_size")= num 2240 [13:13:41.673] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:41.673] - attr(*, "already-done")= logi TRUE [13:13:41.680] - copied '...future.FUN' to environment [13:13:41.680] - copied 'future.call.arguments' to environment [13:13:41.681] - copied '...future.elements_ii' to environment [13:13:41.681] - copied '...future.seeds_ii' to environment [13:13:41.681] - copied '...future.globals.maxSize' to environment [13:13:41.681] assign_globals() ... done [13:13:41.681] plan(): Setting new future strategy stack: [13:13:41.682] List of future strategies: [13:13:41.682] 1. sequential: [13:13:41.682] - args: function (..., envir = parent.frame(), workers = "") [13:13:41.682] - tweaked: FALSE [13:13:41.682] - call: NULL [13:13:41.682] plan(): nbrOfWorkers() = 1 [13:13:41.683] plan(): Setting new future strategy stack: [13:13:41.684] List of future strategies: [13:13:41.684] 1. multisession: [13:13:41.684] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [13:13:41.684] - tweaked: FALSE [13:13:41.684] - call: plan(strategy) [13:13:41.686] plan(): nbrOfWorkers() = 1 [13:13:41.686] SequentialFuture started (and completed) [13:13:41.687] - Launch lazy future ... done [13:13:41.687] run() for 'SequentialFuture' ... done [13:13:41.687] Created future: [13:13:41.687] SequentialFuture: [13:13:41.687] Label: 'future_lapply-1' [13:13:41.687] Expression: [13:13:41.687] { [13:13:41.687] do.call(function(...) { [13:13:41.687] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:41.687] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:41.687] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:41.687] on.exit(options(oopts), add = TRUE) [13:13:41.687] } [13:13:41.687] { [13:13:41.687] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:41.687] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:41.687] ...future.FUN(...future.X_jj, ...) [13:13:41.687] }) [13:13:41.687] } [13:13:41.687] }, args = future.call.arguments) [13:13:41.687] } [13:13:41.687] Lazy evaluation: FALSE [13:13:41.687] Asynchronous evaluation: FALSE [13:13:41.687] Local evaluation: TRUE [13:13:41.687] Environment: R_GlobalEnv [13:13:41.687] Capture standard output: TRUE [13:13:41.687] Capture condition classes: 'condition' (excluding 'nothing') [13:13:41.687] 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) [13:13:41.687] Packages: [13:13:41.687] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:41.687] Resolved: TRUE [13:13:41.687] Value: 240 bytes of class 'list' [13:13:41.687] Early signaling: FALSE [13:13:41.687] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:41.687] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:41.688] Chunk #1 of 1 ... DONE [13:13:41.689] Launching 1 futures (chunks) ... DONE [13:13:41.689] Resolving 1 futures (chunks) ... [13:13:41.689] resolve() on list ... [13:13:41.689] recursive: 0 [13:13:41.689] length: 1 [13:13:41.689] [13:13:41.690] resolved() for 'SequentialFuture' ... [13:13:41.690] - state: 'finished' [13:13:41.690] - run: TRUE [13:13:41.690] - result: 'FutureResult' [13:13:41.690] resolved() for 'SequentialFuture' ... done [13:13:41.691] Future #1 [13:13:41.691] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:41.691] - nx: 1 [13:13:41.691] - relay: TRUE [13:13:41.691] - stdout: TRUE [13:13:41.691] - signal: TRUE [13:13:41.692] - resignal: FALSE [13:13:41.692] - force: TRUE [13:13:41.692] - relayed: [n=1] FALSE [13:13:41.692] - queued futures: [n=1] FALSE [13:13:41.692] - until=1 [13:13:41.692] - relaying element #1 [13:13:41.693] - relayed: [n=1] TRUE [13:13:41.693] - queued futures: [n=1] TRUE [13:13:41.693] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:41.693] length: 0 (resolved future 1) [13:13:41.693] Relaying remaining futures [13:13:41.693] signalConditionsASAP(NULL, pos=0) ... [13:13:41.694] - nx: 1 [13:13:41.694] - relay: TRUE [13:13:41.694] - stdout: TRUE [13:13:41.694] - signal: TRUE [13:13:41.694] - resignal: FALSE [13:13:41.694] - force: TRUE [13:13:41.694] - relayed: [n=1] TRUE [13:13:41.695] - queued futures: [n=1] TRUE - flush all [13:13:41.695] - relayed: [n=1] TRUE [13:13:41.695] - queued futures: [n=1] TRUE [13:13:41.695] signalConditionsASAP(NULL, pos=0) ... done [13:13:41.695] resolve() on list ... DONE [13:13:41.696] - Number of value chunks collected: 1 [13:13:41.696] Resolving 1 futures (chunks) ... DONE [13:13:41.696] Reducing values from 1 chunks ... [13:13:41.696] - Number of values collected after concatenation: 4 [13:13:41.696] - Number of values expected: 4 [13:13:41.696] Reverse index remapping (attribute 'ordering'): [n = 4] 1, 3, 4, 2 [13:13:41.697] Reducing values from 1 chunks ... DONE [13:13:41.697] 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, ...) ... [13:13:41.701] future_lapply() ... [13:13:41.704] Number of chunks: 1 [13:13:41.704] Index remapping (attribute 'ordering'): [n = 4] 4, 1, 2, 3 [13:13:41.704] getGlobalsAndPackagesXApply() ... [13:13:41.704] - future.globals: TRUE [13:13:41.705] getGlobalsAndPackages() ... [13:13:41.705] Searching for globals... [13:13:41.706] - globals found: [2] 'FUN', '.Internal' [13:13:41.706] Searching for globals ... DONE [13:13:41.707] Resolving globals: FALSE [13:13:41.707] The total size of the 1 globals is 2.13 KiB (2184 bytes) [13:13:41.707] 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') [13:13:41.708] - globals: [1] 'FUN' [13:13:41.708] [13:13:41.708] getGlobalsAndPackages() ... DONE [13:13:41.708] - globals found/used: [n=1] 'FUN' [13:13:41.708] - needed namespaces: [n=0] [13:13:41.708] Finding globals ... DONE [13:13:41.709] - use_args: TRUE [13:13:41.709] - Getting '...' globals ... [13:13:41.709] resolve() on list ... [13:13:41.709] recursive: 0 [13:13:41.709] length: 1 [13:13:41.710] elements: '...' [13:13:41.710] length: 0 (resolved future 1) [13:13:41.710] resolve() on list ... DONE [13:13:41.710] - '...' content: [n=1] 'length' [13:13:41.710] List of 1 [13:13:41.710] $ ...:List of 1 [13:13:41.710] ..$ length: int 2 [13:13:41.710] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:41.710] - attr(*, "where")=List of 1 [13:13:41.710] ..$ ...: [13:13:41.710] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:41.710] - attr(*, "resolved")= logi TRUE [13:13:41.710] - attr(*, "total_size")= num NA [13:13:41.714] - Getting '...' globals ... DONE [13:13:41.714] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:41.714] List of 2 [13:13:41.714] $ ...future.FUN:function (mode = "logical", length = 0L) [13:13:41.714] $ ... :List of 1 [13:13:41.714] ..$ length: int 2 [13:13:41.714] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:41.714] - attr(*, "where")=List of 2 [13:13:41.714] ..$ ...future.FUN: [13:13:41.714] ..$ ... : [13:13:41.714] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:41.714] - attr(*, "resolved")= logi FALSE [13:13:41.714] - attr(*, "total_size")= num 2240 [13:13:41.718] Packages to be attached in all futures: [n=0] [13:13:41.718] getGlobalsAndPackagesXApply() ... DONE [13:13:41.718] Number of futures (= number of chunks): 1 [13:13:41.719] Launching 1 futures (chunks) ... [13:13:41.719] Chunk #1 of 1 ... [13:13:41.719] - Finding globals in 'X' for chunk #1 ... [13:13:41.719] getGlobalsAndPackages() ... [13:13:41.719] Searching for globals... [13:13:41.720] [13:13:41.720] Searching for globals ... DONE [13:13:41.720] - globals: [0] [13:13:41.720] getGlobalsAndPackages() ... DONE [13:13:41.720] + additional globals found: [n=0] [13:13:41.720] + additional namespaces needed: [n=0] [13:13:41.721] - Finding globals in 'X' for chunk #1 ... DONE [13:13:41.721] - seeds: [13:13:41.721] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:41.721] getGlobalsAndPackages() ... [13:13:41.721] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:41.721] Resolving globals: FALSE [13:13:41.722] Tweak future expression to call with '...' arguments ... [13:13:41.722] { [13:13:41.722] do.call(function(...) { [13:13:41.722] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:41.722] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:41.722] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:41.722] on.exit(options(oopts), add = TRUE) [13:13:41.722] } [13:13:41.722] { [13:13:41.722] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:41.722] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:41.722] ...future.FUN(...future.X_jj, ...) [13:13:41.722] }) [13:13:41.722] } [13:13:41.722] }, args = future.call.arguments) [13:13:41.722] } [13:13:41.722] Tweak future expression to call with '...' arguments ... DONE [13:13:41.723] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:41.723] [13:13:41.723] getGlobalsAndPackages() ... DONE [13:13:41.723] run() for 'Future' ... [13:13:41.724] - state: 'created' [13:13:41.724] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:41.726] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:41.726] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:41.727] - Field: 'label' [13:13:41.727] - Field: 'local' [13:13:41.727] - Field: 'owner' [13:13:41.727] - Field: 'envir' [13:13:41.727] - Field: 'packages' [13:13:41.728] - Field: 'gc' [13:13:41.728] - Field: 'conditions' [13:13:41.728] - Field: 'expr' [13:13:41.728] - Field: 'uuid' [13:13:41.728] - Field: 'seed' [13:13:41.728] - Field: 'version' [13:13:41.729] - Field: 'result' [13:13:41.729] - Field: 'asynchronous' [13:13:41.729] - Field: 'calls' [13:13:41.729] - Field: 'globals' [13:13:41.729] - Field: 'stdout' [13:13:41.729] - Field: 'earlySignal' [13:13:41.730] - Field: 'lazy' [13:13:41.730] - Field: 'state' [13:13:41.730] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:41.730] - Launch lazy future ... [13:13:41.730] Packages needed by the future expression (n = 0): [13:13:41.731] Packages needed by future strategies (n = 0): [13:13:41.731] { [13:13:41.731] { [13:13:41.731] { [13:13:41.731] ...future.startTime <- base::Sys.time() [13:13:41.731] { [13:13:41.731] { [13:13:41.731] { [13:13:41.731] base::local({ [13:13:41.731] has_future <- base::requireNamespace("future", [13:13:41.731] quietly = TRUE) [13:13:41.731] if (has_future) { [13:13:41.731] ns <- base::getNamespace("future") [13:13:41.731] version <- ns[[".package"]][["version"]] [13:13:41.731] if (is.null(version)) [13:13:41.731] version <- utils::packageVersion("future") [13:13:41.731] } [13:13:41.731] else { [13:13:41.731] version <- NULL [13:13:41.731] } [13:13:41.731] if (!has_future || version < "1.8.0") { [13:13:41.731] info <- base::c(r_version = base::gsub("R version ", [13:13:41.731] "", base::R.version$version.string), [13:13:41.731] platform = base::sprintf("%s (%s-bit)", [13:13:41.731] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:41.731] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:41.731] "release", "version")], collapse = " "), [13:13:41.731] hostname = base::Sys.info()[["nodename"]]) [13:13:41.731] info <- base::sprintf("%s: %s", base::names(info), [13:13:41.731] info) [13:13:41.731] info <- base::paste(info, collapse = "; ") [13:13:41.731] if (!has_future) { [13:13:41.731] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:41.731] info) [13:13:41.731] } [13:13:41.731] else { [13:13:41.731] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:41.731] info, version) [13:13:41.731] } [13:13:41.731] base::stop(msg) [13:13:41.731] } [13:13:41.731] }) [13:13:41.731] } [13:13:41.731] options(future.plan = NULL) [13:13:41.731] Sys.unsetenv("R_FUTURE_PLAN") [13:13:41.731] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:41.731] } [13:13:41.731] ...future.workdir <- getwd() [13:13:41.731] } [13:13:41.731] ...future.oldOptions <- base::as.list(base::.Options) [13:13:41.731] ...future.oldEnvVars <- base::Sys.getenv() [13:13:41.731] } [13:13:41.731] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:41.731] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:41.731] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:41.731] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:41.731] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:41.731] future.stdout.windows.reencode = NULL, width = 80L) [13:13:41.731] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:41.731] base::names(...future.oldOptions)) [13:13:41.731] } [13:13:41.731] if (FALSE) { [13:13:41.731] } [13:13:41.731] else { [13:13:41.731] if (TRUE) { [13:13:41.731] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:41.731] open = "w") [13:13:41.731] } [13:13:41.731] else { [13:13:41.731] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:41.731] windows = "NUL", "/dev/null"), open = "w") [13:13:41.731] } [13:13:41.731] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:41.731] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:41.731] base::sink(type = "output", split = FALSE) [13:13:41.731] base::close(...future.stdout) [13:13:41.731] }, add = TRUE) [13:13:41.731] } [13:13:41.731] ...future.frame <- base::sys.nframe() [13:13:41.731] ...future.conditions <- base::list() [13:13:41.731] ...future.rng <- base::globalenv()$.Random.seed [13:13:41.731] if (FALSE) { [13:13:41.731] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:41.731] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:41.731] } [13:13:41.731] ...future.result <- base::tryCatch({ [13:13:41.731] base::withCallingHandlers({ [13:13:41.731] ...future.value <- base::withVisible(base::local({ [13:13:41.731] do.call(function(...) { [13:13:41.731] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:41.731] if (!identical(...future.globals.maxSize.org, [13:13:41.731] ...future.globals.maxSize)) { [13:13:41.731] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:41.731] on.exit(options(oopts), add = TRUE) [13:13:41.731] } [13:13:41.731] { [13:13:41.731] lapply(seq_along(...future.elements_ii), [13:13:41.731] FUN = function(jj) { [13:13:41.731] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:41.731] ...future.FUN(...future.X_jj, ...) [13:13:41.731] }) [13:13:41.731] } [13:13:41.731] }, args = future.call.arguments) [13:13:41.731] })) [13:13:41.731] future::FutureResult(value = ...future.value$value, [13:13:41.731] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:41.731] ...future.rng), globalenv = if (FALSE) [13:13:41.731] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:41.731] ...future.globalenv.names)) [13:13:41.731] else NULL, started = ...future.startTime, version = "1.8") [13:13:41.731] }, condition = base::local({ [13:13:41.731] c <- base::c [13:13:41.731] inherits <- base::inherits [13:13:41.731] invokeRestart <- base::invokeRestart [13:13:41.731] length <- base::length [13:13:41.731] list <- base::list [13:13:41.731] seq.int <- base::seq.int [13:13:41.731] signalCondition <- base::signalCondition [13:13:41.731] sys.calls <- base::sys.calls [13:13:41.731] `[[` <- base::`[[` [13:13:41.731] `+` <- base::`+` [13:13:41.731] `<<-` <- base::`<<-` [13:13:41.731] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:41.731] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:41.731] 3L)] [13:13:41.731] } [13:13:41.731] function(cond) { [13:13:41.731] is_error <- inherits(cond, "error") [13:13:41.731] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:41.731] NULL) [13:13:41.731] if (is_error) { [13:13:41.731] sessionInformation <- function() { [13:13:41.731] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:41.731] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:41.731] search = base::search(), system = base::Sys.info()) [13:13:41.731] } [13:13:41.731] ...future.conditions[[length(...future.conditions) + [13:13:41.731] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:41.731] cond$call), session = sessionInformation(), [13:13:41.731] timestamp = base::Sys.time(), signaled = 0L) [13:13:41.731] signalCondition(cond) [13:13:41.731] } [13:13:41.731] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:41.731] "immediateCondition"))) { [13:13:41.731] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:41.731] ...future.conditions[[length(...future.conditions) + [13:13:41.731] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:41.731] if (TRUE && !signal) { [13:13:41.731] muffleCondition <- function (cond, pattern = "^muffle") [13:13:41.731] { [13:13:41.731] inherits <- base::inherits [13:13:41.731] invokeRestart <- base::invokeRestart [13:13:41.731] is.null <- base::is.null [13:13:41.731] muffled <- FALSE [13:13:41.731] if (inherits(cond, "message")) { [13:13:41.731] muffled <- grepl(pattern, "muffleMessage") [13:13:41.731] if (muffled) [13:13:41.731] invokeRestart("muffleMessage") [13:13:41.731] } [13:13:41.731] else if (inherits(cond, "warning")) { [13:13:41.731] muffled <- grepl(pattern, "muffleWarning") [13:13:41.731] if (muffled) [13:13:41.731] invokeRestart("muffleWarning") [13:13:41.731] } [13:13:41.731] else if (inherits(cond, "condition")) { [13:13:41.731] if (!is.null(pattern)) { [13:13:41.731] computeRestarts <- base::computeRestarts [13:13:41.731] grepl <- base::grepl [13:13:41.731] restarts <- computeRestarts(cond) [13:13:41.731] for (restart in restarts) { [13:13:41.731] name <- restart$name [13:13:41.731] if (is.null(name)) [13:13:41.731] next [13:13:41.731] if (!grepl(pattern, name)) [13:13:41.731] next [13:13:41.731] invokeRestart(restart) [13:13:41.731] muffled <- TRUE [13:13:41.731] break [13:13:41.731] } [13:13:41.731] } [13:13:41.731] } [13:13:41.731] invisible(muffled) [13:13:41.731] } [13:13:41.731] muffleCondition(cond, pattern = "^muffle") [13:13:41.731] } [13:13:41.731] } [13:13:41.731] else { [13:13:41.731] if (TRUE) { [13:13:41.731] muffleCondition <- function (cond, pattern = "^muffle") [13:13:41.731] { [13:13:41.731] inherits <- base::inherits [13:13:41.731] invokeRestart <- base::invokeRestart [13:13:41.731] is.null <- base::is.null [13:13:41.731] muffled <- FALSE [13:13:41.731] if (inherits(cond, "message")) { [13:13:41.731] muffled <- grepl(pattern, "muffleMessage") [13:13:41.731] if (muffled) [13:13:41.731] invokeRestart("muffleMessage") [13:13:41.731] } [13:13:41.731] else if (inherits(cond, "warning")) { [13:13:41.731] muffled <- grepl(pattern, "muffleWarning") [13:13:41.731] if (muffled) [13:13:41.731] invokeRestart("muffleWarning") [13:13:41.731] } [13:13:41.731] else if (inherits(cond, "condition")) { [13:13:41.731] if (!is.null(pattern)) { [13:13:41.731] computeRestarts <- base::computeRestarts [13:13:41.731] grepl <- base::grepl [13:13:41.731] restarts <- computeRestarts(cond) [13:13:41.731] for (restart in restarts) { [13:13:41.731] name <- restart$name [13:13:41.731] if (is.null(name)) [13:13:41.731] next [13:13:41.731] if (!grepl(pattern, name)) [13:13:41.731] next [13:13:41.731] invokeRestart(restart) [13:13:41.731] muffled <- TRUE [13:13:41.731] break [13:13:41.731] } [13:13:41.731] } [13:13:41.731] } [13:13:41.731] invisible(muffled) [13:13:41.731] } [13:13:41.731] muffleCondition(cond, pattern = "^muffle") [13:13:41.731] } [13:13:41.731] } [13:13:41.731] } [13:13:41.731] })) [13:13:41.731] }, error = function(ex) { [13:13:41.731] base::structure(base::list(value = NULL, visible = NULL, [13:13:41.731] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:41.731] ...future.rng), started = ...future.startTime, [13:13:41.731] finished = Sys.time(), session_uuid = NA_character_, [13:13:41.731] version = "1.8"), class = "FutureResult") [13:13:41.731] }, finally = { [13:13:41.731] if (!identical(...future.workdir, getwd())) [13:13:41.731] setwd(...future.workdir) [13:13:41.731] { [13:13:41.731] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:41.731] ...future.oldOptions$nwarnings <- NULL [13:13:41.731] } [13:13:41.731] base::options(...future.oldOptions) [13:13:41.731] if (.Platform$OS.type == "windows") { [13:13:41.731] old_names <- names(...future.oldEnvVars) [13:13:41.731] envs <- base::Sys.getenv() [13:13:41.731] names <- names(envs) [13:13:41.731] common <- intersect(names, old_names) [13:13:41.731] added <- setdiff(names, old_names) [13:13:41.731] removed <- setdiff(old_names, names) [13:13:41.731] changed <- common[...future.oldEnvVars[common] != [13:13:41.731] envs[common]] [13:13:41.731] NAMES <- toupper(changed) [13:13:41.731] args <- list() [13:13:41.731] for (kk in seq_along(NAMES)) { [13:13:41.731] name <- changed[[kk]] [13:13:41.731] NAME <- NAMES[[kk]] [13:13:41.731] if (name != NAME && is.element(NAME, old_names)) [13:13:41.731] next [13:13:41.731] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:41.731] } [13:13:41.731] NAMES <- toupper(added) [13:13:41.731] for (kk in seq_along(NAMES)) { [13:13:41.731] name <- added[[kk]] [13:13:41.731] NAME <- NAMES[[kk]] [13:13:41.731] if (name != NAME && is.element(NAME, old_names)) [13:13:41.731] next [13:13:41.731] args[[name]] <- "" [13:13:41.731] } [13:13:41.731] NAMES <- toupper(removed) [13:13:41.731] for (kk in seq_along(NAMES)) { [13:13:41.731] name <- removed[[kk]] [13:13:41.731] NAME <- NAMES[[kk]] [13:13:41.731] if (name != NAME && is.element(NAME, old_names)) [13:13:41.731] next [13:13:41.731] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:41.731] } [13:13:41.731] if (length(args) > 0) [13:13:41.731] base::do.call(base::Sys.setenv, args = args) [13:13:41.731] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:41.731] } [13:13:41.731] else { [13:13:41.731] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:41.731] } [13:13:41.731] { [13:13:41.731] if (base::length(...future.futureOptionsAdded) > [13:13:41.731] 0L) { [13:13:41.731] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:41.731] base::names(opts) <- ...future.futureOptionsAdded [13:13:41.731] base::options(opts) [13:13:41.731] } [13:13:41.731] { [13:13:41.731] { [13:13:41.731] NULL [13:13:41.731] RNGkind("Mersenne-Twister") [13:13:41.731] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:41.731] inherits = FALSE) [13:13:41.731] } [13:13:41.731] options(future.plan = NULL) [13:13:41.731] if (is.na(NA_character_)) [13:13:41.731] Sys.unsetenv("R_FUTURE_PLAN") [13:13:41.731] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:41.731] future::plan(list(function (..., workers = availableCores(), [13:13:41.731] lazy = FALSE, rscript_libs = .libPaths(), [13:13:41.731] envir = parent.frame()) [13:13:41.731] { [13:13:41.731] if (is.function(workers)) [13:13:41.731] workers <- workers() [13:13:41.731] workers <- structure(as.integer(workers), [13:13:41.731] class = class(workers)) [13:13:41.731] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:41.731] workers >= 1) [13:13:41.731] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:41.731] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:41.731] } [13:13:41.731] future <- MultisessionFuture(..., workers = workers, [13:13:41.731] lazy = lazy, rscript_libs = rscript_libs, [13:13:41.731] envir = envir) [13:13:41.731] if (!future$lazy) [13:13:41.731] future <- run(future) [13:13:41.731] invisible(future) [13:13:41.731] }), .cleanup = FALSE, .init = FALSE) [13:13:41.731] } [13:13:41.731] } [13:13:41.731] } [13:13:41.731] }) [13:13:41.731] if (TRUE) { [13:13:41.731] base::sink(type = "output", split = FALSE) [13:13:41.731] if (TRUE) { [13:13:41.731] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:41.731] } [13:13:41.731] else { [13:13:41.731] ...future.result["stdout"] <- base::list(NULL) [13:13:41.731] } [13:13:41.731] base::close(...future.stdout) [13:13:41.731] ...future.stdout <- NULL [13:13:41.731] } [13:13:41.731] ...future.result$conditions <- ...future.conditions [13:13:41.731] ...future.result$finished <- base::Sys.time() [13:13:41.731] ...future.result [13:13:41.731] } [13:13:41.735] assign_globals() ... [13:13:41.736] List of 5 [13:13:41.736] $ ...future.FUN :function (mode = "logical", length = 0L) [13:13:41.736] $ future.call.arguments :List of 1 [13:13:41.736] ..$ length: int 2 [13:13:41.736] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:41.736] $ ...future.elements_ii :List of 4 [13:13:41.736] ..$ c: chr "list" [13:13:41.736] ..$ a: chr "integer" [13:13:41.736] ..$ b: chr "numeric" [13:13:41.736] ..$ c: chr "character" [13:13:41.736] $ ...future.seeds_ii : NULL [13:13:41.736] $ ...future.globals.maxSize: NULL [13:13:41.736] - attr(*, "where")=List of 5 [13:13:41.736] ..$ ...future.FUN : [13:13:41.736] ..$ future.call.arguments : [13:13:41.736] ..$ ...future.elements_ii : [13:13:41.736] ..$ ...future.seeds_ii : [13:13:41.736] ..$ ...future.globals.maxSize: [13:13:41.736] - attr(*, "resolved")= logi FALSE [13:13:41.736] - attr(*, "total_size")= num 2240 [13:13:41.736] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:41.736] - attr(*, "already-done")= logi TRUE [13:13:41.743] - copied '...future.FUN' to environment [13:13:41.743] - copied 'future.call.arguments' to environment [13:13:41.743] - copied '...future.elements_ii' to environment [13:13:41.743] - copied '...future.seeds_ii' to environment [13:13:41.743] - copied '...future.globals.maxSize' to environment [13:13:41.743] assign_globals() ... done [13:13:41.744] plan(): Setting new future strategy stack: [13:13:41.744] List of future strategies: [13:13:41.744] 1. sequential: [13:13:41.744] - args: function (..., envir = parent.frame(), workers = "") [13:13:41.744] - tweaked: FALSE [13:13:41.744] - call: NULL [13:13:41.745] plan(): nbrOfWorkers() = 1 [13:13:41.746] plan(): Setting new future strategy stack: [13:13:41.746] List of future strategies: [13:13:41.746] 1. multisession: [13:13:41.746] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [13:13:41.746] - tweaked: FALSE [13:13:41.746] - call: plan(strategy) [13:13:41.748] plan(): nbrOfWorkers() = 1 [13:13:41.749] SequentialFuture started (and completed) [13:13:41.749] - Launch lazy future ... done [13:13:41.749] run() for 'SequentialFuture' ... done [13:13:41.749] Created future: [13:13:41.749] SequentialFuture: [13:13:41.749] Label: 'future_lapply-1' [13:13:41.749] Expression: [13:13:41.749] { [13:13:41.749] do.call(function(...) { [13:13:41.749] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:41.749] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:41.749] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:41.749] on.exit(options(oopts), add = TRUE) [13:13:41.749] } [13:13:41.749] { [13:13:41.749] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:41.749] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:41.749] ...future.FUN(...future.X_jj, ...) [13:13:41.749] }) [13:13:41.749] } [13:13:41.749] }, args = future.call.arguments) [13:13:41.749] } [13:13:41.749] Lazy evaluation: FALSE [13:13:41.749] Asynchronous evaluation: FALSE [13:13:41.749] Local evaluation: TRUE [13:13:41.749] Environment: R_GlobalEnv [13:13:41.749] Capture standard output: TRUE [13:13:41.749] Capture condition classes: 'condition' (excluding 'nothing') [13:13:41.749] 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) [13:13:41.749] Packages: [13:13:41.749] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:41.749] Resolved: TRUE [13:13:41.749] Value: 240 bytes of class 'list' [13:13:41.749] Early signaling: FALSE [13:13:41.749] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:41.749] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:41.751] Chunk #1 of 1 ... DONE [13:13:41.751] Launching 1 futures (chunks) ... DONE [13:13:41.751] Resolving 1 futures (chunks) ... [13:13:41.751] resolve() on list ... [13:13:41.751] recursive: 0 [13:13:41.752] length: 1 [13:13:41.752] [13:13:41.752] resolved() for 'SequentialFuture' ... [13:13:41.752] - state: 'finished' [13:13:41.752] - run: TRUE [13:13:41.752] - result: 'FutureResult' [13:13:41.753] resolved() for 'SequentialFuture' ... done [13:13:41.753] Future #1 [13:13:41.753] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:41.753] - nx: 1 [13:13:41.753] - relay: TRUE [13:13:41.753] - stdout: TRUE [13:13:41.754] - signal: TRUE [13:13:41.754] - resignal: FALSE [13:13:41.754] - force: TRUE [13:13:41.754] - relayed: [n=1] FALSE [13:13:41.754] - queued futures: [n=1] FALSE [13:13:41.754] - until=1 [13:13:41.755] - relaying element #1 [13:13:41.755] - relayed: [n=1] TRUE [13:13:41.755] - queued futures: [n=1] TRUE [13:13:41.755] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:41.755] length: 0 (resolved future 1) [13:13:41.756] Relaying remaining futures [13:13:41.756] signalConditionsASAP(NULL, pos=0) ... [13:13:41.756] - nx: 1 [13:13:41.756] - relay: TRUE [13:13:41.756] - stdout: TRUE [13:13:41.756] - signal: TRUE [13:13:41.756] - resignal: FALSE [13:13:41.757] - force: TRUE [13:13:41.757] - relayed: [n=1] TRUE [13:13:41.757] - queued futures: [n=1] TRUE - flush all [13:13:41.757] - relayed: [n=1] TRUE [13:13:41.757] - queued futures: [n=1] TRUE [13:13:41.757] signalConditionsASAP(NULL, pos=0) ... done [13:13:41.758] resolve() on list ... DONE [13:13:41.758] - Number of value chunks collected: 1 [13:13:41.758] Resolving 1 futures (chunks) ... DONE [13:13:41.758] Reducing values from 1 chunks ... [13:13:41.758] - Number of values collected after concatenation: 4 [13:13:41.758] - Number of values expected: 4 [13:13:41.759] Reverse index remapping (attribute 'ordering'): [n = 4] 2, 3, 4, 1 [13:13:41.759] Reducing values from 1 chunks ... DONE [13:13:41.759] 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, ...) ... [13:13:41.762] future_lapply() ... [13:13:41.772] Number of chunks: 1 [13:13:41.772] getGlobalsAndPackagesXApply() ... [13:13:41.773] - future.globals: TRUE [13:13:41.773] getGlobalsAndPackages() ... [13:13:41.773] Searching for globals... [13:13:41.783] - globals found: [22] 'FUN', 'if', 'missing', 'is.finite', '{', 'is.null', '<-', 'paste', 'length', '==', 'return', '>', '+', '[', 'seq_len', 'rev', 'c', '&&', '!', ':', '(', '-' [13:13:41.783] Searching for globals ... DONE [13:13:41.783] Resolving globals: FALSE [13:13:41.784] The total size of the 1 globals is 69.62 KiB (71288 bytes) [13:13:41.785] 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') [13:13:41.785] - globals: [1] 'FUN' [13:13:41.785] - packages: [1] 'future' [13:13:41.785] getGlobalsAndPackages() ... DONE [13:13:41.786] - globals found/used: [n=1] 'FUN' [13:13:41.786] - needed namespaces: [n=1] 'future' [13:13:41.786] Finding globals ... DONE [13:13:41.786] - use_args: TRUE [13:13:41.786] - Getting '...' globals ... [13:13:41.787] resolve() on list ... [13:13:41.787] recursive: 0 [13:13:41.787] length: 1 [13:13:41.787] elements: '...' [13:13:41.787] length: 0 (resolved future 1) [13:13:41.787] resolve() on list ... DONE [13:13:41.788] - '...' content: [n=2] 'collapse', 'maxHead' [13:13:41.788] List of 1 [13:13:41.788] $ ...:List of 2 [13:13:41.788] ..$ collapse: chr "; " [13:13:41.788] ..$ maxHead : int 3 [13:13:41.788] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:41.788] - attr(*, "where")=List of 1 [13:13:41.788] ..$ ...: [13:13:41.788] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:41.788] - attr(*, "resolved")= logi TRUE [13:13:41.788] - attr(*, "total_size")= num NA [13:13:41.792] - Getting '...' globals ... DONE [13:13:41.792] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:41.792] List of 2 [13:13:41.792] $ ...future.FUN:function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [13:13:41.792] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [13:13:41.792] $ ... :List of 2 [13:13:41.792] ..$ collapse: chr "; " [13:13:41.792] ..$ maxHead : int 3 [13:13:41.792] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:41.792] - attr(*, "where")=List of 2 [13:13:41.792] ..$ ...future.FUN: [13:13:41.792] ..$ ... : [13:13:41.792] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:41.792] - attr(*, "resolved")= logi FALSE [13:13:41.792] - attr(*, "total_size")= num 71456 [13:13:41.796] Packages to be attached in all futures: [n=1] 'future' [13:13:41.796] getGlobalsAndPackagesXApply() ... DONE [13:13:41.797] Number of futures (= number of chunks): 1 [13:13:41.797] Launching 1 futures (chunks) ... [13:13:41.797] Chunk #1 of 1 ... [13:13:41.797] - Finding globals in 'X' for chunk #1 ... [13:13:41.797] getGlobalsAndPackages() ... [13:13:41.798] Searching for globals... [13:13:41.798] [13:13:41.798] Searching for globals ... DONE [13:13:41.798] - globals: [0] [13:13:41.798] getGlobalsAndPackages() ... DONE [13:13:41.799] + additional globals found: [n=0] [13:13:41.799] + additional namespaces needed: [n=0] [13:13:41.799] - Finding globals in 'X' for chunk #1 ... DONE [13:13:41.799] - seeds: [13:13:41.799] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:41.799] getGlobalsAndPackages() ... [13:13:41.799] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:41.800] Resolving globals: FALSE [13:13:41.800] Tweak future expression to call with '...' arguments ... [13:13:41.802] { [13:13:41.802] do.call(function(...) { [13:13:41.802] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:41.802] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:41.802] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:41.802] on.exit(options(oopts), add = TRUE) [13:13:41.802] } [13:13:41.802] { [13:13:41.802] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:41.802] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:41.802] ...future.FUN(...future.X_jj, ...) [13:13:41.802] }) [13:13:41.802] } [13:13:41.802] }, args = future.call.arguments) [13:13:41.802] } [13:13:41.802] Tweak future expression to call with '...' arguments ... DONE [13:13:41.803] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:41.803] - packages: [1] 'future' [13:13:41.803] getGlobalsAndPackages() ... DONE [13:13:41.804] run() for 'Future' ... [13:13:41.804] - state: 'created' [13:13:41.804] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:41.806] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:41.806] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:41.807] - Field: 'label' [13:13:41.807] - Field: 'local' [13:13:41.807] - Field: 'owner' [13:13:41.807] - Field: 'envir' [13:13:41.807] - Field: 'packages' [13:13:41.808] - Field: 'gc' [13:13:41.808] - Field: 'conditions' [13:13:41.808] - Field: 'expr' [13:13:41.808] - Field: 'uuid' [13:13:41.808] - Field: 'seed' [13:13:41.808] - Field: 'version' [13:13:41.809] - Field: 'result' [13:13:41.809] - Field: 'asynchronous' [13:13:41.809] - Field: 'calls' [13:13:41.809] - Field: 'globals' [13:13:41.809] - Field: 'stdout' [13:13:41.809] - Field: 'earlySignal' [13:13:41.810] - Field: 'lazy' [13:13:41.810] - Field: 'state' [13:13:41.810] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:41.810] - Launch lazy future ... [13:13:41.810] Packages needed by the future expression (n = 1): 'future' [13:13:41.811] Packages needed by future strategies (n = 0): [13:13:41.811] { [13:13:41.811] { [13:13:41.811] { [13:13:41.811] ...future.startTime <- base::Sys.time() [13:13:41.811] { [13:13:41.811] { [13:13:41.811] { [13:13:41.811] { [13:13:41.811] base::local({ [13:13:41.811] has_future <- base::requireNamespace("future", [13:13:41.811] quietly = TRUE) [13:13:41.811] if (has_future) { [13:13:41.811] ns <- base::getNamespace("future") [13:13:41.811] version <- ns[[".package"]][["version"]] [13:13:41.811] if (is.null(version)) [13:13:41.811] version <- utils::packageVersion("future") [13:13:41.811] } [13:13:41.811] else { [13:13:41.811] version <- NULL [13:13:41.811] } [13:13:41.811] if (!has_future || version < "1.8.0") { [13:13:41.811] info <- base::c(r_version = base::gsub("R version ", [13:13:41.811] "", base::R.version$version.string), [13:13:41.811] platform = base::sprintf("%s (%s-bit)", [13:13:41.811] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:41.811] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:41.811] "release", "version")], collapse = " "), [13:13:41.811] hostname = base::Sys.info()[["nodename"]]) [13:13:41.811] info <- base::sprintf("%s: %s", base::names(info), [13:13:41.811] info) [13:13:41.811] info <- base::paste(info, collapse = "; ") [13:13:41.811] if (!has_future) { [13:13:41.811] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:41.811] info) [13:13:41.811] } [13:13:41.811] else { [13:13:41.811] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:41.811] info, version) [13:13:41.811] } [13:13:41.811] base::stop(msg) [13:13:41.811] } [13:13:41.811] }) [13:13:41.811] } [13:13:41.811] base::local({ [13:13:41.811] for (pkg in "future") { [13:13:41.811] base::loadNamespace(pkg) [13:13:41.811] base::library(pkg, character.only = TRUE) [13:13:41.811] } [13:13:41.811] }) [13:13:41.811] } [13:13:41.811] options(future.plan = NULL) [13:13:41.811] Sys.unsetenv("R_FUTURE_PLAN") [13:13:41.811] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:41.811] } [13:13:41.811] ...future.workdir <- getwd() [13:13:41.811] } [13:13:41.811] ...future.oldOptions <- base::as.list(base::.Options) [13:13:41.811] ...future.oldEnvVars <- base::Sys.getenv() [13:13:41.811] } [13:13:41.811] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:41.811] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:41.811] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:41.811] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:41.811] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:41.811] future.stdout.windows.reencode = NULL, width = 80L) [13:13:41.811] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:41.811] base::names(...future.oldOptions)) [13:13:41.811] } [13:13:41.811] if (FALSE) { [13:13:41.811] } [13:13:41.811] else { [13:13:41.811] if (TRUE) { [13:13:41.811] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:41.811] open = "w") [13:13:41.811] } [13:13:41.811] else { [13:13:41.811] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:41.811] windows = "NUL", "/dev/null"), open = "w") [13:13:41.811] } [13:13:41.811] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:41.811] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:41.811] base::sink(type = "output", split = FALSE) [13:13:41.811] base::close(...future.stdout) [13:13:41.811] }, add = TRUE) [13:13:41.811] } [13:13:41.811] ...future.frame <- base::sys.nframe() [13:13:41.811] ...future.conditions <- base::list() [13:13:41.811] ...future.rng <- base::globalenv()$.Random.seed [13:13:41.811] if (FALSE) { [13:13:41.811] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:41.811] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:41.811] } [13:13:41.811] ...future.result <- base::tryCatch({ [13:13:41.811] base::withCallingHandlers({ [13:13:41.811] ...future.value <- base::withVisible(base::local({ [13:13:41.811] do.call(function(...) { [13:13:41.811] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:41.811] if (!identical(...future.globals.maxSize.org, [13:13:41.811] ...future.globals.maxSize)) { [13:13:41.811] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:41.811] on.exit(options(oopts), add = TRUE) [13:13:41.811] } [13:13:41.811] { [13:13:41.811] lapply(seq_along(...future.elements_ii), [13:13:41.811] FUN = function(jj) { [13:13:41.811] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:41.811] ...future.FUN(...future.X_jj, ...) [13:13:41.811] }) [13:13:41.811] } [13:13:41.811] }, args = future.call.arguments) [13:13:41.811] })) [13:13:41.811] future::FutureResult(value = ...future.value$value, [13:13:41.811] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:41.811] ...future.rng), globalenv = if (FALSE) [13:13:41.811] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:41.811] ...future.globalenv.names)) [13:13:41.811] else NULL, started = ...future.startTime, version = "1.8") [13:13:41.811] }, condition = base::local({ [13:13:41.811] c <- base::c [13:13:41.811] inherits <- base::inherits [13:13:41.811] invokeRestart <- base::invokeRestart [13:13:41.811] length <- base::length [13:13:41.811] list <- base::list [13:13:41.811] seq.int <- base::seq.int [13:13:41.811] signalCondition <- base::signalCondition [13:13:41.811] sys.calls <- base::sys.calls [13:13:41.811] `[[` <- base::`[[` [13:13:41.811] `+` <- base::`+` [13:13:41.811] `<<-` <- base::`<<-` [13:13:41.811] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:41.811] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:41.811] 3L)] [13:13:41.811] } [13:13:41.811] function(cond) { [13:13:41.811] is_error <- inherits(cond, "error") [13:13:41.811] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:41.811] NULL) [13:13:41.811] if (is_error) { [13:13:41.811] sessionInformation <- function() { [13:13:41.811] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:41.811] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:41.811] search = base::search(), system = base::Sys.info()) [13:13:41.811] } [13:13:41.811] ...future.conditions[[length(...future.conditions) + [13:13:41.811] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:41.811] cond$call), session = sessionInformation(), [13:13:41.811] timestamp = base::Sys.time(), signaled = 0L) [13:13:41.811] signalCondition(cond) [13:13:41.811] } [13:13:41.811] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:41.811] "immediateCondition"))) { [13:13:41.811] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:41.811] ...future.conditions[[length(...future.conditions) + [13:13:41.811] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:41.811] if (TRUE && !signal) { [13:13:41.811] muffleCondition <- function (cond, pattern = "^muffle") [13:13:41.811] { [13:13:41.811] inherits <- base::inherits [13:13:41.811] invokeRestart <- base::invokeRestart [13:13:41.811] is.null <- base::is.null [13:13:41.811] muffled <- FALSE [13:13:41.811] if (inherits(cond, "message")) { [13:13:41.811] muffled <- grepl(pattern, "muffleMessage") [13:13:41.811] if (muffled) [13:13:41.811] invokeRestart("muffleMessage") [13:13:41.811] } [13:13:41.811] else if (inherits(cond, "warning")) { [13:13:41.811] muffled <- grepl(pattern, "muffleWarning") [13:13:41.811] if (muffled) [13:13:41.811] invokeRestart("muffleWarning") [13:13:41.811] } [13:13:41.811] else if (inherits(cond, "condition")) { [13:13:41.811] if (!is.null(pattern)) { [13:13:41.811] computeRestarts <- base::computeRestarts [13:13:41.811] grepl <- base::grepl [13:13:41.811] restarts <- computeRestarts(cond) [13:13:41.811] for (restart in restarts) { [13:13:41.811] name <- restart$name [13:13:41.811] if (is.null(name)) [13:13:41.811] next [13:13:41.811] if (!grepl(pattern, name)) [13:13:41.811] next [13:13:41.811] invokeRestart(restart) [13:13:41.811] muffled <- TRUE [13:13:41.811] break [13:13:41.811] } [13:13:41.811] } [13:13:41.811] } [13:13:41.811] invisible(muffled) [13:13:41.811] } [13:13:41.811] muffleCondition(cond, pattern = "^muffle") [13:13:41.811] } [13:13:41.811] } [13:13:41.811] else { [13:13:41.811] if (TRUE) { [13:13:41.811] muffleCondition <- function (cond, pattern = "^muffle") [13:13:41.811] { [13:13:41.811] inherits <- base::inherits [13:13:41.811] invokeRestart <- base::invokeRestart [13:13:41.811] is.null <- base::is.null [13:13:41.811] muffled <- FALSE [13:13:41.811] if (inherits(cond, "message")) { [13:13:41.811] muffled <- grepl(pattern, "muffleMessage") [13:13:41.811] if (muffled) [13:13:41.811] invokeRestart("muffleMessage") [13:13:41.811] } [13:13:41.811] else if (inherits(cond, "warning")) { [13:13:41.811] muffled <- grepl(pattern, "muffleWarning") [13:13:41.811] if (muffled) [13:13:41.811] invokeRestart("muffleWarning") [13:13:41.811] } [13:13:41.811] else if (inherits(cond, "condition")) { [13:13:41.811] if (!is.null(pattern)) { [13:13:41.811] computeRestarts <- base::computeRestarts [13:13:41.811] grepl <- base::grepl [13:13:41.811] restarts <- computeRestarts(cond) [13:13:41.811] for (restart in restarts) { [13:13:41.811] name <- restart$name [13:13:41.811] if (is.null(name)) [13:13:41.811] next [13:13:41.811] if (!grepl(pattern, name)) [13:13:41.811] next [13:13:41.811] invokeRestart(restart) [13:13:41.811] muffled <- TRUE [13:13:41.811] break [13:13:41.811] } [13:13:41.811] } [13:13:41.811] } [13:13:41.811] invisible(muffled) [13:13:41.811] } [13:13:41.811] muffleCondition(cond, pattern = "^muffle") [13:13:41.811] } [13:13:41.811] } [13:13:41.811] } [13:13:41.811] })) [13:13:41.811] }, error = function(ex) { [13:13:41.811] base::structure(base::list(value = NULL, visible = NULL, [13:13:41.811] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:41.811] ...future.rng), started = ...future.startTime, [13:13:41.811] finished = Sys.time(), session_uuid = NA_character_, [13:13:41.811] version = "1.8"), class = "FutureResult") [13:13:41.811] }, finally = { [13:13:41.811] if (!identical(...future.workdir, getwd())) [13:13:41.811] setwd(...future.workdir) [13:13:41.811] { [13:13:41.811] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:41.811] ...future.oldOptions$nwarnings <- NULL [13:13:41.811] } [13:13:41.811] base::options(...future.oldOptions) [13:13:41.811] if (.Platform$OS.type == "windows") { [13:13:41.811] old_names <- names(...future.oldEnvVars) [13:13:41.811] envs <- base::Sys.getenv() [13:13:41.811] names <- names(envs) [13:13:41.811] common <- intersect(names, old_names) [13:13:41.811] added <- setdiff(names, old_names) [13:13:41.811] removed <- setdiff(old_names, names) [13:13:41.811] changed <- common[...future.oldEnvVars[common] != [13:13:41.811] envs[common]] [13:13:41.811] NAMES <- toupper(changed) [13:13:41.811] args <- list() [13:13:41.811] for (kk in seq_along(NAMES)) { [13:13:41.811] name <- changed[[kk]] [13:13:41.811] NAME <- NAMES[[kk]] [13:13:41.811] if (name != NAME && is.element(NAME, old_names)) [13:13:41.811] next [13:13:41.811] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:41.811] } [13:13:41.811] NAMES <- toupper(added) [13:13:41.811] for (kk in seq_along(NAMES)) { [13:13:41.811] name <- added[[kk]] [13:13:41.811] NAME <- NAMES[[kk]] [13:13:41.811] if (name != NAME && is.element(NAME, old_names)) [13:13:41.811] next [13:13:41.811] args[[name]] <- "" [13:13:41.811] } [13:13:41.811] NAMES <- toupper(removed) [13:13:41.811] for (kk in seq_along(NAMES)) { [13:13:41.811] name <- removed[[kk]] [13:13:41.811] NAME <- NAMES[[kk]] [13:13:41.811] if (name != NAME && is.element(NAME, old_names)) [13:13:41.811] next [13:13:41.811] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:41.811] } [13:13:41.811] if (length(args) > 0) [13:13:41.811] base::do.call(base::Sys.setenv, args = args) [13:13:41.811] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:41.811] } [13:13:41.811] else { [13:13:41.811] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:41.811] } [13:13:41.811] { [13:13:41.811] if (base::length(...future.futureOptionsAdded) > [13:13:41.811] 0L) { [13:13:41.811] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:41.811] base::names(opts) <- ...future.futureOptionsAdded [13:13:41.811] base::options(opts) [13:13:41.811] } [13:13:41.811] { [13:13:41.811] { [13:13:41.811] NULL [13:13:41.811] RNGkind("Mersenne-Twister") [13:13:41.811] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:41.811] inherits = FALSE) [13:13:41.811] } [13:13:41.811] options(future.plan = NULL) [13:13:41.811] if (is.na(NA_character_)) [13:13:41.811] Sys.unsetenv("R_FUTURE_PLAN") [13:13:41.811] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:41.811] future::plan(list(function (..., workers = availableCores(), [13:13:41.811] lazy = FALSE, rscript_libs = .libPaths(), [13:13:41.811] envir = parent.frame()) [13:13:41.811] { [13:13:41.811] if (is.function(workers)) [13:13:41.811] workers <- workers() [13:13:41.811] workers <- structure(as.integer(workers), [13:13:41.811] class = class(workers)) [13:13:41.811] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:41.811] workers >= 1) [13:13:41.811] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:41.811] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:41.811] } [13:13:41.811] future <- MultisessionFuture(..., workers = workers, [13:13:41.811] lazy = lazy, rscript_libs = rscript_libs, [13:13:41.811] envir = envir) [13:13:41.811] if (!future$lazy) [13:13:41.811] future <- run(future) [13:13:41.811] invisible(future) [13:13:41.811] }), .cleanup = FALSE, .init = FALSE) [13:13:41.811] } [13:13:41.811] } [13:13:41.811] } [13:13:41.811] }) [13:13:41.811] if (TRUE) { [13:13:41.811] base::sink(type = "output", split = FALSE) [13:13:41.811] if (TRUE) { [13:13:41.811] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:41.811] } [13:13:41.811] else { [13:13:41.811] ...future.result["stdout"] <- base::list(NULL) [13:13:41.811] } [13:13:41.811] base::close(...future.stdout) [13:13:41.811] ...future.stdout <- NULL [13:13:41.811] } [13:13:41.811] ...future.result$conditions <- ...future.conditions [13:13:41.811] ...future.result$finished <- base::Sys.time() [13:13:41.811] ...future.result [13:13:41.811] } [13:13:41.815] assign_globals() ... [13:13:41.815] List of 5 [13:13:41.815] $ ...future.FUN :function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [13:13:41.815] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [13:13:41.815] $ future.call.arguments :List of 2 [13:13:41.815] ..$ collapse: chr "; " [13:13:41.815] ..$ maxHead : int 3 [13:13:41.815] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:41.815] $ ...future.elements_ii :List of 1 [13:13:41.815] ..$ a: Named chr [1:101] "hello" "1" "2" "3" ... [13:13:41.815] .. ..- attr(*, "names")= chr [1:101] "" "b1" "b2" "b3" ... [13:13:41.815] $ ...future.seeds_ii : NULL [13:13:41.815] $ ...future.globals.maxSize: NULL [13:13:41.815] - attr(*, "where")=List of 5 [13:13:41.815] ..$ ...future.FUN : [13:13:41.815] ..$ future.call.arguments : [13:13:41.815] ..$ ...future.elements_ii : [13:13:41.815] ..$ ...future.seeds_ii : [13:13:41.815] ..$ ...future.globals.maxSize: [13:13:41.815] - attr(*, "resolved")= logi FALSE [13:13:41.815] - attr(*, "total_size")= num 71456 [13:13:41.815] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:41.815] - attr(*, "already-done")= logi TRUE [13:13:41.822] - copied '...future.FUN' to environment [13:13:41.823] - copied 'future.call.arguments' to environment [13:13:41.823] - copied '...future.elements_ii' to environment [13:13:41.823] - copied '...future.seeds_ii' to environment [13:13:41.823] - copied '...future.globals.maxSize' to environment [13:13:41.823] assign_globals() ... done [13:13:41.824] plan(): Setting new future strategy stack: [13:13:41.824] List of future strategies: [13:13:41.824] 1. sequential: [13:13:41.824] - args: function (..., envir = parent.frame(), workers = "") [13:13:41.824] - tweaked: FALSE [13:13:41.824] - call: NULL [13:13:41.825] plan(): nbrOfWorkers() = 1 [13:13:41.826] plan(): Setting new future strategy stack: [13:13:41.826] List of future strategies: [13:13:41.826] 1. multisession: [13:13:41.826] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [13:13:41.826] - tweaked: FALSE [13:13:41.826] - call: plan(strategy) [13:13:41.828] plan(): nbrOfWorkers() = 1 [13:13:41.829] SequentialFuture started (and completed) [13:13:41.829] - Launch lazy future ... done [13:13:41.829] run() for 'SequentialFuture' ... done [13:13:41.829] Created future: [13:13:41.829] SequentialFuture: [13:13:41.829] Label: 'future_lapply-1' [13:13:41.829] Expression: [13:13:41.829] { [13:13:41.829] do.call(function(...) { [13:13:41.829] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:41.829] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:41.829] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:41.829] on.exit(options(oopts), add = TRUE) [13:13:41.829] } [13:13:41.829] { [13:13:41.829] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:41.829] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:41.829] ...future.FUN(...future.X_jj, ...) [13:13:41.829] }) [13:13:41.829] } [13:13:41.829] }, args = future.call.arguments) [13:13:41.829] } [13:13:41.829] Lazy evaluation: FALSE [13:13:41.829] Asynchronous evaluation: FALSE [13:13:41.829] Local evaluation: TRUE [13:13:41.829] Environment: R_GlobalEnv [13:13:41.829] Capture standard output: TRUE [13:13:41.829] Capture condition classes: 'condition' (excluding 'nothing') [13:13:41.829] 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) [13:13:41.829] Packages: 1 packages ('future') [13:13:41.829] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:41.829] Resolved: TRUE [13:13:41.829] Value: 136 bytes of class 'list' [13:13:41.829] Early signaling: FALSE [13:13:41.829] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:41.829] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:41.831] Chunk #1 of 1 ... DONE [13:13:41.831] Launching 1 futures (chunks) ... DONE [13:13:41.831] Resolving 1 futures (chunks) ... [13:13:41.831] resolve() on list ... [13:13:41.831] recursive: 0 [13:13:41.832] length: 1 [13:13:41.832] [13:13:41.832] resolved() for 'SequentialFuture' ... [13:13:41.832] - state: 'finished' [13:13:41.832] - run: TRUE [13:13:41.832] - result: 'FutureResult' [13:13:41.833] resolved() for 'SequentialFuture' ... done [13:13:41.833] Future #1 [13:13:41.833] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:41.833] - nx: 1 [13:13:41.833] - relay: TRUE [13:13:41.834] - stdout: TRUE [13:13:41.834] - signal: TRUE [13:13:41.834] - resignal: FALSE [13:13:41.834] - force: TRUE [13:13:41.834] - relayed: [n=1] FALSE [13:13:41.834] - queued futures: [n=1] FALSE [13:13:41.835] - until=1 [13:13:41.835] - relaying element #1 [13:13:41.835] - relayed: [n=1] TRUE [13:13:41.835] - queued futures: [n=1] TRUE [13:13:41.835] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:41.836] length: 0 (resolved future 1) [13:13:41.836] Relaying remaining futures [13:13:41.836] signalConditionsASAP(NULL, pos=0) ... [13:13:41.836] - nx: 1 [13:13:41.836] - relay: TRUE [13:13:41.836] - stdout: TRUE [13:13:41.836] - signal: TRUE [13:13:41.837] - resignal: FALSE [13:13:41.837] - force: TRUE [13:13:41.837] - relayed: [n=1] TRUE [13:13:41.837] - queued futures: [n=1] TRUE - flush all [13:13:41.837] - relayed: [n=1] TRUE [13:13:41.837] - queued futures: [n=1] TRUE [13:13:41.838] signalConditionsASAP(NULL, pos=0) ... done [13:13:41.838] resolve() on list ... DONE [13:13:41.838] - Number of value chunks collected: 1 [13:13:41.838] Resolving 1 futures (chunks) ... DONE [13:13:41.838] Reducing values from 1 chunks ... [13:13:41.838] - Number of values collected after concatenation: 1 [13:13:41.839] - Number of values expected: 1 [13:13:41.839] Reducing values from 1 chunks ... DONE [13:13:41.839] future_lapply() ... DONE List of 1 $ y:List of 1 ..$ a: chr "hello; 1; 2; ...; 100" - future_lapply(x, FUN = listenv::listenv, ...) ... [13:13:41.840] future_lapply() ... [13:13:41.843] Number of chunks: 1 [13:13:41.843] Index remapping (attribute 'ordering'): [n = 2] 2, 1 [13:13:41.843] getGlobalsAndPackagesXApply() ... [13:13:41.843] - future.globals: TRUE [13:13:41.844] getGlobalsAndPackages() ... [13:13:41.844] Searching for globals... [13:13:41.845] - globals found: [4] 'FUN', '{', 'get', 'parent.env' [13:13:41.845] Searching for globals ... DONE [13:13:41.846] Resolving globals: FALSE [13:13:41.846] The total size of the 1 globals is 4.85 KiB (4968 bytes) [13:13:41.847] 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') [13:13:41.847] - globals: [1] 'FUN' [13:13:41.847] - packages: [1] 'listenv' [13:13:41.847] getGlobalsAndPackages() ... DONE [13:13:41.847] - globals found/used: [n=1] 'FUN' [13:13:41.847] - needed namespaces: [n=1] 'listenv' [13:13:41.848] Finding globals ... DONE [13:13:41.848] - use_args: TRUE [13:13:41.848] - Getting '...' globals ... [13:13:41.848] resolve() on list ... [13:13:41.849] recursive: 0 [13:13:41.849] length: 1 [13:13:41.849] elements: '...' [13:13:41.849] length: 0 (resolved future 1) [13:13:41.849] resolve() on list ... DONE [13:13:41.849] - '...' content: [n=0] [13:13:41.850] List of 1 [13:13:41.850] $ ...: list() [13:13:41.850] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:41.850] - attr(*, "where")=List of 1 [13:13:41.850] ..$ ...: [13:13:41.850] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:41.850] - attr(*, "resolved")= logi TRUE [13:13:41.850] - attr(*, "total_size")= num NA [13:13:41.853] - Getting '...' globals ... DONE [13:13:41.853] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:41.853] List of 2 [13:13:41.853] $ ...future.FUN:function (x, ...) [13:13:41.853] $ ... : list() [13:13:41.853] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:41.853] - attr(*, "where")=List of 2 [13:13:41.853] ..$ ...future.FUN: [13:13:41.853] ..$ ... : [13:13:41.853] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:41.853] - attr(*, "resolved")= logi FALSE [13:13:41.853] - attr(*, "total_size")= num 4968 [13:13:41.856] Packages to be attached in all futures: [n=1] 'listenv' [13:13:41.857] getGlobalsAndPackagesXApply() ... DONE [13:13:41.857] Number of futures (= number of chunks): 1 [13:13:41.857] Launching 1 futures (chunks) ... [13:13:41.857] Chunk #1 of 1 ... [13:13:41.857] - Finding globals in 'X' for chunk #1 ... [13:13:41.858] getGlobalsAndPackages() ... [13:13:41.858] Searching for globals... [13:13:41.858] [13:13:41.859] Searching for globals ... DONE [13:13:41.859] - globals: [0] [13:13:41.859] getGlobalsAndPackages() ... DONE [13:13:41.859] + additional globals found: [n=0] [13:13:41.859] + additional namespaces needed: [n=0] [13:13:41.859] - Finding globals in 'X' for chunk #1 ... DONE [13:13:41.859] - seeds: [13:13:41.860] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:41.860] getGlobalsAndPackages() ... [13:13:41.860] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:41.860] Resolving globals: FALSE [13:13:41.860] Tweak future expression to call with '...' arguments ... [13:13:41.861] { [13:13:41.861] do.call(function(...) { [13:13:41.861] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:41.861] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:41.861] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:41.861] on.exit(options(oopts), add = TRUE) [13:13:41.861] } [13:13:41.861] { [13:13:41.861] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:41.861] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:41.861] ...future.FUN(...future.X_jj, ...) [13:13:41.861] }) [13:13:41.861] } [13:13:41.861] }, args = future.call.arguments) [13:13:41.861] } [13:13:41.861] Tweak future expression to call with '...' arguments ... DONE [13:13:41.861] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:41.862] - packages: [1] 'listenv' [13:13:41.862] getGlobalsAndPackages() ... DONE [13:13:41.862] run() for 'Future' ... [13:13:41.862] - state: 'created' [13:13:41.863] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:41.865] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:41.865] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:41.865] - Field: 'label' [13:13:41.865] - Field: 'local' [13:13:41.866] - Field: 'owner' [13:13:41.866] - Field: 'envir' [13:13:41.866] - Field: 'packages' [13:13:41.866] - Field: 'gc' [13:13:41.866] - Field: 'conditions' [13:13:41.867] - Field: 'expr' [13:13:41.867] - Field: 'uuid' [13:13:41.867] - Field: 'seed' [13:13:41.867] - Field: 'version' [13:13:41.867] - Field: 'result' [13:13:41.867] - Field: 'asynchronous' [13:13:41.868] - Field: 'calls' [13:13:41.868] - Field: 'globals' [13:13:41.868] - Field: 'stdout' [13:13:41.868] - Field: 'earlySignal' [13:13:41.868] - Field: 'lazy' [13:13:41.869] - Field: 'state' [13:13:41.869] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:41.869] - Launch lazy future ... [13:13:41.869] Packages needed by the future expression (n = 1): 'listenv' [13:13:41.869] Packages needed by future strategies (n = 0): [13:13:41.870] { [13:13:41.870] { [13:13:41.870] { [13:13:41.870] ...future.startTime <- base::Sys.time() [13:13:41.870] { [13:13:41.870] { [13:13:41.870] { [13:13:41.870] { [13:13:41.870] base::local({ [13:13:41.870] has_future <- base::requireNamespace("future", [13:13:41.870] quietly = TRUE) [13:13:41.870] if (has_future) { [13:13:41.870] ns <- base::getNamespace("future") [13:13:41.870] version <- ns[[".package"]][["version"]] [13:13:41.870] if (is.null(version)) [13:13:41.870] version <- utils::packageVersion("future") [13:13:41.870] } [13:13:41.870] else { [13:13:41.870] version <- NULL [13:13:41.870] } [13:13:41.870] if (!has_future || version < "1.8.0") { [13:13:41.870] info <- base::c(r_version = base::gsub("R version ", [13:13:41.870] "", base::R.version$version.string), [13:13:41.870] platform = base::sprintf("%s (%s-bit)", [13:13:41.870] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:41.870] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:41.870] "release", "version")], collapse = " "), [13:13:41.870] hostname = base::Sys.info()[["nodename"]]) [13:13:41.870] info <- base::sprintf("%s: %s", base::names(info), [13:13:41.870] info) [13:13:41.870] info <- base::paste(info, collapse = "; ") [13:13:41.870] if (!has_future) { [13:13:41.870] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:41.870] info) [13:13:41.870] } [13:13:41.870] else { [13:13:41.870] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:41.870] info, version) [13:13:41.870] } [13:13:41.870] base::stop(msg) [13:13:41.870] } [13:13:41.870] }) [13:13:41.870] } [13:13:41.870] base::local({ [13:13:41.870] for (pkg in "listenv") { [13:13:41.870] base::loadNamespace(pkg) [13:13:41.870] base::library(pkg, character.only = TRUE) [13:13:41.870] } [13:13:41.870] }) [13:13:41.870] } [13:13:41.870] options(future.plan = NULL) [13:13:41.870] Sys.unsetenv("R_FUTURE_PLAN") [13:13:41.870] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:41.870] } [13:13:41.870] ...future.workdir <- getwd() [13:13:41.870] } [13:13:41.870] ...future.oldOptions <- base::as.list(base::.Options) [13:13:41.870] ...future.oldEnvVars <- base::Sys.getenv() [13:13:41.870] } [13:13:41.870] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:41.870] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:41.870] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:41.870] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:41.870] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:41.870] future.stdout.windows.reencode = NULL, width = 80L) [13:13:41.870] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:41.870] base::names(...future.oldOptions)) [13:13:41.870] } [13:13:41.870] if (FALSE) { [13:13:41.870] } [13:13:41.870] else { [13:13:41.870] if (TRUE) { [13:13:41.870] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:41.870] open = "w") [13:13:41.870] } [13:13:41.870] else { [13:13:41.870] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:41.870] windows = "NUL", "/dev/null"), open = "w") [13:13:41.870] } [13:13:41.870] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:41.870] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:41.870] base::sink(type = "output", split = FALSE) [13:13:41.870] base::close(...future.stdout) [13:13:41.870] }, add = TRUE) [13:13:41.870] } [13:13:41.870] ...future.frame <- base::sys.nframe() [13:13:41.870] ...future.conditions <- base::list() [13:13:41.870] ...future.rng <- base::globalenv()$.Random.seed [13:13:41.870] if (FALSE) { [13:13:41.870] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:41.870] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:41.870] } [13:13:41.870] ...future.result <- base::tryCatch({ [13:13:41.870] base::withCallingHandlers({ [13:13:41.870] ...future.value <- base::withVisible(base::local({ [13:13:41.870] do.call(function(...) { [13:13:41.870] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:41.870] if (!identical(...future.globals.maxSize.org, [13:13:41.870] ...future.globals.maxSize)) { [13:13:41.870] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:41.870] on.exit(options(oopts), add = TRUE) [13:13:41.870] } [13:13:41.870] { [13:13:41.870] lapply(seq_along(...future.elements_ii), [13:13:41.870] FUN = function(jj) { [13:13:41.870] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:41.870] ...future.FUN(...future.X_jj, ...) [13:13:41.870] }) [13:13:41.870] } [13:13:41.870] }, args = future.call.arguments) [13:13:41.870] })) [13:13:41.870] future::FutureResult(value = ...future.value$value, [13:13:41.870] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:41.870] ...future.rng), globalenv = if (FALSE) [13:13:41.870] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:41.870] ...future.globalenv.names)) [13:13:41.870] else NULL, started = ...future.startTime, version = "1.8") [13:13:41.870] }, condition = base::local({ [13:13:41.870] c <- base::c [13:13:41.870] inherits <- base::inherits [13:13:41.870] invokeRestart <- base::invokeRestart [13:13:41.870] length <- base::length [13:13:41.870] list <- base::list [13:13:41.870] seq.int <- base::seq.int [13:13:41.870] signalCondition <- base::signalCondition [13:13:41.870] sys.calls <- base::sys.calls [13:13:41.870] `[[` <- base::`[[` [13:13:41.870] `+` <- base::`+` [13:13:41.870] `<<-` <- base::`<<-` [13:13:41.870] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:41.870] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:41.870] 3L)] [13:13:41.870] } [13:13:41.870] function(cond) { [13:13:41.870] is_error <- inherits(cond, "error") [13:13:41.870] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:41.870] NULL) [13:13:41.870] if (is_error) { [13:13:41.870] sessionInformation <- function() { [13:13:41.870] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:41.870] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:41.870] search = base::search(), system = base::Sys.info()) [13:13:41.870] } [13:13:41.870] ...future.conditions[[length(...future.conditions) + [13:13:41.870] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:41.870] cond$call), session = sessionInformation(), [13:13:41.870] timestamp = base::Sys.time(), signaled = 0L) [13:13:41.870] signalCondition(cond) [13:13:41.870] } [13:13:41.870] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:41.870] "immediateCondition"))) { [13:13:41.870] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:41.870] ...future.conditions[[length(...future.conditions) + [13:13:41.870] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:41.870] if (TRUE && !signal) { [13:13:41.870] muffleCondition <- function (cond, pattern = "^muffle") [13:13:41.870] { [13:13:41.870] inherits <- base::inherits [13:13:41.870] invokeRestart <- base::invokeRestart [13:13:41.870] is.null <- base::is.null [13:13:41.870] muffled <- FALSE [13:13:41.870] if (inherits(cond, "message")) { [13:13:41.870] muffled <- grepl(pattern, "muffleMessage") [13:13:41.870] if (muffled) [13:13:41.870] invokeRestart("muffleMessage") [13:13:41.870] } [13:13:41.870] else if (inherits(cond, "warning")) { [13:13:41.870] muffled <- grepl(pattern, "muffleWarning") [13:13:41.870] if (muffled) [13:13:41.870] invokeRestart("muffleWarning") [13:13:41.870] } [13:13:41.870] else if (inherits(cond, "condition")) { [13:13:41.870] if (!is.null(pattern)) { [13:13:41.870] computeRestarts <- base::computeRestarts [13:13:41.870] grepl <- base::grepl [13:13:41.870] restarts <- computeRestarts(cond) [13:13:41.870] for (restart in restarts) { [13:13:41.870] name <- restart$name [13:13:41.870] if (is.null(name)) [13:13:41.870] next [13:13:41.870] if (!grepl(pattern, name)) [13:13:41.870] next [13:13:41.870] invokeRestart(restart) [13:13:41.870] muffled <- TRUE [13:13:41.870] break [13:13:41.870] } [13:13:41.870] } [13:13:41.870] } [13:13:41.870] invisible(muffled) [13:13:41.870] } [13:13:41.870] muffleCondition(cond, pattern = "^muffle") [13:13:41.870] } [13:13:41.870] } [13:13:41.870] else { [13:13:41.870] if (TRUE) { [13:13:41.870] muffleCondition <- function (cond, pattern = "^muffle") [13:13:41.870] { [13:13:41.870] inherits <- base::inherits [13:13:41.870] invokeRestart <- base::invokeRestart [13:13:41.870] is.null <- base::is.null [13:13:41.870] muffled <- FALSE [13:13:41.870] if (inherits(cond, "message")) { [13:13:41.870] muffled <- grepl(pattern, "muffleMessage") [13:13:41.870] if (muffled) [13:13:41.870] invokeRestart("muffleMessage") [13:13:41.870] } [13:13:41.870] else if (inherits(cond, "warning")) { [13:13:41.870] muffled <- grepl(pattern, "muffleWarning") [13:13:41.870] if (muffled) [13:13:41.870] invokeRestart("muffleWarning") [13:13:41.870] } [13:13:41.870] else if (inherits(cond, "condition")) { [13:13:41.870] if (!is.null(pattern)) { [13:13:41.870] computeRestarts <- base::computeRestarts [13:13:41.870] grepl <- base::grepl [13:13:41.870] restarts <- computeRestarts(cond) [13:13:41.870] for (restart in restarts) { [13:13:41.870] name <- restart$name [13:13:41.870] if (is.null(name)) [13:13:41.870] next [13:13:41.870] if (!grepl(pattern, name)) [13:13:41.870] next [13:13:41.870] invokeRestart(restart) [13:13:41.870] muffled <- TRUE [13:13:41.870] break [13:13:41.870] } [13:13:41.870] } [13:13:41.870] } [13:13:41.870] invisible(muffled) [13:13:41.870] } [13:13:41.870] muffleCondition(cond, pattern = "^muffle") [13:13:41.870] } [13:13:41.870] } [13:13:41.870] } [13:13:41.870] })) [13:13:41.870] }, error = function(ex) { [13:13:41.870] base::structure(base::list(value = NULL, visible = NULL, [13:13:41.870] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:41.870] ...future.rng), started = ...future.startTime, [13:13:41.870] finished = Sys.time(), session_uuid = NA_character_, [13:13:41.870] version = "1.8"), class = "FutureResult") [13:13:41.870] }, finally = { [13:13:41.870] if (!identical(...future.workdir, getwd())) [13:13:41.870] setwd(...future.workdir) [13:13:41.870] { [13:13:41.870] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:41.870] ...future.oldOptions$nwarnings <- NULL [13:13:41.870] } [13:13:41.870] base::options(...future.oldOptions) [13:13:41.870] if (.Platform$OS.type == "windows") { [13:13:41.870] old_names <- names(...future.oldEnvVars) [13:13:41.870] envs <- base::Sys.getenv() [13:13:41.870] names <- names(envs) [13:13:41.870] common <- intersect(names, old_names) [13:13:41.870] added <- setdiff(names, old_names) [13:13:41.870] removed <- setdiff(old_names, names) [13:13:41.870] changed <- common[...future.oldEnvVars[common] != [13:13:41.870] envs[common]] [13:13:41.870] NAMES <- toupper(changed) [13:13:41.870] args <- list() [13:13:41.870] for (kk in seq_along(NAMES)) { [13:13:41.870] name <- changed[[kk]] [13:13:41.870] NAME <- NAMES[[kk]] [13:13:41.870] if (name != NAME && is.element(NAME, old_names)) [13:13:41.870] next [13:13:41.870] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:41.870] } [13:13:41.870] NAMES <- toupper(added) [13:13:41.870] for (kk in seq_along(NAMES)) { [13:13:41.870] name <- added[[kk]] [13:13:41.870] NAME <- NAMES[[kk]] [13:13:41.870] if (name != NAME && is.element(NAME, old_names)) [13:13:41.870] next [13:13:41.870] args[[name]] <- "" [13:13:41.870] } [13:13:41.870] NAMES <- toupper(removed) [13:13:41.870] for (kk in seq_along(NAMES)) { [13:13:41.870] name <- removed[[kk]] [13:13:41.870] NAME <- NAMES[[kk]] [13:13:41.870] if (name != NAME && is.element(NAME, old_names)) [13:13:41.870] next [13:13:41.870] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:41.870] } [13:13:41.870] if (length(args) > 0) [13:13:41.870] base::do.call(base::Sys.setenv, args = args) [13:13:41.870] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:41.870] } [13:13:41.870] else { [13:13:41.870] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:41.870] } [13:13:41.870] { [13:13:41.870] if (base::length(...future.futureOptionsAdded) > [13:13:41.870] 0L) { [13:13:41.870] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:41.870] base::names(opts) <- ...future.futureOptionsAdded [13:13:41.870] base::options(opts) [13:13:41.870] } [13:13:41.870] { [13:13:41.870] { [13:13:41.870] NULL [13:13:41.870] RNGkind("Mersenne-Twister") [13:13:41.870] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:41.870] inherits = FALSE) [13:13:41.870] } [13:13:41.870] options(future.plan = NULL) [13:13:41.870] if (is.na(NA_character_)) [13:13:41.870] Sys.unsetenv("R_FUTURE_PLAN") [13:13:41.870] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:41.870] future::plan(list(function (..., workers = availableCores(), [13:13:41.870] lazy = FALSE, rscript_libs = .libPaths(), [13:13:41.870] envir = parent.frame()) [13:13:41.870] { [13:13:41.870] if (is.function(workers)) [13:13:41.870] workers <- workers() [13:13:41.870] workers <- structure(as.integer(workers), [13:13:41.870] class = class(workers)) [13:13:41.870] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:41.870] workers >= 1) [13:13:41.870] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:41.870] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:41.870] } [13:13:41.870] future <- MultisessionFuture(..., workers = workers, [13:13:41.870] lazy = lazy, rscript_libs = rscript_libs, [13:13:41.870] envir = envir) [13:13:41.870] if (!future$lazy) [13:13:41.870] future <- run(future) [13:13:41.870] invisible(future) [13:13:41.870] }), .cleanup = FALSE, .init = FALSE) [13:13:41.870] } [13:13:41.870] } [13:13:41.870] } [13:13:41.870] }) [13:13:41.870] if (TRUE) { [13:13:41.870] base::sink(type = "output", split = FALSE) [13:13:41.870] if (TRUE) { [13:13:41.870] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:41.870] } [13:13:41.870] else { [13:13:41.870] ...future.result["stdout"] <- base::list(NULL) [13:13:41.870] } [13:13:41.870] base::close(...future.stdout) [13:13:41.870] ...future.stdout <- NULL [13:13:41.870] } [13:13:41.870] ...future.result$conditions <- ...future.conditions [13:13:41.870] ...future.result$finished <- base::Sys.time() [13:13:41.870] ...future.result [13:13:41.870] } [13:13:41.874] assign_globals() ... [13:13:41.874] List of 5 [13:13:41.874] $ ...future.FUN :function (x, ...) [13:13:41.874] $ future.call.arguments : list() [13:13:41.874] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:41.874] $ ...future.elements_ii :List of 2 [13:13:41.874] ..$ b:Classes 'listenv', 'environment' [13:13:41.874] ..$ a:Classes 'listenv', 'environment' [13:13:41.874] $ ...future.seeds_ii : NULL [13:13:41.874] $ ...future.globals.maxSize: NULL [13:13:41.874] - attr(*, "where")=List of 5 [13:13:41.874] ..$ ...future.FUN : [13:13:41.874] ..$ future.call.arguments : [13:13:41.874] ..$ ...future.elements_ii : [13:13:41.874] ..$ ...future.seeds_ii : [13:13:41.874] ..$ ...future.globals.maxSize: [13:13:41.874] - attr(*, "resolved")= logi FALSE [13:13:41.874] - attr(*, "total_size")= num 4968 [13:13:41.874] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:41.874] - attr(*, "already-done")= logi TRUE [13:13:41.880] - copied '...future.FUN' to environment [13:13:41.880] - copied 'future.call.arguments' to environment [13:13:41.881] - copied '...future.elements_ii' to environment [13:13:41.881] - copied '...future.seeds_ii' to environment [13:13:41.881] - copied '...future.globals.maxSize' to environment [13:13:41.881] assign_globals() ... done [13:13:41.882] plan(): Setting new future strategy stack: [13:13:41.882] List of future strategies: [13:13:41.882] 1. sequential: [13:13:41.882] - args: function (..., envir = parent.frame(), workers = "") [13:13:41.882] - tweaked: FALSE [13:13:41.882] - call: NULL [13:13:41.882] plan(): nbrOfWorkers() = 1 [13:13:41.884] plan(): Setting new future strategy stack: [13:13:41.884] List of future strategies: [13:13:41.884] 1. multisession: [13:13:41.884] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [13:13:41.884] - tweaked: FALSE [13:13:41.884] - call: plan(strategy) [13:13:41.886] plan(): nbrOfWorkers() = 1 [13:13:41.887] SequentialFuture started (and completed) [13:13:41.887] - Launch lazy future ... done [13:13:41.887] run() for 'SequentialFuture' ... done [13:13:41.887] Created future: [13:13:41.887] SequentialFuture: [13:13:41.887] Label: 'future_lapply-1' [13:13:41.887] Expression: [13:13:41.887] { [13:13:41.887] do.call(function(...) { [13:13:41.887] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:41.887] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:41.887] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:41.887] on.exit(options(oopts), add = TRUE) [13:13:41.887] } [13:13:41.887] { [13:13:41.887] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:41.887] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:41.887] ...future.FUN(...future.X_jj, ...) [13:13:41.887] }) [13:13:41.887] } [13:13:41.887] }, args = future.call.arguments) [13:13:41.887] } [13:13:41.887] Lazy evaluation: FALSE [13:13:41.887] Asynchronous evaluation: FALSE [13:13:41.887] Local evaluation: TRUE [13:13:41.887] Environment: R_GlobalEnv [13:13:41.887] Capture standard output: TRUE [13:13:41.887] Capture condition classes: 'condition' (excluding 'nothing') [13:13:41.887] 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) [13:13:41.887] Packages: 1 packages ('listenv') [13:13:41.887] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:41.887] Resolved: TRUE [13:13:41.887] Value: 800 bytes of class 'list' [13:13:41.887] Early signaling: FALSE [13:13:41.887] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:41.887] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:41.889] Chunk #1 of 1 ... DONE [13:13:41.889] Launching 1 futures (chunks) ... DONE [13:13:41.889] Resolving 1 futures (chunks) ... [13:13:41.889] resolve() on list ... [13:13:41.889] recursive: 0 [13:13:41.890] length: 1 [13:13:41.890] [13:13:41.890] resolved() for 'SequentialFuture' ... [13:13:41.890] - state: 'finished' [13:13:41.890] - run: TRUE [13:13:41.890] - result: 'FutureResult' [13:13:41.891] resolved() for 'SequentialFuture' ... done [13:13:41.891] Future #1 [13:13:41.891] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:41.891] - nx: 1 [13:13:41.891] - relay: TRUE [13:13:41.892] - stdout: TRUE [13:13:41.892] - signal: TRUE [13:13:41.892] - resignal: FALSE [13:13:41.892] - force: TRUE [13:13:41.892] - relayed: [n=1] FALSE [13:13:41.892] - queued futures: [n=1] FALSE [13:13:41.892] - until=1 [13:13:41.893] - relaying element #1 [13:13:41.893] - relayed: [n=1] TRUE [13:13:41.893] - queued futures: [n=1] TRUE [13:13:41.893] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:41.893] length: 0 (resolved future 1) [13:13:41.894] Relaying remaining futures [13:13:41.894] signalConditionsASAP(NULL, pos=0) ... [13:13:41.894] - nx: 1 [13:13:41.894] - relay: TRUE [13:13:41.894] - stdout: TRUE [13:13:41.894] - signal: TRUE [13:13:41.894] - resignal: FALSE [13:13:41.895] - force: TRUE [13:13:41.895] - relayed: [n=1] TRUE [13:13:41.895] - queued futures: [n=1] TRUE - flush all [13:13:41.895] - relayed: [n=1] TRUE [13:13:41.895] - queued futures: [n=1] TRUE [13:13:41.895] signalConditionsASAP(NULL, pos=0) ... done [13:13:41.896] resolve() on list ... DONE [13:13:41.896] - Number of value chunks collected: 1 [13:13:41.896] Resolving 1 futures (chunks) ... DONE [13:13:41.896] Reducing values from 1 chunks ... [13:13:41.896] - Number of values collected after concatenation: 2 [13:13:41.896] - Number of values expected: 2 [13:13:41.897] Reverse index remapping (attribute 'ordering'): [n = 2] 2, 1 [13:13:41.897] Reducing values from 1 chunks ... DONE [13:13:41.897] 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, ...) ... [13:13:41.899] future_lapply() ... [13:13:41.902] Number of chunks: 1 [13:13:41.902] Index remapping (attribute 'ordering'): [n = 4] 4, 3, 2, 1 [13:13:41.902] getGlobalsAndPackagesXApply() ... [13:13:41.902] - future.globals: TRUE [13:13:41.903] getGlobalsAndPackages() ... [13:13:41.903] Searching for globals... [13:13:41.904] - globals found: [2] 'FUN', '.Internal' [13:13:41.904] Searching for globals ... DONE [13:13:41.904] Resolving globals: FALSE [13:13:41.905] The total size of the 1 globals is 2.13 KiB (2184 bytes) [13:13:41.905] 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') [13:13:41.906] - globals: [1] 'FUN' [13:13:41.906] [13:13:41.906] getGlobalsAndPackages() ... DONE [13:13:41.906] - globals found/used: [n=1] 'FUN' [13:13:41.906] - needed namespaces: [n=0] [13:13:41.906] Finding globals ... DONE [13:13:41.907] - use_args: TRUE [13:13:41.907] - Getting '...' globals ... [13:13:41.907] resolve() on list ... [13:13:41.907] recursive: 0 [13:13:41.907] length: 1 [13:13:41.908] elements: '...' [13:13:41.908] length: 0 (resolved future 1) [13:13:41.908] resolve() on list ... DONE [13:13:41.908] - '...' content: [n=1] 'length' [13:13:41.908] List of 1 [13:13:41.908] $ ...:List of 1 [13:13:41.908] ..$ length: int 2 [13:13:41.908] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:41.908] - attr(*, "where")=List of 1 [13:13:41.908] ..$ ...: [13:13:41.908] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:41.908] - attr(*, "resolved")= logi TRUE [13:13:41.908] - attr(*, "total_size")= num NA [13:13:41.912] - Getting '...' globals ... DONE [13:13:41.912] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:41.912] List of 2 [13:13:41.912] $ ...future.FUN:function (mode = "logical", length = 0L) [13:13:41.912] $ ... :List of 1 [13:13:41.912] ..$ length: int 2 [13:13:41.912] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:41.912] - attr(*, "where")=List of 2 [13:13:41.912] ..$ ...future.FUN: [13:13:41.912] ..$ ... : [13:13:41.912] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:41.912] - attr(*, "resolved")= logi FALSE [13:13:41.912] - attr(*, "total_size")= num 2240 [13:13:41.918] Packages to be attached in all futures: [n=0] [13:13:41.918] getGlobalsAndPackagesXApply() ... DONE [13:13:41.918] Number of futures (= number of chunks): 1 [13:13:41.919] Launching 1 futures (chunks) ... [13:13:41.919] Chunk #1 of 1 ... [13:13:41.919] - Finding globals in 'X' for chunk #1 ... [13:13:41.919] getGlobalsAndPackages() ... [13:13:41.919] Searching for globals... [13:13:41.920] [13:13:41.920] Searching for globals ... DONE [13:13:41.920] - globals: [0] [13:13:41.920] getGlobalsAndPackages() ... DONE [13:13:41.920] + additional globals found: [n=0] [13:13:41.920] + additional namespaces needed: [n=0] [13:13:41.921] - Finding globals in 'X' for chunk #1 ... DONE [13:13:41.921] - seeds: [13:13:41.921] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:41.921] getGlobalsAndPackages() ... [13:13:41.921] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:41.921] Resolving globals: FALSE [13:13:41.922] Tweak future expression to call with '...' arguments ... [13:13:41.922] { [13:13:41.922] do.call(function(...) { [13:13:41.922] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:41.922] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:41.922] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:41.922] on.exit(options(oopts), add = TRUE) [13:13:41.922] } [13:13:41.922] { [13:13:41.922] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:41.922] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:41.922] ...future.FUN(...future.X_jj, ...) [13:13:41.922] }) [13:13:41.922] } [13:13:41.922] }, args = future.call.arguments) [13:13:41.922] } [13:13:41.922] Tweak future expression to call with '...' arguments ... DONE [13:13:41.923] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:41.923] [13:13:41.923] getGlobalsAndPackages() ... DONE [13:13:41.923] run() for 'Future' ... [13:13:41.924] - state: 'created' [13:13:41.924] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:41.926] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:41.926] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:41.927] - Field: 'label' [13:13:41.927] - Field: 'local' [13:13:41.927] - Field: 'owner' [13:13:41.927] - Field: 'envir' [13:13:41.927] - Field: 'packages' [13:13:41.927] - Field: 'gc' [13:13:41.928] - Field: 'conditions' [13:13:41.928] - Field: 'expr' [13:13:41.928] - Field: 'uuid' [13:13:41.928] - Field: 'seed' [13:13:41.928] - Field: 'version' [13:13:41.928] - Field: 'result' [13:13:41.929] - Field: 'asynchronous' [13:13:41.929] - Field: 'calls' [13:13:41.929] - Field: 'globals' [13:13:41.929] - Field: 'stdout' [13:13:41.929] - Field: 'earlySignal' [13:13:41.930] - Field: 'lazy' [13:13:41.930] - Field: 'state' [13:13:41.930] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:41.930] - Launch lazy future ... [13:13:41.930] Packages needed by the future expression (n = 0): [13:13:41.931] Packages needed by future strategies (n = 0): [13:13:41.931] { [13:13:41.931] { [13:13:41.931] { [13:13:41.931] ...future.startTime <- base::Sys.time() [13:13:41.931] { [13:13:41.931] { [13:13:41.931] { [13:13:41.931] base::local({ [13:13:41.931] has_future <- base::requireNamespace("future", [13:13:41.931] quietly = TRUE) [13:13:41.931] if (has_future) { [13:13:41.931] ns <- base::getNamespace("future") [13:13:41.931] version <- ns[[".package"]][["version"]] [13:13:41.931] if (is.null(version)) [13:13:41.931] version <- utils::packageVersion("future") [13:13:41.931] } [13:13:41.931] else { [13:13:41.931] version <- NULL [13:13:41.931] } [13:13:41.931] if (!has_future || version < "1.8.0") { [13:13:41.931] info <- base::c(r_version = base::gsub("R version ", [13:13:41.931] "", base::R.version$version.string), [13:13:41.931] platform = base::sprintf("%s (%s-bit)", [13:13:41.931] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:41.931] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:41.931] "release", "version")], collapse = " "), [13:13:41.931] hostname = base::Sys.info()[["nodename"]]) [13:13:41.931] info <- base::sprintf("%s: %s", base::names(info), [13:13:41.931] info) [13:13:41.931] info <- base::paste(info, collapse = "; ") [13:13:41.931] if (!has_future) { [13:13:41.931] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:41.931] info) [13:13:41.931] } [13:13:41.931] else { [13:13:41.931] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:41.931] info, version) [13:13:41.931] } [13:13:41.931] base::stop(msg) [13:13:41.931] } [13:13:41.931] }) [13:13:41.931] } [13:13:41.931] options(future.plan = NULL) [13:13:41.931] Sys.unsetenv("R_FUTURE_PLAN") [13:13:41.931] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:41.931] } [13:13:41.931] ...future.workdir <- getwd() [13:13:41.931] } [13:13:41.931] ...future.oldOptions <- base::as.list(base::.Options) [13:13:41.931] ...future.oldEnvVars <- base::Sys.getenv() [13:13:41.931] } [13:13:41.931] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:41.931] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:41.931] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:41.931] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:41.931] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:41.931] future.stdout.windows.reencode = NULL, width = 80L) [13:13:41.931] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:41.931] base::names(...future.oldOptions)) [13:13:41.931] } [13:13:41.931] if (FALSE) { [13:13:41.931] } [13:13:41.931] else { [13:13:41.931] if (TRUE) { [13:13:41.931] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:41.931] open = "w") [13:13:41.931] } [13:13:41.931] else { [13:13:41.931] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:41.931] windows = "NUL", "/dev/null"), open = "w") [13:13:41.931] } [13:13:41.931] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:41.931] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:41.931] base::sink(type = "output", split = FALSE) [13:13:41.931] base::close(...future.stdout) [13:13:41.931] }, add = TRUE) [13:13:41.931] } [13:13:41.931] ...future.frame <- base::sys.nframe() [13:13:41.931] ...future.conditions <- base::list() [13:13:41.931] ...future.rng <- base::globalenv()$.Random.seed [13:13:41.931] if (FALSE) { [13:13:41.931] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:41.931] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:41.931] } [13:13:41.931] ...future.result <- base::tryCatch({ [13:13:41.931] base::withCallingHandlers({ [13:13:41.931] ...future.value <- base::withVisible(base::local({ [13:13:41.931] do.call(function(...) { [13:13:41.931] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:41.931] if (!identical(...future.globals.maxSize.org, [13:13:41.931] ...future.globals.maxSize)) { [13:13:41.931] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:41.931] on.exit(options(oopts), add = TRUE) [13:13:41.931] } [13:13:41.931] { [13:13:41.931] lapply(seq_along(...future.elements_ii), [13:13:41.931] FUN = function(jj) { [13:13:41.931] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:41.931] ...future.FUN(...future.X_jj, ...) [13:13:41.931] }) [13:13:41.931] } [13:13:41.931] }, args = future.call.arguments) [13:13:41.931] })) [13:13:41.931] future::FutureResult(value = ...future.value$value, [13:13:41.931] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:41.931] ...future.rng), globalenv = if (FALSE) [13:13:41.931] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:41.931] ...future.globalenv.names)) [13:13:41.931] else NULL, started = ...future.startTime, version = "1.8") [13:13:41.931] }, condition = base::local({ [13:13:41.931] c <- base::c [13:13:41.931] inherits <- base::inherits [13:13:41.931] invokeRestart <- base::invokeRestart [13:13:41.931] length <- base::length [13:13:41.931] list <- base::list [13:13:41.931] seq.int <- base::seq.int [13:13:41.931] signalCondition <- base::signalCondition [13:13:41.931] sys.calls <- base::sys.calls [13:13:41.931] `[[` <- base::`[[` [13:13:41.931] `+` <- base::`+` [13:13:41.931] `<<-` <- base::`<<-` [13:13:41.931] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:41.931] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:41.931] 3L)] [13:13:41.931] } [13:13:41.931] function(cond) { [13:13:41.931] is_error <- inherits(cond, "error") [13:13:41.931] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:41.931] NULL) [13:13:41.931] if (is_error) { [13:13:41.931] sessionInformation <- function() { [13:13:41.931] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:41.931] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:41.931] search = base::search(), system = base::Sys.info()) [13:13:41.931] } [13:13:41.931] ...future.conditions[[length(...future.conditions) + [13:13:41.931] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:41.931] cond$call), session = sessionInformation(), [13:13:41.931] timestamp = base::Sys.time(), signaled = 0L) [13:13:41.931] signalCondition(cond) [13:13:41.931] } [13:13:41.931] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:41.931] "immediateCondition"))) { [13:13:41.931] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:41.931] ...future.conditions[[length(...future.conditions) + [13:13:41.931] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:41.931] if (TRUE && !signal) { [13:13:41.931] muffleCondition <- function (cond, pattern = "^muffle") [13:13:41.931] { [13:13:41.931] inherits <- base::inherits [13:13:41.931] invokeRestart <- base::invokeRestart [13:13:41.931] is.null <- base::is.null [13:13:41.931] muffled <- FALSE [13:13:41.931] if (inherits(cond, "message")) { [13:13:41.931] muffled <- grepl(pattern, "muffleMessage") [13:13:41.931] if (muffled) [13:13:41.931] invokeRestart("muffleMessage") [13:13:41.931] } [13:13:41.931] else if (inherits(cond, "warning")) { [13:13:41.931] muffled <- grepl(pattern, "muffleWarning") [13:13:41.931] if (muffled) [13:13:41.931] invokeRestart("muffleWarning") [13:13:41.931] } [13:13:41.931] else if (inherits(cond, "condition")) { [13:13:41.931] if (!is.null(pattern)) { [13:13:41.931] computeRestarts <- base::computeRestarts [13:13:41.931] grepl <- base::grepl [13:13:41.931] restarts <- computeRestarts(cond) [13:13:41.931] for (restart in restarts) { [13:13:41.931] name <- restart$name [13:13:41.931] if (is.null(name)) [13:13:41.931] next [13:13:41.931] if (!grepl(pattern, name)) [13:13:41.931] next [13:13:41.931] invokeRestart(restart) [13:13:41.931] muffled <- TRUE [13:13:41.931] break [13:13:41.931] } [13:13:41.931] } [13:13:41.931] } [13:13:41.931] invisible(muffled) [13:13:41.931] } [13:13:41.931] muffleCondition(cond, pattern = "^muffle") [13:13:41.931] } [13:13:41.931] } [13:13:41.931] else { [13:13:41.931] if (TRUE) { [13:13:41.931] muffleCondition <- function (cond, pattern = "^muffle") [13:13:41.931] { [13:13:41.931] inherits <- base::inherits [13:13:41.931] invokeRestart <- base::invokeRestart [13:13:41.931] is.null <- base::is.null [13:13:41.931] muffled <- FALSE [13:13:41.931] if (inherits(cond, "message")) { [13:13:41.931] muffled <- grepl(pattern, "muffleMessage") [13:13:41.931] if (muffled) [13:13:41.931] invokeRestart("muffleMessage") [13:13:41.931] } [13:13:41.931] else if (inherits(cond, "warning")) { [13:13:41.931] muffled <- grepl(pattern, "muffleWarning") [13:13:41.931] if (muffled) [13:13:41.931] invokeRestart("muffleWarning") [13:13:41.931] } [13:13:41.931] else if (inherits(cond, "condition")) { [13:13:41.931] if (!is.null(pattern)) { [13:13:41.931] computeRestarts <- base::computeRestarts [13:13:41.931] grepl <- base::grepl [13:13:41.931] restarts <- computeRestarts(cond) [13:13:41.931] for (restart in restarts) { [13:13:41.931] name <- restart$name [13:13:41.931] if (is.null(name)) [13:13:41.931] next [13:13:41.931] if (!grepl(pattern, name)) [13:13:41.931] next [13:13:41.931] invokeRestart(restart) [13:13:41.931] muffled <- TRUE [13:13:41.931] break [13:13:41.931] } [13:13:41.931] } [13:13:41.931] } [13:13:41.931] invisible(muffled) [13:13:41.931] } [13:13:41.931] muffleCondition(cond, pattern = "^muffle") [13:13:41.931] } [13:13:41.931] } [13:13:41.931] } [13:13:41.931] })) [13:13:41.931] }, error = function(ex) { [13:13:41.931] base::structure(base::list(value = NULL, visible = NULL, [13:13:41.931] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:41.931] ...future.rng), started = ...future.startTime, [13:13:41.931] finished = Sys.time(), session_uuid = NA_character_, [13:13:41.931] version = "1.8"), class = "FutureResult") [13:13:41.931] }, finally = { [13:13:41.931] if (!identical(...future.workdir, getwd())) [13:13:41.931] setwd(...future.workdir) [13:13:41.931] { [13:13:41.931] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:41.931] ...future.oldOptions$nwarnings <- NULL [13:13:41.931] } [13:13:41.931] base::options(...future.oldOptions) [13:13:41.931] if (.Platform$OS.type == "windows") { [13:13:41.931] old_names <- names(...future.oldEnvVars) [13:13:41.931] envs <- base::Sys.getenv() [13:13:41.931] names <- names(envs) [13:13:41.931] common <- intersect(names, old_names) [13:13:41.931] added <- setdiff(names, old_names) [13:13:41.931] removed <- setdiff(old_names, names) [13:13:41.931] changed <- common[...future.oldEnvVars[common] != [13:13:41.931] envs[common]] [13:13:41.931] NAMES <- toupper(changed) [13:13:41.931] args <- list() [13:13:41.931] for (kk in seq_along(NAMES)) { [13:13:41.931] name <- changed[[kk]] [13:13:41.931] NAME <- NAMES[[kk]] [13:13:41.931] if (name != NAME && is.element(NAME, old_names)) [13:13:41.931] next [13:13:41.931] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:41.931] } [13:13:41.931] NAMES <- toupper(added) [13:13:41.931] for (kk in seq_along(NAMES)) { [13:13:41.931] name <- added[[kk]] [13:13:41.931] NAME <- NAMES[[kk]] [13:13:41.931] if (name != NAME && is.element(NAME, old_names)) [13:13:41.931] next [13:13:41.931] args[[name]] <- "" [13:13:41.931] } [13:13:41.931] NAMES <- toupper(removed) [13:13:41.931] for (kk in seq_along(NAMES)) { [13:13:41.931] name <- removed[[kk]] [13:13:41.931] NAME <- NAMES[[kk]] [13:13:41.931] if (name != NAME && is.element(NAME, old_names)) [13:13:41.931] next [13:13:41.931] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:41.931] } [13:13:41.931] if (length(args) > 0) [13:13:41.931] base::do.call(base::Sys.setenv, args = args) [13:13:41.931] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:41.931] } [13:13:41.931] else { [13:13:41.931] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:41.931] } [13:13:41.931] { [13:13:41.931] if (base::length(...future.futureOptionsAdded) > [13:13:41.931] 0L) { [13:13:41.931] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:41.931] base::names(opts) <- ...future.futureOptionsAdded [13:13:41.931] base::options(opts) [13:13:41.931] } [13:13:41.931] { [13:13:41.931] { [13:13:41.931] NULL [13:13:41.931] RNGkind("Mersenne-Twister") [13:13:41.931] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:41.931] inherits = FALSE) [13:13:41.931] } [13:13:41.931] options(future.plan = NULL) [13:13:41.931] if (is.na(NA_character_)) [13:13:41.931] Sys.unsetenv("R_FUTURE_PLAN") [13:13:41.931] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:41.931] future::plan(list(function (..., workers = availableCores(), [13:13:41.931] lazy = FALSE, rscript_libs = .libPaths(), [13:13:41.931] envir = parent.frame()) [13:13:41.931] { [13:13:41.931] if (is.function(workers)) [13:13:41.931] workers <- workers() [13:13:41.931] workers <- structure(as.integer(workers), [13:13:41.931] class = class(workers)) [13:13:41.931] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:41.931] workers >= 1) [13:13:41.931] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:41.931] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:41.931] } [13:13:41.931] future <- MultisessionFuture(..., workers = workers, [13:13:41.931] lazy = lazy, rscript_libs = rscript_libs, [13:13:41.931] envir = envir) [13:13:41.931] if (!future$lazy) [13:13:41.931] future <- run(future) [13:13:41.931] invisible(future) [13:13:41.931] }), .cleanup = FALSE, .init = FALSE) [13:13:41.931] } [13:13:41.931] } [13:13:41.931] } [13:13:41.931] }) [13:13:41.931] if (TRUE) { [13:13:41.931] base::sink(type = "output", split = FALSE) [13:13:41.931] if (TRUE) { [13:13:41.931] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:41.931] } [13:13:41.931] else { [13:13:41.931] ...future.result["stdout"] <- base::list(NULL) [13:13:41.931] } [13:13:41.931] base::close(...future.stdout) [13:13:41.931] ...future.stdout <- NULL [13:13:41.931] } [13:13:41.931] ...future.result$conditions <- ...future.conditions [13:13:41.931] ...future.result$finished <- base::Sys.time() [13:13:41.931] ...future.result [13:13:41.931] } [13:13:41.935] assign_globals() ... [13:13:41.935] List of 5 [13:13:41.935] $ ...future.FUN :function (mode = "logical", length = 0L) [13:13:41.935] $ future.call.arguments :List of 1 [13:13:41.935] ..$ length: int 2 [13:13:41.935] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:41.935] $ ...future.elements_ii :List of 4 [13:13:41.935] ..$ c: chr "list" [13:13:41.935] ..$ c: chr "character" [13:13:41.935] ..$ b: chr "numeric" [13:13:41.935] ..$ a: chr "integer" [13:13:41.935] $ ...future.seeds_ii : NULL [13:13:41.935] $ ...future.globals.maxSize: NULL [13:13:41.935] - attr(*, "where")=List of 5 [13:13:41.935] ..$ ...future.FUN : [13:13:41.935] ..$ future.call.arguments : [13:13:41.935] ..$ ...future.elements_ii : [13:13:41.935] ..$ ...future.seeds_ii : [13:13:41.935] ..$ ...future.globals.maxSize: [13:13:41.935] - attr(*, "resolved")= logi FALSE [13:13:41.935] - attr(*, "total_size")= num 2240 [13:13:41.935] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:41.935] - attr(*, "already-done")= logi TRUE [13:13:41.942] - copied '...future.FUN' to environment [13:13:41.942] - copied 'future.call.arguments' to environment [13:13:41.943] - copied '...future.elements_ii' to environment [13:13:41.943] - copied '...future.seeds_ii' to environment [13:13:41.943] - copied '...future.globals.maxSize' to environment [13:13:41.943] assign_globals() ... done [13:13:41.943] plan(): Setting new future strategy stack: [13:13:41.944] List of future strategies: [13:13:41.944] 1. sequential: [13:13:41.944] - args: function (..., envir = parent.frame(), workers = "") [13:13:41.944] - tweaked: FALSE [13:13:41.944] - call: NULL [13:13:41.944] plan(): nbrOfWorkers() = 1 [13:13:41.945] plan(): Setting new future strategy stack: [13:13:41.946] List of future strategies: [13:13:41.946] 1. multisession: [13:13:41.946] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [13:13:41.946] - tweaked: FALSE [13:13:41.946] - call: plan(strategy) [13:13:41.948] plan(): nbrOfWorkers() = 1 [13:13:41.948] SequentialFuture started (and completed) [13:13:41.948] - Launch lazy future ... done [13:13:41.949] run() for 'SequentialFuture' ... done [13:13:41.949] Created future: [13:13:41.949] SequentialFuture: [13:13:41.949] Label: 'future_lapply-1' [13:13:41.949] Expression: [13:13:41.949] { [13:13:41.949] do.call(function(...) { [13:13:41.949] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:41.949] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:41.949] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:41.949] on.exit(options(oopts), add = TRUE) [13:13:41.949] } [13:13:41.949] { [13:13:41.949] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:41.949] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:41.949] ...future.FUN(...future.X_jj, ...) [13:13:41.949] }) [13:13:41.949] } [13:13:41.949] }, args = future.call.arguments) [13:13:41.949] } [13:13:41.949] Lazy evaluation: FALSE [13:13:41.949] Asynchronous evaluation: FALSE [13:13:41.949] Local evaluation: TRUE [13:13:41.949] Environment: R_GlobalEnv [13:13:41.949] Capture standard output: TRUE [13:13:41.949] Capture condition classes: 'condition' (excluding 'nothing') [13:13:41.949] 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) [13:13:41.949] Packages: [13:13:41.949] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:41.949] Resolved: TRUE [13:13:41.949] Value: 240 bytes of class 'list' [13:13:41.949] Early signaling: FALSE [13:13:41.949] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:41.949] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:41.950] Chunk #1 of 1 ... DONE [13:13:41.950] Launching 1 futures (chunks) ... DONE [13:13:41.951] Resolving 1 futures (chunks) ... [13:13:41.951] resolve() on list ... [13:13:41.951] recursive: 0 [13:13:41.951] length: 1 [13:13:41.951] [13:13:41.951] resolved() for 'SequentialFuture' ... [13:13:41.952] - state: 'finished' [13:13:41.952] - run: TRUE [13:13:41.952] - result: 'FutureResult' [13:13:41.952] resolved() for 'SequentialFuture' ... done [13:13:41.952] Future #1 [13:13:41.953] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:41.953] - nx: 1 [13:13:41.953] - relay: TRUE [13:13:41.953] - stdout: TRUE [13:13:41.953] - signal: TRUE [13:13:41.953] - resignal: FALSE [13:13:41.954] - force: TRUE [13:13:41.954] - relayed: [n=1] FALSE [13:13:41.954] - queued futures: [n=1] FALSE [13:13:41.954] - until=1 [13:13:41.954] - relaying element #1 [13:13:41.954] - relayed: [n=1] TRUE [13:13:41.955] - queued futures: [n=1] TRUE [13:13:41.955] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:41.955] length: 0 (resolved future 1) [13:13:41.955] Relaying remaining futures [13:13:41.955] signalConditionsASAP(NULL, pos=0) ... [13:13:41.955] - nx: 1 [13:13:41.956] - relay: TRUE [13:13:41.956] - stdout: TRUE [13:13:41.956] - signal: TRUE [13:13:41.956] - resignal: FALSE [13:13:41.956] - force: TRUE [13:13:41.956] - relayed: [n=1] TRUE [13:13:41.956] - queued futures: [n=1] TRUE - flush all [13:13:41.957] - relayed: [n=1] TRUE [13:13:41.957] - queued futures: [n=1] TRUE [13:13:41.957] signalConditionsASAP(NULL, pos=0) ... done [13:13:41.957] resolve() on list ... DONE [13:13:41.957] - Number of value chunks collected: 1 [13:13:41.958] Resolving 1 futures (chunks) ... DONE [13:13:41.958] Reducing values from 1 chunks ... [13:13:41.958] - Number of values collected after concatenation: 4 [13:13:41.958] - Number of values expected: 4 [13:13:41.958] Reverse index remapping (attribute 'ordering'): [n = 4] 4, 3, 2, 1 [13:13:41.958] Reducing values from 1 chunks ... DONE [13:13:41.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 [13:13:41.961] future_lapply() ... [13:13:41.964] Number of chunks: 1 [13:13:41.964] Index remapping (attribute 'ordering'): [n = 4] 4, 3, 2, 1 [13:13:41.964] getGlobalsAndPackagesXApply() ... [13:13:41.964] - future.globals: TRUE [13:13:41.965] getGlobalsAndPackages() ... [13:13:41.965] Searching for globals... [13:13:41.966] - globals found: [2] 'FUN', '.Internal' [13:13:41.966] Searching for globals ... DONE [13:13:41.967] Resolving globals: FALSE [13:13:41.967] The total size of the 1 globals is 2.13 KiB (2184 bytes) [13:13:41.967] 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') [13:13:41.968] - globals: [1] 'FUN' [13:13:41.968] [13:13:41.968] getGlobalsAndPackages() ... DONE [13:13:41.968] - globals found/used: [n=1] 'FUN' [13:13:41.968] - needed namespaces: [n=0] [13:13:41.968] Finding globals ... DONE [13:13:41.969] - use_args: TRUE [13:13:41.969] - Getting '...' globals ... [13:13:41.969] resolve() on list ... [13:13:41.969] recursive: 0 [13:13:41.969] length: 1 [13:13:41.970] elements: '...' [13:13:41.970] length: 0 (resolved future 1) [13:13:41.970] resolve() on list ... DONE [13:13:41.970] - '...' content: [n=1] 'length' [13:13:41.970] List of 1 [13:13:41.970] $ ...:List of 1 [13:13:41.970] ..$ length: int 2 [13:13:41.970] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:41.970] - attr(*, "where")=List of 1 [13:13:41.970] ..$ ...: [13:13:41.970] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:41.970] - attr(*, "resolved")= logi TRUE [13:13:41.970] - attr(*, "total_size")= num NA [13:13:41.974] - Getting '...' globals ... DONE [13:13:41.974] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:41.974] List of 2 [13:13:41.974] $ ...future.FUN:function (mode = "logical", length = 0L) [13:13:41.974] $ ... :List of 1 [13:13:41.974] ..$ length: int 2 [13:13:41.974] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:41.974] - attr(*, "where")=List of 2 [13:13:41.974] ..$ ...future.FUN: [13:13:41.974] ..$ ... : [13:13:41.974] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:41.974] - attr(*, "resolved")= logi FALSE [13:13:41.974] - attr(*, "total_size")= num 2240 [13:13:41.978] Packages to be attached in all futures: [n=0] [13:13:41.978] getGlobalsAndPackagesXApply() ... DONE [13:13:41.979] Number of futures (= number of chunks): 1 [13:13:41.979] Launching 1 futures (chunks) ... [13:13:41.979] Chunk #1 of 1 ... [13:13:41.979] - Finding globals in 'X' for chunk #1 ... [13:13:41.979] getGlobalsAndPackages() ... [13:13:41.979] Searching for globals... [13:13:41.980] [13:13:41.980] Searching for globals ... DONE [13:13:41.980] - globals: [0] [13:13:41.980] getGlobalsAndPackages() ... DONE [13:13:41.980] + additional globals found: [n=0] [13:13:41.981] + additional namespaces needed: [n=0] [13:13:41.981] - Finding globals in 'X' for chunk #1 ... DONE [13:13:41.981] - seeds: [13:13:41.981] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:41.981] getGlobalsAndPackages() ... [13:13:41.981] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:41.982] Resolving globals: FALSE [13:13:41.982] Tweak future expression to call with '...' arguments ... [13:13:41.982] { [13:13:41.982] do.call(function(...) { [13:13:41.982] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:41.982] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:41.982] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:41.982] on.exit(options(oopts), add = TRUE) [13:13:41.982] } [13:13:41.982] { [13:13:41.982] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:41.982] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:41.982] ...future.FUN(...future.X_jj, ...) [13:13:41.982] }) [13:13:41.982] } [13:13:41.982] }, args = future.call.arguments) [13:13:41.982] } [13:13:41.982] Tweak future expression to call with '...' arguments ... DONE [13:13:41.983] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:41.983] [13:13:41.983] getGlobalsAndPackages() ... DONE [13:13:41.984] run() for 'Future' ... [13:13:41.984] - state: 'created' [13:13:41.984] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:41.986] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:41.986] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:41.987] - Field: 'label' [13:13:41.987] - Field: 'local' [13:13:41.987] - Field: 'owner' [13:13:41.987] - Field: 'envir' [13:13:41.987] - Field: 'packages' [13:13:41.988] - Field: 'gc' [13:13:41.988] - Field: 'conditions' [13:13:41.988] - Field: 'expr' [13:13:41.988] - Field: 'uuid' [13:13:41.988] - Field: 'seed' [13:13:41.988] - Field: 'version' [13:13:41.989] - Field: 'result' [13:13:41.989] - Field: 'asynchronous' [13:13:41.989] - Field: 'calls' [13:13:41.989] - Field: 'globals' [13:13:41.989] - Field: 'stdout' [13:13:41.990] - Field: 'earlySignal' [13:13:41.990] - Field: 'lazy' [13:13:41.990] - Field: 'state' [13:13:41.990] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:41.990] - Launch lazy future ... [13:13:41.990] Packages needed by the future expression (n = 0): [13:13:41.991] Packages needed by future strategies (n = 0): [13:13:41.991] { [13:13:41.991] { [13:13:41.991] { [13:13:41.991] ...future.startTime <- base::Sys.time() [13:13:41.991] { [13:13:41.991] { [13:13:41.991] { [13:13:41.991] base::local({ [13:13:41.991] has_future <- base::requireNamespace("future", [13:13:41.991] quietly = TRUE) [13:13:41.991] if (has_future) { [13:13:41.991] ns <- base::getNamespace("future") [13:13:41.991] version <- ns[[".package"]][["version"]] [13:13:41.991] if (is.null(version)) [13:13:41.991] version <- utils::packageVersion("future") [13:13:41.991] } [13:13:41.991] else { [13:13:41.991] version <- NULL [13:13:41.991] } [13:13:41.991] if (!has_future || version < "1.8.0") { [13:13:41.991] info <- base::c(r_version = base::gsub("R version ", [13:13:41.991] "", base::R.version$version.string), [13:13:41.991] platform = base::sprintf("%s (%s-bit)", [13:13:41.991] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:41.991] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:41.991] "release", "version")], collapse = " "), [13:13:41.991] hostname = base::Sys.info()[["nodename"]]) [13:13:41.991] info <- base::sprintf("%s: %s", base::names(info), [13:13:41.991] info) [13:13:41.991] info <- base::paste(info, collapse = "; ") [13:13:41.991] if (!has_future) { [13:13:41.991] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:41.991] info) [13:13:41.991] } [13:13:41.991] else { [13:13:41.991] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:41.991] info, version) [13:13:41.991] } [13:13:41.991] base::stop(msg) [13:13:41.991] } [13:13:41.991] }) [13:13:41.991] } [13:13:41.991] options(future.plan = NULL) [13:13:41.991] Sys.unsetenv("R_FUTURE_PLAN") [13:13:41.991] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:41.991] } [13:13:41.991] ...future.workdir <- getwd() [13:13:41.991] } [13:13:41.991] ...future.oldOptions <- base::as.list(base::.Options) [13:13:41.991] ...future.oldEnvVars <- base::Sys.getenv() [13:13:41.991] } [13:13:41.991] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:41.991] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:41.991] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:41.991] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:41.991] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:41.991] future.stdout.windows.reencode = NULL, width = 80L) [13:13:41.991] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:41.991] base::names(...future.oldOptions)) [13:13:41.991] } [13:13:41.991] if (FALSE) { [13:13:41.991] } [13:13:41.991] else { [13:13:41.991] if (TRUE) { [13:13:41.991] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:41.991] open = "w") [13:13:41.991] } [13:13:41.991] else { [13:13:41.991] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:41.991] windows = "NUL", "/dev/null"), open = "w") [13:13:41.991] } [13:13:41.991] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:41.991] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:41.991] base::sink(type = "output", split = FALSE) [13:13:41.991] base::close(...future.stdout) [13:13:41.991] }, add = TRUE) [13:13:41.991] } [13:13:41.991] ...future.frame <- base::sys.nframe() [13:13:41.991] ...future.conditions <- base::list() [13:13:41.991] ...future.rng <- base::globalenv()$.Random.seed [13:13:41.991] if (FALSE) { [13:13:41.991] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:41.991] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:41.991] } [13:13:41.991] ...future.result <- base::tryCatch({ [13:13:41.991] base::withCallingHandlers({ [13:13:41.991] ...future.value <- base::withVisible(base::local({ [13:13:41.991] do.call(function(...) { [13:13:41.991] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:41.991] if (!identical(...future.globals.maxSize.org, [13:13:41.991] ...future.globals.maxSize)) { [13:13:41.991] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:41.991] on.exit(options(oopts), add = TRUE) [13:13:41.991] } [13:13:41.991] { [13:13:41.991] lapply(seq_along(...future.elements_ii), [13:13:41.991] FUN = function(jj) { [13:13:41.991] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:41.991] ...future.FUN(...future.X_jj, ...) [13:13:41.991] }) [13:13:41.991] } [13:13:41.991] }, args = future.call.arguments) [13:13:41.991] })) [13:13:41.991] future::FutureResult(value = ...future.value$value, [13:13:41.991] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:41.991] ...future.rng), globalenv = if (FALSE) [13:13:41.991] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:41.991] ...future.globalenv.names)) [13:13:41.991] else NULL, started = ...future.startTime, version = "1.8") [13:13:41.991] }, condition = base::local({ [13:13:41.991] c <- base::c [13:13:41.991] inherits <- base::inherits [13:13:41.991] invokeRestart <- base::invokeRestart [13:13:41.991] length <- base::length [13:13:41.991] list <- base::list [13:13:41.991] seq.int <- base::seq.int [13:13:41.991] signalCondition <- base::signalCondition [13:13:41.991] sys.calls <- base::sys.calls [13:13:41.991] `[[` <- base::`[[` [13:13:41.991] `+` <- base::`+` [13:13:41.991] `<<-` <- base::`<<-` [13:13:41.991] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:41.991] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:41.991] 3L)] [13:13:41.991] } [13:13:41.991] function(cond) { [13:13:41.991] is_error <- inherits(cond, "error") [13:13:41.991] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:41.991] NULL) [13:13:41.991] if (is_error) { [13:13:41.991] sessionInformation <- function() { [13:13:41.991] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:41.991] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:41.991] search = base::search(), system = base::Sys.info()) [13:13:41.991] } [13:13:41.991] ...future.conditions[[length(...future.conditions) + [13:13:41.991] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:41.991] cond$call), session = sessionInformation(), [13:13:41.991] timestamp = base::Sys.time(), signaled = 0L) [13:13:41.991] signalCondition(cond) [13:13:41.991] } [13:13:41.991] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:41.991] "immediateCondition"))) { [13:13:41.991] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:41.991] ...future.conditions[[length(...future.conditions) + [13:13:41.991] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:41.991] if (TRUE && !signal) { [13:13:41.991] muffleCondition <- function (cond, pattern = "^muffle") [13:13:41.991] { [13:13:41.991] inherits <- base::inherits [13:13:41.991] invokeRestart <- base::invokeRestart [13:13:41.991] is.null <- base::is.null [13:13:41.991] muffled <- FALSE [13:13:41.991] if (inherits(cond, "message")) { [13:13:41.991] muffled <- grepl(pattern, "muffleMessage") [13:13:41.991] if (muffled) [13:13:41.991] invokeRestart("muffleMessage") [13:13:41.991] } [13:13:41.991] else if (inherits(cond, "warning")) { [13:13:41.991] muffled <- grepl(pattern, "muffleWarning") [13:13:41.991] if (muffled) [13:13:41.991] invokeRestart("muffleWarning") [13:13:41.991] } [13:13:41.991] else if (inherits(cond, "condition")) { [13:13:41.991] if (!is.null(pattern)) { [13:13:41.991] computeRestarts <- base::computeRestarts [13:13:41.991] grepl <- base::grepl [13:13:41.991] restarts <- computeRestarts(cond) [13:13:41.991] for (restart in restarts) { [13:13:41.991] name <- restart$name [13:13:41.991] if (is.null(name)) [13:13:41.991] next [13:13:41.991] if (!grepl(pattern, name)) [13:13:41.991] next [13:13:41.991] invokeRestart(restart) [13:13:41.991] muffled <- TRUE [13:13:41.991] break [13:13:41.991] } [13:13:41.991] } [13:13:41.991] } [13:13:41.991] invisible(muffled) [13:13:41.991] } [13:13:41.991] muffleCondition(cond, pattern = "^muffle") [13:13:41.991] } [13:13:41.991] } [13:13:41.991] else { [13:13:41.991] if (TRUE) { [13:13:41.991] muffleCondition <- function (cond, pattern = "^muffle") [13:13:41.991] { [13:13:41.991] inherits <- base::inherits [13:13:41.991] invokeRestart <- base::invokeRestart [13:13:41.991] is.null <- base::is.null [13:13:41.991] muffled <- FALSE [13:13:41.991] if (inherits(cond, "message")) { [13:13:41.991] muffled <- grepl(pattern, "muffleMessage") [13:13:41.991] if (muffled) [13:13:41.991] invokeRestart("muffleMessage") [13:13:41.991] } [13:13:41.991] else if (inherits(cond, "warning")) { [13:13:41.991] muffled <- grepl(pattern, "muffleWarning") [13:13:41.991] if (muffled) [13:13:41.991] invokeRestart("muffleWarning") [13:13:41.991] } [13:13:41.991] else if (inherits(cond, "condition")) { [13:13:41.991] if (!is.null(pattern)) { [13:13:41.991] computeRestarts <- base::computeRestarts [13:13:41.991] grepl <- base::grepl [13:13:41.991] restarts <- computeRestarts(cond) [13:13:41.991] for (restart in restarts) { [13:13:41.991] name <- restart$name [13:13:41.991] if (is.null(name)) [13:13:41.991] next [13:13:41.991] if (!grepl(pattern, name)) [13:13:41.991] next [13:13:41.991] invokeRestart(restart) [13:13:41.991] muffled <- TRUE [13:13:41.991] break [13:13:41.991] } [13:13:41.991] } [13:13:41.991] } [13:13:41.991] invisible(muffled) [13:13:41.991] } [13:13:41.991] muffleCondition(cond, pattern = "^muffle") [13:13:41.991] } [13:13:41.991] } [13:13:41.991] } [13:13:41.991] })) [13:13:41.991] }, error = function(ex) { [13:13:41.991] base::structure(base::list(value = NULL, visible = NULL, [13:13:41.991] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:41.991] ...future.rng), started = ...future.startTime, [13:13:41.991] finished = Sys.time(), session_uuid = NA_character_, [13:13:41.991] version = "1.8"), class = "FutureResult") [13:13:41.991] }, finally = { [13:13:41.991] if (!identical(...future.workdir, getwd())) [13:13:41.991] setwd(...future.workdir) [13:13:41.991] { [13:13:41.991] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:41.991] ...future.oldOptions$nwarnings <- NULL [13:13:41.991] } [13:13:41.991] base::options(...future.oldOptions) [13:13:41.991] if (.Platform$OS.type == "windows") { [13:13:41.991] old_names <- names(...future.oldEnvVars) [13:13:41.991] envs <- base::Sys.getenv() [13:13:41.991] names <- names(envs) [13:13:41.991] common <- intersect(names, old_names) [13:13:41.991] added <- setdiff(names, old_names) [13:13:41.991] removed <- setdiff(old_names, names) [13:13:41.991] changed <- common[...future.oldEnvVars[common] != [13:13:41.991] envs[common]] [13:13:41.991] NAMES <- toupper(changed) [13:13:41.991] args <- list() [13:13:41.991] for (kk in seq_along(NAMES)) { [13:13:41.991] name <- changed[[kk]] [13:13:41.991] NAME <- NAMES[[kk]] [13:13:41.991] if (name != NAME && is.element(NAME, old_names)) [13:13:41.991] next [13:13:41.991] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:41.991] } [13:13:41.991] NAMES <- toupper(added) [13:13:41.991] for (kk in seq_along(NAMES)) { [13:13:41.991] name <- added[[kk]] [13:13:41.991] NAME <- NAMES[[kk]] [13:13:41.991] if (name != NAME && is.element(NAME, old_names)) [13:13:41.991] next [13:13:41.991] args[[name]] <- "" [13:13:41.991] } [13:13:41.991] NAMES <- toupper(removed) [13:13:41.991] for (kk in seq_along(NAMES)) { [13:13:41.991] name <- removed[[kk]] [13:13:41.991] NAME <- NAMES[[kk]] [13:13:41.991] if (name != NAME && is.element(NAME, old_names)) [13:13:41.991] next [13:13:41.991] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:41.991] } [13:13:41.991] if (length(args) > 0) [13:13:41.991] base::do.call(base::Sys.setenv, args = args) [13:13:41.991] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:41.991] } [13:13:41.991] else { [13:13:41.991] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:41.991] } [13:13:41.991] { [13:13:41.991] if (base::length(...future.futureOptionsAdded) > [13:13:41.991] 0L) { [13:13:41.991] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:41.991] base::names(opts) <- ...future.futureOptionsAdded [13:13:41.991] base::options(opts) [13:13:41.991] } [13:13:41.991] { [13:13:41.991] { [13:13:41.991] NULL [13:13:41.991] RNGkind("Mersenne-Twister") [13:13:41.991] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:41.991] inherits = FALSE) [13:13:41.991] } [13:13:41.991] options(future.plan = NULL) [13:13:41.991] if (is.na(NA_character_)) [13:13:41.991] Sys.unsetenv("R_FUTURE_PLAN") [13:13:41.991] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:41.991] future::plan(list(function (..., workers = availableCores(), [13:13:41.991] lazy = FALSE, rscript_libs = .libPaths(), [13:13:41.991] envir = parent.frame()) [13:13:41.991] { [13:13:41.991] if (is.function(workers)) [13:13:41.991] workers <- workers() [13:13:41.991] workers <- structure(as.integer(workers), [13:13:41.991] class = class(workers)) [13:13:41.991] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:41.991] workers >= 1) [13:13:41.991] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:41.991] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:41.991] } [13:13:41.991] future <- MultisessionFuture(..., workers = workers, [13:13:41.991] lazy = lazy, rscript_libs = rscript_libs, [13:13:41.991] envir = envir) [13:13:41.991] if (!future$lazy) [13:13:41.991] future <- run(future) [13:13:41.991] invisible(future) [13:13:41.991] }), .cleanup = FALSE, .init = FALSE) [13:13:41.991] } [13:13:41.991] } [13:13:41.991] } [13:13:41.991] }) [13:13:41.991] if (TRUE) { [13:13:41.991] base::sink(type = "output", split = FALSE) [13:13:41.991] if (TRUE) { [13:13:41.991] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:41.991] } [13:13:41.991] else { [13:13:41.991] ...future.result["stdout"] <- base::list(NULL) [13:13:41.991] } [13:13:41.991] base::close(...future.stdout) [13:13:41.991] ...future.stdout <- NULL [13:13:41.991] } [13:13:41.991] ...future.result$conditions <- ...future.conditions [13:13:41.991] ...future.result$finished <- base::Sys.time() [13:13:41.991] ...future.result [13:13:41.991] } [13:13:41.995] assign_globals() ... [13:13:41.996] List of 5 [13:13:41.996] $ ...future.FUN :function (mode = "logical", length = 0L) [13:13:41.996] $ future.call.arguments :List of 1 [13:13:41.996] ..$ length: int 2 [13:13:41.996] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:41.996] $ ...future.elements_ii :List of 4 [13:13:41.996] ..$ c: chr "list" [13:13:41.996] ..$ c: chr "character" [13:13:41.996] ..$ b: chr "numeric" [13:13:41.996] ..$ a: chr "integer" [13:13:41.996] $ ...future.seeds_ii : NULL [13:13:41.996] $ ...future.globals.maxSize: NULL [13:13:41.996] - attr(*, "where")=List of 5 [13:13:41.996] ..$ ...future.FUN : [13:13:41.996] ..$ future.call.arguments : [13:13:41.996] ..$ ...future.elements_ii : [13:13:41.996] ..$ ...future.seeds_ii : [13:13:41.996] ..$ ...future.globals.maxSize: [13:13:41.996] - attr(*, "resolved")= logi FALSE [13:13:41.996] - attr(*, "total_size")= num 2240 [13:13:41.996] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:41.996] - attr(*, "already-done")= logi TRUE [13:13:42.003] - copied '...future.FUN' to environment [13:13:42.003] - copied 'future.call.arguments' to environment [13:13:42.003] - copied '...future.elements_ii' to environment [13:13:42.003] - copied '...future.seeds_ii' to environment [13:13:42.003] - copied '...future.globals.maxSize' to environment [13:13:42.003] assign_globals() ... done [13:13:42.004] plan(): Setting new future strategy stack: [13:13:42.004] List of future strategies: [13:13:42.004] 1. sequential: [13:13:42.004] - args: function (..., envir = parent.frame(), workers = "") [13:13:42.004] - tweaked: FALSE [13:13:42.004] - call: NULL [13:13:42.005] plan(): nbrOfWorkers() = 1 [13:13:42.006] plan(): Setting new future strategy stack: [13:13:42.006] List of future strategies: [13:13:42.006] 1. multisession: [13:13:42.006] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [13:13:42.006] - tweaked: FALSE [13:13:42.006] - call: plan(strategy) [13:13:42.008] plan(): nbrOfWorkers() = 1 [13:13:42.009] SequentialFuture started (and completed) [13:13:42.009] - Launch lazy future ... done [13:13:42.009] run() for 'SequentialFuture' ... done [13:13:42.009] Created future: [13:13:42.009] SequentialFuture: [13:13:42.009] Label: 'future_lapply-1' [13:13:42.009] Expression: [13:13:42.009] { [13:13:42.009] do.call(function(...) { [13:13:42.009] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:42.009] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:42.009] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:42.009] on.exit(options(oopts), add = TRUE) [13:13:42.009] } [13:13:42.009] { [13:13:42.009] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:42.009] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:42.009] ...future.FUN(...future.X_jj, ...) [13:13:42.009] }) [13:13:42.009] } [13:13:42.009] }, args = future.call.arguments) [13:13:42.009] } [13:13:42.009] Lazy evaluation: FALSE [13:13:42.009] Asynchronous evaluation: FALSE [13:13:42.009] Local evaluation: TRUE [13:13:42.009] Environment: R_GlobalEnv [13:13:42.009] Capture standard output: TRUE [13:13:42.009] Capture condition classes: 'condition' (excluding 'nothing') [13:13:42.009] 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) [13:13:42.009] Packages: [13:13:42.009] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:42.009] Resolved: TRUE [13:13:42.009] Value: 240 bytes of class 'list' [13:13:42.009] Early signaling: FALSE [13:13:42.009] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:42.009] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:42.011] Chunk #1 of 1 ... DONE [13:13:42.011] Launching 1 futures (chunks) ... DONE [13:13:42.011] Resolving 1 futures (chunks) ... [13:13:42.011] resolve() on list ... [13:13:42.011] recursive: 0 [13:13:42.012] length: 1 [13:13:42.012] [13:13:42.012] resolved() for 'SequentialFuture' ... [13:13:42.012] - state: 'finished' [13:13:42.012] - run: TRUE [13:13:42.012] - result: 'FutureResult' [13:13:42.013] resolved() for 'SequentialFuture' ... done [13:13:42.013] Future #1 [13:13:42.013] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:42.013] - nx: 1 [13:13:42.013] - relay: TRUE [13:13:42.013] - stdout: TRUE [13:13:42.014] - signal: TRUE [13:13:42.014] - resignal: FALSE [13:13:42.014] - force: TRUE [13:13:42.014] - relayed: [n=1] FALSE [13:13:42.014] - queued futures: [n=1] FALSE [13:13:42.014] - until=1 [13:13:42.015] - relaying element #1 [13:13:42.015] - relayed: [n=1] TRUE [13:13:42.015] - queued futures: [n=1] TRUE [13:13:42.015] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:42.015] length: 0 (resolved future 1) [13:13:42.016] Relaying remaining futures [13:13:42.016] signalConditionsASAP(NULL, pos=0) ... [13:13:42.016] - nx: 1 [13:13:42.016] - relay: TRUE [13:13:42.016] - stdout: TRUE [13:13:42.016] - signal: TRUE [13:13:42.016] - resignal: FALSE [13:13:42.017] - force: TRUE [13:13:42.017] - relayed: [n=1] TRUE [13:13:42.017] - queued futures: [n=1] TRUE - flush all [13:13:42.017] - relayed: [n=1] TRUE [13:13:42.017] - queued futures: [n=1] TRUE [13:13:42.017] signalConditionsASAP(NULL, pos=0) ... done [13:13:42.018] resolve() on list ... DONE [13:13:42.018] - Number of value chunks collected: 1 [13:13:42.018] Resolving 1 futures (chunks) ... DONE [13:13:42.018] Reducing values from 1 chunks ... [13:13:42.018] - Number of values collected after concatenation: 4 [13:13:42.018] - Number of values expected: 4 [13:13:42.019] Reverse index remapping (attribute 'ordering'): [n = 4] 4, 3, 2, 1 [13:13:42.019] Reducing values from 1 chunks ... DONE [13:13:42.019] 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, ...) ... [13:13:42.022] future_lapply() ... [13:13:42.024] Number of chunks: 1 [13:13:42.025] Index remapping (attribute 'ordering'): [n = 4] 4, 3, 2, 1 [13:13:42.025] getGlobalsAndPackagesXApply() ... [13:13:42.025] - future.globals: TRUE [13:13:42.025] getGlobalsAndPackages() ... [13:13:42.025] Searching for globals... [13:13:42.027] - globals found: [2] 'FUN', '.Internal' [13:13:42.027] Searching for globals ... DONE [13:13:42.027] Resolving globals: FALSE [13:13:42.029] The total size of the 1 globals is 2.13 KiB (2184 bytes) [13:13:42.030] 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') [13:13:42.030] - globals: [1] 'FUN' [13:13:42.030] [13:13:42.030] getGlobalsAndPackages() ... DONE [13:13:42.031] - globals found/used: [n=1] 'FUN' [13:13:42.031] - needed namespaces: [n=0] [13:13:42.031] Finding globals ... DONE [13:13:42.031] - use_args: TRUE [13:13:42.031] - Getting '...' globals ... [13:13:42.032] resolve() on list ... [13:13:42.032] recursive: 0 [13:13:42.032] length: 1 [13:13:42.032] elements: '...' [13:13:42.032] length: 0 (resolved future 1) [13:13:42.032] resolve() on list ... DONE [13:13:42.033] - '...' content: [n=1] 'length' [13:13:42.033] List of 1 [13:13:42.033] $ ...:List of 1 [13:13:42.033] ..$ length: int 2 [13:13:42.033] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:42.033] - attr(*, "where")=List of 1 [13:13:42.033] ..$ ...: [13:13:42.033] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:42.033] - attr(*, "resolved")= logi TRUE [13:13:42.033] - attr(*, "total_size")= num NA [13:13:42.036] - Getting '...' globals ... DONE [13:13:42.036] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:42.037] List of 2 [13:13:42.037] $ ...future.FUN:function (mode = "logical", length = 0L) [13:13:42.037] $ ... :List of 1 [13:13:42.037] ..$ length: int 2 [13:13:42.037] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:42.037] - attr(*, "where")=List of 2 [13:13:42.037] ..$ ...future.FUN: [13:13:42.037] ..$ ... : [13:13:42.037] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:42.037] - attr(*, "resolved")= logi FALSE [13:13:42.037] - attr(*, "total_size")= num 2240 [13:13:42.040] Packages to be attached in all futures: [n=0] [13:13:42.041] getGlobalsAndPackagesXApply() ... DONE [13:13:42.041] Number of futures (= number of chunks): 1 [13:13:42.041] Launching 1 futures (chunks) ... [13:13:42.041] Chunk #1 of 1 ... [13:13:42.041] - Finding globals in 'X' for chunk #1 ... [13:13:42.042] getGlobalsAndPackages() ... [13:13:42.042] Searching for globals... [13:13:42.042] [13:13:42.042] Searching for globals ... DONE [13:13:42.042] - globals: [0] [13:13:42.043] getGlobalsAndPackages() ... DONE [13:13:42.043] + additional globals found: [n=0] [13:13:42.043] + additional namespaces needed: [n=0] [13:13:42.043] - Finding globals in 'X' for chunk #1 ... DONE [13:13:42.043] - seeds: [13:13:42.043] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:42.044] getGlobalsAndPackages() ... [13:13:42.044] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:42.044] Resolving globals: FALSE [13:13:42.044] Tweak future expression to call with '...' arguments ... [13:13:42.044] { [13:13:42.044] do.call(function(...) { [13:13:42.044] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:42.044] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:42.044] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:42.044] on.exit(options(oopts), add = TRUE) [13:13:42.044] } [13:13:42.044] { [13:13:42.044] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:42.044] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:42.044] ...future.FUN(...future.X_jj, ...) [13:13:42.044] }) [13:13:42.044] } [13:13:42.044] }, args = future.call.arguments) [13:13:42.044] } [13:13:42.045] Tweak future expression to call with '...' arguments ... DONE [13:13:42.045] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:42.045] [13:13:42.046] getGlobalsAndPackages() ... DONE [13:13:42.046] run() for 'Future' ... [13:13:42.046] - state: 'created' [13:13:42.046] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:42.049] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:42.049] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:42.049] - Field: 'label' [13:13:42.049] - Field: 'local' [13:13:42.049] - Field: 'owner' [13:13:42.050] - Field: 'envir' [13:13:42.050] - Field: 'packages' [13:13:42.050] - Field: 'gc' [13:13:42.050] - Field: 'conditions' [13:13:42.050] - Field: 'expr' [13:13:42.050] - Field: 'uuid' [13:13:42.051] - Field: 'seed' [13:13:42.051] - Field: 'version' [13:13:42.051] - Field: 'result' [13:13:42.051] - Field: 'asynchronous' [13:13:42.051] - Field: 'calls' [13:13:42.051] - Field: 'globals' [13:13:42.052] - Field: 'stdout' [13:13:42.052] - Field: 'earlySignal' [13:13:42.052] - Field: 'lazy' [13:13:42.052] - Field: 'state' [13:13:42.052] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:42.053] - Launch lazy future ... [13:13:42.053] Packages needed by the future expression (n = 0): [13:13:42.053] Packages needed by future strategies (n = 0): [13:13:42.054] { [13:13:42.054] { [13:13:42.054] { [13:13:42.054] ...future.startTime <- base::Sys.time() [13:13:42.054] { [13:13:42.054] { [13:13:42.054] { [13:13:42.054] base::local({ [13:13:42.054] has_future <- base::requireNamespace("future", [13:13:42.054] quietly = TRUE) [13:13:42.054] if (has_future) { [13:13:42.054] ns <- base::getNamespace("future") [13:13:42.054] version <- ns[[".package"]][["version"]] [13:13:42.054] if (is.null(version)) [13:13:42.054] version <- utils::packageVersion("future") [13:13:42.054] } [13:13:42.054] else { [13:13:42.054] version <- NULL [13:13:42.054] } [13:13:42.054] if (!has_future || version < "1.8.0") { [13:13:42.054] info <- base::c(r_version = base::gsub("R version ", [13:13:42.054] "", base::R.version$version.string), [13:13:42.054] platform = base::sprintf("%s (%s-bit)", [13:13:42.054] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:42.054] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:42.054] "release", "version")], collapse = " "), [13:13:42.054] hostname = base::Sys.info()[["nodename"]]) [13:13:42.054] info <- base::sprintf("%s: %s", base::names(info), [13:13:42.054] info) [13:13:42.054] info <- base::paste(info, collapse = "; ") [13:13:42.054] if (!has_future) { [13:13:42.054] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:42.054] info) [13:13:42.054] } [13:13:42.054] else { [13:13:42.054] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:42.054] info, version) [13:13:42.054] } [13:13:42.054] base::stop(msg) [13:13:42.054] } [13:13:42.054] }) [13:13:42.054] } [13:13:42.054] options(future.plan = NULL) [13:13:42.054] Sys.unsetenv("R_FUTURE_PLAN") [13:13:42.054] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:42.054] } [13:13:42.054] ...future.workdir <- getwd() [13:13:42.054] } [13:13:42.054] ...future.oldOptions <- base::as.list(base::.Options) [13:13:42.054] ...future.oldEnvVars <- base::Sys.getenv() [13:13:42.054] } [13:13:42.054] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:42.054] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:42.054] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:42.054] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:42.054] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:42.054] future.stdout.windows.reencode = NULL, width = 80L) [13:13:42.054] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:42.054] base::names(...future.oldOptions)) [13:13:42.054] } [13:13:42.054] if (FALSE) { [13:13:42.054] } [13:13:42.054] else { [13:13:42.054] if (TRUE) { [13:13:42.054] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:42.054] open = "w") [13:13:42.054] } [13:13:42.054] else { [13:13:42.054] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:42.054] windows = "NUL", "/dev/null"), open = "w") [13:13:42.054] } [13:13:42.054] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:42.054] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:42.054] base::sink(type = "output", split = FALSE) [13:13:42.054] base::close(...future.stdout) [13:13:42.054] }, add = TRUE) [13:13:42.054] } [13:13:42.054] ...future.frame <- base::sys.nframe() [13:13:42.054] ...future.conditions <- base::list() [13:13:42.054] ...future.rng <- base::globalenv()$.Random.seed [13:13:42.054] if (FALSE) { [13:13:42.054] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:42.054] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:42.054] } [13:13:42.054] ...future.result <- base::tryCatch({ [13:13:42.054] base::withCallingHandlers({ [13:13:42.054] ...future.value <- base::withVisible(base::local({ [13:13:42.054] do.call(function(...) { [13:13:42.054] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:42.054] if (!identical(...future.globals.maxSize.org, [13:13:42.054] ...future.globals.maxSize)) { [13:13:42.054] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:42.054] on.exit(options(oopts), add = TRUE) [13:13:42.054] } [13:13:42.054] { [13:13:42.054] lapply(seq_along(...future.elements_ii), [13:13:42.054] FUN = function(jj) { [13:13:42.054] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:42.054] ...future.FUN(...future.X_jj, ...) [13:13:42.054] }) [13:13:42.054] } [13:13:42.054] }, args = future.call.arguments) [13:13:42.054] })) [13:13:42.054] future::FutureResult(value = ...future.value$value, [13:13:42.054] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:42.054] ...future.rng), globalenv = if (FALSE) [13:13:42.054] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:42.054] ...future.globalenv.names)) [13:13:42.054] else NULL, started = ...future.startTime, version = "1.8") [13:13:42.054] }, condition = base::local({ [13:13:42.054] c <- base::c [13:13:42.054] inherits <- base::inherits [13:13:42.054] invokeRestart <- base::invokeRestart [13:13:42.054] length <- base::length [13:13:42.054] list <- base::list [13:13:42.054] seq.int <- base::seq.int [13:13:42.054] signalCondition <- base::signalCondition [13:13:42.054] sys.calls <- base::sys.calls [13:13:42.054] `[[` <- base::`[[` [13:13:42.054] `+` <- base::`+` [13:13:42.054] `<<-` <- base::`<<-` [13:13:42.054] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:42.054] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:42.054] 3L)] [13:13:42.054] } [13:13:42.054] function(cond) { [13:13:42.054] is_error <- inherits(cond, "error") [13:13:42.054] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:42.054] NULL) [13:13:42.054] if (is_error) { [13:13:42.054] sessionInformation <- function() { [13:13:42.054] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:42.054] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:42.054] search = base::search(), system = base::Sys.info()) [13:13:42.054] } [13:13:42.054] ...future.conditions[[length(...future.conditions) + [13:13:42.054] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:42.054] cond$call), session = sessionInformation(), [13:13:42.054] timestamp = base::Sys.time(), signaled = 0L) [13:13:42.054] signalCondition(cond) [13:13:42.054] } [13:13:42.054] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:42.054] "immediateCondition"))) { [13:13:42.054] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:42.054] ...future.conditions[[length(...future.conditions) + [13:13:42.054] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:42.054] if (TRUE && !signal) { [13:13:42.054] muffleCondition <- function (cond, pattern = "^muffle") [13:13:42.054] { [13:13:42.054] inherits <- base::inherits [13:13:42.054] invokeRestart <- base::invokeRestart [13:13:42.054] is.null <- base::is.null [13:13:42.054] muffled <- FALSE [13:13:42.054] if (inherits(cond, "message")) { [13:13:42.054] muffled <- grepl(pattern, "muffleMessage") [13:13:42.054] if (muffled) [13:13:42.054] invokeRestart("muffleMessage") [13:13:42.054] } [13:13:42.054] else if (inherits(cond, "warning")) { [13:13:42.054] muffled <- grepl(pattern, "muffleWarning") [13:13:42.054] if (muffled) [13:13:42.054] invokeRestart("muffleWarning") [13:13:42.054] } [13:13:42.054] else if (inherits(cond, "condition")) { [13:13:42.054] if (!is.null(pattern)) { [13:13:42.054] computeRestarts <- base::computeRestarts [13:13:42.054] grepl <- base::grepl [13:13:42.054] restarts <- computeRestarts(cond) [13:13:42.054] for (restart in restarts) { [13:13:42.054] name <- restart$name [13:13:42.054] if (is.null(name)) [13:13:42.054] next [13:13:42.054] if (!grepl(pattern, name)) [13:13:42.054] next [13:13:42.054] invokeRestart(restart) [13:13:42.054] muffled <- TRUE [13:13:42.054] break [13:13:42.054] } [13:13:42.054] } [13:13:42.054] } [13:13:42.054] invisible(muffled) [13:13:42.054] } [13:13:42.054] muffleCondition(cond, pattern = "^muffle") [13:13:42.054] } [13:13:42.054] } [13:13:42.054] else { [13:13:42.054] if (TRUE) { [13:13:42.054] muffleCondition <- function (cond, pattern = "^muffle") [13:13:42.054] { [13:13:42.054] inherits <- base::inherits [13:13:42.054] invokeRestart <- base::invokeRestart [13:13:42.054] is.null <- base::is.null [13:13:42.054] muffled <- FALSE [13:13:42.054] if (inherits(cond, "message")) { [13:13:42.054] muffled <- grepl(pattern, "muffleMessage") [13:13:42.054] if (muffled) [13:13:42.054] invokeRestart("muffleMessage") [13:13:42.054] } [13:13:42.054] else if (inherits(cond, "warning")) { [13:13:42.054] muffled <- grepl(pattern, "muffleWarning") [13:13:42.054] if (muffled) [13:13:42.054] invokeRestart("muffleWarning") [13:13:42.054] } [13:13:42.054] else if (inherits(cond, "condition")) { [13:13:42.054] if (!is.null(pattern)) { [13:13:42.054] computeRestarts <- base::computeRestarts [13:13:42.054] grepl <- base::grepl [13:13:42.054] restarts <- computeRestarts(cond) [13:13:42.054] for (restart in restarts) { [13:13:42.054] name <- restart$name [13:13:42.054] if (is.null(name)) [13:13:42.054] next [13:13:42.054] if (!grepl(pattern, name)) [13:13:42.054] next [13:13:42.054] invokeRestart(restart) [13:13:42.054] muffled <- TRUE [13:13:42.054] break [13:13:42.054] } [13:13:42.054] } [13:13:42.054] } [13:13:42.054] invisible(muffled) [13:13:42.054] } [13:13:42.054] muffleCondition(cond, pattern = "^muffle") [13:13:42.054] } [13:13:42.054] } [13:13:42.054] } [13:13:42.054] })) [13:13:42.054] }, error = function(ex) { [13:13:42.054] base::structure(base::list(value = NULL, visible = NULL, [13:13:42.054] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:42.054] ...future.rng), started = ...future.startTime, [13:13:42.054] finished = Sys.time(), session_uuid = NA_character_, [13:13:42.054] version = "1.8"), class = "FutureResult") [13:13:42.054] }, finally = { [13:13:42.054] if (!identical(...future.workdir, getwd())) [13:13:42.054] setwd(...future.workdir) [13:13:42.054] { [13:13:42.054] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:42.054] ...future.oldOptions$nwarnings <- NULL [13:13:42.054] } [13:13:42.054] base::options(...future.oldOptions) [13:13:42.054] if (.Platform$OS.type == "windows") { [13:13:42.054] old_names <- names(...future.oldEnvVars) [13:13:42.054] envs <- base::Sys.getenv() [13:13:42.054] names <- names(envs) [13:13:42.054] common <- intersect(names, old_names) [13:13:42.054] added <- setdiff(names, old_names) [13:13:42.054] removed <- setdiff(old_names, names) [13:13:42.054] changed <- common[...future.oldEnvVars[common] != [13:13:42.054] envs[common]] [13:13:42.054] NAMES <- toupper(changed) [13:13:42.054] args <- list() [13:13:42.054] for (kk in seq_along(NAMES)) { [13:13:42.054] name <- changed[[kk]] [13:13:42.054] NAME <- NAMES[[kk]] [13:13:42.054] if (name != NAME && is.element(NAME, old_names)) [13:13:42.054] next [13:13:42.054] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:42.054] } [13:13:42.054] NAMES <- toupper(added) [13:13:42.054] for (kk in seq_along(NAMES)) { [13:13:42.054] name <- added[[kk]] [13:13:42.054] NAME <- NAMES[[kk]] [13:13:42.054] if (name != NAME && is.element(NAME, old_names)) [13:13:42.054] next [13:13:42.054] args[[name]] <- "" [13:13:42.054] } [13:13:42.054] NAMES <- toupper(removed) [13:13:42.054] for (kk in seq_along(NAMES)) { [13:13:42.054] name <- removed[[kk]] [13:13:42.054] NAME <- NAMES[[kk]] [13:13:42.054] if (name != NAME && is.element(NAME, old_names)) [13:13:42.054] next [13:13:42.054] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:42.054] } [13:13:42.054] if (length(args) > 0) [13:13:42.054] base::do.call(base::Sys.setenv, args = args) [13:13:42.054] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:42.054] } [13:13:42.054] else { [13:13:42.054] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:42.054] } [13:13:42.054] { [13:13:42.054] if (base::length(...future.futureOptionsAdded) > [13:13:42.054] 0L) { [13:13:42.054] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:42.054] base::names(opts) <- ...future.futureOptionsAdded [13:13:42.054] base::options(opts) [13:13:42.054] } [13:13:42.054] { [13:13:42.054] { [13:13:42.054] NULL [13:13:42.054] RNGkind("Mersenne-Twister") [13:13:42.054] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:42.054] inherits = FALSE) [13:13:42.054] } [13:13:42.054] options(future.plan = NULL) [13:13:42.054] if (is.na(NA_character_)) [13:13:42.054] Sys.unsetenv("R_FUTURE_PLAN") [13:13:42.054] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:42.054] future::plan(list(function (..., workers = availableCores(), [13:13:42.054] lazy = FALSE, rscript_libs = .libPaths(), [13:13:42.054] envir = parent.frame()) [13:13:42.054] { [13:13:42.054] if (is.function(workers)) [13:13:42.054] workers <- workers() [13:13:42.054] workers <- structure(as.integer(workers), [13:13:42.054] class = class(workers)) [13:13:42.054] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:42.054] workers >= 1) [13:13:42.054] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:42.054] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:42.054] } [13:13:42.054] future <- MultisessionFuture(..., workers = workers, [13:13:42.054] lazy = lazy, rscript_libs = rscript_libs, [13:13:42.054] envir = envir) [13:13:42.054] if (!future$lazy) [13:13:42.054] future <- run(future) [13:13:42.054] invisible(future) [13:13:42.054] }), .cleanup = FALSE, .init = FALSE) [13:13:42.054] } [13:13:42.054] } [13:13:42.054] } [13:13:42.054] }) [13:13:42.054] if (TRUE) { [13:13:42.054] base::sink(type = "output", split = FALSE) [13:13:42.054] if (TRUE) { [13:13:42.054] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:42.054] } [13:13:42.054] else { [13:13:42.054] ...future.result["stdout"] <- base::list(NULL) [13:13:42.054] } [13:13:42.054] base::close(...future.stdout) [13:13:42.054] ...future.stdout <- NULL [13:13:42.054] } [13:13:42.054] ...future.result$conditions <- ...future.conditions [13:13:42.054] ...future.result$finished <- base::Sys.time() [13:13:42.054] ...future.result [13:13:42.054] } [13:13:42.058] assign_globals() ... [13:13:42.058] List of 5 [13:13:42.058] $ ...future.FUN :function (mode = "logical", length = 0L) [13:13:42.058] $ future.call.arguments :List of 1 [13:13:42.058] ..$ length: int 2 [13:13:42.058] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:42.058] $ ...future.elements_ii :List of 4 [13:13:42.058] ..$ c: chr "list" [13:13:42.058] ..$ c: chr "character" [13:13:42.058] ..$ b: chr "numeric" [13:13:42.058] ..$ a: chr "integer" [13:13:42.058] $ ...future.seeds_ii : NULL [13:13:42.058] $ ...future.globals.maxSize: NULL [13:13:42.058] - attr(*, "where")=List of 5 [13:13:42.058] ..$ ...future.FUN : [13:13:42.058] ..$ future.call.arguments : [13:13:42.058] ..$ ...future.elements_ii : [13:13:42.058] ..$ ...future.seeds_ii : [13:13:42.058] ..$ ...future.globals.maxSize: [13:13:42.058] - attr(*, "resolved")= logi FALSE [13:13:42.058] - attr(*, "total_size")= num 2240 [13:13:42.058] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:42.058] - attr(*, "already-done")= logi TRUE [13:13:42.065] - copied '...future.FUN' to environment [13:13:42.065] - copied 'future.call.arguments' to environment [13:13:42.065] - copied '...future.elements_ii' to environment [13:13:42.065] - copied '...future.seeds_ii' to environment [13:13:42.065] - copied '...future.globals.maxSize' to environment [13:13:42.066] assign_globals() ... done [13:13:42.066] plan(): Setting new future strategy stack: [13:13:42.066] List of future strategies: [13:13:42.066] 1. sequential: [13:13:42.066] - args: function (..., envir = parent.frame(), workers = "") [13:13:42.066] - tweaked: FALSE [13:13:42.066] - call: NULL [13:13:42.067] plan(): nbrOfWorkers() = 1 [13:13:42.068] plan(): Setting new future strategy stack: [13:13:42.068] List of future strategies: [13:13:42.068] 1. multisession: [13:13:42.068] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [13:13:42.068] - tweaked: FALSE [13:13:42.068] - call: plan(strategy) [13:13:42.070] plan(): nbrOfWorkers() = 1 [13:13:42.071] SequentialFuture started (and completed) [13:13:42.071] - Launch lazy future ... done [13:13:42.071] run() for 'SequentialFuture' ... done [13:13:42.071] Created future: [13:13:42.072] SequentialFuture: [13:13:42.072] Label: 'future_lapply-1' [13:13:42.072] Expression: [13:13:42.072] { [13:13:42.072] do.call(function(...) { [13:13:42.072] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:42.072] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:42.072] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:42.072] on.exit(options(oopts), add = TRUE) [13:13:42.072] } [13:13:42.072] { [13:13:42.072] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:42.072] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:42.072] ...future.FUN(...future.X_jj, ...) [13:13:42.072] }) [13:13:42.072] } [13:13:42.072] }, args = future.call.arguments) [13:13:42.072] } [13:13:42.072] Lazy evaluation: FALSE [13:13:42.072] Asynchronous evaluation: FALSE [13:13:42.072] Local evaluation: TRUE [13:13:42.072] Environment: R_GlobalEnv [13:13:42.072] Capture standard output: TRUE [13:13:42.072] Capture condition classes: 'condition' (excluding 'nothing') [13:13:42.072] 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) [13:13:42.072] Packages: [13:13:42.072] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:42.072] Resolved: TRUE [13:13:42.072] Value: 240 bytes of class 'list' [13:13:42.072] Early signaling: FALSE [13:13:42.072] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:42.072] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:42.073] Chunk #1 of 1 ... DONE [13:13:42.073] Launching 1 futures (chunks) ... DONE [13:13:42.073] Resolving 1 futures (chunks) ... [13:13:42.073] resolve() on list ... [13:13:42.074] recursive: 0 [13:13:42.074] length: 1 [13:13:42.074] [13:13:42.074] resolved() for 'SequentialFuture' ... [13:13:42.074] - state: 'finished' [13:13:42.074] - run: TRUE [13:13:42.075] - result: 'FutureResult' [13:13:42.075] resolved() for 'SequentialFuture' ... done [13:13:42.075] Future #1 [13:13:42.075] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:42.075] - nx: 1 [13:13:42.076] - relay: TRUE [13:13:42.076] - stdout: TRUE [13:13:42.076] - signal: TRUE [13:13:42.076] - resignal: FALSE [13:13:42.076] - force: TRUE [13:13:42.076] - relayed: [n=1] FALSE [13:13:42.076] - queued futures: [n=1] FALSE [13:13:42.077] - until=1 [13:13:42.077] - relaying element #1 [13:13:42.077] - relayed: [n=1] TRUE [13:13:42.077] - queued futures: [n=1] TRUE [13:13:42.077] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:42.078] length: 0 (resolved future 1) [13:13:42.078] Relaying remaining futures [13:13:42.078] signalConditionsASAP(NULL, pos=0) ... [13:13:42.078] - nx: 1 [13:13:42.078] - relay: TRUE [13:13:42.078] - stdout: TRUE [13:13:42.078] - signal: TRUE [13:13:42.079] - resignal: FALSE [13:13:42.079] - force: TRUE [13:13:42.079] - relayed: [n=1] TRUE [13:13:42.079] - queued futures: [n=1] TRUE - flush all [13:13:42.079] - relayed: [n=1] TRUE [13:13:42.079] - queued futures: [n=1] TRUE [13:13:42.080] signalConditionsASAP(NULL, pos=0) ... done [13:13:42.080] resolve() on list ... DONE [13:13:42.080] - Number of value chunks collected: 1 [13:13:42.080] Resolving 1 futures (chunks) ... DONE [13:13:42.080] Reducing values from 1 chunks ... [13:13:42.081] - Number of values collected after concatenation: 4 [13:13:42.081] - Number of values expected: 4 [13:13:42.081] Reverse index remapping (attribute 'ordering'): [n = 4] 4, 3, 2, 1 [13:13:42.081] Reducing values from 1 chunks ... DONE [13:13:42.081] 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, ...) ... [13:13:42.084] future_lapply() ... [13:13:42.095] Number of chunks: 1 [13:13:42.095] getGlobalsAndPackagesXApply() ... [13:13:42.095] - future.globals: TRUE [13:13:42.095] getGlobalsAndPackages() ... [13:13:42.095] Searching for globals... [13:13:42.105] - globals found: [22] 'FUN', 'if', 'missing', 'is.finite', '{', 'is.null', '<-', 'paste', 'length', '==', 'return', '>', '+', '[', 'seq_len', 'rev', 'c', '&&', '!', ':', '(', '-' [13:13:42.105] Searching for globals ... DONE [13:13:42.105] Resolving globals: FALSE [13:13:42.107] The total size of the 1 globals is 69.62 KiB (71288 bytes) [13:13:42.107] 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') [13:13:42.107] - globals: [1] 'FUN' [13:13:42.107] - packages: [1] 'future' [13:13:42.108] getGlobalsAndPackages() ... DONE [13:13:42.108] - globals found/used: [n=1] 'FUN' [13:13:42.108] - needed namespaces: [n=1] 'future' [13:13:42.108] Finding globals ... DONE [13:13:42.108] - use_args: TRUE [13:13:42.108] - Getting '...' globals ... [13:13:42.109] resolve() on list ... [13:13:42.109] recursive: 0 [13:13:42.109] length: 1 [13:13:42.109] elements: '...' [13:13:42.110] length: 0 (resolved future 1) [13:13:42.110] resolve() on list ... DONE [13:13:42.110] - '...' content: [n=2] 'collapse', 'maxHead' [13:13:42.110] List of 1 [13:13:42.110] $ ...:List of 2 [13:13:42.110] ..$ collapse: chr "; " [13:13:42.110] ..$ maxHead : int 3 [13:13:42.110] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:42.110] - attr(*, "where")=List of 1 [13:13:42.110] ..$ ...: [13:13:42.110] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:42.110] - attr(*, "resolved")= logi TRUE [13:13:42.110] - attr(*, "total_size")= num NA [13:13:42.114] - Getting '...' globals ... DONE [13:13:42.114] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:42.114] List of 2 [13:13:42.114] $ ...future.FUN:function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [13:13:42.114] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [13:13:42.114] $ ... :List of 2 [13:13:42.114] ..$ collapse: chr "; " [13:13:42.114] ..$ maxHead : int 3 [13:13:42.114] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:42.114] - attr(*, "where")=List of 2 [13:13:42.114] ..$ ...future.FUN: [13:13:42.114] ..$ ... : [13:13:42.114] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:42.114] - attr(*, "resolved")= logi FALSE [13:13:42.114] - attr(*, "total_size")= num 71456 [13:13:42.118] Packages to be attached in all futures: [n=1] 'future' [13:13:42.119] getGlobalsAndPackagesXApply() ... DONE [13:13:42.119] Number of futures (= number of chunks): 1 [13:13:42.119] Launching 1 futures (chunks) ... [13:13:42.119] Chunk #1 of 1 ... [13:13:42.119] - Finding globals in 'X' for chunk #1 ... [13:13:42.120] getGlobalsAndPackages() ... [13:13:42.120] Searching for globals... [13:13:42.120] [13:13:42.120] Searching for globals ... DONE [13:13:42.120] - globals: [0] [13:13:42.121] getGlobalsAndPackages() ... DONE [13:13:42.121] + additional globals found: [n=0] [13:13:42.121] + additional namespaces needed: [n=0] [13:13:42.121] - Finding globals in 'X' for chunk #1 ... DONE [13:13:42.121] - seeds: [13:13:42.121] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:42.122] getGlobalsAndPackages() ... [13:13:42.122] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:42.122] Resolving globals: FALSE [13:13:42.122] Tweak future expression to call with '...' arguments ... [13:13:42.122] { [13:13:42.122] do.call(function(...) { [13:13:42.122] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:42.122] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:42.122] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:42.122] on.exit(options(oopts), add = TRUE) [13:13:42.122] } [13:13:42.122] { [13:13:42.122] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:42.122] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:42.122] ...future.FUN(...future.X_jj, ...) [13:13:42.122] }) [13:13:42.122] } [13:13:42.122] }, args = future.call.arguments) [13:13:42.122] } [13:13:42.123] Tweak future expression to call with '...' arguments ... DONE [13:13:42.123] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:42.123] - packages: [1] 'future' [13:13:42.124] getGlobalsAndPackages() ... DONE [13:13:42.124] run() for 'Future' ... [13:13:42.124] - state: 'created' [13:13:42.124] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:42.127] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:42.127] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:42.127] - Field: 'label' [13:13:42.127] - Field: 'local' [13:13:42.127] - Field: 'owner' [13:13:42.128] - Field: 'envir' [13:13:42.128] - Field: 'packages' [13:13:42.128] - Field: 'gc' [13:13:42.128] - Field: 'conditions' [13:13:42.128] - Field: 'expr' [13:13:42.129] - Field: 'uuid' [13:13:42.129] - Field: 'seed' [13:13:42.129] - Field: 'version' [13:13:42.129] - Field: 'result' [13:13:42.129] - Field: 'asynchronous' [13:13:42.129] - Field: 'calls' [13:13:42.132] - Field: 'globals' [13:13:42.132] - Field: 'stdout' [13:13:42.132] - Field: 'earlySignal' [13:13:42.132] - Field: 'lazy' [13:13:42.132] - Field: 'state' [13:13:42.133] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:42.133] - Launch lazy future ... [13:13:42.133] Packages needed by the future expression (n = 1): 'future' [13:13:42.133] Packages needed by future strategies (n = 0): [13:13:42.134] { [13:13:42.134] { [13:13:42.134] { [13:13:42.134] ...future.startTime <- base::Sys.time() [13:13:42.134] { [13:13:42.134] { [13:13:42.134] { [13:13:42.134] { [13:13:42.134] base::local({ [13:13:42.134] has_future <- base::requireNamespace("future", [13:13:42.134] quietly = TRUE) [13:13:42.134] if (has_future) { [13:13:42.134] ns <- base::getNamespace("future") [13:13:42.134] version <- ns[[".package"]][["version"]] [13:13:42.134] if (is.null(version)) [13:13:42.134] version <- utils::packageVersion("future") [13:13:42.134] } [13:13:42.134] else { [13:13:42.134] version <- NULL [13:13:42.134] } [13:13:42.134] if (!has_future || version < "1.8.0") { [13:13:42.134] info <- base::c(r_version = base::gsub("R version ", [13:13:42.134] "", base::R.version$version.string), [13:13:42.134] platform = base::sprintf("%s (%s-bit)", [13:13:42.134] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:42.134] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:42.134] "release", "version")], collapse = " "), [13:13:42.134] hostname = base::Sys.info()[["nodename"]]) [13:13:42.134] info <- base::sprintf("%s: %s", base::names(info), [13:13:42.134] info) [13:13:42.134] info <- base::paste(info, collapse = "; ") [13:13:42.134] if (!has_future) { [13:13:42.134] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:42.134] info) [13:13:42.134] } [13:13:42.134] else { [13:13:42.134] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:42.134] info, version) [13:13:42.134] } [13:13:42.134] base::stop(msg) [13:13:42.134] } [13:13:42.134] }) [13:13:42.134] } [13:13:42.134] base::local({ [13:13:42.134] for (pkg in "future") { [13:13:42.134] base::loadNamespace(pkg) [13:13:42.134] base::library(pkg, character.only = TRUE) [13:13:42.134] } [13:13:42.134] }) [13:13:42.134] } [13:13:42.134] options(future.plan = NULL) [13:13:42.134] Sys.unsetenv("R_FUTURE_PLAN") [13:13:42.134] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:42.134] } [13:13:42.134] ...future.workdir <- getwd() [13:13:42.134] } [13:13:42.134] ...future.oldOptions <- base::as.list(base::.Options) [13:13:42.134] ...future.oldEnvVars <- base::Sys.getenv() [13:13:42.134] } [13:13:42.134] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:42.134] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:42.134] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:42.134] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:42.134] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:42.134] future.stdout.windows.reencode = NULL, width = 80L) [13:13:42.134] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:42.134] base::names(...future.oldOptions)) [13:13:42.134] } [13:13:42.134] if (FALSE) { [13:13:42.134] } [13:13:42.134] else { [13:13:42.134] if (TRUE) { [13:13:42.134] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:42.134] open = "w") [13:13:42.134] } [13:13:42.134] else { [13:13:42.134] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:42.134] windows = "NUL", "/dev/null"), open = "w") [13:13:42.134] } [13:13:42.134] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:42.134] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:42.134] base::sink(type = "output", split = FALSE) [13:13:42.134] base::close(...future.stdout) [13:13:42.134] }, add = TRUE) [13:13:42.134] } [13:13:42.134] ...future.frame <- base::sys.nframe() [13:13:42.134] ...future.conditions <- base::list() [13:13:42.134] ...future.rng <- base::globalenv()$.Random.seed [13:13:42.134] if (FALSE) { [13:13:42.134] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:42.134] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:42.134] } [13:13:42.134] ...future.result <- base::tryCatch({ [13:13:42.134] base::withCallingHandlers({ [13:13:42.134] ...future.value <- base::withVisible(base::local({ [13:13:42.134] do.call(function(...) { [13:13:42.134] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:42.134] if (!identical(...future.globals.maxSize.org, [13:13:42.134] ...future.globals.maxSize)) { [13:13:42.134] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:42.134] on.exit(options(oopts), add = TRUE) [13:13:42.134] } [13:13:42.134] { [13:13:42.134] lapply(seq_along(...future.elements_ii), [13:13:42.134] FUN = function(jj) { [13:13:42.134] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:42.134] ...future.FUN(...future.X_jj, ...) [13:13:42.134] }) [13:13:42.134] } [13:13:42.134] }, args = future.call.arguments) [13:13:42.134] })) [13:13:42.134] future::FutureResult(value = ...future.value$value, [13:13:42.134] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:42.134] ...future.rng), globalenv = if (FALSE) [13:13:42.134] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:42.134] ...future.globalenv.names)) [13:13:42.134] else NULL, started = ...future.startTime, version = "1.8") [13:13:42.134] }, condition = base::local({ [13:13:42.134] c <- base::c [13:13:42.134] inherits <- base::inherits [13:13:42.134] invokeRestart <- base::invokeRestart [13:13:42.134] length <- base::length [13:13:42.134] list <- base::list [13:13:42.134] seq.int <- base::seq.int [13:13:42.134] signalCondition <- base::signalCondition [13:13:42.134] sys.calls <- base::sys.calls [13:13:42.134] `[[` <- base::`[[` [13:13:42.134] `+` <- base::`+` [13:13:42.134] `<<-` <- base::`<<-` [13:13:42.134] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:42.134] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:42.134] 3L)] [13:13:42.134] } [13:13:42.134] function(cond) { [13:13:42.134] is_error <- inherits(cond, "error") [13:13:42.134] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:42.134] NULL) [13:13:42.134] if (is_error) { [13:13:42.134] sessionInformation <- function() { [13:13:42.134] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:42.134] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:42.134] search = base::search(), system = base::Sys.info()) [13:13:42.134] } [13:13:42.134] ...future.conditions[[length(...future.conditions) + [13:13:42.134] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:42.134] cond$call), session = sessionInformation(), [13:13:42.134] timestamp = base::Sys.time(), signaled = 0L) [13:13:42.134] signalCondition(cond) [13:13:42.134] } [13:13:42.134] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:42.134] "immediateCondition"))) { [13:13:42.134] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:42.134] ...future.conditions[[length(...future.conditions) + [13:13:42.134] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:42.134] if (TRUE && !signal) { [13:13:42.134] muffleCondition <- function (cond, pattern = "^muffle") [13:13:42.134] { [13:13:42.134] inherits <- base::inherits [13:13:42.134] invokeRestart <- base::invokeRestart [13:13:42.134] is.null <- base::is.null [13:13:42.134] muffled <- FALSE [13:13:42.134] if (inherits(cond, "message")) { [13:13:42.134] muffled <- grepl(pattern, "muffleMessage") [13:13:42.134] if (muffled) [13:13:42.134] invokeRestart("muffleMessage") [13:13:42.134] } [13:13:42.134] else if (inherits(cond, "warning")) { [13:13:42.134] muffled <- grepl(pattern, "muffleWarning") [13:13:42.134] if (muffled) [13:13:42.134] invokeRestart("muffleWarning") [13:13:42.134] } [13:13:42.134] else if (inherits(cond, "condition")) { [13:13:42.134] if (!is.null(pattern)) { [13:13:42.134] computeRestarts <- base::computeRestarts [13:13:42.134] grepl <- base::grepl [13:13:42.134] restarts <- computeRestarts(cond) [13:13:42.134] for (restart in restarts) { [13:13:42.134] name <- restart$name [13:13:42.134] if (is.null(name)) [13:13:42.134] next [13:13:42.134] if (!grepl(pattern, name)) [13:13:42.134] next [13:13:42.134] invokeRestart(restart) [13:13:42.134] muffled <- TRUE [13:13:42.134] break [13:13:42.134] } [13:13:42.134] } [13:13:42.134] } [13:13:42.134] invisible(muffled) [13:13:42.134] } [13:13:42.134] muffleCondition(cond, pattern = "^muffle") [13:13:42.134] } [13:13:42.134] } [13:13:42.134] else { [13:13:42.134] if (TRUE) { [13:13:42.134] muffleCondition <- function (cond, pattern = "^muffle") [13:13:42.134] { [13:13:42.134] inherits <- base::inherits [13:13:42.134] invokeRestart <- base::invokeRestart [13:13:42.134] is.null <- base::is.null [13:13:42.134] muffled <- FALSE [13:13:42.134] if (inherits(cond, "message")) { [13:13:42.134] muffled <- grepl(pattern, "muffleMessage") [13:13:42.134] if (muffled) [13:13:42.134] invokeRestart("muffleMessage") [13:13:42.134] } [13:13:42.134] else if (inherits(cond, "warning")) { [13:13:42.134] muffled <- grepl(pattern, "muffleWarning") [13:13:42.134] if (muffled) [13:13:42.134] invokeRestart("muffleWarning") [13:13:42.134] } [13:13:42.134] else if (inherits(cond, "condition")) { [13:13:42.134] if (!is.null(pattern)) { [13:13:42.134] computeRestarts <- base::computeRestarts [13:13:42.134] grepl <- base::grepl [13:13:42.134] restarts <- computeRestarts(cond) [13:13:42.134] for (restart in restarts) { [13:13:42.134] name <- restart$name [13:13:42.134] if (is.null(name)) [13:13:42.134] next [13:13:42.134] if (!grepl(pattern, name)) [13:13:42.134] next [13:13:42.134] invokeRestart(restart) [13:13:42.134] muffled <- TRUE [13:13:42.134] break [13:13:42.134] } [13:13:42.134] } [13:13:42.134] } [13:13:42.134] invisible(muffled) [13:13:42.134] } [13:13:42.134] muffleCondition(cond, pattern = "^muffle") [13:13:42.134] } [13:13:42.134] } [13:13:42.134] } [13:13:42.134] })) [13:13:42.134] }, error = function(ex) { [13:13:42.134] base::structure(base::list(value = NULL, visible = NULL, [13:13:42.134] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:42.134] ...future.rng), started = ...future.startTime, [13:13:42.134] finished = Sys.time(), session_uuid = NA_character_, [13:13:42.134] version = "1.8"), class = "FutureResult") [13:13:42.134] }, finally = { [13:13:42.134] if (!identical(...future.workdir, getwd())) [13:13:42.134] setwd(...future.workdir) [13:13:42.134] { [13:13:42.134] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:42.134] ...future.oldOptions$nwarnings <- NULL [13:13:42.134] } [13:13:42.134] base::options(...future.oldOptions) [13:13:42.134] if (.Platform$OS.type == "windows") { [13:13:42.134] old_names <- names(...future.oldEnvVars) [13:13:42.134] envs <- base::Sys.getenv() [13:13:42.134] names <- names(envs) [13:13:42.134] common <- intersect(names, old_names) [13:13:42.134] added <- setdiff(names, old_names) [13:13:42.134] removed <- setdiff(old_names, names) [13:13:42.134] changed <- common[...future.oldEnvVars[common] != [13:13:42.134] envs[common]] [13:13:42.134] NAMES <- toupper(changed) [13:13:42.134] args <- list() [13:13:42.134] for (kk in seq_along(NAMES)) { [13:13:42.134] name <- changed[[kk]] [13:13:42.134] NAME <- NAMES[[kk]] [13:13:42.134] if (name != NAME && is.element(NAME, old_names)) [13:13:42.134] next [13:13:42.134] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:42.134] } [13:13:42.134] NAMES <- toupper(added) [13:13:42.134] for (kk in seq_along(NAMES)) { [13:13:42.134] name <- added[[kk]] [13:13:42.134] NAME <- NAMES[[kk]] [13:13:42.134] if (name != NAME && is.element(NAME, old_names)) [13:13:42.134] next [13:13:42.134] args[[name]] <- "" [13:13:42.134] } [13:13:42.134] NAMES <- toupper(removed) [13:13:42.134] for (kk in seq_along(NAMES)) { [13:13:42.134] name <- removed[[kk]] [13:13:42.134] NAME <- NAMES[[kk]] [13:13:42.134] if (name != NAME && is.element(NAME, old_names)) [13:13:42.134] next [13:13:42.134] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:42.134] } [13:13:42.134] if (length(args) > 0) [13:13:42.134] base::do.call(base::Sys.setenv, args = args) [13:13:42.134] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:42.134] } [13:13:42.134] else { [13:13:42.134] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:42.134] } [13:13:42.134] { [13:13:42.134] if (base::length(...future.futureOptionsAdded) > [13:13:42.134] 0L) { [13:13:42.134] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:42.134] base::names(opts) <- ...future.futureOptionsAdded [13:13:42.134] base::options(opts) [13:13:42.134] } [13:13:42.134] { [13:13:42.134] { [13:13:42.134] NULL [13:13:42.134] RNGkind("Mersenne-Twister") [13:13:42.134] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:42.134] inherits = FALSE) [13:13:42.134] } [13:13:42.134] options(future.plan = NULL) [13:13:42.134] if (is.na(NA_character_)) [13:13:42.134] Sys.unsetenv("R_FUTURE_PLAN") [13:13:42.134] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:42.134] future::plan(list(function (..., workers = availableCores(), [13:13:42.134] lazy = FALSE, rscript_libs = .libPaths(), [13:13:42.134] envir = parent.frame()) [13:13:42.134] { [13:13:42.134] if (is.function(workers)) [13:13:42.134] workers <- workers() [13:13:42.134] workers <- structure(as.integer(workers), [13:13:42.134] class = class(workers)) [13:13:42.134] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:42.134] workers >= 1) [13:13:42.134] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:42.134] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:42.134] } [13:13:42.134] future <- MultisessionFuture(..., workers = workers, [13:13:42.134] lazy = lazy, rscript_libs = rscript_libs, [13:13:42.134] envir = envir) [13:13:42.134] if (!future$lazy) [13:13:42.134] future <- run(future) [13:13:42.134] invisible(future) [13:13:42.134] }), .cleanup = FALSE, .init = FALSE) [13:13:42.134] } [13:13:42.134] } [13:13:42.134] } [13:13:42.134] }) [13:13:42.134] if (TRUE) { [13:13:42.134] base::sink(type = "output", split = FALSE) [13:13:42.134] if (TRUE) { [13:13:42.134] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:42.134] } [13:13:42.134] else { [13:13:42.134] ...future.result["stdout"] <- base::list(NULL) [13:13:42.134] } [13:13:42.134] base::close(...future.stdout) [13:13:42.134] ...future.stdout <- NULL [13:13:42.134] } [13:13:42.134] ...future.result$conditions <- ...future.conditions [13:13:42.134] ...future.result$finished <- base::Sys.time() [13:13:42.134] ...future.result [13:13:42.134] } [13:13:42.138] assign_globals() ... [13:13:42.138] List of 5 [13:13:42.138] $ ...future.FUN :function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [13:13:42.138] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [13:13:42.138] $ future.call.arguments :List of 2 [13:13:42.138] ..$ collapse: chr "; " [13:13:42.138] ..$ maxHead : int 3 [13:13:42.138] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:42.138] $ ...future.elements_ii :List of 1 [13:13:42.138] ..$ a: Named chr [1:101] "hello" "1" "2" "3" ... [13:13:42.138] .. ..- attr(*, "names")= chr [1:101] "" "b1" "b2" "b3" ... [13:13:42.138] $ ...future.seeds_ii : NULL [13:13:42.138] $ ...future.globals.maxSize: NULL [13:13:42.138] - attr(*, "where")=List of 5 [13:13:42.138] ..$ ...future.FUN : [13:13:42.138] ..$ future.call.arguments : [13:13:42.138] ..$ ...future.elements_ii : [13:13:42.138] ..$ ...future.seeds_ii : [13:13:42.138] ..$ ...future.globals.maxSize: [13:13:42.138] - attr(*, "resolved")= logi FALSE [13:13:42.138] - attr(*, "total_size")= num 71456 [13:13:42.138] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:42.138] - attr(*, "already-done")= logi TRUE [13:13:42.145] - copied '...future.FUN' to environment [13:13:42.145] - copied 'future.call.arguments' to environment [13:13:42.145] - copied '...future.elements_ii' to environment [13:13:42.145] - copied '...future.seeds_ii' to environment [13:13:42.146] - copied '...future.globals.maxSize' to environment [13:13:42.146] assign_globals() ... done [13:13:42.146] plan(): Setting new future strategy stack: [13:13:42.147] List of future strategies: [13:13:42.147] 1. sequential: [13:13:42.147] - args: function (..., envir = parent.frame(), workers = "") [13:13:42.147] - tweaked: FALSE [13:13:42.147] - call: NULL [13:13:42.147] plan(): nbrOfWorkers() = 1 [13:13:42.148] plan(): Setting new future strategy stack: [13:13:42.149] List of future strategies: [13:13:42.149] 1. multisession: [13:13:42.149] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [13:13:42.149] - tweaked: FALSE [13:13:42.149] - call: plan(strategy) [13:13:42.151] plan(): nbrOfWorkers() = 1 [13:13:42.151] SequentialFuture started (and completed) [13:13:42.151] - Launch lazy future ... done [13:13:42.152] run() for 'SequentialFuture' ... done [13:13:42.152] Created future: [13:13:42.152] SequentialFuture: [13:13:42.152] Label: 'future_lapply-1' [13:13:42.152] Expression: [13:13:42.152] { [13:13:42.152] do.call(function(...) { [13:13:42.152] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:42.152] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:42.152] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:42.152] on.exit(options(oopts), add = TRUE) [13:13:42.152] } [13:13:42.152] { [13:13:42.152] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:42.152] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:42.152] ...future.FUN(...future.X_jj, ...) [13:13:42.152] }) [13:13:42.152] } [13:13:42.152] }, args = future.call.arguments) [13:13:42.152] } [13:13:42.152] Lazy evaluation: FALSE [13:13:42.152] Asynchronous evaluation: FALSE [13:13:42.152] Local evaluation: TRUE [13:13:42.152] Environment: R_GlobalEnv [13:13:42.152] Capture standard output: TRUE [13:13:42.152] Capture condition classes: 'condition' (excluding 'nothing') [13:13:42.152] 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) [13:13:42.152] Packages: 1 packages ('future') [13:13:42.152] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:42.152] Resolved: TRUE [13:13:42.152] Value: 136 bytes of class 'list' [13:13:42.152] Early signaling: FALSE [13:13:42.152] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:42.152] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:42.153] Chunk #1 of 1 ... DONE [13:13:42.154] Launching 1 futures (chunks) ... DONE [13:13:42.154] Resolving 1 futures (chunks) ... [13:13:42.154] resolve() on list ... [13:13:42.154] recursive: 0 [13:13:42.154] length: 1 [13:13:42.154] [13:13:42.155] resolved() for 'SequentialFuture' ... [13:13:42.155] - state: 'finished' [13:13:42.155] - run: TRUE [13:13:42.155] - result: 'FutureResult' [13:13:42.155] resolved() for 'SequentialFuture' ... done [13:13:42.155] Future #1 [13:13:42.156] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:42.156] - nx: 1 [13:13:42.156] - relay: TRUE [13:13:42.156] - stdout: TRUE [13:13:42.156] - signal: TRUE [13:13:42.156] - resignal: FALSE [13:13:42.157] - force: TRUE [13:13:42.157] - relayed: [n=1] FALSE [13:13:42.157] - queued futures: [n=1] FALSE [13:13:42.157] - until=1 [13:13:42.157] - relaying element #1 [13:13:42.158] - relayed: [n=1] TRUE [13:13:42.158] - queued futures: [n=1] TRUE [13:13:42.158] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:42.158] length: 0 (resolved future 1) [13:13:42.158] Relaying remaining futures [13:13:42.158] signalConditionsASAP(NULL, pos=0) ... [13:13:42.158] - nx: 1 [13:13:42.159] - relay: TRUE [13:13:42.159] - stdout: TRUE [13:13:42.159] - signal: TRUE [13:13:42.159] - resignal: FALSE [13:13:42.159] - force: TRUE [13:13:42.159] - relayed: [n=1] TRUE [13:13:42.160] - queued futures: [n=1] TRUE - flush all [13:13:42.160] - relayed: [n=1] TRUE [13:13:42.160] - queued futures: [n=1] TRUE [13:13:42.160] signalConditionsASAP(NULL, pos=0) ... done [13:13:42.160] resolve() on list ... DONE [13:13:42.161] - Number of value chunks collected: 1 [13:13:42.161] Resolving 1 futures (chunks) ... DONE [13:13:42.161] Reducing values from 1 chunks ... [13:13:42.161] - Number of values collected after concatenation: 1 [13:13:42.161] - Number of values expected: 1 [13:13:42.161] Reducing values from 1 chunks ... DONE [13:13:42.161] future_lapply() ... DONE List of 1 $ y:List of 1 ..$ a: chr "hello; 1; 2; ...; 100" - future_lapply(x, FUN = listenv::listenv, ...) ... [13:13:42.163] future_lapply() ... [13:13:42.165] Number of chunks: 1 [13:13:42.165] Index remapping (attribute 'ordering'): [n = 2] 2, 1 [13:13:42.166] getGlobalsAndPackagesXApply() ... [13:13:42.166] - future.globals: TRUE [13:13:42.166] getGlobalsAndPackages() ... [13:13:42.166] Searching for globals... [13:13:42.168] - globals found: [4] 'FUN', '{', 'get', 'parent.env' [13:13:42.168] Searching for globals ... DONE [13:13:42.168] Resolving globals: FALSE [13:13:42.169] The total size of the 1 globals is 4.85 KiB (4968 bytes) [13:13:42.169] 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') [13:13:42.169] - globals: [1] 'FUN' [13:13:42.169] - packages: [1] 'listenv' [13:13:42.170] getGlobalsAndPackages() ... DONE [13:13:42.170] - globals found/used: [n=1] 'FUN' [13:13:42.170] - needed namespaces: [n=1] 'listenv' [13:13:42.170] Finding globals ... DONE [13:13:42.170] - use_args: TRUE [13:13:42.170] - Getting '...' globals ... [13:13:42.171] resolve() on list ... [13:13:42.171] recursive: 0 [13:13:42.171] length: 1 [13:13:42.171] elements: '...' [13:13:42.172] length: 0 (resolved future 1) [13:13:42.172] resolve() on list ... DONE [13:13:42.172] - '...' content: [n=0] [13:13:42.172] List of 1 [13:13:42.172] $ ...: list() [13:13:42.172] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:42.172] - attr(*, "where")=List of 1 [13:13:42.172] ..$ ...: [13:13:42.172] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:42.172] - attr(*, "resolved")= logi TRUE [13:13:42.172] - attr(*, "total_size")= num NA [13:13:42.175] - Getting '...' globals ... DONE [13:13:42.175] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:42.175] List of 2 [13:13:42.175] $ ...future.FUN:function (x, ...) [13:13:42.175] $ ... : list() [13:13:42.175] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:42.175] - attr(*, "where")=List of 2 [13:13:42.175] ..$ ...future.FUN: [13:13:42.175] ..$ ... : [13:13:42.175] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:42.175] - attr(*, "resolved")= logi FALSE [13:13:42.175] - attr(*, "total_size")= num 4968 [13:13:42.179] Packages to be attached in all futures: [n=1] 'listenv' [13:13:42.179] getGlobalsAndPackagesXApply() ... DONE [13:13:42.179] Number of futures (= number of chunks): 1 [13:13:42.180] Launching 1 futures (chunks) ... [13:13:42.180] Chunk #1 of 1 ... [13:13:42.180] - Finding globals in 'X' for chunk #1 ... [13:13:42.180] getGlobalsAndPackages() ... [13:13:42.180] Searching for globals... [13:13:42.181] [13:13:42.181] Searching for globals ... DONE [13:13:42.181] - globals: [0] [13:13:42.181] getGlobalsAndPackages() ... DONE [13:13:42.182] + additional globals found: [n=0] [13:13:42.182] + additional namespaces needed: [n=0] [13:13:42.182] - Finding globals in 'X' for chunk #1 ... DONE [13:13:42.182] - seeds: [13:13:42.182] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:42.182] getGlobalsAndPackages() ... [13:13:42.183] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:42.183] Resolving globals: FALSE [13:13:42.183] Tweak future expression to call with '...' arguments ... [13:13:42.183] { [13:13:42.183] do.call(function(...) { [13:13:42.183] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:42.183] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:42.183] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:42.183] on.exit(options(oopts), add = TRUE) [13:13:42.183] } [13:13:42.183] { [13:13:42.183] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:42.183] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:42.183] ...future.FUN(...future.X_jj, ...) [13:13:42.183] }) [13:13:42.183] } [13:13:42.183] }, args = future.call.arguments) [13:13:42.183] } [13:13:42.184] Tweak future expression to call with '...' arguments ... DONE [13:13:42.184] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:42.184] - packages: [1] 'listenv' [13:13:42.184] getGlobalsAndPackages() ... DONE [13:13:42.185] run() for 'Future' ... [13:13:42.185] - state: 'created' [13:13:42.185] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:42.187] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:42.188] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:42.188] - Field: 'label' [13:13:42.188] - Field: 'local' [13:13:42.188] - Field: 'owner' [13:13:42.188] - Field: 'envir' [13:13:42.189] - Field: 'packages' [13:13:42.189] - Field: 'gc' [13:13:42.189] - Field: 'conditions' [13:13:42.189] - Field: 'expr' [13:13:42.189] - Field: 'uuid' [13:13:42.189] - Field: 'seed' [13:13:42.190] - Field: 'version' [13:13:42.190] - Field: 'result' [13:13:42.190] - Field: 'asynchronous' [13:13:42.190] - Field: 'calls' [13:13:42.190] - Field: 'globals' [13:13:42.191] - Field: 'stdout' [13:13:42.191] - Field: 'earlySignal' [13:13:42.191] - Field: 'lazy' [13:13:42.191] - Field: 'state' [13:13:42.191] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:42.191] - Launch lazy future ... [13:13:42.192] Packages needed by the future expression (n = 1): 'listenv' [13:13:42.192] Packages needed by future strategies (n = 0): [13:13:42.193] { [13:13:42.193] { [13:13:42.193] { [13:13:42.193] ...future.startTime <- base::Sys.time() [13:13:42.193] { [13:13:42.193] { [13:13:42.193] { [13:13:42.193] { [13:13:42.193] base::local({ [13:13:42.193] has_future <- base::requireNamespace("future", [13:13:42.193] quietly = TRUE) [13:13:42.193] if (has_future) { [13:13:42.193] ns <- base::getNamespace("future") [13:13:42.193] version <- ns[[".package"]][["version"]] [13:13:42.193] if (is.null(version)) [13:13:42.193] version <- utils::packageVersion("future") [13:13:42.193] } [13:13:42.193] else { [13:13:42.193] version <- NULL [13:13:42.193] } [13:13:42.193] if (!has_future || version < "1.8.0") { [13:13:42.193] info <- base::c(r_version = base::gsub("R version ", [13:13:42.193] "", base::R.version$version.string), [13:13:42.193] platform = base::sprintf("%s (%s-bit)", [13:13:42.193] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:42.193] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:42.193] "release", "version")], collapse = " "), [13:13:42.193] hostname = base::Sys.info()[["nodename"]]) [13:13:42.193] info <- base::sprintf("%s: %s", base::names(info), [13:13:42.193] info) [13:13:42.193] info <- base::paste(info, collapse = "; ") [13:13:42.193] if (!has_future) { [13:13:42.193] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:42.193] info) [13:13:42.193] } [13:13:42.193] else { [13:13:42.193] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:42.193] info, version) [13:13:42.193] } [13:13:42.193] base::stop(msg) [13:13:42.193] } [13:13:42.193] }) [13:13:42.193] } [13:13:42.193] base::local({ [13:13:42.193] for (pkg in "listenv") { [13:13:42.193] base::loadNamespace(pkg) [13:13:42.193] base::library(pkg, character.only = TRUE) [13:13:42.193] } [13:13:42.193] }) [13:13:42.193] } [13:13:42.193] options(future.plan = NULL) [13:13:42.193] Sys.unsetenv("R_FUTURE_PLAN") [13:13:42.193] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:42.193] } [13:13:42.193] ...future.workdir <- getwd() [13:13:42.193] } [13:13:42.193] ...future.oldOptions <- base::as.list(base::.Options) [13:13:42.193] ...future.oldEnvVars <- base::Sys.getenv() [13:13:42.193] } [13:13:42.193] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:42.193] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:42.193] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:42.193] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:42.193] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:42.193] future.stdout.windows.reencode = NULL, width = 80L) [13:13:42.193] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:42.193] base::names(...future.oldOptions)) [13:13:42.193] } [13:13:42.193] if (FALSE) { [13:13:42.193] } [13:13:42.193] else { [13:13:42.193] if (TRUE) { [13:13:42.193] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:42.193] open = "w") [13:13:42.193] } [13:13:42.193] else { [13:13:42.193] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:42.193] windows = "NUL", "/dev/null"), open = "w") [13:13:42.193] } [13:13:42.193] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:42.193] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:42.193] base::sink(type = "output", split = FALSE) [13:13:42.193] base::close(...future.stdout) [13:13:42.193] }, add = TRUE) [13:13:42.193] } [13:13:42.193] ...future.frame <- base::sys.nframe() [13:13:42.193] ...future.conditions <- base::list() [13:13:42.193] ...future.rng <- base::globalenv()$.Random.seed [13:13:42.193] if (FALSE) { [13:13:42.193] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:42.193] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:42.193] } [13:13:42.193] ...future.result <- base::tryCatch({ [13:13:42.193] base::withCallingHandlers({ [13:13:42.193] ...future.value <- base::withVisible(base::local({ [13:13:42.193] do.call(function(...) { [13:13:42.193] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:42.193] if (!identical(...future.globals.maxSize.org, [13:13:42.193] ...future.globals.maxSize)) { [13:13:42.193] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:42.193] on.exit(options(oopts), add = TRUE) [13:13:42.193] } [13:13:42.193] { [13:13:42.193] lapply(seq_along(...future.elements_ii), [13:13:42.193] FUN = function(jj) { [13:13:42.193] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:42.193] ...future.FUN(...future.X_jj, ...) [13:13:42.193] }) [13:13:42.193] } [13:13:42.193] }, args = future.call.arguments) [13:13:42.193] })) [13:13:42.193] future::FutureResult(value = ...future.value$value, [13:13:42.193] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:42.193] ...future.rng), globalenv = if (FALSE) [13:13:42.193] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:42.193] ...future.globalenv.names)) [13:13:42.193] else NULL, started = ...future.startTime, version = "1.8") [13:13:42.193] }, condition = base::local({ [13:13:42.193] c <- base::c [13:13:42.193] inherits <- base::inherits [13:13:42.193] invokeRestart <- base::invokeRestart [13:13:42.193] length <- base::length [13:13:42.193] list <- base::list [13:13:42.193] seq.int <- base::seq.int [13:13:42.193] signalCondition <- base::signalCondition [13:13:42.193] sys.calls <- base::sys.calls [13:13:42.193] `[[` <- base::`[[` [13:13:42.193] `+` <- base::`+` [13:13:42.193] `<<-` <- base::`<<-` [13:13:42.193] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:42.193] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:42.193] 3L)] [13:13:42.193] } [13:13:42.193] function(cond) { [13:13:42.193] is_error <- inherits(cond, "error") [13:13:42.193] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:42.193] NULL) [13:13:42.193] if (is_error) { [13:13:42.193] sessionInformation <- function() { [13:13:42.193] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:42.193] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:42.193] search = base::search(), system = base::Sys.info()) [13:13:42.193] } [13:13:42.193] ...future.conditions[[length(...future.conditions) + [13:13:42.193] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:42.193] cond$call), session = sessionInformation(), [13:13:42.193] timestamp = base::Sys.time(), signaled = 0L) [13:13:42.193] signalCondition(cond) [13:13:42.193] } [13:13:42.193] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:42.193] "immediateCondition"))) { [13:13:42.193] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:42.193] ...future.conditions[[length(...future.conditions) + [13:13:42.193] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:42.193] if (TRUE && !signal) { [13:13:42.193] muffleCondition <- function (cond, pattern = "^muffle") [13:13:42.193] { [13:13:42.193] inherits <- base::inherits [13:13:42.193] invokeRestart <- base::invokeRestart [13:13:42.193] is.null <- base::is.null [13:13:42.193] muffled <- FALSE [13:13:42.193] if (inherits(cond, "message")) { [13:13:42.193] muffled <- grepl(pattern, "muffleMessage") [13:13:42.193] if (muffled) [13:13:42.193] invokeRestart("muffleMessage") [13:13:42.193] } [13:13:42.193] else if (inherits(cond, "warning")) { [13:13:42.193] muffled <- grepl(pattern, "muffleWarning") [13:13:42.193] if (muffled) [13:13:42.193] invokeRestart("muffleWarning") [13:13:42.193] } [13:13:42.193] else if (inherits(cond, "condition")) { [13:13:42.193] if (!is.null(pattern)) { [13:13:42.193] computeRestarts <- base::computeRestarts [13:13:42.193] grepl <- base::grepl [13:13:42.193] restarts <- computeRestarts(cond) [13:13:42.193] for (restart in restarts) { [13:13:42.193] name <- restart$name [13:13:42.193] if (is.null(name)) [13:13:42.193] next [13:13:42.193] if (!grepl(pattern, name)) [13:13:42.193] next [13:13:42.193] invokeRestart(restart) [13:13:42.193] muffled <- TRUE [13:13:42.193] break [13:13:42.193] } [13:13:42.193] } [13:13:42.193] } [13:13:42.193] invisible(muffled) [13:13:42.193] } [13:13:42.193] muffleCondition(cond, pattern = "^muffle") [13:13:42.193] } [13:13:42.193] } [13:13:42.193] else { [13:13:42.193] if (TRUE) { [13:13:42.193] muffleCondition <- function (cond, pattern = "^muffle") [13:13:42.193] { [13:13:42.193] inherits <- base::inherits [13:13:42.193] invokeRestart <- base::invokeRestart [13:13:42.193] is.null <- base::is.null [13:13:42.193] muffled <- FALSE [13:13:42.193] if (inherits(cond, "message")) { [13:13:42.193] muffled <- grepl(pattern, "muffleMessage") [13:13:42.193] if (muffled) [13:13:42.193] invokeRestart("muffleMessage") [13:13:42.193] } [13:13:42.193] else if (inherits(cond, "warning")) { [13:13:42.193] muffled <- grepl(pattern, "muffleWarning") [13:13:42.193] if (muffled) [13:13:42.193] invokeRestart("muffleWarning") [13:13:42.193] } [13:13:42.193] else if (inherits(cond, "condition")) { [13:13:42.193] if (!is.null(pattern)) { [13:13:42.193] computeRestarts <- base::computeRestarts [13:13:42.193] grepl <- base::grepl [13:13:42.193] restarts <- computeRestarts(cond) [13:13:42.193] for (restart in restarts) { [13:13:42.193] name <- restart$name [13:13:42.193] if (is.null(name)) [13:13:42.193] next [13:13:42.193] if (!grepl(pattern, name)) [13:13:42.193] next [13:13:42.193] invokeRestart(restart) [13:13:42.193] muffled <- TRUE [13:13:42.193] break [13:13:42.193] } [13:13:42.193] } [13:13:42.193] } [13:13:42.193] invisible(muffled) [13:13:42.193] } [13:13:42.193] muffleCondition(cond, pattern = "^muffle") [13:13:42.193] } [13:13:42.193] } [13:13:42.193] } [13:13:42.193] })) [13:13:42.193] }, error = function(ex) { [13:13:42.193] base::structure(base::list(value = NULL, visible = NULL, [13:13:42.193] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:42.193] ...future.rng), started = ...future.startTime, [13:13:42.193] finished = Sys.time(), session_uuid = NA_character_, [13:13:42.193] version = "1.8"), class = "FutureResult") [13:13:42.193] }, finally = { [13:13:42.193] if (!identical(...future.workdir, getwd())) [13:13:42.193] setwd(...future.workdir) [13:13:42.193] { [13:13:42.193] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:42.193] ...future.oldOptions$nwarnings <- NULL [13:13:42.193] } [13:13:42.193] base::options(...future.oldOptions) [13:13:42.193] if (.Platform$OS.type == "windows") { [13:13:42.193] old_names <- names(...future.oldEnvVars) [13:13:42.193] envs <- base::Sys.getenv() [13:13:42.193] names <- names(envs) [13:13:42.193] common <- intersect(names, old_names) [13:13:42.193] added <- setdiff(names, old_names) [13:13:42.193] removed <- setdiff(old_names, names) [13:13:42.193] changed <- common[...future.oldEnvVars[common] != [13:13:42.193] envs[common]] [13:13:42.193] NAMES <- toupper(changed) [13:13:42.193] args <- list() [13:13:42.193] for (kk in seq_along(NAMES)) { [13:13:42.193] name <- changed[[kk]] [13:13:42.193] NAME <- NAMES[[kk]] [13:13:42.193] if (name != NAME && is.element(NAME, old_names)) [13:13:42.193] next [13:13:42.193] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:42.193] } [13:13:42.193] NAMES <- toupper(added) [13:13:42.193] for (kk in seq_along(NAMES)) { [13:13:42.193] name <- added[[kk]] [13:13:42.193] NAME <- NAMES[[kk]] [13:13:42.193] if (name != NAME && is.element(NAME, old_names)) [13:13:42.193] next [13:13:42.193] args[[name]] <- "" [13:13:42.193] } [13:13:42.193] NAMES <- toupper(removed) [13:13:42.193] for (kk in seq_along(NAMES)) { [13:13:42.193] name <- removed[[kk]] [13:13:42.193] NAME <- NAMES[[kk]] [13:13:42.193] if (name != NAME && is.element(NAME, old_names)) [13:13:42.193] next [13:13:42.193] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:42.193] } [13:13:42.193] if (length(args) > 0) [13:13:42.193] base::do.call(base::Sys.setenv, args = args) [13:13:42.193] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:42.193] } [13:13:42.193] else { [13:13:42.193] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:42.193] } [13:13:42.193] { [13:13:42.193] if (base::length(...future.futureOptionsAdded) > [13:13:42.193] 0L) { [13:13:42.193] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:42.193] base::names(opts) <- ...future.futureOptionsAdded [13:13:42.193] base::options(opts) [13:13:42.193] } [13:13:42.193] { [13:13:42.193] { [13:13:42.193] NULL [13:13:42.193] RNGkind("Mersenne-Twister") [13:13:42.193] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:42.193] inherits = FALSE) [13:13:42.193] } [13:13:42.193] options(future.plan = NULL) [13:13:42.193] if (is.na(NA_character_)) [13:13:42.193] Sys.unsetenv("R_FUTURE_PLAN") [13:13:42.193] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:42.193] future::plan(list(function (..., workers = availableCores(), [13:13:42.193] lazy = FALSE, rscript_libs = .libPaths(), [13:13:42.193] envir = parent.frame()) [13:13:42.193] { [13:13:42.193] if (is.function(workers)) [13:13:42.193] workers <- workers() [13:13:42.193] workers <- structure(as.integer(workers), [13:13:42.193] class = class(workers)) [13:13:42.193] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:42.193] workers >= 1) [13:13:42.193] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:42.193] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:42.193] } [13:13:42.193] future <- MultisessionFuture(..., workers = workers, [13:13:42.193] lazy = lazy, rscript_libs = rscript_libs, [13:13:42.193] envir = envir) [13:13:42.193] if (!future$lazy) [13:13:42.193] future <- run(future) [13:13:42.193] invisible(future) [13:13:42.193] }), .cleanup = FALSE, .init = FALSE) [13:13:42.193] } [13:13:42.193] } [13:13:42.193] } [13:13:42.193] }) [13:13:42.193] if (TRUE) { [13:13:42.193] base::sink(type = "output", split = FALSE) [13:13:42.193] if (TRUE) { [13:13:42.193] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:42.193] } [13:13:42.193] else { [13:13:42.193] ...future.result["stdout"] <- base::list(NULL) [13:13:42.193] } [13:13:42.193] base::close(...future.stdout) [13:13:42.193] ...future.stdout <- NULL [13:13:42.193] } [13:13:42.193] ...future.result$conditions <- ...future.conditions [13:13:42.193] ...future.result$finished <- base::Sys.time() [13:13:42.193] ...future.result [13:13:42.193] } [13:13:42.197] assign_globals() ... [13:13:42.197] List of 5 [13:13:42.197] $ ...future.FUN :function (x, ...) [13:13:42.197] $ future.call.arguments : list() [13:13:42.197] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:42.197] $ ...future.elements_ii :List of 2 [13:13:42.197] ..$ b:Classes 'listenv', 'environment' [13:13:42.197] ..$ a:Classes 'listenv', 'environment' [13:13:42.197] $ ...future.seeds_ii : NULL [13:13:42.197] $ ...future.globals.maxSize: NULL [13:13:42.197] - attr(*, "where")=List of 5 [13:13:42.197] ..$ ...future.FUN : [13:13:42.197] ..$ future.call.arguments : [13:13:42.197] ..$ ...future.elements_ii : [13:13:42.197] ..$ ...future.seeds_ii : [13:13:42.197] ..$ ...future.globals.maxSize: [13:13:42.197] - attr(*, "resolved")= logi FALSE [13:13:42.197] - attr(*, "total_size")= num 4968 [13:13:42.197] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:42.197] - attr(*, "already-done")= logi TRUE [13:13:42.203] - copied '...future.FUN' to environment [13:13:42.203] - copied 'future.call.arguments' to environment [13:13:42.203] - copied '...future.elements_ii' to environment [13:13:42.203] - copied '...future.seeds_ii' to environment [13:13:42.203] - copied '...future.globals.maxSize' to environment [13:13:42.204] assign_globals() ... done [13:13:42.204] plan(): Setting new future strategy stack: [13:13:42.204] List of future strategies: [13:13:42.204] 1. sequential: [13:13:42.204] - args: function (..., envir = parent.frame(), workers = "") [13:13:42.204] - tweaked: FALSE [13:13:42.204] - call: NULL [13:13:42.205] plan(): nbrOfWorkers() = 1 [13:13:42.206] plan(): Setting new future strategy stack: [13:13:42.206] List of future strategies: [13:13:42.206] 1. multisession: [13:13:42.206] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [13:13:42.206] - tweaked: FALSE [13:13:42.206] - call: plan(strategy) [13:13:42.209] plan(): nbrOfWorkers() = 1 [13:13:42.209] SequentialFuture started (and completed) [13:13:42.209] - Launch lazy future ... done [13:13:42.209] run() for 'SequentialFuture' ... done [13:13:42.210] Created future: [13:13:42.210] SequentialFuture: [13:13:42.210] Label: 'future_lapply-1' [13:13:42.210] Expression: [13:13:42.210] { [13:13:42.210] do.call(function(...) { [13:13:42.210] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:42.210] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:42.210] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:42.210] on.exit(options(oopts), add = TRUE) [13:13:42.210] } [13:13:42.210] { [13:13:42.210] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:42.210] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:42.210] ...future.FUN(...future.X_jj, ...) [13:13:42.210] }) [13:13:42.210] } [13:13:42.210] }, args = future.call.arguments) [13:13:42.210] } [13:13:42.210] Lazy evaluation: FALSE [13:13:42.210] Asynchronous evaluation: FALSE [13:13:42.210] Local evaluation: TRUE [13:13:42.210] Environment: R_GlobalEnv [13:13:42.210] Capture standard output: TRUE [13:13:42.210] Capture condition classes: 'condition' (excluding 'nothing') [13:13:42.210] 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) [13:13:42.210] Packages: 1 packages ('listenv') [13:13:42.210] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:42.210] Resolved: TRUE [13:13:42.210] Value: 800 bytes of class 'list' [13:13:42.210] Early signaling: FALSE [13:13:42.210] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:42.210] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:42.211] Chunk #1 of 1 ... DONE [13:13:42.212] Launching 1 futures (chunks) ... DONE [13:13:42.212] Resolving 1 futures (chunks) ... [13:13:42.212] resolve() on list ... [13:13:42.212] recursive: 0 [13:13:42.212] length: 1 [13:13:42.212] [13:13:42.212] resolved() for 'SequentialFuture' ... [13:13:42.213] - state: 'finished' [13:13:42.213] - run: TRUE [13:13:42.213] - result: 'FutureResult' [13:13:42.213] resolved() for 'SequentialFuture' ... done [13:13:42.213] Future #1 [13:13:42.214] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:42.214] - nx: 1 [13:13:42.214] - relay: TRUE [13:13:42.214] - stdout: TRUE [13:13:42.214] - signal: TRUE [13:13:42.214] - resignal: FALSE [13:13:42.215] - force: TRUE [13:13:42.215] - relayed: [n=1] FALSE [13:13:42.215] - queued futures: [n=1] FALSE [13:13:42.215] - until=1 [13:13:42.215] - relaying element #1 [13:13:42.215] - relayed: [n=1] TRUE [13:13:42.216] - queued futures: [n=1] TRUE [13:13:42.216] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:42.216] length: 0 (resolved future 1) [13:13:42.216] Relaying remaining futures [13:13:42.216] signalConditionsASAP(NULL, pos=0) ... [13:13:42.216] - nx: 1 [13:13:42.217] - relay: TRUE [13:13:42.217] - stdout: TRUE [13:13:42.217] - signal: TRUE [13:13:42.217] - resignal: FALSE [13:13:42.217] - force: TRUE [13:13:42.217] - relayed: [n=1] TRUE [13:13:42.217] - queued futures: [n=1] TRUE - flush all [13:13:42.218] - relayed: [n=1] TRUE [13:13:42.218] - queued futures: [n=1] TRUE [13:13:42.218] signalConditionsASAP(NULL, pos=0) ... done [13:13:42.218] resolve() on list ... DONE [13:13:42.218] - Number of value chunks collected: 1 [13:13:42.219] Resolving 1 futures (chunks) ... DONE [13:13:42.219] Reducing values from 1 chunks ... [13:13:42.219] - Number of values collected after concatenation: 2 [13:13:42.219] - Number of values expected: 2 [13:13:42.219] Reverse index remapping (attribute 'ordering'): [n = 2] 2, 1 [13:13:42.219] Reducing values from 1 chunks ... DONE [13:13:42.220] 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) ... [13:13:42.222] future_lapply() ... [13:13:42.224] Number of chunks: 1 [13:13:42.225] getGlobalsAndPackagesXApply() ... [13:13:42.225] - future.globals: TRUE [13:13:42.225] getGlobalsAndPackages() ... [13:13:42.225] Searching for globals... [13:13:42.227] - globals found: [4] 'FUN', 'sqrt', '+', 'a' [13:13:42.227] Searching for globals ... DONE [13:13:42.227] Resolving globals: FALSE [13:13:42.228] The total size of the 2 globals is 1.93 KiB (1976 bytes) [13:13:42.228] 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') [13:13:42.228] - globals: [2] 'FUN', 'a' [13:13:42.228] [13:13:42.229] getGlobalsAndPackages() ... DONE [13:13:42.229] - globals found/used: [n=2] 'FUN', 'a' [13:13:42.229] - needed namespaces: [n=0] [13:13:42.229] Finding globals ... DONE [13:13:42.229] - use_args: TRUE [13:13:42.229] - Getting '...' globals ... [13:13:42.230] resolve() on list ... [13:13:42.230] recursive: 0 [13:13:42.230] length: 1 [13:13:42.230] elements: '...' [13:13:42.231] length: 0 (resolved future 1) [13:13:42.231] resolve() on list ... DONE [13:13:42.231] - '...' content: [n=0] [13:13:42.231] List of 1 [13:13:42.231] $ ...: list() [13:13:42.231] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:42.231] - attr(*, "where")=List of 1 [13:13:42.231] ..$ ...: [13:13:42.231] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:42.231] - attr(*, "resolved")= logi TRUE [13:13:42.231] - attr(*, "total_size")= num NA [13:13:42.234] - Getting '...' globals ... DONE [13:13:42.234] Globals to be used in all futures (chunks): [n=3] '...future.FUN', 'a', '...' [13:13:42.234] List of 3 [13:13:42.234] $ ...future.FUN:function (z) [13:13:42.234] $ a : num 3.14 [13:13:42.234] $ ... : list() [13:13:42.234] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:42.234] - attr(*, "where")=List of 3 [13:13:42.234] ..$ ...future.FUN: [13:13:42.234] ..$ a : [13:13:42.234] ..$ ... : [13:13:42.234] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:42.234] - attr(*, "resolved")= logi FALSE [13:13:42.234] - attr(*, "total_size")= num 1976 [13:13:42.238] Packages to be attached in all futures: [n=0] [13:13:42.239] getGlobalsAndPackagesXApply() ... DONE [13:13:42.239] Number of futures (= number of chunks): 1 [13:13:42.239] Launching 1 futures (chunks) ... [13:13:42.239] Chunk #1 of 1 ... [13:13:42.243] - Finding globals in 'X' for chunk #1 ... [13:13:42.243] getGlobalsAndPackages() ... [13:13:42.244] Searching for globals... [13:13:42.251] [13:13:42.251] Searching for globals ... DONE [13:13:42.252] - globals: [0] [13:13:42.252] getGlobalsAndPackages() ... DONE [13:13:42.252] + additional globals found: [n=0] [13:13:42.252] + additional namespaces needed: [n=0] [13:13:42.252] - Finding globals in 'X' for chunk #1 ... DONE [13:13:42.252] - seeds: [13:13:42.253] - All globals exported: [n=6] '...future.FUN', 'a', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:42.253] getGlobalsAndPackages() ... [13:13:42.253] - globals passed as-is: [6] '...future.FUN', 'a', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:42.253] Resolving globals: FALSE [13:13:42.253] Tweak future expression to call with '...' arguments ... [13:13:42.253] { [13:13:42.253] do.call(function(...) { [13:13:42.253] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:42.253] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:42.253] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:42.253] on.exit(options(oopts), add = TRUE) [13:13:42.253] } [13:13:42.253] { [13:13:42.253] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:42.253] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:42.253] ...future.FUN(...future.X_jj, ...) [13:13:42.253] }) [13:13:42.253] } [13:13:42.253] }, args = future.call.arguments) [13:13:42.253] } [13:13:42.254] Tweak future expression to call with '...' arguments ... DONE [13:13:42.254] - globals: [6] '...future.FUN', 'a', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:42.255] [13:13:42.255] getGlobalsAndPackages() ... DONE [13:13:42.255] run() for 'Future' ... [13:13:42.255] - state: 'created' [13:13:42.256] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:42.258] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:42.258] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:42.258] - Field: 'label' [13:13:42.258] - Field: 'local' [13:13:42.259] - Field: 'owner' [13:13:42.259] - Field: 'envir' [13:13:42.259] - Field: 'packages' [13:13:42.259] - Field: 'gc' [13:13:42.259] - Field: 'conditions' [13:13:42.259] - Field: 'expr' [13:13:42.260] - Field: 'uuid' [13:13:42.260] - Field: 'seed' [13:13:42.260] - Field: 'version' [13:13:42.260] - Field: 'result' [13:13:42.260] - Field: 'asynchronous' [13:13:42.261] - Field: 'calls' [13:13:42.261] - Field: 'globals' [13:13:42.261] - Field: 'stdout' [13:13:42.261] - Field: 'earlySignal' [13:13:42.261] - Field: 'lazy' [13:13:42.261] - Field: 'state' [13:13:42.262] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:42.262] - Launch lazy future ... [13:13:42.262] Packages needed by the future expression (n = 0): [13:13:42.262] Packages needed by future strategies (n = 0): [13:13:42.263] { [13:13:42.263] { [13:13:42.263] { [13:13:42.263] ...future.startTime <- base::Sys.time() [13:13:42.263] { [13:13:42.263] { [13:13:42.263] { [13:13:42.263] base::local({ [13:13:42.263] has_future <- base::requireNamespace("future", [13:13:42.263] quietly = TRUE) [13:13:42.263] if (has_future) { [13:13:42.263] ns <- base::getNamespace("future") [13:13:42.263] version <- ns[[".package"]][["version"]] [13:13:42.263] if (is.null(version)) [13:13:42.263] version <- utils::packageVersion("future") [13:13:42.263] } [13:13:42.263] else { [13:13:42.263] version <- NULL [13:13:42.263] } [13:13:42.263] if (!has_future || version < "1.8.0") { [13:13:42.263] info <- base::c(r_version = base::gsub("R version ", [13:13:42.263] "", base::R.version$version.string), [13:13:42.263] platform = base::sprintf("%s (%s-bit)", [13:13:42.263] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:42.263] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:42.263] "release", "version")], collapse = " "), [13:13:42.263] hostname = base::Sys.info()[["nodename"]]) [13:13:42.263] info <- base::sprintf("%s: %s", base::names(info), [13:13:42.263] info) [13:13:42.263] info <- base::paste(info, collapse = "; ") [13:13:42.263] if (!has_future) { [13:13:42.263] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:42.263] info) [13:13:42.263] } [13:13:42.263] else { [13:13:42.263] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:42.263] info, version) [13:13:42.263] } [13:13:42.263] base::stop(msg) [13:13:42.263] } [13:13:42.263] }) [13:13:42.263] } [13:13:42.263] options(future.plan = NULL) [13:13:42.263] Sys.unsetenv("R_FUTURE_PLAN") [13:13:42.263] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:42.263] } [13:13:42.263] ...future.workdir <- getwd() [13:13:42.263] } [13:13:42.263] ...future.oldOptions <- base::as.list(base::.Options) [13:13:42.263] ...future.oldEnvVars <- base::Sys.getenv() [13:13:42.263] } [13:13:42.263] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:42.263] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:42.263] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:42.263] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:42.263] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:42.263] future.stdout.windows.reencode = NULL, width = 80L) [13:13:42.263] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:42.263] base::names(...future.oldOptions)) [13:13:42.263] } [13:13:42.263] if (FALSE) { [13:13:42.263] } [13:13:42.263] else { [13:13:42.263] if (TRUE) { [13:13:42.263] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:42.263] open = "w") [13:13:42.263] } [13:13:42.263] else { [13:13:42.263] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:42.263] windows = "NUL", "/dev/null"), open = "w") [13:13:42.263] } [13:13:42.263] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:42.263] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:42.263] base::sink(type = "output", split = FALSE) [13:13:42.263] base::close(...future.stdout) [13:13:42.263] }, add = TRUE) [13:13:42.263] } [13:13:42.263] ...future.frame <- base::sys.nframe() [13:13:42.263] ...future.conditions <- base::list() [13:13:42.263] ...future.rng <- base::globalenv()$.Random.seed [13:13:42.263] if (FALSE) { [13:13:42.263] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:42.263] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:42.263] } [13:13:42.263] ...future.result <- base::tryCatch({ [13:13:42.263] base::withCallingHandlers({ [13:13:42.263] ...future.value <- base::withVisible(base::local({ [13:13:42.263] do.call(function(...) { [13:13:42.263] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:42.263] if (!identical(...future.globals.maxSize.org, [13:13:42.263] ...future.globals.maxSize)) { [13:13:42.263] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:42.263] on.exit(options(oopts), add = TRUE) [13:13:42.263] } [13:13:42.263] { [13:13:42.263] lapply(seq_along(...future.elements_ii), [13:13:42.263] FUN = function(jj) { [13:13:42.263] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:42.263] ...future.FUN(...future.X_jj, ...) [13:13:42.263] }) [13:13:42.263] } [13:13:42.263] }, args = future.call.arguments) [13:13:42.263] })) [13:13:42.263] future::FutureResult(value = ...future.value$value, [13:13:42.263] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:42.263] ...future.rng), globalenv = if (FALSE) [13:13:42.263] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:42.263] ...future.globalenv.names)) [13:13:42.263] else NULL, started = ...future.startTime, version = "1.8") [13:13:42.263] }, condition = base::local({ [13:13:42.263] c <- base::c [13:13:42.263] inherits <- base::inherits [13:13:42.263] invokeRestart <- base::invokeRestart [13:13:42.263] length <- base::length [13:13:42.263] list <- base::list [13:13:42.263] seq.int <- base::seq.int [13:13:42.263] signalCondition <- base::signalCondition [13:13:42.263] sys.calls <- base::sys.calls [13:13:42.263] `[[` <- base::`[[` [13:13:42.263] `+` <- base::`+` [13:13:42.263] `<<-` <- base::`<<-` [13:13:42.263] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:42.263] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:42.263] 3L)] [13:13:42.263] } [13:13:42.263] function(cond) { [13:13:42.263] is_error <- inherits(cond, "error") [13:13:42.263] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:42.263] NULL) [13:13:42.263] if (is_error) { [13:13:42.263] sessionInformation <- function() { [13:13:42.263] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:42.263] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:42.263] search = base::search(), system = base::Sys.info()) [13:13:42.263] } [13:13:42.263] ...future.conditions[[length(...future.conditions) + [13:13:42.263] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:42.263] cond$call), session = sessionInformation(), [13:13:42.263] timestamp = base::Sys.time(), signaled = 0L) [13:13:42.263] signalCondition(cond) [13:13:42.263] } [13:13:42.263] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:42.263] "immediateCondition"))) { [13:13:42.263] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:42.263] ...future.conditions[[length(...future.conditions) + [13:13:42.263] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:42.263] if (TRUE && !signal) { [13:13:42.263] muffleCondition <- function (cond, pattern = "^muffle") [13:13:42.263] { [13:13:42.263] inherits <- base::inherits [13:13:42.263] invokeRestart <- base::invokeRestart [13:13:42.263] is.null <- base::is.null [13:13:42.263] muffled <- FALSE [13:13:42.263] if (inherits(cond, "message")) { [13:13:42.263] muffled <- grepl(pattern, "muffleMessage") [13:13:42.263] if (muffled) [13:13:42.263] invokeRestart("muffleMessage") [13:13:42.263] } [13:13:42.263] else if (inherits(cond, "warning")) { [13:13:42.263] muffled <- grepl(pattern, "muffleWarning") [13:13:42.263] if (muffled) [13:13:42.263] invokeRestart("muffleWarning") [13:13:42.263] } [13:13:42.263] else if (inherits(cond, "condition")) { [13:13:42.263] if (!is.null(pattern)) { [13:13:42.263] computeRestarts <- base::computeRestarts [13:13:42.263] grepl <- base::grepl [13:13:42.263] restarts <- computeRestarts(cond) [13:13:42.263] for (restart in restarts) { [13:13:42.263] name <- restart$name [13:13:42.263] if (is.null(name)) [13:13:42.263] next [13:13:42.263] if (!grepl(pattern, name)) [13:13:42.263] next [13:13:42.263] invokeRestart(restart) [13:13:42.263] muffled <- TRUE [13:13:42.263] break [13:13:42.263] } [13:13:42.263] } [13:13:42.263] } [13:13:42.263] invisible(muffled) [13:13:42.263] } [13:13:42.263] muffleCondition(cond, pattern = "^muffle") [13:13:42.263] } [13:13:42.263] } [13:13:42.263] else { [13:13:42.263] if (TRUE) { [13:13:42.263] muffleCondition <- function (cond, pattern = "^muffle") [13:13:42.263] { [13:13:42.263] inherits <- base::inherits [13:13:42.263] invokeRestart <- base::invokeRestart [13:13:42.263] is.null <- base::is.null [13:13:42.263] muffled <- FALSE [13:13:42.263] if (inherits(cond, "message")) { [13:13:42.263] muffled <- grepl(pattern, "muffleMessage") [13:13:42.263] if (muffled) [13:13:42.263] invokeRestart("muffleMessage") [13:13:42.263] } [13:13:42.263] else if (inherits(cond, "warning")) { [13:13:42.263] muffled <- grepl(pattern, "muffleWarning") [13:13:42.263] if (muffled) [13:13:42.263] invokeRestart("muffleWarning") [13:13:42.263] } [13:13:42.263] else if (inherits(cond, "condition")) { [13:13:42.263] if (!is.null(pattern)) { [13:13:42.263] computeRestarts <- base::computeRestarts [13:13:42.263] grepl <- base::grepl [13:13:42.263] restarts <- computeRestarts(cond) [13:13:42.263] for (restart in restarts) { [13:13:42.263] name <- restart$name [13:13:42.263] if (is.null(name)) [13:13:42.263] next [13:13:42.263] if (!grepl(pattern, name)) [13:13:42.263] next [13:13:42.263] invokeRestart(restart) [13:13:42.263] muffled <- TRUE [13:13:42.263] break [13:13:42.263] } [13:13:42.263] } [13:13:42.263] } [13:13:42.263] invisible(muffled) [13:13:42.263] } [13:13:42.263] muffleCondition(cond, pattern = "^muffle") [13:13:42.263] } [13:13:42.263] } [13:13:42.263] } [13:13:42.263] })) [13:13:42.263] }, error = function(ex) { [13:13:42.263] base::structure(base::list(value = NULL, visible = NULL, [13:13:42.263] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:42.263] ...future.rng), started = ...future.startTime, [13:13:42.263] finished = Sys.time(), session_uuid = NA_character_, [13:13:42.263] version = "1.8"), class = "FutureResult") [13:13:42.263] }, finally = { [13:13:42.263] if (!identical(...future.workdir, getwd())) [13:13:42.263] setwd(...future.workdir) [13:13:42.263] { [13:13:42.263] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:42.263] ...future.oldOptions$nwarnings <- NULL [13:13:42.263] } [13:13:42.263] base::options(...future.oldOptions) [13:13:42.263] if (.Platform$OS.type == "windows") { [13:13:42.263] old_names <- names(...future.oldEnvVars) [13:13:42.263] envs <- base::Sys.getenv() [13:13:42.263] names <- names(envs) [13:13:42.263] common <- intersect(names, old_names) [13:13:42.263] added <- setdiff(names, old_names) [13:13:42.263] removed <- setdiff(old_names, names) [13:13:42.263] changed <- common[...future.oldEnvVars[common] != [13:13:42.263] envs[common]] [13:13:42.263] NAMES <- toupper(changed) [13:13:42.263] args <- list() [13:13:42.263] for (kk in seq_along(NAMES)) { [13:13:42.263] name <- changed[[kk]] [13:13:42.263] NAME <- NAMES[[kk]] [13:13:42.263] if (name != NAME && is.element(NAME, old_names)) [13:13:42.263] next [13:13:42.263] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:42.263] } [13:13:42.263] NAMES <- toupper(added) [13:13:42.263] for (kk in seq_along(NAMES)) { [13:13:42.263] name <- added[[kk]] [13:13:42.263] NAME <- NAMES[[kk]] [13:13:42.263] if (name != NAME && is.element(NAME, old_names)) [13:13:42.263] next [13:13:42.263] args[[name]] <- "" [13:13:42.263] } [13:13:42.263] NAMES <- toupper(removed) [13:13:42.263] for (kk in seq_along(NAMES)) { [13:13:42.263] name <- removed[[kk]] [13:13:42.263] NAME <- NAMES[[kk]] [13:13:42.263] if (name != NAME && is.element(NAME, old_names)) [13:13:42.263] next [13:13:42.263] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:42.263] } [13:13:42.263] if (length(args) > 0) [13:13:42.263] base::do.call(base::Sys.setenv, args = args) [13:13:42.263] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:42.263] } [13:13:42.263] else { [13:13:42.263] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:42.263] } [13:13:42.263] { [13:13:42.263] if (base::length(...future.futureOptionsAdded) > [13:13:42.263] 0L) { [13:13:42.263] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:42.263] base::names(opts) <- ...future.futureOptionsAdded [13:13:42.263] base::options(opts) [13:13:42.263] } [13:13:42.263] { [13:13:42.263] { [13:13:42.263] NULL [13:13:42.263] RNGkind("Mersenne-Twister") [13:13:42.263] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:42.263] inherits = FALSE) [13:13:42.263] } [13:13:42.263] options(future.plan = NULL) [13:13:42.263] if (is.na(NA_character_)) [13:13:42.263] Sys.unsetenv("R_FUTURE_PLAN") [13:13:42.263] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:42.263] future::plan(list(function (..., workers = availableCores(), [13:13:42.263] lazy = FALSE, rscript_libs = .libPaths(), [13:13:42.263] envir = parent.frame()) [13:13:42.263] { [13:13:42.263] if (is.function(workers)) [13:13:42.263] workers <- workers() [13:13:42.263] workers <- structure(as.integer(workers), [13:13:42.263] class = class(workers)) [13:13:42.263] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:42.263] workers >= 1) [13:13:42.263] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:42.263] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:42.263] } [13:13:42.263] future <- MultisessionFuture(..., workers = workers, [13:13:42.263] lazy = lazy, rscript_libs = rscript_libs, [13:13:42.263] envir = envir) [13:13:42.263] if (!future$lazy) [13:13:42.263] future <- run(future) [13:13:42.263] invisible(future) [13:13:42.263] }), .cleanup = FALSE, .init = FALSE) [13:13:42.263] } [13:13:42.263] } [13:13:42.263] } [13:13:42.263] }) [13:13:42.263] if (TRUE) { [13:13:42.263] base::sink(type = "output", split = FALSE) [13:13:42.263] if (TRUE) { [13:13:42.263] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:42.263] } [13:13:42.263] else { [13:13:42.263] ...future.result["stdout"] <- base::list(NULL) [13:13:42.263] } [13:13:42.263] base::close(...future.stdout) [13:13:42.263] ...future.stdout <- NULL [13:13:42.263] } [13:13:42.263] ...future.result$conditions <- ...future.conditions [13:13:42.263] ...future.result$finished <- base::Sys.time() [13:13:42.263] ...future.result [13:13:42.263] } [13:13:42.267] assign_globals() ... [13:13:42.267] List of 6 [13:13:42.267] $ ...future.FUN :function (z) [13:13:42.267] $ a : num 3.14 [13:13:42.267] $ future.call.arguments : list() [13:13:42.267] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:42.267] $ ...future.elements_ii :List of 10000 [13:13:42.267] ..$ : int 1 [13:13:42.267] ..$ : int 2 [13:13:42.267] ..$ : int 3 [13:13:42.267] ..$ : int 4 [13:13:42.267] ..$ : int 5 [13:13:42.267] ..$ : int 6 [13:13:42.267] ..$ : int 7 [13:13:42.267] ..$ : int 8 [13:13:42.267] ..$ : int 9 [13:13:42.267] ..$ : int 10 [13:13:42.267] ..$ : int 11 [13:13:42.267] ..$ : int 12 [13:13:42.267] ..$ : int 13 [13:13:42.267] ..$ : int 14 [13:13:42.267] ..$ : int 15 [13:13:42.267] ..$ : int 16 [13:13:42.267] ..$ : int 17 [13:13:42.267] ..$ : int 18 [13:13:42.267] ..$ : int 19 [13:13:42.267] ..$ : int 20 [13:13:42.267] ..$ : int 21 [13:13:42.267] ..$ : int 22 [13:13:42.267] ..$ : int 23 [13:13:42.267] ..$ : int 24 [13:13:42.267] ..$ : int 25 [13:13:42.267] ..$ : int 26 [13:13:42.267] ..$ : int 27 [13:13:42.267] ..$ : int 28 [13:13:42.267] ..$ : int 29 [13:13:42.267] ..$ : int 30 [13:13:42.267] ..$ : int 31 [13:13:42.267] ..$ : int 32 [13:13:42.267] ..$ : int 33 [13:13:42.267] ..$ : int 34 [13:13:42.267] ..$ : int 35 [13:13:42.267] ..$ : int 36 [13:13:42.267] ..$ : int 37 [13:13:42.267] ..$ : int 38 [13:13:42.267] ..$ : int 39 [13:13:42.267] ..$ : int 40 [13:13:42.267] ..$ : int 41 [13:13:42.267] ..$ : int 42 [13:13:42.267] ..$ : int 43 [13:13:42.267] ..$ : int 44 [13:13:42.267] ..$ : int 45 [13:13:42.267] ..$ : int 46 [13:13:42.267] ..$ : int 47 [13:13:42.267] ..$ : int 48 [13:13:42.267] ..$ : int 49 [13:13:42.267] ..$ : int 50 [13:13:42.267] ..$ : int 51 [13:13:42.267] ..$ : int 52 [13:13:42.267] ..$ : int 53 [13:13:42.267] ..$ : int 54 [13:13:42.267] ..$ : int 55 [13:13:42.267] ..$ : int 56 [13:13:42.267] ..$ : int 57 [13:13:42.267] ..$ : int 58 [13:13:42.267] ..$ : int 59 [13:13:42.267] ..$ : int 60 [13:13:42.267] ..$ : int 61 [13:13:42.267] ..$ : int 62 [13:13:42.267] ..$ : int 63 [13:13:42.267] ..$ : int 64 [13:13:42.267] ..$ : int 65 [13:13:42.267] ..$ : int 66 [13:13:42.267] ..$ : int 67 [13:13:42.267] ..$ : int 68 [13:13:42.267] ..$ : int 69 [13:13:42.267] ..$ : int 70 [13:13:42.267] ..$ : int 71 [13:13:42.267] ..$ : int 72 [13:13:42.267] ..$ : int 73 [13:13:42.267] ..$ : int 74 [13:13:42.267] ..$ : int 75 [13:13:42.267] ..$ : int 76 [13:13:42.267] ..$ : int 77 [13:13:42.267] ..$ : int 78 [13:13:42.267] ..$ : int 79 [13:13:42.267] ..$ : int 80 [13:13:42.267] ..$ : int 81 [13:13:42.267] ..$ : int 82 [13:13:42.267] ..$ : int 83 [13:13:42.267] ..$ : int 84 [13:13:42.267] ..$ : int 85 [13:13:42.267] ..$ : int 86 [13:13:42.267] ..$ : int 87 [13:13:42.267] ..$ : int 88 [13:13:42.267] ..$ : int 89 [13:13:42.267] ..$ : int 90 [13:13:42.267] ..$ : int 91 [13:13:42.267] ..$ : int 92 [13:13:42.267] ..$ : int 93 [13:13:42.267] ..$ : int 94 [13:13:42.267] ..$ : int 95 [13:13:42.267] ..$ : int 96 [13:13:42.267] ..$ : int 97 [13:13:42.267] ..$ : int 98 [13:13:42.267] ..$ : int 99 [13:13:42.267] .. [list output truncated] [13:13:42.267] $ ...future.seeds_ii : NULL [13:13:42.267] $ ...future.globals.maxSize: NULL [13:13:42.267] - attr(*, "where")=List of 6 [13:13:42.267] ..$ ...future.FUN : [13:13:42.267] ..$ a : [13:13:42.267] ..$ future.call.arguments : [13:13:42.267] ..$ ...future.elements_ii : [13:13:42.267] ..$ ...future.seeds_ii : [13:13:42.267] ..$ ...future.globals.maxSize: [13:13:42.267] - attr(*, "resolved")= logi FALSE [13:13:42.267] - attr(*, "total_size")= num 1976 [13:13:42.267] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:42.267] - attr(*, "already-done")= logi TRUE [13:13:42.312] - reassign environment for '...future.FUN' [13:13:42.312] - copied '...future.FUN' to environment [13:13:42.312] - copied 'a' to environment [13:13:42.312] - copied 'future.call.arguments' to environment [13:13:42.312] - copied '...future.elements_ii' to environment [13:13:42.312] - copied '...future.seeds_ii' to environment [13:13:42.312] - copied '...future.globals.maxSize' to environment [13:13:42.313] assign_globals() ... done [13:13:42.315] plan(): Setting new future strategy stack: [13:13:42.315] List of future strategies: [13:13:42.315] 1. sequential: [13:13:42.315] - args: function (..., envir = parent.frame(), workers = "") [13:13:42.315] - tweaked: FALSE [13:13:42.315] - call: NULL [13:13:42.316] plan(): nbrOfWorkers() = 1 [13:13:42.334] plan(): Setting new future strategy stack: [13:13:42.334] List of future strategies: [13:13:42.334] 1. multisession: [13:13:42.334] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [13:13:42.334] - tweaked: FALSE [13:13:42.334] - call: plan(strategy) [13:13:42.337] plan(): nbrOfWorkers() = 1 [13:13:42.337] SequentialFuture started (and completed) [13:13:42.337] - Launch lazy future ... done [13:13:42.337] run() for 'SequentialFuture' ... done [13:13:42.338] Created future: [13:13:42.338] SequentialFuture: [13:13:42.338] Label: 'future_lapply-1' [13:13:42.338] Expression: [13:13:42.338] { [13:13:42.338] do.call(function(...) { [13:13:42.338] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:42.338] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:42.338] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:42.338] on.exit(options(oopts), add = TRUE) [13:13:42.338] } [13:13:42.338] { [13:13:42.338] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:42.338] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:42.338] ...future.FUN(...future.X_jj, ...) [13:13:42.338] }) [13:13:42.338] } [13:13:42.338] }, args = future.call.arguments) [13:13:42.338] } [13:13:42.338] Lazy evaluation: FALSE [13:13:42.338] Asynchronous evaluation: FALSE [13:13:42.338] Local evaluation: TRUE [13:13:42.338] Environment: R_GlobalEnv [13:13:42.338] Capture standard output: TRUE [13:13:42.338] Capture condition classes: 'condition' (excluding 'nothing') [13:13:42.338] 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, ...) [13:13:42.338] Packages: [13:13:42.338] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:42.338] Resolved: TRUE [13:13:42.338] Value: 546.88 KiB of class 'list' [13:13:42.338] Early signaling: FALSE [13:13:42.338] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:42.338] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:42.448] Chunk #1 of 1 ... DONE [13:13:42.448] Launching 1 futures (chunks) ... DONE [13:13:42.448] Resolving 1 futures (chunks) ... [13:13:42.448] resolve() on list ... [13:13:42.448] recursive: 0 [13:13:42.448] length: 1 [13:13:42.449] [13:13:42.449] resolved() for 'SequentialFuture' ... [13:13:42.449] - state: 'finished' [13:13:42.449] - run: TRUE [13:13:42.449] - result: 'FutureResult' [13:13:42.449] resolved() for 'SequentialFuture' ... done [13:13:42.449] Future #1 [13:13:42.450] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:42.450] - nx: 1 [13:13:42.450] - relay: TRUE [13:13:42.450] - stdout: TRUE [13:13:42.450] - signal: TRUE [13:13:42.450] - resignal: FALSE [13:13:42.450] - force: TRUE [13:13:42.450] - relayed: [n=1] FALSE [13:13:42.451] - queued futures: [n=1] FALSE [13:13:42.451] - until=1 [13:13:42.451] - relaying element #1 [13:13:42.451] - relayed: [n=1] TRUE [13:13:42.451] - queued futures: [n=1] TRUE [13:13:42.451] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:42.452] length: 0 (resolved future 1) [13:13:42.452] Relaying remaining futures [13:13:42.452] signalConditionsASAP(NULL, pos=0) ... [13:13:42.452] - nx: 1 [13:13:42.452] - relay: TRUE [13:13:42.452] - stdout: TRUE [13:13:42.452] - signal: TRUE [13:13:42.452] - resignal: FALSE [13:13:42.452] - force: TRUE [13:13:42.453] - relayed: [n=1] TRUE [13:13:42.453] - queued futures: [n=1] TRUE - flush all [13:13:42.453] - relayed: [n=1] TRUE [13:13:42.453] - queued futures: [n=1] TRUE [13:13:42.453] signalConditionsASAP(NULL, pos=0) ... done [13:13:42.453] resolve() on list ... DONE [13:13:42.454] - Number of value chunks collected: 1 [13:13:42.454] Resolving 1 futures (chunks) ... DONE [13:13:42.454] Reducing values from 1 chunks ... [13:13:42.454] - Number of values collected after concatenation: 10000 [13:13:42.454] - Number of values expected: 10000 [13:13:42.454] Reducing values from 1 chunks ... DONE [13:13:42.455] future_lapply() ... DONE - future_lapply(x, FUN = table, ...) ... [13:13:42.455] future_lapply() ... [13:13:42.494] Number of chunks: 1 [13:13:42.494] getGlobalsAndPackagesXApply() ... [13:13:42.495] - future.globals: TRUE [13:13:42.495] getGlobalsAndPackages() ... [13:13:42.495] Searching for globals... [13:13:42.531] - 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<-' [13:13:42.532] Searching for globals ... DONE [13:13:42.532] Resolving globals: FALSE [13:13:42.533] The total size of the 1 globals is 345.92 KiB (354224 bytes) [13:13:42.534] 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') [13:13:42.534] - globals: [1] 'FUN' [13:13:42.534] [13:13:42.534] getGlobalsAndPackages() ... DONE [13:13:42.534] - globals found/used: [n=1] 'FUN' [13:13:42.534] - needed namespaces: [n=0] [13:13:42.534] Finding globals ... DONE [13:13:42.535] - use_args: TRUE [13:13:42.535] - Getting '...' globals ... [13:13:42.535] resolve() on list ... [13:13:42.535] recursive: 0 [13:13:42.535] length: 1 [13:13:42.535] elements: '...' [13:13:42.536] length: 0 (resolved future 1) [13:13:42.536] resolve() on list ... DONE [13:13:42.536] - '...' content: [n=0] [13:13:42.536] List of 1 [13:13:42.536] $ ...: list() [13:13:42.536] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:42.536] - attr(*, "where")=List of 1 [13:13:42.536] ..$ ...: [13:13:42.536] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:42.536] - attr(*, "resolved")= logi TRUE [13:13:42.536] - attr(*, "total_size")= num NA [13:13:42.539] - Getting '...' globals ... DONE [13:13:42.539] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:42.539] List of 2 [13:13:42.539] $ ...future.FUN:function (..., exclude = if (useNA == "no") c(NA, NaN), useNA = c("no", [13:13:42.539] "ifany", "always"), dnn = list.names(...), deparse.level = 1) [13:13:42.539] $ ... : list() [13:13:42.539] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:42.539] - attr(*, "where")=List of 2 [13:13:42.539] ..$ ...future.FUN: [13:13:42.539] ..$ ... : [13:13:42.539] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:42.539] - attr(*, "resolved")= logi FALSE [13:13:42.539] - attr(*, "total_size")= num 354224 [13:13:42.542] Packages to be attached in all futures: [n=0] [13:13:42.543] getGlobalsAndPackagesXApply() ... DONE [13:13:42.543] Number of futures (= number of chunks): 1 [13:13:42.543] Launching 1 futures (chunks) ... [13:13:42.543] Chunk #1 of 1 ... [13:13:42.543] - Finding globals in 'X' for chunk #1 ... [13:13:42.543] getGlobalsAndPackages() ... [13:13:42.543] Searching for globals... [13:13:42.544] [13:13:42.544] Searching for globals ... DONE [13:13:42.544] - globals: [0] [13:13:42.544] getGlobalsAndPackages() ... DONE [13:13:42.544] + additional globals found: [n=0] [13:13:42.544] + additional namespaces needed: [n=0] [13:13:42.544] - Finding globals in 'X' for chunk #1 ... DONE [13:13:42.545] - seeds: [13:13:42.545] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:42.545] getGlobalsAndPackages() ... [13:13:42.545] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:42.545] Resolving globals: FALSE [13:13:42.545] Tweak future expression to call with '...' arguments ... [13:13:42.545] { [13:13:42.545] do.call(function(...) { [13:13:42.545] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:42.545] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:42.545] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:42.545] on.exit(options(oopts), add = TRUE) [13:13:42.545] } [13:13:42.545] { [13:13:42.545] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:42.545] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:42.545] ...future.FUN(...future.X_jj, ...) [13:13:42.545] }) [13:13:42.545] } [13:13:42.545] }, args = future.call.arguments) [13:13:42.545] } [13:13:42.546] Tweak future expression to call with '...' arguments ... DONE [13:13:42.546] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:42.546] [13:13:42.546] getGlobalsAndPackages() ... DONE [13:13:42.547] run() for 'Future' ... [13:13:42.547] - state: 'created' [13:13:42.547] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:42.549] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:42.549] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:42.549] - Field: 'label' [13:13:42.549] - Field: 'local' [13:13:42.549] - Field: 'owner' [13:13:42.549] - Field: 'envir' [13:13:42.550] - Field: 'packages' [13:13:42.550] - Field: 'gc' [13:13:42.550] - Field: 'conditions' [13:13:42.550] - Field: 'expr' [13:13:42.550] - Field: 'uuid' [13:13:42.550] - Field: 'seed' [13:13:42.550] - Field: 'version' [13:13:42.551] - Field: 'result' [13:13:42.551] - Field: 'asynchronous' [13:13:42.551] - Field: 'calls' [13:13:42.551] - Field: 'globals' [13:13:42.551] - Field: 'stdout' [13:13:42.551] - Field: 'earlySignal' [13:13:42.551] - Field: 'lazy' [13:13:42.551] - Field: 'state' [13:13:42.552] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:42.552] - Launch lazy future ... [13:13:42.552] Packages needed by the future expression (n = 0): [13:13:42.552] Packages needed by future strategies (n = 0): [13:13:42.552] { [13:13:42.552] { [13:13:42.552] { [13:13:42.552] ...future.startTime <- base::Sys.time() [13:13:42.552] { [13:13:42.552] { [13:13:42.552] { [13:13:42.552] base::local({ [13:13:42.552] has_future <- base::requireNamespace("future", [13:13:42.552] quietly = TRUE) [13:13:42.552] if (has_future) { [13:13:42.552] ns <- base::getNamespace("future") [13:13:42.552] version <- ns[[".package"]][["version"]] [13:13:42.552] if (is.null(version)) [13:13:42.552] version <- utils::packageVersion("future") [13:13:42.552] } [13:13:42.552] else { [13:13:42.552] version <- NULL [13:13:42.552] } [13:13:42.552] if (!has_future || version < "1.8.0") { [13:13:42.552] info <- base::c(r_version = base::gsub("R version ", [13:13:42.552] "", base::R.version$version.string), [13:13:42.552] platform = base::sprintf("%s (%s-bit)", [13:13:42.552] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:42.552] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:42.552] "release", "version")], collapse = " "), [13:13:42.552] hostname = base::Sys.info()[["nodename"]]) [13:13:42.552] info <- base::sprintf("%s: %s", base::names(info), [13:13:42.552] info) [13:13:42.552] info <- base::paste(info, collapse = "; ") [13:13:42.552] if (!has_future) { [13:13:42.552] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:42.552] info) [13:13:42.552] } [13:13:42.552] else { [13:13:42.552] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:42.552] info, version) [13:13:42.552] } [13:13:42.552] base::stop(msg) [13:13:42.552] } [13:13:42.552] }) [13:13:42.552] } [13:13:42.552] options(future.plan = NULL) [13:13:42.552] Sys.unsetenv("R_FUTURE_PLAN") [13:13:42.552] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:42.552] } [13:13:42.552] ...future.workdir <- getwd() [13:13:42.552] } [13:13:42.552] ...future.oldOptions <- base::as.list(base::.Options) [13:13:42.552] ...future.oldEnvVars <- base::Sys.getenv() [13:13:42.552] } [13:13:42.552] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:42.552] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:42.552] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:42.552] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:42.552] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:42.552] future.stdout.windows.reencode = NULL, width = 80L) [13:13:42.552] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:42.552] base::names(...future.oldOptions)) [13:13:42.552] } [13:13:42.552] if (FALSE) { [13:13:42.552] } [13:13:42.552] else { [13:13:42.552] if (TRUE) { [13:13:42.552] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:42.552] open = "w") [13:13:42.552] } [13:13:42.552] else { [13:13:42.552] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:42.552] windows = "NUL", "/dev/null"), open = "w") [13:13:42.552] } [13:13:42.552] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:42.552] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:42.552] base::sink(type = "output", split = FALSE) [13:13:42.552] base::close(...future.stdout) [13:13:42.552] }, add = TRUE) [13:13:42.552] } [13:13:42.552] ...future.frame <- base::sys.nframe() [13:13:42.552] ...future.conditions <- base::list() [13:13:42.552] ...future.rng <- base::globalenv()$.Random.seed [13:13:42.552] if (FALSE) { [13:13:42.552] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:42.552] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:42.552] } [13:13:42.552] ...future.result <- base::tryCatch({ [13:13:42.552] base::withCallingHandlers({ [13:13:42.552] ...future.value <- base::withVisible(base::local({ [13:13:42.552] do.call(function(...) { [13:13:42.552] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:42.552] if (!identical(...future.globals.maxSize.org, [13:13:42.552] ...future.globals.maxSize)) { [13:13:42.552] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:42.552] on.exit(options(oopts), add = TRUE) [13:13:42.552] } [13:13:42.552] { [13:13:42.552] lapply(seq_along(...future.elements_ii), [13:13:42.552] FUN = function(jj) { [13:13:42.552] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:42.552] ...future.FUN(...future.X_jj, ...) [13:13:42.552] }) [13:13:42.552] } [13:13:42.552] }, args = future.call.arguments) [13:13:42.552] })) [13:13:42.552] future::FutureResult(value = ...future.value$value, [13:13:42.552] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:42.552] ...future.rng), globalenv = if (FALSE) [13:13:42.552] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:42.552] ...future.globalenv.names)) [13:13:42.552] else NULL, started = ...future.startTime, version = "1.8") [13:13:42.552] }, condition = base::local({ [13:13:42.552] c <- base::c [13:13:42.552] inherits <- base::inherits [13:13:42.552] invokeRestart <- base::invokeRestart [13:13:42.552] length <- base::length [13:13:42.552] list <- base::list [13:13:42.552] seq.int <- base::seq.int [13:13:42.552] signalCondition <- base::signalCondition [13:13:42.552] sys.calls <- base::sys.calls [13:13:42.552] `[[` <- base::`[[` [13:13:42.552] `+` <- base::`+` [13:13:42.552] `<<-` <- base::`<<-` [13:13:42.552] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:42.552] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:42.552] 3L)] [13:13:42.552] } [13:13:42.552] function(cond) { [13:13:42.552] is_error <- inherits(cond, "error") [13:13:42.552] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:42.552] NULL) [13:13:42.552] if (is_error) { [13:13:42.552] sessionInformation <- function() { [13:13:42.552] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:42.552] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:42.552] search = base::search(), system = base::Sys.info()) [13:13:42.552] } [13:13:42.552] ...future.conditions[[length(...future.conditions) + [13:13:42.552] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:42.552] cond$call), session = sessionInformation(), [13:13:42.552] timestamp = base::Sys.time(), signaled = 0L) [13:13:42.552] signalCondition(cond) [13:13:42.552] } [13:13:42.552] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:42.552] "immediateCondition"))) { [13:13:42.552] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:42.552] ...future.conditions[[length(...future.conditions) + [13:13:42.552] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:42.552] if (TRUE && !signal) { [13:13:42.552] muffleCondition <- function (cond, pattern = "^muffle") [13:13:42.552] { [13:13:42.552] inherits <- base::inherits [13:13:42.552] invokeRestart <- base::invokeRestart [13:13:42.552] is.null <- base::is.null [13:13:42.552] muffled <- FALSE [13:13:42.552] if (inherits(cond, "message")) { [13:13:42.552] muffled <- grepl(pattern, "muffleMessage") [13:13:42.552] if (muffled) [13:13:42.552] invokeRestart("muffleMessage") [13:13:42.552] } [13:13:42.552] else if (inherits(cond, "warning")) { [13:13:42.552] muffled <- grepl(pattern, "muffleWarning") [13:13:42.552] if (muffled) [13:13:42.552] invokeRestart("muffleWarning") [13:13:42.552] } [13:13:42.552] else if (inherits(cond, "condition")) { [13:13:42.552] if (!is.null(pattern)) { [13:13:42.552] computeRestarts <- base::computeRestarts [13:13:42.552] grepl <- base::grepl [13:13:42.552] restarts <- computeRestarts(cond) [13:13:42.552] for (restart in restarts) { [13:13:42.552] name <- restart$name [13:13:42.552] if (is.null(name)) [13:13:42.552] next [13:13:42.552] if (!grepl(pattern, name)) [13:13:42.552] next [13:13:42.552] invokeRestart(restart) [13:13:42.552] muffled <- TRUE [13:13:42.552] break [13:13:42.552] } [13:13:42.552] } [13:13:42.552] } [13:13:42.552] invisible(muffled) [13:13:42.552] } [13:13:42.552] muffleCondition(cond, pattern = "^muffle") [13:13:42.552] } [13:13:42.552] } [13:13:42.552] else { [13:13:42.552] if (TRUE) { [13:13:42.552] muffleCondition <- function (cond, pattern = "^muffle") [13:13:42.552] { [13:13:42.552] inherits <- base::inherits [13:13:42.552] invokeRestart <- base::invokeRestart [13:13:42.552] is.null <- base::is.null [13:13:42.552] muffled <- FALSE [13:13:42.552] if (inherits(cond, "message")) { [13:13:42.552] muffled <- grepl(pattern, "muffleMessage") [13:13:42.552] if (muffled) [13:13:42.552] invokeRestart("muffleMessage") [13:13:42.552] } [13:13:42.552] else if (inherits(cond, "warning")) { [13:13:42.552] muffled <- grepl(pattern, "muffleWarning") [13:13:42.552] if (muffled) [13:13:42.552] invokeRestart("muffleWarning") [13:13:42.552] } [13:13:42.552] else if (inherits(cond, "condition")) { [13:13:42.552] if (!is.null(pattern)) { [13:13:42.552] computeRestarts <- base::computeRestarts [13:13:42.552] grepl <- base::grepl [13:13:42.552] restarts <- computeRestarts(cond) [13:13:42.552] for (restart in restarts) { [13:13:42.552] name <- restart$name [13:13:42.552] if (is.null(name)) [13:13:42.552] next [13:13:42.552] if (!grepl(pattern, name)) [13:13:42.552] next [13:13:42.552] invokeRestart(restart) [13:13:42.552] muffled <- TRUE [13:13:42.552] break [13:13:42.552] } [13:13:42.552] } [13:13:42.552] } [13:13:42.552] invisible(muffled) [13:13:42.552] } [13:13:42.552] muffleCondition(cond, pattern = "^muffle") [13:13:42.552] } [13:13:42.552] } [13:13:42.552] } [13:13:42.552] })) [13:13:42.552] }, error = function(ex) { [13:13:42.552] base::structure(base::list(value = NULL, visible = NULL, [13:13:42.552] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:42.552] ...future.rng), started = ...future.startTime, [13:13:42.552] finished = Sys.time(), session_uuid = NA_character_, [13:13:42.552] version = "1.8"), class = "FutureResult") [13:13:42.552] }, finally = { [13:13:42.552] if (!identical(...future.workdir, getwd())) [13:13:42.552] setwd(...future.workdir) [13:13:42.552] { [13:13:42.552] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:42.552] ...future.oldOptions$nwarnings <- NULL [13:13:42.552] } [13:13:42.552] base::options(...future.oldOptions) [13:13:42.552] if (.Platform$OS.type == "windows") { [13:13:42.552] old_names <- names(...future.oldEnvVars) [13:13:42.552] envs <- base::Sys.getenv() [13:13:42.552] names <- names(envs) [13:13:42.552] common <- intersect(names, old_names) [13:13:42.552] added <- setdiff(names, old_names) [13:13:42.552] removed <- setdiff(old_names, names) [13:13:42.552] changed <- common[...future.oldEnvVars[common] != [13:13:42.552] envs[common]] [13:13:42.552] NAMES <- toupper(changed) [13:13:42.552] args <- list() [13:13:42.552] for (kk in seq_along(NAMES)) { [13:13:42.552] name <- changed[[kk]] [13:13:42.552] NAME <- NAMES[[kk]] [13:13:42.552] if (name != NAME && is.element(NAME, old_names)) [13:13:42.552] next [13:13:42.552] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:42.552] } [13:13:42.552] NAMES <- toupper(added) [13:13:42.552] for (kk in seq_along(NAMES)) { [13:13:42.552] name <- added[[kk]] [13:13:42.552] NAME <- NAMES[[kk]] [13:13:42.552] if (name != NAME && is.element(NAME, old_names)) [13:13:42.552] next [13:13:42.552] args[[name]] <- "" [13:13:42.552] } [13:13:42.552] NAMES <- toupper(removed) [13:13:42.552] for (kk in seq_along(NAMES)) { [13:13:42.552] name <- removed[[kk]] [13:13:42.552] NAME <- NAMES[[kk]] [13:13:42.552] if (name != NAME && is.element(NAME, old_names)) [13:13:42.552] next [13:13:42.552] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:42.552] } [13:13:42.552] if (length(args) > 0) [13:13:42.552] base::do.call(base::Sys.setenv, args = args) [13:13:42.552] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:42.552] } [13:13:42.552] else { [13:13:42.552] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:42.552] } [13:13:42.552] { [13:13:42.552] if (base::length(...future.futureOptionsAdded) > [13:13:42.552] 0L) { [13:13:42.552] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:42.552] base::names(opts) <- ...future.futureOptionsAdded [13:13:42.552] base::options(opts) [13:13:42.552] } [13:13:42.552] { [13:13:42.552] { [13:13:42.552] NULL [13:13:42.552] RNGkind("Mersenne-Twister") [13:13:42.552] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:42.552] inherits = FALSE) [13:13:42.552] } [13:13:42.552] options(future.plan = NULL) [13:13:42.552] if (is.na(NA_character_)) [13:13:42.552] Sys.unsetenv("R_FUTURE_PLAN") [13:13:42.552] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:42.552] future::plan(list(function (..., workers = availableCores(), [13:13:42.552] lazy = FALSE, rscript_libs = .libPaths(), [13:13:42.552] envir = parent.frame()) [13:13:42.552] { [13:13:42.552] if (is.function(workers)) [13:13:42.552] workers <- workers() [13:13:42.552] workers <- structure(as.integer(workers), [13:13:42.552] class = class(workers)) [13:13:42.552] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:42.552] workers >= 1) [13:13:42.552] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:42.552] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:42.552] } [13:13:42.552] future <- MultisessionFuture(..., workers = workers, [13:13:42.552] lazy = lazy, rscript_libs = rscript_libs, [13:13:42.552] envir = envir) [13:13:42.552] if (!future$lazy) [13:13:42.552] future <- run(future) [13:13:42.552] invisible(future) [13:13:42.552] }), .cleanup = FALSE, .init = FALSE) [13:13:42.552] } [13:13:42.552] } [13:13:42.552] } [13:13:42.552] }) [13:13:42.552] if (TRUE) { [13:13:42.552] base::sink(type = "output", split = FALSE) [13:13:42.552] if (TRUE) { [13:13:42.552] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:42.552] } [13:13:42.552] else { [13:13:42.552] ...future.result["stdout"] <- base::list(NULL) [13:13:42.552] } [13:13:42.552] base::close(...future.stdout) [13:13:42.552] ...future.stdout <- NULL [13:13:42.552] } [13:13:42.552] ...future.result$conditions <- ...future.conditions [13:13:42.552] ...future.result$finished <- base::Sys.time() [13:13:42.552] ...future.result [13:13:42.552] } [13:13:42.556] assign_globals() ... [13:13:42.556] List of 5 [13:13:42.556] $ ...future.FUN :function (..., exclude = if (useNA == "no") c(NA, NaN), useNA = c("no", [13:13:42.556] "ifany", "always"), dnn = list.names(...), deparse.level = 1) [13:13:42.556] $ future.call.arguments : list() [13:13:42.556] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:42.556] $ ...future.elements_ii :List of 2 [13:13:42.556] ..$ a: int [1:4] 1 2 3 4 [13:13:42.556] ..$ b: int [1:4] 5 6 7 8 [13:13:42.556] $ ...future.seeds_ii : NULL [13:13:42.556] $ ...future.globals.maxSize: NULL [13:13:42.556] - attr(*, "where")=List of 5 [13:13:42.556] ..$ ...future.FUN : [13:13:42.556] ..$ future.call.arguments : [13:13:42.556] ..$ ...future.elements_ii : [13:13:42.556] ..$ ...future.seeds_ii : [13:13:42.556] ..$ ...future.globals.maxSize: [13:13:42.556] - attr(*, "resolved")= logi FALSE [13:13:42.556] - attr(*, "total_size")= num 354224 [13:13:42.556] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:42.556] - attr(*, "already-done")= logi TRUE [13:13:42.560] - copied '...future.FUN' to environment [13:13:42.560] - copied 'future.call.arguments' to environment [13:13:42.560] - copied '...future.elements_ii' to environment [13:13:42.561] - copied '...future.seeds_ii' to environment [13:13:42.561] - copied '...future.globals.maxSize' to environment [13:13:42.561] assign_globals() ... done [13:13:42.561] plan(): Setting new future strategy stack: [13:13:42.561] List of future strategies: [13:13:42.561] 1. sequential: [13:13:42.561] - args: function (..., envir = parent.frame(), workers = "") [13:13:42.561] - tweaked: FALSE [13:13:42.561] - call: NULL [13:13:42.562] plan(): nbrOfWorkers() = 1 [13:13:42.563] plan(): Setting new future strategy stack: [13:13:42.563] List of future strategies: [13:13:42.563] 1. multisession: [13:13:42.563] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [13:13:42.563] - tweaked: FALSE [13:13:42.563] - call: plan(strategy) [13:13:42.565] plan(): nbrOfWorkers() = 1 [13:13:42.565] SequentialFuture started (and completed) [13:13:42.565] - Launch lazy future ... done [13:13:42.565] run() for 'SequentialFuture' ... done [13:13:42.565] Created future: [13:13:42.565] SequentialFuture: [13:13:42.565] Label: 'future_lapply-1' [13:13:42.565] Expression: [13:13:42.565] { [13:13:42.565] do.call(function(...) { [13:13:42.565] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:42.565] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:42.565] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:42.565] on.exit(options(oopts), add = TRUE) [13:13:42.565] } [13:13:42.565] { [13:13:42.565] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:42.565] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:42.565] ...future.FUN(...future.X_jj, ...) [13:13:42.565] }) [13:13:42.565] } [13:13:42.565] }, args = future.call.arguments) [13:13:42.565] } [13:13:42.565] Lazy evaluation: FALSE [13:13:42.565] Asynchronous evaluation: FALSE [13:13:42.565] Local evaluation: TRUE [13:13:42.565] Environment: R_GlobalEnv [13:13:42.565] Capture standard output: TRUE [13:13:42.565] Capture condition classes: 'condition' (excluding 'nothing') [13:13:42.565] 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) [13:13:42.565] Packages: [13:13:42.565] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:42.565] Resolved: TRUE [13:13:42.565] Value: 2.27 KiB of class 'list' [13:13:42.565] Early signaling: FALSE [13:13:42.565] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:42.565] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:42.567] Chunk #1 of 1 ... DONE [13:13:42.567] Launching 1 futures (chunks) ... DONE [13:13:42.567] Resolving 1 futures (chunks) ... [13:13:42.567] resolve() on list ... [13:13:42.567] recursive: 0 [13:13:42.567] length: 1 [13:13:42.567] [13:13:42.567] resolved() for 'SequentialFuture' ... [13:13:42.568] - state: 'finished' [13:13:42.568] - run: TRUE [13:13:42.568] - result: 'FutureResult' [13:13:42.568] resolved() for 'SequentialFuture' ... done [13:13:42.568] Future #1 [13:13:42.568] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:42.568] - nx: 1 [13:13:42.568] - relay: TRUE [13:13:42.569] - stdout: TRUE [13:13:42.569] - signal: TRUE [13:13:42.569] - resignal: FALSE [13:13:42.569] - force: TRUE [13:13:42.569] - relayed: [n=1] FALSE [13:13:42.569] - queued futures: [n=1] FALSE [13:13:42.569] - until=1 [13:13:42.569] - relaying element #1 [13:13:42.570] - relayed: [n=1] TRUE [13:13:42.570] - queued futures: [n=1] TRUE [13:13:42.570] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:42.570] length: 0 (resolved future 1) [13:13:42.570] Relaying remaining futures [13:13:42.570] signalConditionsASAP(NULL, pos=0) ... [13:13:42.570] - nx: 1 [13:13:42.571] - relay: TRUE [13:13:42.571] - stdout: TRUE [13:13:42.571] - signal: TRUE [13:13:42.571] - resignal: FALSE [13:13:42.571] - force: TRUE [13:13:42.571] - relayed: [n=1] TRUE [13:13:42.571] - queued futures: [n=1] TRUE - flush all [13:13:42.571] - relayed: [n=1] TRUE [13:13:42.571] - queued futures: [n=1] TRUE [13:13:42.572] signalConditionsASAP(NULL, pos=0) ... done [13:13:42.572] resolve() on list ... DONE [13:13:42.572] - Number of value chunks collected: 1 [13:13:42.572] Resolving 1 futures (chunks) ... DONE [13:13:42.572] Reducing values from 1 chunks ... [13:13:42.572] - Number of values collected after concatenation: 2 [13:13:42.572] - Number of values expected: 2 [13:13:42.573] Reducing values from 1 chunks ... DONE [13:13:42.573] future_lapply() ... DONE - future_lapply(x, ...) where length(x) != length(as.list(x)) ... [13:13:42.573] future_lapply() ... [13:13:42.575] Number of chunks: 1 [13:13:42.575] getGlobalsAndPackagesXApply() ... [13:13:42.575] - future.globals: TRUE [13:13:42.575] getGlobalsAndPackages() ... [13:13:42.575] Searching for globals... [13:13:42.576] - globals found: [1] 'FUN' [13:13:42.576] Searching for globals ... DONE [13:13:42.576] Resolving globals: FALSE [13:13:42.576] The total size of the 1 globals is 56 bytes (56 bytes) [13:13:42.577] 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') [13:13:42.577] - globals: [1] 'FUN' [13:13:42.577] [13:13:42.577] getGlobalsAndPackages() ... DONE [13:13:42.577] - globals found/used: [n=1] 'FUN' [13:13:42.577] - needed namespaces: [n=0] [13:13:42.577] Finding globals ... DONE [13:13:42.577] - use_args: TRUE [13:13:42.578] - Getting '...' globals ... [13:13:42.578] resolve() on list ... [13:13:42.578] recursive: 0 [13:13:42.578] length: 1 [13:13:42.578] elements: '...' [13:13:42.578] length: 0 (resolved future 1) [13:13:42.578] resolve() on list ... DONE [13:13:42.579] - '...' content: [n=0] [13:13:42.579] List of 1 [13:13:42.579] $ ...: list() [13:13:42.579] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:42.579] - attr(*, "where")=List of 1 [13:13:42.579] ..$ ...: [13:13:42.579] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:42.579] - attr(*, "resolved")= logi TRUE [13:13:42.579] - attr(*, "total_size")= num NA [13:13:42.581] - Getting '...' globals ... DONE [13:13:42.581] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:42.581] List of 2 [13:13:42.581] $ ...future.FUN:function (x) [13:13:42.581] $ ... : list() [13:13:42.581] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:42.581] - attr(*, "where")=List of 2 [13:13:42.581] ..$ ...future.FUN: [13:13:42.581] ..$ ... : [13:13:42.581] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:42.581] - attr(*, "resolved")= logi FALSE [13:13:42.581] - attr(*, "total_size")= num 56 [13:13:42.584] Packages to be attached in all futures: [n=0] [13:13:42.584] getGlobalsAndPackagesXApply() ... DONE [13:13:42.584] Number of futures (= number of chunks): 1 [13:13:42.584] Launching 1 futures (chunks) ... [13:13:42.584] Chunk #1 of 1 ... [13:13:42.584] - Finding globals in 'X' for chunk #1 ... [13:13:42.585] getGlobalsAndPackages() ... [13:13:42.585] Searching for globals... [13:13:42.585] [13:13:42.585] Searching for globals ... DONE [13:13:42.585] - globals: [0] [13:13:42.585] getGlobalsAndPackages() ... DONE [13:13:42.585] + additional globals found: [n=0] [13:13:42.586] + additional namespaces needed: [n=0] [13:13:42.586] - Finding globals in 'X' for chunk #1 ... DONE [13:13:42.586] - seeds: [13:13:42.586] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:42.586] getGlobalsAndPackages() ... [13:13:42.586] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:42.586] Resolving globals: FALSE [13:13:42.586] Tweak future expression to call with '...' arguments ... [13:13:42.587] { [13:13:42.587] do.call(function(...) { [13:13:42.587] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:42.587] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:42.587] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:42.587] on.exit(options(oopts), add = TRUE) [13:13:42.587] } [13:13:42.587] { [13:13:42.587] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:42.587] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:42.587] ...future.FUN(...future.X_jj, ...) [13:13:42.587] }) [13:13:42.587] } [13:13:42.587] }, args = future.call.arguments) [13:13:42.587] } [13:13:42.587] Tweak future expression to call with '...' arguments ... DONE [13:13:42.587] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:42.588] [13:13:42.588] getGlobalsAndPackages() ... DONE [13:13:42.588] run() for 'Future' ... [13:13:42.588] - state: 'created' [13:13:42.588] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:42.590] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:42.590] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:42.590] - Field: 'label' [13:13:42.590] - Field: 'local' [13:13:42.590] - Field: 'owner' [13:13:42.591] - Field: 'envir' [13:13:42.591] - Field: 'packages' [13:13:42.591] - Field: 'gc' [13:13:42.591] - Field: 'conditions' [13:13:42.591] - Field: 'expr' [13:13:42.591] - Field: 'uuid' [13:13:42.591] - Field: 'seed' [13:13:42.591] - Field: 'version' [13:13:42.592] - Field: 'result' [13:13:42.592] - Field: 'asynchronous' [13:13:42.592] - Field: 'calls' [13:13:42.592] - Field: 'globals' [13:13:42.592] - Field: 'stdout' [13:13:42.592] - Field: 'earlySignal' [13:13:42.592] - Field: 'lazy' [13:13:42.593] - Field: 'state' [13:13:42.593] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:42.593] - Launch lazy future ... [13:13:42.593] Packages needed by the future expression (n = 0): [13:13:42.593] Packages needed by future strategies (n = 0): [13:13:42.594] { [13:13:42.594] { [13:13:42.594] { [13:13:42.594] ...future.startTime <- base::Sys.time() [13:13:42.594] { [13:13:42.594] { [13:13:42.594] { [13:13:42.594] base::local({ [13:13:42.594] has_future <- base::requireNamespace("future", [13:13:42.594] quietly = TRUE) [13:13:42.594] if (has_future) { [13:13:42.594] ns <- base::getNamespace("future") [13:13:42.594] version <- ns[[".package"]][["version"]] [13:13:42.594] if (is.null(version)) [13:13:42.594] version <- utils::packageVersion("future") [13:13:42.594] } [13:13:42.594] else { [13:13:42.594] version <- NULL [13:13:42.594] } [13:13:42.594] if (!has_future || version < "1.8.0") { [13:13:42.594] info <- base::c(r_version = base::gsub("R version ", [13:13:42.594] "", base::R.version$version.string), [13:13:42.594] platform = base::sprintf("%s (%s-bit)", [13:13:42.594] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:42.594] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:42.594] "release", "version")], collapse = " "), [13:13:42.594] hostname = base::Sys.info()[["nodename"]]) [13:13:42.594] info <- base::sprintf("%s: %s", base::names(info), [13:13:42.594] info) [13:13:42.594] info <- base::paste(info, collapse = "; ") [13:13:42.594] if (!has_future) { [13:13:42.594] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:42.594] info) [13:13:42.594] } [13:13:42.594] else { [13:13:42.594] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:42.594] info, version) [13:13:42.594] } [13:13:42.594] base::stop(msg) [13:13:42.594] } [13:13:42.594] }) [13:13:42.594] } [13:13:42.594] options(future.plan = NULL) [13:13:42.594] Sys.unsetenv("R_FUTURE_PLAN") [13:13:42.594] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:42.594] } [13:13:42.594] ...future.workdir <- getwd() [13:13:42.594] } [13:13:42.594] ...future.oldOptions <- base::as.list(base::.Options) [13:13:42.594] ...future.oldEnvVars <- base::Sys.getenv() [13:13:42.594] } [13:13:42.594] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:42.594] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:42.594] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:42.594] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:42.594] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:42.594] future.stdout.windows.reencode = NULL, width = 80L) [13:13:42.594] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:42.594] base::names(...future.oldOptions)) [13:13:42.594] } [13:13:42.594] if (FALSE) { [13:13:42.594] } [13:13:42.594] else { [13:13:42.594] if (TRUE) { [13:13:42.594] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:42.594] open = "w") [13:13:42.594] } [13:13:42.594] else { [13:13:42.594] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:42.594] windows = "NUL", "/dev/null"), open = "w") [13:13:42.594] } [13:13:42.594] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:42.594] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:42.594] base::sink(type = "output", split = FALSE) [13:13:42.594] base::close(...future.stdout) [13:13:42.594] }, add = TRUE) [13:13:42.594] } [13:13:42.594] ...future.frame <- base::sys.nframe() [13:13:42.594] ...future.conditions <- base::list() [13:13:42.594] ...future.rng <- base::globalenv()$.Random.seed [13:13:42.594] if (FALSE) { [13:13:42.594] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:42.594] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:42.594] } [13:13:42.594] ...future.result <- base::tryCatch({ [13:13:42.594] base::withCallingHandlers({ [13:13:42.594] ...future.value <- base::withVisible(base::local({ [13:13:42.594] do.call(function(...) { [13:13:42.594] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:42.594] if (!identical(...future.globals.maxSize.org, [13:13:42.594] ...future.globals.maxSize)) { [13:13:42.594] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:42.594] on.exit(options(oopts), add = TRUE) [13:13:42.594] } [13:13:42.594] { [13:13:42.594] lapply(seq_along(...future.elements_ii), [13:13:42.594] FUN = function(jj) { [13:13:42.594] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:42.594] ...future.FUN(...future.X_jj, ...) [13:13:42.594] }) [13:13:42.594] } [13:13:42.594] }, args = future.call.arguments) [13:13:42.594] })) [13:13:42.594] future::FutureResult(value = ...future.value$value, [13:13:42.594] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:42.594] ...future.rng), globalenv = if (FALSE) [13:13:42.594] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:42.594] ...future.globalenv.names)) [13:13:42.594] else NULL, started = ...future.startTime, version = "1.8") [13:13:42.594] }, condition = base::local({ [13:13:42.594] c <- base::c [13:13:42.594] inherits <- base::inherits [13:13:42.594] invokeRestart <- base::invokeRestart [13:13:42.594] length <- base::length [13:13:42.594] list <- base::list [13:13:42.594] seq.int <- base::seq.int [13:13:42.594] signalCondition <- base::signalCondition [13:13:42.594] sys.calls <- base::sys.calls [13:13:42.594] `[[` <- base::`[[` [13:13:42.594] `+` <- base::`+` [13:13:42.594] `<<-` <- base::`<<-` [13:13:42.594] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:42.594] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:42.594] 3L)] [13:13:42.594] } [13:13:42.594] function(cond) { [13:13:42.594] is_error <- inherits(cond, "error") [13:13:42.594] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:42.594] NULL) [13:13:42.594] if (is_error) { [13:13:42.594] sessionInformation <- function() { [13:13:42.594] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:42.594] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:42.594] search = base::search(), system = base::Sys.info()) [13:13:42.594] } [13:13:42.594] ...future.conditions[[length(...future.conditions) + [13:13:42.594] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:42.594] cond$call), session = sessionInformation(), [13:13:42.594] timestamp = base::Sys.time(), signaled = 0L) [13:13:42.594] signalCondition(cond) [13:13:42.594] } [13:13:42.594] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:42.594] "immediateCondition"))) { [13:13:42.594] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:42.594] ...future.conditions[[length(...future.conditions) + [13:13:42.594] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:42.594] if (TRUE && !signal) { [13:13:42.594] muffleCondition <- function (cond, pattern = "^muffle") [13:13:42.594] { [13:13:42.594] inherits <- base::inherits [13:13:42.594] invokeRestart <- base::invokeRestart [13:13:42.594] is.null <- base::is.null [13:13:42.594] muffled <- FALSE [13:13:42.594] if (inherits(cond, "message")) { [13:13:42.594] muffled <- grepl(pattern, "muffleMessage") [13:13:42.594] if (muffled) [13:13:42.594] invokeRestart("muffleMessage") [13:13:42.594] } [13:13:42.594] else if (inherits(cond, "warning")) { [13:13:42.594] muffled <- grepl(pattern, "muffleWarning") [13:13:42.594] if (muffled) [13:13:42.594] invokeRestart("muffleWarning") [13:13:42.594] } [13:13:42.594] else if (inherits(cond, "condition")) { [13:13:42.594] if (!is.null(pattern)) { [13:13:42.594] computeRestarts <- base::computeRestarts [13:13:42.594] grepl <- base::grepl [13:13:42.594] restarts <- computeRestarts(cond) [13:13:42.594] for (restart in restarts) { [13:13:42.594] name <- restart$name [13:13:42.594] if (is.null(name)) [13:13:42.594] next [13:13:42.594] if (!grepl(pattern, name)) [13:13:42.594] next [13:13:42.594] invokeRestart(restart) [13:13:42.594] muffled <- TRUE [13:13:42.594] break [13:13:42.594] } [13:13:42.594] } [13:13:42.594] } [13:13:42.594] invisible(muffled) [13:13:42.594] } [13:13:42.594] muffleCondition(cond, pattern = "^muffle") [13:13:42.594] } [13:13:42.594] } [13:13:42.594] else { [13:13:42.594] if (TRUE) { [13:13:42.594] muffleCondition <- function (cond, pattern = "^muffle") [13:13:42.594] { [13:13:42.594] inherits <- base::inherits [13:13:42.594] invokeRestart <- base::invokeRestart [13:13:42.594] is.null <- base::is.null [13:13:42.594] muffled <- FALSE [13:13:42.594] if (inherits(cond, "message")) { [13:13:42.594] muffled <- grepl(pattern, "muffleMessage") [13:13:42.594] if (muffled) [13:13:42.594] invokeRestart("muffleMessage") [13:13:42.594] } [13:13:42.594] else if (inherits(cond, "warning")) { [13:13:42.594] muffled <- grepl(pattern, "muffleWarning") [13:13:42.594] if (muffled) [13:13:42.594] invokeRestart("muffleWarning") [13:13:42.594] } [13:13:42.594] else if (inherits(cond, "condition")) { [13:13:42.594] if (!is.null(pattern)) { [13:13:42.594] computeRestarts <- base::computeRestarts [13:13:42.594] grepl <- base::grepl [13:13:42.594] restarts <- computeRestarts(cond) [13:13:42.594] for (restart in restarts) { [13:13:42.594] name <- restart$name [13:13:42.594] if (is.null(name)) [13:13:42.594] next [13:13:42.594] if (!grepl(pattern, name)) [13:13:42.594] next [13:13:42.594] invokeRestart(restart) [13:13:42.594] muffled <- TRUE [13:13:42.594] break [13:13:42.594] } [13:13:42.594] } [13:13:42.594] } [13:13:42.594] invisible(muffled) [13:13:42.594] } [13:13:42.594] muffleCondition(cond, pattern = "^muffle") [13:13:42.594] } [13:13:42.594] } [13:13:42.594] } [13:13:42.594] })) [13:13:42.594] }, error = function(ex) { [13:13:42.594] base::structure(base::list(value = NULL, visible = NULL, [13:13:42.594] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:42.594] ...future.rng), started = ...future.startTime, [13:13:42.594] finished = Sys.time(), session_uuid = NA_character_, [13:13:42.594] version = "1.8"), class = "FutureResult") [13:13:42.594] }, finally = { [13:13:42.594] if (!identical(...future.workdir, getwd())) [13:13:42.594] setwd(...future.workdir) [13:13:42.594] { [13:13:42.594] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:42.594] ...future.oldOptions$nwarnings <- NULL [13:13:42.594] } [13:13:42.594] base::options(...future.oldOptions) [13:13:42.594] if (.Platform$OS.type == "windows") { [13:13:42.594] old_names <- names(...future.oldEnvVars) [13:13:42.594] envs <- base::Sys.getenv() [13:13:42.594] names <- names(envs) [13:13:42.594] common <- intersect(names, old_names) [13:13:42.594] added <- setdiff(names, old_names) [13:13:42.594] removed <- setdiff(old_names, names) [13:13:42.594] changed <- common[...future.oldEnvVars[common] != [13:13:42.594] envs[common]] [13:13:42.594] NAMES <- toupper(changed) [13:13:42.594] args <- list() [13:13:42.594] for (kk in seq_along(NAMES)) { [13:13:42.594] name <- changed[[kk]] [13:13:42.594] NAME <- NAMES[[kk]] [13:13:42.594] if (name != NAME && is.element(NAME, old_names)) [13:13:42.594] next [13:13:42.594] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:42.594] } [13:13:42.594] NAMES <- toupper(added) [13:13:42.594] for (kk in seq_along(NAMES)) { [13:13:42.594] name <- added[[kk]] [13:13:42.594] NAME <- NAMES[[kk]] [13:13:42.594] if (name != NAME && is.element(NAME, old_names)) [13:13:42.594] next [13:13:42.594] args[[name]] <- "" [13:13:42.594] } [13:13:42.594] NAMES <- toupper(removed) [13:13:42.594] for (kk in seq_along(NAMES)) { [13:13:42.594] name <- removed[[kk]] [13:13:42.594] NAME <- NAMES[[kk]] [13:13:42.594] if (name != NAME && is.element(NAME, old_names)) [13:13:42.594] next [13:13:42.594] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:42.594] } [13:13:42.594] if (length(args) > 0) [13:13:42.594] base::do.call(base::Sys.setenv, args = args) [13:13:42.594] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:42.594] } [13:13:42.594] else { [13:13:42.594] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:42.594] } [13:13:42.594] { [13:13:42.594] if (base::length(...future.futureOptionsAdded) > [13:13:42.594] 0L) { [13:13:42.594] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:42.594] base::names(opts) <- ...future.futureOptionsAdded [13:13:42.594] base::options(opts) [13:13:42.594] } [13:13:42.594] { [13:13:42.594] { [13:13:42.594] NULL [13:13:42.594] RNGkind("Mersenne-Twister") [13:13:42.594] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:42.594] inherits = FALSE) [13:13:42.594] } [13:13:42.594] options(future.plan = NULL) [13:13:42.594] if (is.na(NA_character_)) [13:13:42.594] Sys.unsetenv("R_FUTURE_PLAN") [13:13:42.594] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:42.594] future::plan(list(function (..., workers = availableCores(), [13:13:42.594] lazy = FALSE, rscript_libs = .libPaths(), [13:13:42.594] envir = parent.frame()) [13:13:42.594] { [13:13:42.594] if (is.function(workers)) [13:13:42.594] workers <- workers() [13:13:42.594] workers <- structure(as.integer(workers), [13:13:42.594] class = class(workers)) [13:13:42.594] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:42.594] workers >= 1) [13:13:42.594] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:42.594] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:42.594] } [13:13:42.594] future <- MultisessionFuture(..., workers = workers, [13:13:42.594] lazy = lazy, rscript_libs = rscript_libs, [13:13:42.594] envir = envir) [13:13:42.594] if (!future$lazy) [13:13:42.594] future <- run(future) [13:13:42.594] invisible(future) [13:13:42.594] }), .cleanup = FALSE, .init = FALSE) [13:13:42.594] } [13:13:42.594] } [13:13:42.594] } [13:13:42.594] }) [13:13:42.594] if (TRUE) { [13:13:42.594] base::sink(type = "output", split = FALSE) [13:13:42.594] if (TRUE) { [13:13:42.594] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:42.594] } [13:13:42.594] else { [13:13:42.594] ...future.result["stdout"] <- base::list(NULL) [13:13:42.594] } [13:13:42.594] base::close(...future.stdout) [13:13:42.594] ...future.stdout <- NULL [13:13:42.594] } [13:13:42.594] ...future.result$conditions <- ...future.conditions [13:13:42.594] ...future.result$finished <- base::Sys.time() [13:13:42.594] ...future.result [13:13:42.594] } [13:13:42.596] assign_globals() ... [13:13:42.597] List of 5 [13:13:42.597] $ ...future.FUN :function (x) [13:13:42.597] $ future.call.arguments : list() [13:13:42.597] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:42.597] $ ...future.elements_ii :List of 3 [13:13:42.597] ..$ a: num 1 [13:13:42.597] ..$ b: num 2 [13:13:42.597] ..$ c: num 3 [13:13:42.597] $ ...future.seeds_ii : NULL [13:13:42.597] $ ...future.globals.maxSize: NULL [13:13:42.597] - attr(*, "where")=List of 5 [13:13:42.597] ..$ ...future.FUN : [13:13:42.597] ..$ future.call.arguments : [13:13:42.597] ..$ ...future.elements_ii : [13:13:42.597] ..$ ...future.seeds_ii : [13:13:42.597] ..$ ...future.globals.maxSize: [13:13:42.597] - attr(*, "resolved")= logi FALSE [13:13:42.597] - attr(*, "total_size")= num 56 [13:13:42.597] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:42.597] - attr(*, "already-done")= logi TRUE [13:13:42.601] - copied '...future.FUN' to environment [13:13:42.601] - copied 'future.call.arguments' to environment [13:13:42.601] - copied '...future.elements_ii' to environment [13:13:42.602] - copied '...future.seeds_ii' to environment [13:13:42.602] - copied '...future.globals.maxSize' to environment [13:13:42.602] assign_globals() ... done [13:13:42.602] plan(): Setting new future strategy stack: [13:13:42.602] List of future strategies: [13:13:42.602] 1. sequential: [13:13:42.602] - args: function (..., envir = parent.frame(), workers = "") [13:13:42.602] - tweaked: FALSE [13:13:42.602] - call: NULL [13:13:42.603] plan(): nbrOfWorkers() = 1 [13:13:42.604] plan(): Setting new future strategy stack: [13:13:42.604] List of future strategies: [13:13:42.604] 1. multisession: [13:13:42.604] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [13:13:42.604] - tweaked: FALSE [13:13:42.604] - call: plan(strategy) [13:13:42.605] plan(): nbrOfWorkers() = 1 [13:13:42.606] SequentialFuture started (and completed) [13:13:42.606] - Launch lazy future ... done [13:13:42.606] run() for 'SequentialFuture' ... done [13:13:42.606] Created future: [13:13:42.606] SequentialFuture: [13:13:42.606] Label: 'future_lapply-1' [13:13:42.606] Expression: [13:13:42.606] { [13:13:42.606] do.call(function(...) { [13:13:42.606] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:42.606] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:42.606] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:42.606] on.exit(options(oopts), add = TRUE) [13:13:42.606] } [13:13:42.606] { [13:13:42.606] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:42.606] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:42.606] ...future.FUN(...future.X_jj, ...) [13:13:42.606] }) [13:13:42.606] } [13:13:42.606] }, args = future.call.arguments) [13:13:42.606] } [13:13:42.606] Lazy evaluation: FALSE [13:13:42.606] Asynchronous evaluation: FALSE [13:13:42.606] Local evaluation: TRUE [13:13:42.606] Environment: R_GlobalEnv [13:13:42.606] Capture standard output: TRUE [13:13:42.606] Capture condition classes: 'condition' (excluding 'nothing') [13:13:42.606] 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) [13:13:42.606] Packages: [13:13:42.606] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:42.606] Resolved: TRUE [13:13:42.606] Value: 168 bytes of class 'list' [13:13:42.606] Early signaling: FALSE [13:13:42.606] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:42.606] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:42.607] Chunk #1 of 1 ... DONE [13:13:42.607] Launching 1 futures (chunks) ... DONE [13:13:42.607] Resolving 1 futures (chunks) ... [13:13:42.608] resolve() on list ... [13:13:42.608] recursive: 0 [13:13:42.608] length: 1 [13:13:42.608] [13:13:42.608] resolved() for 'SequentialFuture' ... [13:13:42.608] - state: 'finished' [13:13:42.608] - run: TRUE [13:13:42.608] - result: 'FutureResult' [13:13:42.609] resolved() for 'SequentialFuture' ... done [13:13:42.609] Future #1 [13:13:42.609] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:42.609] - nx: 1 [13:13:42.609] - relay: TRUE [13:13:42.609] - stdout: TRUE [13:13:42.609] - signal: TRUE [13:13:42.609] - resignal: FALSE [13:13:42.610] - force: TRUE [13:13:42.610] - relayed: [n=1] FALSE [13:13:42.610] - queued futures: [n=1] FALSE [13:13:42.610] - until=1 [13:13:42.610] - relaying element #1 [13:13:42.610] - relayed: [n=1] TRUE [13:13:42.610] - queued futures: [n=1] TRUE [13:13:42.610] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:42.611] length: 0 (resolved future 1) [13:13:42.611] Relaying remaining futures [13:13:42.611] signalConditionsASAP(NULL, pos=0) ... [13:13:42.611] - nx: 1 [13:13:42.611] - relay: TRUE [13:13:42.611] - stdout: TRUE [13:13:42.611] - signal: TRUE [13:13:42.611] - resignal: FALSE [13:13:42.611] - force: TRUE [13:13:42.612] - relayed: [n=1] TRUE [13:13:42.612] - queued futures: [n=1] TRUE - flush all [13:13:42.612] - relayed: [n=1] TRUE [13:13:42.612] - queued futures: [n=1] TRUE [13:13:42.612] signalConditionsASAP(NULL, pos=0) ... done [13:13:42.612] resolve() on list ... DONE [13:13:42.612] - Number of value chunks collected: 1 [13:13:42.612] Resolving 1 futures (chunks) ... DONE [13:13:42.613] Reducing values from 1 chunks ... [13:13:42.613] - Number of values collected after concatenation: 3 [13:13:42.613] - Number of values expected: 3 [13:13:42.613] Reducing values from 1 chunks ... DONE [13:13:42.613] future_lapply() ... DONE - future_lapply(x, ...) where x[[i]] subsets via S3 method ... [13:13:42.613] future_lapply() ... [13:13:42.615] Number of chunks: 1 [13:13:42.615] getGlobalsAndPackagesXApply() ... [13:13:42.615] - future.globals: TRUE [13:13:42.616] getGlobalsAndPackages() ... [13:13:42.616] Searching for globals... [13:13:42.617] - globals found: [1] 'FUN' [13:13:42.617] Searching for globals ... DONE [13:13:42.617] Resolving globals: FALSE [13:13:42.617] The total size of the 1 globals is 848 bytes (848 bytes) [13:13:42.617] 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') [13:13:42.618] - globals: [1] 'FUN' [13:13:42.618] [13:13:42.618] getGlobalsAndPackages() ... DONE [13:13:42.618] - globals found/used: [n=1] 'FUN' [13:13:42.618] - needed namespaces: [n=0] [13:13:42.618] Finding globals ... DONE [13:13:42.618] - use_args: TRUE [13:13:42.618] - Getting '...' globals ... [13:13:42.619] resolve() on list ... [13:13:42.619] recursive: 0 [13:13:42.619] length: 1 [13:13:42.619] elements: '...' [13:13:42.619] length: 0 (resolved future 1) [13:13:42.619] resolve() on list ... DONE [13:13:42.619] - '...' content: [n=0] [13:13:42.620] List of 1 [13:13:42.620] $ ...: list() [13:13:42.620] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:42.620] - attr(*, "where")=List of 1 [13:13:42.620] ..$ ...: [13:13:42.620] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:42.620] - attr(*, "resolved")= logi TRUE [13:13:42.620] - attr(*, "total_size")= num NA [13:13:42.622] - Getting '...' globals ... DONE [13:13:42.622] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:42.622] List of 2 [13:13:42.622] $ ...future.FUN:function (x) [13:13:42.622] $ ... : list() [13:13:42.622] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:42.622] - attr(*, "where")=List of 2 [13:13:42.622] ..$ ...future.FUN: [13:13:42.622] ..$ ... : [13:13:42.622] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:42.622] - attr(*, "resolved")= logi FALSE [13:13:42.622] - attr(*, "total_size")= num 848 [13:13:42.624] Packages to be attached in all futures: [n=0] [13:13:42.625] getGlobalsAndPackagesXApply() ... DONE [13:13:42.625] Number of futures (= number of chunks): 1 [13:13:42.625] Launching 1 futures (chunks) ... [13:13:42.625] Chunk #1 of 1 ... [13:13:42.625] - Finding globals in 'X' for chunk #1 ... [13:13:42.625] getGlobalsAndPackages() ... [13:13:42.625] Searching for globals... [13:13:42.626] [13:13:42.626] Searching for globals ... DONE [13:13:42.626] - globals: [0] [13:13:42.626] getGlobalsAndPackages() ... DONE [13:13:42.626] + additional globals found: [n=0] [13:13:42.626] + additional namespaces needed: [n=0] [13:13:42.626] - Finding globals in 'X' for chunk #1 ... DONE [13:13:42.627] - seeds: [13:13:42.627] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:42.627] getGlobalsAndPackages() ... [13:13:42.627] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:42.627] Resolving globals: FALSE [13:13:42.627] Tweak future expression to call with '...' arguments ... [13:13:42.627] { [13:13:42.627] do.call(function(...) { [13:13:42.627] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:42.627] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:42.627] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:42.627] on.exit(options(oopts), add = TRUE) [13:13:42.627] } [13:13:42.627] { [13:13:42.627] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:42.627] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:42.627] ...future.FUN(...future.X_jj, ...) [13:13:42.627] }) [13:13:42.627] } [13:13:42.627] }, args = future.call.arguments) [13:13:42.627] } [13:13:42.628] Tweak future expression to call with '...' arguments ... DONE [13:13:42.628] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:42.628] [13:13:42.628] getGlobalsAndPackages() ... DONE [13:13:42.628] run() for 'Future' ... [13:13:42.629] - state: 'created' [13:13:42.629] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:42.631] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:42.631] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:42.631] - Field: 'label' [13:13:42.631] - Field: 'local' [13:13:42.631] - Field: 'owner' [13:13:42.631] - Field: 'envir' [13:13:42.631] - Field: 'packages' [13:13:42.631] - Field: 'gc' [13:13:42.633] - Field: 'conditions' [13:13:42.633] - Field: 'expr' [13:13:42.633] - Field: 'uuid' [13:13:42.633] - Field: 'seed' [13:13:42.633] - Field: 'version' [13:13:42.634] - Field: 'result' [13:13:42.634] - Field: 'asynchronous' [13:13:42.634] - Field: 'calls' [13:13:42.634] - Field: 'globals' [13:13:42.634] - Field: 'stdout' [13:13:42.634] - Field: 'earlySignal' [13:13:42.634] - Field: 'lazy' [13:13:42.634] - Field: 'state' [13:13:42.635] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:42.635] - Launch lazy future ... [13:13:42.635] Packages needed by the future expression (n = 0): [13:13:42.635] Packages needed by future strategies (n = 0): [13:13:42.635] { [13:13:42.635] { [13:13:42.635] { [13:13:42.635] ...future.startTime <- base::Sys.time() [13:13:42.635] { [13:13:42.635] { [13:13:42.635] { [13:13:42.635] base::local({ [13:13:42.635] has_future <- base::requireNamespace("future", [13:13:42.635] quietly = TRUE) [13:13:42.635] if (has_future) { [13:13:42.635] ns <- base::getNamespace("future") [13:13:42.635] version <- ns[[".package"]][["version"]] [13:13:42.635] if (is.null(version)) [13:13:42.635] version <- utils::packageVersion("future") [13:13:42.635] } [13:13:42.635] else { [13:13:42.635] version <- NULL [13:13:42.635] } [13:13:42.635] if (!has_future || version < "1.8.0") { [13:13:42.635] info <- base::c(r_version = base::gsub("R version ", [13:13:42.635] "", base::R.version$version.string), [13:13:42.635] platform = base::sprintf("%s (%s-bit)", [13:13:42.635] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:42.635] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:42.635] "release", "version")], collapse = " "), [13:13:42.635] hostname = base::Sys.info()[["nodename"]]) [13:13:42.635] info <- base::sprintf("%s: %s", base::names(info), [13:13:42.635] info) [13:13:42.635] info <- base::paste(info, collapse = "; ") [13:13:42.635] if (!has_future) { [13:13:42.635] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:42.635] info) [13:13:42.635] } [13:13:42.635] else { [13:13:42.635] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:42.635] info, version) [13:13:42.635] } [13:13:42.635] base::stop(msg) [13:13:42.635] } [13:13:42.635] }) [13:13:42.635] } [13:13:42.635] options(future.plan = NULL) [13:13:42.635] Sys.unsetenv("R_FUTURE_PLAN") [13:13:42.635] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:42.635] } [13:13:42.635] ...future.workdir <- getwd() [13:13:42.635] } [13:13:42.635] ...future.oldOptions <- base::as.list(base::.Options) [13:13:42.635] ...future.oldEnvVars <- base::Sys.getenv() [13:13:42.635] } [13:13:42.635] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:42.635] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:42.635] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:42.635] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:42.635] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:42.635] future.stdout.windows.reencode = NULL, width = 80L) [13:13:42.635] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:42.635] base::names(...future.oldOptions)) [13:13:42.635] } [13:13:42.635] if (FALSE) { [13:13:42.635] } [13:13:42.635] else { [13:13:42.635] if (TRUE) { [13:13:42.635] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:42.635] open = "w") [13:13:42.635] } [13:13:42.635] else { [13:13:42.635] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:42.635] windows = "NUL", "/dev/null"), open = "w") [13:13:42.635] } [13:13:42.635] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:42.635] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:42.635] base::sink(type = "output", split = FALSE) [13:13:42.635] base::close(...future.stdout) [13:13:42.635] }, add = TRUE) [13:13:42.635] } [13:13:42.635] ...future.frame <- base::sys.nframe() [13:13:42.635] ...future.conditions <- base::list() [13:13:42.635] ...future.rng <- base::globalenv()$.Random.seed [13:13:42.635] if (FALSE) { [13:13:42.635] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:42.635] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:42.635] } [13:13:42.635] ...future.result <- base::tryCatch({ [13:13:42.635] base::withCallingHandlers({ [13:13:42.635] ...future.value <- base::withVisible(base::local({ [13:13:42.635] do.call(function(...) { [13:13:42.635] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:42.635] if (!identical(...future.globals.maxSize.org, [13:13:42.635] ...future.globals.maxSize)) { [13:13:42.635] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:42.635] on.exit(options(oopts), add = TRUE) [13:13:42.635] } [13:13:42.635] { [13:13:42.635] lapply(seq_along(...future.elements_ii), [13:13:42.635] FUN = function(jj) { [13:13:42.635] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:42.635] ...future.FUN(...future.X_jj, ...) [13:13:42.635] }) [13:13:42.635] } [13:13:42.635] }, args = future.call.arguments) [13:13:42.635] })) [13:13:42.635] future::FutureResult(value = ...future.value$value, [13:13:42.635] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:42.635] ...future.rng), globalenv = if (FALSE) [13:13:42.635] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:42.635] ...future.globalenv.names)) [13:13:42.635] else NULL, started = ...future.startTime, version = "1.8") [13:13:42.635] }, condition = base::local({ [13:13:42.635] c <- base::c [13:13:42.635] inherits <- base::inherits [13:13:42.635] invokeRestart <- base::invokeRestart [13:13:42.635] length <- base::length [13:13:42.635] list <- base::list [13:13:42.635] seq.int <- base::seq.int [13:13:42.635] signalCondition <- base::signalCondition [13:13:42.635] sys.calls <- base::sys.calls [13:13:42.635] `[[` <- base::`[[` [13:13:42.635] `+` <- base::`+` [13:13:42.635] `<<-` <- base::`<<-` [13:13:42.635] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:42.635] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:42.635] 3L)] [13:13:42.635] } [13:13:42.635] function(cond) { [13:13:42.635] is_error <- inherits(cond, "error") [13:13:42.635] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:42.635] NULL) [13:13:42.635] if (is_error) { [13:13:42.635] sessionInformation <- function() { [13:13:42.635] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:42.635] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:42.635] search = base::search(), system = base::Sys.info()) [13:13:42.635] } [13:13:42.635] ...future.conditions[[length(...future.conditions) + [13:13:42.635] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:42.635] cond$call), session = sessionInformation(), [13:13:42.635] timestamp = base::Sys.time(), signaled = 0L) [13:13:42.635] signalCondition(cond) [13:13:42.635] } [13:13:42.635] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:42.635] "immediateCondition"))) { [13:13:42.635] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:42.635] ...future.conditions[[length(...future.conditions) + [13:13:42.635] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:42.635] if (TRUE && !signal) { [13:13:42.635] muffleCondition <- function (cond, pattern = "^muffle") [13:13:42.635] { [13:13:42.635] inherits <- base::inherits [13:13:42.635] invokeRestart <- base::invokeRestart [13:13:42.635] is.null <- base::is.null [13:13:42.635] muffled <- FALSE [13:13:42.635] if (inherits(cond, "message")) { [13:13:42.635] muffled <- grepl(pattern, "muffleMessage") [13:13:42.635] if (muffled) [13:13:42.635] invokeRestart("muffleMessage") [13:13:42.635] } [13:13:42.635] else if (inherits(cond, "warning")) { [13:13:42.635] muffled <- grepl(pattern, "muffleWarning") [13:13:42.635] if (muffled) [13:13:42.635] invokeRestart("muffleWarning") [13:13:42.635] } [13:13:42.635] else if (inherits(cond, "condition")) { [13:13:42.635] if (!is.null(pattern)) { [13:13:42.635] computeRestarts <- base::computeRestarts [13:13:42.635] grepl <- base::grepl [13:13:42.635] restarts <- computeRestarts(cond) [13:13:42.635] for (restart in restarts) { [13:13:42.635] name <- restart$name [13:13:42.635] if (is.null(name)) [13:13:42.635] next [13:13:42.635] if (!grepl(pattern, name)) [13:13:42.635] next [13:13:42.635] invokeRestart(restart) [13:13:42.635] muffled <- TRUE [13:13:42.635] break [13:13:42.635] } [13:13:42.635] } [13:13:42.635] } [13:13:42.635] invisible(muffled) [13:13:42.635] } [13:13:42.635] muffleCondition(cond, pattern = "^muffle") [13:13:42.635] } [13:13:42.635] } [13:13:42.635] else { [13:13:42.635] if (TRUE) { [13:13:42.635] muffleCondition <- function (cond, pattern = "^muffle") [13:13:42.635] { [13:13:42.635] inherits <- base::inherits [13:13:42.635] invokeRestart <- base::invokeRestart [13:13:42.635] is.null <- base::is.null [13:13:42.635] muffled <- FALSE [13:13:42.635] if (inherits(cond, "message")) { [13:13:42.635] muffled <- grepl(pattern, "muffleMessage") [13:13:42.635] if (muffled) [13:13:42.635] invokeRestart("muffleMessage") [13:13:42.635] } [13:13:42.635] else if (inherits(cond, "warning")) { [13:13:42.635] muffled <- grepl(pattern, "muffleWarning") [13:13:42.635] if (muffled) [13:13:42.635] invokeRestart("muffleWarning") [13:13:42.635] } [13:13:42.635] else if (inherits(cond, "condition")) { [13:13:42.635] if (!is.null(pattern)) { [13:13:42.635] computeRestarts <- base::computeRestarts [13:13:42.635] grepl <- base::grepl [13:13:42.635] restarts <- computeRestarts(cond) [13:13:42.635] for (restart in restarts) { [13:13:42.635] name <- restart$name [13:13:42.635] if (is.null(name)) [13:13:42.635] next [13:13:42.635] if (!grepl(pattern, name)) [13:13:42.635] next [13:13:42.635] invokeRestart(restart) [13:13:42.635] muffled <- TRUE [13:13:42.635] break [13:13:42.635] } [13:13:42.635] } [13:13:42.635] } [13:13:42.635] invisible(muffled) [13:13:42.635] } [13:13:42.635] muffleCondition(cond, pattern = "^muffle") [13:13:42.635] } [13:13:42.635] } [13:13:42.635] } [13:13:42.635] })) [13:13:42.635] }, error = function(ex) { [13:13:42.635] base::structure(base::list(value = NULL, visible = NULL, [13:13:42.635] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:42.635] ...future.rng), started = ...future.startTime, [13:13:42.635] finished = Sys.time(), session_uuid = NA_character_, [13:13:42.635] version = "1.8"), class = "FutureResult") [13:13:42.635] }, finally = { [13:13:42.635] if (!identical(...future.workdir, getwd())) [13:13:42.635] setwd(...future.workdir) [13:13:42.635] { [13:13:42.635] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:42.635] ...future.oldOptions$nwarnings <- NULL [13:13:42.635] } [13:13:42.635] base::options(...future.oldOptions) [13:13:42.635] if (.Platform$OS.type == "windows") { [13:13:42.635] old_names <- names(...future.oldEnvVars) [13:13:42.635] envs <- base::Sys.getenv() [13:13:42.635] names <- names(envs) [13:13:42.635] common <- intersect(names, old_names) [13:13:42.635] added <- setdiff(names, old_names) [13:13:42.635] removed <- setdiff(old_names, names) [13:13:42.635] changed <- common[...future.oldEnvVars[common] != [13:13:42.635] envs[common]] [13:13:42.635] NAMES <- toupper(changed) [13:13:42.635] args <- list() [13:13:42.635] for (kk in seq_along(NAMES)) { [13:13:42.635] name <- changed[[kk]] [13:13:42.635] NAME <- NAMES[[kk]] [13:13:42.635] if (name != NAME && is.element(NAME, old_names)) [13:13:42.635] next [13:13:42.635] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:42.635] } [13:13:42.635] NAMES <- toupper(added) [13:13:42.635] for (kk in seq_along(NAMES)) { [13:13:42.635] name <- added[[kk]] [13:13:42.635] NAME <- NAMES[[kk]] [13:13:42.635] if (name != NAME && is.element(NAME, old_names)) [13:13:42.635] next [13:13:42.635] args[[name]] <- "" [13:13:42.635] } [13:13:42.635] NAMES <- toupper(removed) [13:13:42.635] for (kk in seq_along(NAMES)) { [13:13:42.635] name <- removed[[kk]] [13:13:42.635] NAME <- NAMES[[kk]] [13:13:42.635] if (name != NAME && is.element(NAME, old_names)) [13:13:42.635] next [13:13:42.635] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:42.635] } [13:13:42.635] if (length(args) > 0) [13:13:42.635] base::do.call(base::Sys.setenv, args = args) [13:13:42.635] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:42.635] } [13:13:42.635] else { [13:13:42.635] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:42.635] } [13:13:42.635] { [13:13:42.635] if (base::length(...future.futureOptionsAdded) > [13:13:42.635] 0L) { [13:13:42.635] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:42.635] base::names(opts) <- ...future.futureOptionsAdded [13:13:42.635] base::options(opts) [13:13:42.635] } [13:13:42.635] { [13:13:42.635] { [13:13:42.635] NULL [13:13:42.635] RNGkind("Mersenne-Twister") [13:13:42.635] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:42.635] inherits = FALSE) [13:13:42.635] } [13:13:42.635] options(future.plan = NULL) [13:13:42.635] if (is.na(NA_character_)) [13:13:42.635] Sys.unsetenv("R_FUTURE_PLAN") [13:13:42.635] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:42.635] future::plan(list(function (..., workers = availableCores(), [13:13:42.635] lazy = FALSE, rscript_libs = .libPaths(), [13:13:42.635] envir = parent.frame()) [13:13:42.635] { [13:13:42.635] if (is.function(workers)) [13:13:42.635] workers <- workers() [13:13:42.635] workers <- structure(as.integer(workers), [13:13:42.635] class = class(workers)) [13:13:42.635] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:42.635] workers >= 1) [13:13:42.635] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:42.635] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:42.635] } [13:13:42.635] future <- MultisessionFuture(..., workers = workers, [13:13:42.635] lazy = lazy, rscript_libs = rscript_libs, [13:13:42.635] envir = envir) [13:13:42.635] if (!future$lazy) [13:13:42.635] future <- run(future) [13:13:42.635] invisible(future) [13:13:42.635] }), .cleanup = FALSE, .init = FALSE) [13:13:42.635] } [13:13:42.635] } [13:13:42.635] } [13:13:42.635] }) [13:13:42.635] if (TRUE) { [13:13:42.635] base::sink(type = "output", split = FALSE) [13:13:42.635] if (TRUE) { [13:13:42.635] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:42.635] } [13:13:42.635] else { [13:13:42.635] ...future.result["stdout"] <- base::list(NULL) [13:13:42.635] } [13:13:42.635] base::close(...future.stdout) [13:13:42.635] ...future.stdout <- NULL [13:13:42.635] } [13:13:42.635] ...future.result$conditions <- ...future.conditions [13:13:42.635] ...future.result$finished <- base::Sys.time() [13:13:42.635] ...future.result [13:13:42.635] } [13:13:42.638] assign_globals() ... [13:13:42.638] List of 5 [13:13:42.638] $ ...future.FUN :function (x) [13:13:42.638] $ future.call.arguments : list() [13:13:42.638] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:42.638] $ ...future.elements_ii :List of 2 [13:13:42.638] ..$ a: num 0 [13:13:42.638] ..$ b: num 0 [13:13:42.638] $ ...future.seeds_ii : NULL [13:13:42.638] $ ...future.globals.maxSize: NULL [13:13:42.638] - attr(*, "where")=List of 5 [13:13:42.638] ..$ ...future.FUN : [13:13:42.638] ..$ future.call.arguments : [13:13:42.638] ..$ ...future.elements_ii : [13:13:42.638] ..$ ...future.seeds_ii : [13:13:42.638] ..$ ...future.globals.maxSize: [13:13:42.638] - attr(*, "resolved")= logi FALSE [13:13:42.638] - attr(*, "total_size")= num 848 [13:13:42.638] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:42.638] - attr(*, "already-done")= logi TRUE [13:13:42.643] - copied '...future.FUN' to environment [13:13:42.643] - copied 'future.call.arguments' to environment [13:13:42.643] - copied '...future.elements_ii' to environment [13:13:42.643] - copied '...future.seeds_ii' to environment [13:13:42.643] - copied '...future.globals.maxSize' to environment [13:13:42.643] assign_globals() ... done [13:13:42.643] plan(): Setting new future strategy stack: [13:13:42.644] List of future strategies: [13:13:42.644] 1. sequential: [13:13:42.644] - args: function (..., envir = parent.frame(), workers = "") [13:13:42.644] - tweaked: FALSE [13:13:42.644] - call: NULL [13:13:42.644] plan(): nbrOfWorkers() = 1 [13:13:42.645] plan(): Setting new future strategy stack: [13:13:42.645] List of future strategies: [13:13:42.645] 1. multisession: [13:13:42.645] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [13:13:42.645] - tweaked: FALSE [13:13:42.645] - call: plan(strategy) [13:13:42.647] plan(): nbrOfWorkers() = 1 [13:13:42.647] SequentialFuture started (and completed) [13:13:42.647] - Launch lazy future ... done [13:13:42.647] run() for 'SequentialFuture' ... done [13:13:42.647] Created future: [13:13:42.647] SequentialFuture: [13:13:42.647] Label: 'future_lapply-1' [13:13:42.647] Expression: [13:13:42.647] { [13:13:42.647] do.call(function(...) { [13:13:42.647] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:42.647] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:42.647] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:42.647] on.exit(options(oopts), add = TRUE) [13:13:42.647] } [13:13:42.647] { [13:13:42.647] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:42.647] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:42.647] ...future.FUN(...future.X_jj, ...) [13:13:42.647] }) [13:13:42.647] } [13:13:42.647] }, args = future.call.arguments) [13:13:42.647] } [13:13:42.647] Lazy evaluation: FALSE [13:13:42.647] Asynchronous evaluation: FALSE [13:13:42.647] Local evaluation: TRUE [13:13:42.647] Environment: R_GlobalEnv [13:13:42.647] Capture standard output: TRUE [13:13:42.647] Capture condition classes: 'condition' (excluding 'nothing') [13:13:42.647] 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) [13:13:42.647] Packages: [13:13:42.647] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:42.647] Resolved: TRUE [13:13:42.647] Value: 112 bytes of class 'list' [13:13:42.647] Early signaling: FALSE [13:13:42.647] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:42.647] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:42.648] Chunk #1 of 1 ... DONE [13:13:42.648] Launching 1 futures (chunks) ... DONE [13:13:42.649] Resolving 1 futures (chunks) ... [13:13:42.649] resolve() on list ... [13:13:42.649] recursive: 0 [13:13:42.649] length: 1 [13:13:42.649] [13:13:42.649] resolved() for 'SequentialFuture' ... [13:13:42.649] - state: 'finished' [13:13:42.650] - run: TRUE [13:13:42.650] - result: 'FutureResult' [13:13:42.650] resolved() for 'SequentialFuture' ... done [13:13:42.650] Future #1 [13:13:42.650] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:42.650] - nx: 1 [13:13:42.650] - relay: TRUE [13:13:42.650] - stdout: TRUE [13:13:42.651] - signal: TRUE [13:13:42.651] - resignal: FALSE [13:13:42.651] - force: TRUE [13:13:42.651] - relayed: [n=1] FALSE [13:13:42.651] - queued futures: [n=1] FALSE [13:13:42.651] - until=1 [13:13:42.651] - relaying element #1 [13:13:42.651] - relayed: [n=1] TRUE [13:13:42.652] - queued futures: [n=1] TRUE [13:13:42.652] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:42.652] length: 0 (resolved future 1) [13:13:42.652] Relaying remaining futures [13:13:42.652] signalConditionsASAP(NULL, pos=0) ... [13:13:42.652] - nx: 1 [13:13:42.652] - relay: TRUE [13:13:42.652] - stdout: TRUE [13:13:42.652] - signal: TRUE [13:13:42.652] - resignal: FALSE [13:13:42.653] - force: TRUE [13:13:42.653] - relayed: [n=1] TRUE [13:13:42.653] - queued futures: [n=1] TRUE - flush all [13:13:42.653] - relayed: [n=1] TRUE [13:13:42.653] - queued futures: [n=1] TRUE [13:13:42.653] signalConditionsASAP(NULL, pos=0) ... done [13:13:42.653] resolve() on list ... DONE [13:13:42.653] - Number of value chunks collected: 1 [13:13:42.654] Resolving 1 futures (chunks) ... DONE [13:13:42.654] Reducing values from 1 chunks ... [13:13:42.654] - Number of values collected after concatenation: 2 [13:13:42.654] - Number of values expected: 2 [13:13:42.654] Reducing values from 1 chunks ... DONE [13:13:42.654] future_lapply() ... DONE Testing with 1 cores ... DONE Testing with 2 cores ... - plan('sequential') ... [13:13:42.655] plan(): Setting new future strategy stack: [13:13:42.655] List of future strategies: [13:13:42.655] 1. sequential: [13:13:42.655] - args: function (..., envir = parent.frame(), workers = "") [13:13:42.655] - tweaked: FALSE [13:13:42.655] - call: plan(strategy) [13:13:42.655] plan(): nbrOfWorkers() = 1 - future_lapply(x, FUN = vector, ...) ... [13:13:42.655] future_lapply() ... [13:13:42.656] Number of chunks: 4 [13:13:42.656] getGlobalsAndPackagesXApply() ... [13:13:42.656] - future.globals: TRUE [13:13:42.656] getGlobalsAndPackages() ... [13:13:42.656] Searching for globals... [13:13:42.657] - globals found: [2] 'FUN', '.Internal' [13:13:42.658] Searching for globals ... DONE [13:13:42.658] Resolving globals: FALSE [13:13:42.658] The total size of the 1 globals is 2.13 KiB (2184 bytes) [13:13:42.658] 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') [13:13:42.658] - globals: [1] 'FUN' [13:13:42.659] [13:13:42.659] getGlobalsAndPackages() ... DONE [13:13:42.659] - globals found/used: [n=1] 'FUN' [13:13:42.659] - needed namespaces: [n=0] [13:13:42.659] Finding globals ... DONE [13:13:42.659] - use_args: TRUE [13:13:42.659] - Getting '...' globals ... [13:13:42.659] resolve() on list ... [13:13:42.660] recursive: 0 [13:13:42.660] length: 1 [13:13:42.660] elements: '...' [13:13:42.660] length: 0 (resolved future 1) [13:13:42.660] resolve() on list ... DONE [13:13:42.660] - '...' content: [n=1] 'length' [13:13:42.660] List of 1 [13:13:42.660] $ ...:List of 1 [13:13:42.660] ..$ length: int 2 [13:13:42.660] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:42.660] - attr(*, "where")=List of 1 [13:13:42.660] ..$ ...: [13:13:42.660] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:42.660] - attr(*, "resolved")= logi TRUE [13:13:42.660] - attr(*, "total_size")= num NA [13:13:42.663] - Getting '...' globals ... DONE [13:13:42.663] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:42.663] List of 2 [13:13:42.663] $ ...future.FUN:function (mode = "logical", length = 0L) [13:13:42.663] $ ... :List of 1 [13:13:42.663] ..$ length: int 2 [13:13:42.663] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:42.663] - attr(*, "where")=List of 2 [13:13:42.663] ..$ ...future.FUN: [13:13:42.663] ..$ ... : [13:13:42.663] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:42.663] - attr(*, "resolved")= logi FALSE [13:13:42.663] - attr(*, "total_size")= num 2240 [13:13:42.666] Packages to be attached in all futures: [n=0] [13:13:42.666] getGlobalsAndPackagesXApply() ... DONE [13:13:42.666] Number of futures (= number of chunks): 4 [13:13:42.666] Launching 4 futures (chunks) ... [13:13:42.666] Chunk #1 of 4 ... [13:13:42.666] - Finding globals in 'X' for chunk #1 ... [13:13:42.666] getGlobalsAndPackages() ... [13:13:42.667] Searching for globals... [13:13:42.667] [13:13:42.667] Searching for globals ... DONE [13:13:42.667] - globals: [0] [13:13:42.667] getGlobalsAndPackages() ... DONE [13:13:42.667] + additional globals found: [n=0] [13:13:42.667] + additional namespaces needed: [n=0] [13:13:42.668] - Finding globals in 'X' for chunk #1 ... DONE [13:13:42.668] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [13:13:42.668] - seeds: [13:13:42.668] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:42.668] getGlobalsAndPackages() ... [13:13:42.668] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:42.668] Resolving globals: FALSE [13:13:42.668] Tweak future expression to call with '...' arguments ... [13:13:42.668] { [13:13:42.668] do.call(function(...) { [13:13:42.668] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:42.668] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:42.668] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:42.668] on.exit(options(oopts), add = TRUE) [13:13:42.668] } [13:13:42.668] { [13:13:42.668] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:42.668] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:42.668] ...future.FUN(...future.X_jj, ...) [13:13:42.668] }) [13:13:42.668] } [13:13:42.668] }, args = future.call.arguments) [13:13:42.668] } [13:13:42.669] Tweak future expression to call with '...' arguments ... DONE [13:13:42.669] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:42.669] [13:13:42.669] getGlobalsAndPackages() ... DONE [13:13:42.670] run() for 'Future' ... [13:13:42.670] - state: 'created' [13:13:42.670] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:13:42.670] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:42.670] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:42.670] - Field: 'label' [13:13:42.671] - Field: 'local' [13:13:42.671] - Field: 'owner' [13:13:42.671] - Field: 'envir' [13:13:42.671] - Field: 'packages' [13:13:42.671] - Field: 'gc' [13:13:42.671] - Field: 'conditions' [13:13:42.671] - Field: 'expr' [13:13:42.671] - Field: 'uuid' [13:13:42.672] - Field: 'seed' [13:13:42.672] - Field: 'version' [13:13:42.672] - Field: 'result' [13:13:42.672] - Field: 'asynchronous' [13:13:42.672] - Field: 'calls' [13:13:42.672] - Field: 'globals' [13:13:42.672] - Field: 'stdout' [13:13:42.672] - Field: 'earlySignal' [13:13:42.673] - Field: 'lazy' [13:13:42.673] - Field: 'state' [13:13:42.673] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:42.673] - Launch lazy future ... [13:13:42.673] Packages needed by the future expression (n = 0): [13:13:42.673] Packages needed by future strategies (n = 0): [13:13:42.674] { [13:13:42.674] { [13:13:42.674] { [13:13:42.674] ...future.startTime <- base::Sys.time() [13:13:42.674] { [13:13:42.674] { [13:13:42.674] { [13:13:42.674] base::local({ [13:13:42.674] has_future <- base::requireNamespace("future", [13:13:42.674] quietly = TRUE) [13:13:42.674] if (has_future) { [13:13:42.674] ns <- base::getNamespace("future") [13:13:42.674] version <- ns[[".package"]][["version"]] [13:13:42.674] if (is.null(version)) [13:13:42.674] version <- utils::packageVersion("future") [13:13:42.674] } [13:13:42.674] else { [13:13:42.674] version <- NULL [13:13:42.674] } [13:13:42.674] if (!has_future || version < "1.8.0") { [13:13:42.674] info <- base::c(r_version = base::gsub("R version ", [13:13:42.674] "", base::R.version$version.string), [13:13:42.674] platform = base::sprintf("%s (%s-bit)", [13:13:42.674] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:42.674] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:42.674] "release", "version")], collapse = " "), [13:13:42.674] hostname = base::Sys.info()[["nodename"]]) [13:13:42.674] info <- base::sprintf("%s: %s", base::names(info), [13:13:42.674] info) [13:13:42.674] info <- base::paste(info, collapse = "; ") [13:13:42.674] if (!has_future) { [13:13:42.674] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:42.674] info) [13:13:42.674] } [13:13:42.674] else { [13:13:42.674] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:42.674] info, version) [13:13:42.674] } [13:13:42.674] base::stop(msg) [13:13:42.674] } [13:13:42.674] }) [13:13:42.674] } [13:13:42.674] options(future.plan = NULL) [13:13:42.674] Sys.unsetenv("R_FUTURE_PLAN") [13:13:42.674] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:42.674] } [13:13:42.674] ...future.workdir <- getwd() [13:13:42.674] } [13:13:42.674] ...future.oldOptions <- base::as.list(base::.Options) [13:13:42.674] ...future.oldEnvVars <- base::Sys.getenv() [13:13:42.674] } [13:13:42.674] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:42.674] future.globals.maxSize = 2097152000, future.globals.method = NULL, [13:13:42.674] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:42.674] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:42.674] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:42.674] future.stdout.windows.reencode = NULL, width = 80L) [13:13:42.674] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:42.674] base::names(...future.oldOptions)) [13:13:42.674] } [13:13:42.674] if (FALSE) { [13:13:42.674] } [13:13:42.674] else { [13:13:42.674] if (TRUE) { [13:13:42.674] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:42.674] open = "w") [13:13:42.674] } [13:13:42.674] else { [13:13:42.674] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:42.674] windows = "NUL", "/dev/null"), open = "w") [13:13:42.674] } [13:13:42.674] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:42.674] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:42.674] base::sink(type = "output", split = FALSE) [13:13:42.674] base::close(...future.stdout) [13:13:42.674] }, add = TRUE) [13:13:42.674] } [13:13:42.674] ...future.frame <- base::sys.nframe() [13:13:42.674] ...future.conditions <- base::list() [13:13:42.674] ...future.rng <- base::globalenv()$.Random.seed [13:13:42.674] if (FALSE) { [13:13:42.674] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:42.674] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:42.674] } [13:13:42.674] ...future.result <- base::tryCatch({ [13:13:42.674] base::withCallingHandlers({ [13:13:42.674] ...future.value <- base::withVisible(base::local({ [13:13:42.674] do.call(function(...) { [13:13:42.674] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:42.674] if (!identical(...future.globals.maxSize.org, [13:13:42.674] ...future.globals.maxSize)) { [13:13:42.674] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:42.674] on.exit(options(oopts), add = TRUE) [13:13:42.674] } [13:13:42.674] { [13:13:42.674] lapply(seq_along(...future.elements_ii), [13:13:42.674] FUN = function(jj) { [13:13:42.674] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:42.674] ...future.FUN(...future.X_jj, ...) [13:13:42.674] }) [13:13:42.674] } [13:13:42.674] }, args = future.call.arguments) [13:13:42.674] })) [13:13:42.674] future::FutureResult(value = ...future.value$value, [13:13:42.674] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:42.674] ...future.rng), globalenv = if (FALSE) [13:13:42.674] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:42.674] ...future.globalenv.names)) [13:13:42.674] else NULL, started = ...future.startTime, version = "1.8") [13:13:42.674] }, condition = base::local({ [13:13:42.674] c <- base::c [13:13:42.674] inherits <- base::inherits [13:13:42.674] invokeRestart <- base::invokeRestart [13:13:42.674] length <- base::length [13:13:42.674] list <- base::list [13:13:42.674] seq.int <- base::seq.int [13:13:42.674] signalCondition <- base::signalCondition [13:13:42.674] sys.calls <- base::sys.calls [13:13:42.674] `[[` <- base::`[[` [13:13:42.674] `+` <- base::`+` [13:13:42.674] `<<-` <- base::`<<-` [13:13:42.674] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:42.674] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:42.674] 3L)] [13:13:42.674] } [13:13:42.674] function(cond) { [13:13:42.674] is_error <- inherits(cond, "error") [13:13:42.674] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:42.674] NULL) [13:13:42.674] if (is_error) { [13:13:42.674] sessionInformation <- function() { [13:13:42.674] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:42.674] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:42.674] search = base::search(), system = base::Sys.info()) [13:13:42.674] } [13:13:42.674] ...future.conditions[[length(...future.conditions) + [13:13:42.674] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:42.674] cond$call), session = sessionInformation(), [13:13:42.674] timestamp = base::Sys.time(), signaled = 0L) [13:13:42.674] signalCondition(cond) [13:13:42.674] } [13:13:42.674] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:42.674] "immediateCondition"))) { [13:13:42.674] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:42.674] ...future.conditions[[length(...future.conditions) + [13:13:42.674] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:42.674] if (TRUE && !signal) { [13:13:42.674] muffleCondition <- function (cond, pattern = "^muffle") [13:13:42.674] { [13:13:42.674] inherits <- base::inherits [13:13:42.674] invokeRestart <- base::invokeRestart [13:13:42.674] is.null <- base::is.null [13:13:42.674] muffled <- FALSE [13:13:42.674] if (inherits(cond, "message")) { [13:13:42.674] muffled <- grepl(pattern, "muffleMessage") [13:13:42.674] if (muffled) [13:13:42.674] invokeRestart("muffleMessage") [13:13:42.674] } [13:13:42.674] else if (inherits(cond, "warning")) { [13:13:42.674] muffled <- grepl(pattern, "muffleWarning") [13:13:42.674] if (muffled) [13:13:42.674] invokeRestart("muffleWarning") [13:13:42.674] } [13:13:42.674] else if (inherits(cond, "condition")) { [13:13:42.674] if (!is.null(pattern)) { [13:13:42.674] computeRestarts <- base::computeRestarts [13:13:42.674] grepl <- base::grepl [13:13:42.674] restarts <- computeRestarts(cond) [13:13:42.674] for (restart in restarts) { [13:13:42.674] name <- restart$name [13:13:42.674] if (is.null(name)) [13:13:42.674] next [13:13:42.674] if (!grepl(pattern, name)) [13:13:42.674] next [13:13:42.674] invokeRestart(restart) [13:13:42.674] muffled <- TRUE [13:13:42.674] break [13:13:42.674] } [13:13:42.674] } [13:13:42.674] } [13:13:42.674] invisible(muffled) [13:13:42.674] } [13:13:42.674] muffleCondition(cond, pattern = "^muffle") [13:13:42.674] } [13:13:42.674] } [13:13:42.674] else { [13:13:42.674] if (TRUE) { [13:13:42.674] muffleCondition <- function (cond, pattern = "^muffle") [13:13:42.674] { [13:13:42.674] inherits <- base::inherits [13:13:42.674] invokeRestart <- base::invokeRestart [13:13:42.674] is.null <- base::is.null [13:13:42.674] muffled <- FALSE [13:13:42.674] if (inherits(cond, "message")) { [13:13:42.674] muffled <- grepl(pattern, "muffleMessage") [13:13:42.674] if (muffled) [13:13:42.674] invokeRestart("muffleMessage") [13:13:42.674] } [13:13:42.674] else if (inherits(cond, "warning")) { [13:13:42.674] muffled <- grepl(pattern, "muffleWarning") [13:13:42.674] if (muffled) [13:13:42.674] invokeRestart("muffleWarning") [13:13:42.674] } [13:13:42.674] else if (inherits(cond, "condition")) { [13:13:42.674] if (!is.null(pattern)) { [13:13:42.674] computeRestarts <- base::computeRestarts [13:13:42.674] grepl <- base::grepl [13:13:42.674] restarts <- computeRestarts(cond) [13:13:42.674] for (restart in restarts) { [13:13:42.674] name <- restart$name [13:13:42.674] if (is.null(name)) [13:13:42.674] next [13:13:42.674] if (!grepl(pattern, name)) [13:13:42.674] next [13:13:42.674] invokeRestart(restart) [13:13:42.674] muffled <- TRUE [13:13:42.674] break [13:13:42.674] } [13:13:42.674] } [13:13:42.674] } [13:13:42.674] invisible(muffled) [13:13:42.674] } [13:13:42.674] muffleCondition(cond, pattern = "^muffle") [13:13:42.674] } [13:13:42.674] } [13:13:42.674] } [13:13:42.674] })) [13:13:42.674] }, error = function(ex) { [13:13:42.674] base::structure(base::list(value = NULL, visible = NULL, [13:13:42.674] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:42.674] ...future.rng), started = ...future.startTime, [13:13:42.674] finished = Sys.time(), session_uuid = NA_character_, [13:13:42.674] version = "1.8"), class = "FutureResult") [13:13:42.674] }, finally = { [13:13:42.674] if (!identical(...future.workdir, getwd())) [13:13:42.674] setwd(...future.workdir) [13:13:42.674] { [13:13:42.674] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:42.674] ...future.oldOptions$nwarnings <- NULL [13:13:42.674] } [13:13:42.674] base::options(...future.oldOptions) [13:13:42.674] if (.Platform$OS.type == "windows") { [13:13:42.674] old_names <- names(...future.oldEnvVars) [13:13:42.674] envs <- base::Sys.getenv() [13:13:42.674] names <- names(envs) [13:13:42.674] common <- intersect(names, old_names) [13:13:42.674] added <- setdiff(names, old_names) [13:13:42.674] removed <- setdiff(old_names, names) [13:13:42.674] changed <- common[...future.oldEnvVars[common] != [13:13:42.674] envs[common]] [13:13:42.674] NAMES <- toupper(changed) [13:13:42.674] args <- list() [13:13:42.674] for (kk in seq_along(NAMES)) { [13:13:42.674] name <- changed[[kk]] [13:13:42.674] NAME <- NAMES[[kk]] [13:13:42.674] if (name != NAME && is.element(NAME, old_names)) [13:13:42.674] next [13:13:42.674] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:42.674] } [13:13:42.674] NAMES <- toupper(added) [13:13:42.674] for (kk in seq_along(NAMES)) { [13:13:42.674] name <- added[[kk]] [13:13:42.674] NAME <- NAMES[[kk]] [13:13:42.674] if (name != NAME && is.element(NAME, old_names)) [13:13:42.674] next [13:13:42.674] args[[name]] <- "" [13:13:42.674] } [13:13:42.674] NAMES <- toupper(removed) [13:13:42.674] for (kk in seq_along(NAMES)) { [13:13:42.674] name <- removed[[kk]] [13:13:42.674] NAME <- NAMES[[kk]] [13:13:42.674] if (name != NAME && is.element(NAME, old_names)) [13:13:42.674] next [13:13:42.674] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:42.674] } [13:13:42.674] if (length(args) > 0) [13:13:42.674] base::do.call(base::Sys.setenv, args = args) [13:13:42.674] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:42.674] } [13:13:42.674] else { [13:13:42.674] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:42.674] } [13:13:42.674] { [13:13:42.674] if (base::length(...future.futureOptionsAdded) > [13:13:42.674] 0L) { [13:13:42.674] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:42.674] base::names(opts) <- ...future.futureOptionsAdded [13:13:42.674] base::options(opts) [13:13:42.674] } [13:13:42.674] { [13:13:42.674] { [13:13:42.674] NULL [13:13:42.674] RNGkind("Mersenne-Twister") [13:13:42.674] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:42.674] inherits = FALSE) [13:13:42.674] } [13:13:42.674] options(future.plan = NULL) [13:13:42.674] if (is.na(NA_character_)) [13:13:42.674] Sys.unsetenv("R_FUTURE_PLAN") [13:13:42.674] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:42.674] future::plan(list(function (..., envir = parent.frame()) [13:13:42.674] { [13:13:42.674] future <- SequentialFuture(..., envir = envir) [13:13:42.674] if (!future$lazy) [13:13:42.674] future <- run(future) [13:13:42.674] invisible(future) [13:13:42.674] }), .cleanup = FALSE, .init = FALSE) [13:13:42.674] } [13:13:42.674] } [13:13:42.674] } [13:13:42.674] }) [13:13:42.674] if (TRUE) { [13:13:42.674] base::sink(type = "output", split = FALSE) [13:13:42.674] if (TRUE) { [13:13:42.674] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:42.674] } [13:13:42.674] else { [13:13:42.674] ...future.result["stdout"] <- base::list(NULL) [13:13:42.674] } [13:13:42.674] base::close(...future.stdout) [13:13:42.674] ...future.stdout <- NULL [13:13:42.674] } [13:13:42.674] ...future.result$conditions <- ...future.conditions [13:13:42.674] ...future.result$finished <- base::Sys.time() [13:13:42.674] ...future.result [13:13:42.674] } [13:13:42.676] assign_globals() ... [13:13:42.676] List of 5 [13:13:42.676] $ ...future.FUN :function (mode = "logical", length = 0L) [13:13:42.676] $ future.call.arguments :List of 1 [13:13:42.676] ..$ length: int 2 [13:13:42.676] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:42.676] $ ...future.elements_ii :List of 1 [13:13:42.676] ..$ a: chr "integer" [13:13:42.676] $ ...future.seeds_ii : NULL [13:13:42.676] $ ...future.globals.maxSize: NULL [13:13:42.676] - attr(*, "where")=List of 5 [13:13:42.676] ..$ ...future.FUN : [13:13:42.676] ..$ future.call.arguments : [13:13:42.676] ..$ ...future.elements_ii : [13:13:42.676] ..$ ...future.seeds_ii : [13:13:42.676] ..$ ...future.globals.maxSize: [13:13:42.676] - attr(*, "resolved")= logi FALSE [13:13:42.676] - attr(*, "total_size")= num 2240 [13:13:42.676] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:42.676] - attr(*, "already-done")= logi TRUE [13:13:42.681] - copied '...future.FUN' to environment [13:13:42.681] - copied 'future.call.arguments' to environment [13:13:42.681] - copied '...future.elements_ii' to environment [13:13:42.681] - copied '...future.seeds_ii' to environment [13:13:42.681] - copied '...future.globals.maxSize' to environment [13:13:42.681] assign_globals() ... done [13:13:42.681] plan(): Setting new future strategy stack: [13:13:42.682] List of future strategies: [13:13:42.682] 1. sequential: [13:13:42.682] - args: function (..., envir = parent.frame(), workers = "") [13:13:42.682] - tweaked: FALSE [13:13:42.682] - call: NULL [13:13:42.682] plan(): nbrOfWorkers() = 1 [13:13:42.683] plan(): Setting new future strategy stack: [13:13:42.683] List of future strategies: [13:13:42.683] 1. sequential: [13:13:42.683] - args: function (..., envir = parent.frame(), workers = "") [13:13:42.683] - tweaked: FALSE [13:13:42.683] - call: plan(strategy) [13:13:42.683] plan(): nbrOfWorkers() = 1 [13:13:42.684] SequentialFuture started (and completed) [13:13:42.684] - Launch lazy future ... done [13:13:42.684] run() for 'SequentialFuture' ... done [13:13:42.684] Created future: [13:13:42.684] SequentialFuture: [13:13:42.684] Label: 'future_lapply-1' [13:13:42.684] Expression: [13:13:42.684] { [13:13:42.684] do.call(function(...) { [13:13:42.684] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:42.684] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:42.684] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:42.684] on.exit(options(oopts), add = TRUE) [13:13:42.684] } [13:13:42.684] { [13:13:42.684] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:42.684] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:42.684] ...future.FUN(...future.X_jj, ...) [13:13:42.684] }) [13:13:42.684] } [13:13:42.684] }, args = future.call.arguments) [13:13:42.684] } [13:13:42.684] Lazy evaluation: FALSE [13:13:42.684] Asynchronous evaluation: FALSE [13:13:42.684] Local evaluation: TRUE [13:13:42.684] Environment: R_GlobalEnv [13:13:42.684] Capture standard output: TRUE [13:13:42.684] Capture condition classes: 'condition' (excluding 'nothing') [13:13:42.684] 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) [13:13:42.684] Packages: [13:13:42.684] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:42.684] Resolved: TRUE [13:13:42.684] Value: 56 bytes of class 'list' [13:13:42.684] Early signaling: FALSE [13:13:42.684] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:42.684] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:42.685] Chunk #1 of 4 ... DONE [13:13:42.685] Chunk #2 of 4 ... [13:13:42.685] - Finding globals in 'X' for chunk #2 ... [13:13:42.685] getGlobalsAndPackages() ... [13:13:42.685] Searching for globals... [13:13:42.686] [13:13:42.686] Searching for globals ... DONE [13:13:42.686] - globals: [0] [13:13:42.686] getGlobalsAndPackages() ... DONE [13:13:42.686] + additional globals found: [n=0] [13:13:42.686] + additional namespaces needed: [n=0] [13:13:42.686] - Finding globals in 'X' for chunk #2 ... DONE [13:13:42.686] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [13:13:42.687] - seeds: [13:13:42.687] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:42.687] getGlobalsAndPackages() ... [13:13:42.687] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:42.687] Resolving globals: FALSE [13:13:42.687] Tweak future expression to call with '...' arguments ... [13:13:42.687] { [13:13:42.687] do.call(function(...) { [13:13:42.687] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:42.687] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:42.687] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:42.687] on.exit(options(oopts), add = TRUE) [13:13:42.687] } [13:13:42.687] { [13:13:42.687] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:42.687] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:42.687] ...future.FUN(...future.X_jj, ...) [13:13:42.687] }) [13:13:42.687] } [13:13:42.687] }, args = future.call.arguments) [13:13:42.687] } [13:13:42.688] Tweak future expression to call with '...' arguments ... DONE [13:13:42.688] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:42.688] [13:13:42.688] getGlobalsAndPackages() ... DONE [13:13:42.688] run() for 'Future' ... [13:13:42.689] - state: 'created' [13:13:42.689] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:13:42.689] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:42.689] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:42.689] - Field: 'label' [13:13:42.689] - Field: 'local' [13:13:42.689] - Field: 'owner' [13:13:42.690] - Field: 'envir' [13:13:42.690] - Field: 'packages' [13:13:42.690] - Field: 'gc' [13:13:42.690] - Field: 'conditions' [13:13:42.690] - Field: 'expr' [13:13:42.690] - Field: 'uuid' [13:13:42.690] - Field: 'seed' [13:13:42.690] - Field: 'version' [13:13:42.691] - Field: 'result' [13:13:42.691] - Field: 'asynchronous' [13:13:42.691] - Field: 'calls' [13:13:42.691] - Field: 'globals' [13:13:42.691] - Field: 'stdout' [13:13:42.691] - Field: 'earlySignal' [13:13:42.691] - Field: 'lazy' [13:13:42.691] - Field: 'state' [13:13:42.692] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:42.692] - Launch lazy future ... [13:13:42.692] Packages needed by the future expression (n = 0): [13:13:42.692] Packages needed by future strategies (n = 0): [13:13:42.692] { [13:13:42.692] { [13:13:42.692] { [13:13:42.692] ...future.startTime <- base::Sys.time() [13:13:42.692] { [13:13:42.692] { [13:13:42.692] { [13:13:42.692] base::local({ [13:13:42.692] has_future <- base::requireNamespace("future", [13:13:42.692] quietly = TRUE) [13:13:42.692] if (has_future) { [13:13:42.692] ns <- base::getNamespace("future") [13:13:42.692] version <- ns[[".package"]][["version"]] [13:13:42.692] if (is.null(version)) [13:13:42.692] version <- utils::packageVersion("future") [13:13:42.692] } [13:13:42.692] else { [13:13:42.692] version <- NULL [13:13:42.692] } [13:13:42.692] if (!has_future || version < "1.8.0") { [13:13:42.692] info <- base::c(r_version = base::gsub("R version ", [13:13:42.692] "", base::R.version$version.string), [13:13:42.692] platform = base::sprintf("%s (%s-bit)", [13:13:42.692] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:42.692] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:42.692] "release", "version")], collapse = " "), [13:13:42.692] hostname = base::Sys.info()[["nodename"]]) [13:13:42.692] info <- base::sprintf("%s: %s", base::names(info), [13:13:42.692] info) [13:13:42.692] info <- base::paste(info, collapse = "; ") [13:13:42.692] if (!has_future) { [13:13:42.692] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:42.692] info) [13:13:42.692] } [13:13:42.692] else { [13:13:42.692] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:42.692] info, version) [13:13:42.692] } [13:13:42.692] base::stop(msg) [13:13:42.692] } [13:13:42.692] }) [13:13:42.692] } [13:13:42.692] options(future.plan = NULL) [13:13:42.692] Sys.unsetenv("R_FUTURE_PLAN") [13:13:42.692] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:42.692] } [13:13:42.692] ...future.workdir <- getwd() [13:13:42.692] } [13:13:42.692] ...future.oldOptions <- base::as.list(base::.Options) [13:13:42.692] ...future.oldEnvVars <- base::Sys.getenv() [13:13:42.692] } [13:13:42.692] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:42.692] future.globals.maxSize = 2097152000, future.globals.method = NULL, [13:13:42.692] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:42.692] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:42.692] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:42.692] future.stdout.windows.reencode = NULL, width = 80L) [13:13:42.692] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:42.692] base::names(...future.oldOptions)) [13:13:42.692] } [13:13:42.692] if (FALSE) { [13:13:42.692] } [13:13:42.692] else { [13:13:42.692] if (TRUE) { [13:13:42.692] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:42.692] open = "w") [13:13:42.692] } [13:13:42.692] else { [13:13:42.692] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:42.692] windows = "NUL", "/dev/null"), open = "w") [13:13:42.692] } [13:13:42.692] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:42.692] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:42.692] base::sink(type = "output", split = FALSE) [13:13:42.692] base::close(...future.stdout) [13:13:42.692] }, add = TRUE) [13:13:42.692] } [13:13:42.692] ...future.frame <- base::sys.nframe() [13:13:42.692] ...future.conditions <- base::list() [13:13:42.692] ...future.rng <- base::globalenv()$.Random.seed [13:13:42.692] if (FALSE) { [13:13:42.692] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:42.692] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:42.692] } [13:13:42.692] ...future.result <- base::tryCatch({ [13:13:42.692] base::withCallingHandlers({ [13:13:42.692] ...future.value <- base::withVisible(base::local({ [13:13:42.692] do.call(function(...) { [13:13:42.692] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:42.692] if (!identical(...future.globals.maxSize.org, [13:13:42.692] ...future.globals.maxSize)) { [13:13:42.692] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:42.692] on.exit(options(oopts), add = TRUE) [13:13:42.692] } [13:13:42.692] { [13:13:42.692] lapply(seq_along(...future.elements_ii), [13:13:42.692] FUN = function(jj) { [13:13:42.692] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:42.692] ...future.FUN(...future.X_jj, ...) [13:13:42.692] }) [13:13:42.692] } [13:13:42.692] }, args = future.call.arguments) [13:13:42.692] })) [13:13:42.692] future::FutureResult(value = ...future.value$value, [13:13:42.692] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:42.692] ...future.rng), globalenv = if (FALSE) [13:13:42.692] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:42.692] ...future.globalenv.names)) [13:13:42.692] else NULL, started = ...future.startTime, version = "1.8") [13:13:42.692] }, condition = base::local({ [13:13:42.692] c <- base::c [13:13:42.692] inherits <- base::inherits [13:13:42.692] invokeRestart <- base::invokeRestart [13:13:42.692] length <- base::length [13:13:42.692] list <- base::list [13:13:42.692] seq.int <- base::seq.int [13:13:42.692] signalCondition <- base::signalCondition [13:13:42.692] sys.calls <- base::sys.calls [13:13:42.692] `[[` <- base::`[[` [13:13:42.692] `+` <- base::`+` [13:13:42.692] `<<-` <- base::`<<-` [13:13:42.692] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:42.692] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:42.692] 3L)] [13:13:42.692] } [13:13:42.692] function(cond) { [13:13:42.692] is_error <- inherits(cond, "error") [13:13:42.692] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:42.692] NULL) [13:13:42.692] if (is_error) { [13:13:42.692] sessionInformation <- function() { [13:13:42.692] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:42.692] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:42.692] search = base::search(), system = base::Sys.info()) [13:13:42.692] } [13:13:42.692] ...future.conditions[[length(...future.conditions) + [13:13:42.692] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:42.692] cond$call), session = sessionInformation(), [13:13:42.692] timestamp = base::Sys.time(), signaled = 0L) [13:13:42.692] signalCondition(cond) [13:13:42.692] } [13:13:42.692] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:42.692] "immediateCondition"))) { [13:13:42.692] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:42.692] ...future.conditions[[length(...future.conditions) + [13:13:42.692] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:42.692] if (TRUE && !signal) { [13:13:42.692] muffleCondition <- function (cond, pattern = "^muffle") [13:13:42.692] { [13:13:42.692] inherits <- base::inherits [13:13:42.692] invokeRestart <- base::invokeRestart [13:13:42.692] is.null <- base::is.null [13:13:42.692] muffled <- FALSE [13:13:42.692] if (inherits(cond, "message")) { [13:13:42.692] muffled <- grepl(pattern, "muffleMessage") [13:13:42.692] if (muffled) [13:13:42.692] invokeRestart("muffleMessage") [13:13:42.692] } [13:13:42.692] else if (inherits(cond, "warning")) { [13:13:42.692] muffled <- grepl(pattern, "muffleWarning") [13:13:42.692] if (muffled) [13:13:42.692] invokeRestart("muffleWarning") [13:13:42.692] } [13:13:42.692] else if (inherits(cond, "condition")) { [13:13:42.692] if (!is.null(pattern)) { [13:13:42.692] computeRestarts <- base::computeRestarts [13:13:42.692] grepl <- base::grepl [13:13:42.692] restarts <- computeRestarts(cond) [13:13:42.692] for (restart in restarts) { [13:13:42.692] name <- restart$name [13:13:42.692] if (is.null(name)) [13:13:42.692] next [13:13:42.692] if (!grepl(pattern, name)) [13:13:42.692] next [13:13:42.692] invokeRestart(restart) [13:13:42.692] muffled <- TRUE [13:13:42.692] break [13:13:42.692] } [13:13:42.692] } [13:13:42.692] } [13:13:42.692] invisible(muffled) [13:13:42.692] } [13:13:42.692] muffleCondition(cond, pattern = "^muffle") [13:13:42.692] } [13:13:42.692] } [13:13:42.692] else { [13:13:42.692] if (TRUE) { [13:13:42.692] muffleCondition <- function (cond, pattern = "^muffle") [13:13:42.692] { [13:13:42.692] inherits <- base::inherits [13:13:42.692] invokeRestart <- base::invokeRestart [13:13:42.692] is.null <- base::is.null [13:13:42.692] muffled <- FALSE [13:13:42.692] if (inherits(cond, "message")) { [13:13:42.692] muffled <- grepl(pattern, "muffleMessage") [13:13:42.692] if (muffled) [13:13:42.692] invokeRestart("muffleMessage") [13:13:42.692] } [13:13:42.692] else if (inherits(cond, "warning")) { [13:13:42.692] muffled <- grepl(pattern, "muffleWarning") [13:13:42.692] if (muffled) [13:13:42.692] invokeRestart("muffleWarning") [13:13:42.692] } [13:13:42.692] else if (inherits(cond, "condition")) { [13:13:42.692] if (!is.null(pattern)) { [13:13:42.692] computeRestarts <- base::computeRestarts [13:13:42.692] grepl <- base::grepl [13:13:42.692] restarts <- computeRestarts(cond) [13:13:42.692] for (restart in restarts) { [13:13:42.692] name <- restart$name [13:13:42.692] if (is.null(name)) [13:13:42.692] next [13:13:42.692] if (!grepl(pattern, name)) [13:13:42.692] next [13:13:42.692] invokeRestart(restart) [13:13:42.692] muffled <- TRUE [13:13:42.692] break [13:13:42.692] } [13:13:42.692] } [13:13:42.692] } [13:13:42.692] invisible(muffled) [13:13:42.692] } [13:13:42.692] muffleCondition(cond, pattern = "^muffle") [13:13:42.692] } [13:13:42.692] } [13:13:42.692] } [13:13:42.692] })) [13:13:42.692] }, error = function(ex) { [13:13:42.692] base::structure(base::list(value = NULL, visible = NULL, [13:13:42.692] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:42.692] ...future.rng), started = ...future.startTime, [13:13:42.692] finished = Sys.time(), session_uuid = NA_character_, [13:13:42.692] version = "1.8"), class = "FutureResult") [13:13:42.692] }, finally = { [13:13:42.692] if (!identical(...future.workdir, getwd())) [13:13:42.692] setwd(...future.workdir) [13:13:42.692] { [13:13:42.692] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:42.692] ...future.oldOptions$nwarnings <- NULL [13:13:42.692] } [13:13:42.692] base::options(...future.oldOptions) [13:13:42.692] if (.Platform$OS.type == "windows") { [13:13:42.692] old_names <- names(...future.oldEnvVars) [13:13:42.692] envs <- base::Sys.getenv() [13:13:42.692] names <- names(envs) [13:13:42.692] common <- intersect(names, old_names) [13:13:42.692] added <- setdiff(names, old_names) [13:13:42.692] removed <- setdiff(old_names, names) [13:13:42.692] changed <- common[...future.oldEnvVars[common] != [13:13:42.692] envs[common]] [13:13:42.692] NAMES <- toupper(changed) [13:13:42.692] args <- list() [13:13:42.692] for (kk in seq_along(NAMES)) { [13:13:42.692] name <- changed[[kk]] [13:13:42.692] NAME <- NAMES[[kk]] [13:13:42.692] if (name != NAME && is.element(NAME, old_names)) [13:13:42.692] next [13:13:42.692] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:42.692] } [13:13:42.692] NAMES <- toupper(added) [13:13:42.692] for (kk in seq_along(NAMES)) { [13:13:42.692] name <- added[[kk]] [13:13:42.692] NAME <- NAMES[[kk]] [13:13:42.692] if (name != NAME && is.element(NAME, old_names)) [13:13:42.692] next [13:13:42.692] args[[name]] <- "" [13:13:42.692] } [13:13:42.692] NAMES <- toupper(removed) [13:13:42.692] for (kk in seq_along(NAMES)) { [13:13:42.692] name <- removed[[kk]] [13:13:42.692] NAME <- NAMES[[kk]] [13:13:42.692] if (name != NAME && is.element(NAME, old_names)) [13:13:42.692] next [13:13:42.692] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:42.692] } [13:13:42.692] if (length(args) > 0) [13:13:42.692] base::do.call(base::Sys.setenv, args = args) [13:13:42.692] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:42.692] } [13:13:42.692] else { [13:13:42.692] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:42.692] } [13:13:42.692] { [13:13:42.692] if (base::length(...future.futureOptionsAdded) > [13:13:42.692] 0L) { [13:13:42.692] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:42.692] base::names(opts) <- ...future.futureOptionsAdded [13:13:42.692] base::options(opts) [13:13:42.692] } [13:13:42.692] { [13:13:42.692] { [13:13:42.692] NULL [13:13:42.692] RNGkind("Mersenne-Twister") [13:13:42.692] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:42.692] inherits = FALSE) [13:13:42.692] } [13:13:42.692] options(future.plan = NULL) [13:13:42.692] if (is.na(NA_character_)) [13:13:42.692] Sys.unsetenv("R_FUTURE_PLAN") [13:13:42.692] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:42.692] future::plan(list(function (..., envir = parent.frame()) [13:13:42.692] { [13:13:42.692] future <- SequentialFuture(..., envir = envir) [13:13:42.692] if (!future$lazy) [13:13:42.692] future <- run(future) [13:13:42.692] invisible(future) [13:13:42.692] }), .cleanup = FALSE, .init = FALSE) [13:13:42.692] } [13:13:42.692] } [13:13:42.692] } [13:13:42.692] }) [13:13:42.692] if (TRUE) { [13:13:42.692] base::sink(type = "output", split = FALSE) [13:13:42.692] if (TRUE) { [13:13:42.692] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:42.692] } [13:13:42.692] else { [13:13:42.692] ...future.result["stdout"] <- base::list(NULL) [13:13:42.692] } [13:13:42.692] base::close(...future.stdout) [13:13:42.692] ...future.stdout <- NULL [13:13:42.692] } [13:13:42.692] ...future.result$conditions <- ...future.conditions [13:13:42.692] ...future.result$finished <- base::Sys.time() [13:13:42.692] ...future.result [13:13:42.692] } [13:13:42.695] assign_globals() ... [13:13:42.695] List of 5 [13:13:42.695] $ ...future.FUN :function (mode = "logical", length = 0L) [13:13:42.695] $ future.call.arguments :List of 1 [13:13:42.695] ..$ length: int 2 [13:13:42.695] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:42.695] $ ...future.elements_ii :List of 1 [13:13:42.695] ..$ b: chr "numeric" [13:13:42.695] $ ...future.seeds_ii : NULL [13:13:42.695] $ ...future.globals.maxSize: NULL [13:13:42.695] - attr(*, "where")=List of 5 [13:13:42.695] ..$ ...future.FUN : [13:13:42.695] ..$ future.call.arguments : [13:13:42.695] ..$ ...future.elements_ii : [13:13:42.695] ..$ ...future.seeds_ii : [13:13:42.695] ..$ ...future.globals.maxSize: [13:13:42.695] - attr(*, "resolved")= logi FALSE [13:13:42.695] - attr(*, "total_size")= num 2240 [13:13:42.695] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:42.695] - attr(*, "already-done")= logi TRUE [13:13:42.699] - copied '...future.FUN' to environment [13:13:42.700] - copied 'future.call.arguments' to environment [13:13:42.700] - copied '...future.elements_ii' to environment [13:13:42.700] - copied '...future.seeds_ii' to environment [13:13:42.700] - copied '...future.globals.maxSize' to environment [13:13:42.700] assign_globals() ... done [13:13:42.700] plan(): Setting new future strategy stack: [13:13:42.700] List of future strategies: [13:13:42.700] 1. sequential: [13:13:42.700] - args: function (..., envir = parent.frame(), workers = "") [13:13:42.700] - tweaked: FALSE [13:13:42.700] - call: NULL [13:13:42.701] plan(): nbrOfWorkers() = 1 [13:13:42.702] plan(): Setting new future strategy stack: [13:13:42.702] List of future strategies: [13:13:42.702] 1. sequential: [13:13:42.702] - args: function (..., envir = parent.frame(), workers = "") [13:13:42.702] - tweaked: FALSE [13:13:42.702] - call: plan(strategy) [13:13:42.702] plan(): nbrOfWorkers() = 1 [13:13:42.702] SequentialFuture started (and completed) [13:13:42.703] - Launch lazy future ... done [13:13:42.703] run() for 'SequentialFuture' ... done [13:13:42.703] Created future: [13:13:42.703] SequentialFuture: [13:13:42.703] Label: 'future_lapply-2' [13:13:42.703] Expression: [13:13:42.703] { [13:13:42.703] do.call(function(...) { [13:13:42.703] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:42.703] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:42.703] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:42.703] on.exit(options(oopts), add = TRUE) [13:13:42.703] } [13:13:42.703] { [13:13:42.703] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:42.703] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:42.703] ...future.FUN(...future.X_jj, ...) [13:13:42.703] }) [13:13:42.703] } [13:13:42.703] }, args = future.call.arguments) [13:13:42.703] } [13:13:42.703] Lazy evaluation: FALSE [13:13:42.703] Asynchronous evaluation: FALSE [13:13:42.703] Local evaluation: TRUE [13:13:42.703] Environment: R_GlobalEnv [13:13:42.703] Capture standard output: TRUE [13:13:42.703] Capture condition classes: 'condition' (excluding 'nothing') [13:13:42.703] 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) [13:13:42.703] Packages: [13:13:42.703] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:42.703] Resolved: TRUE [13:13:42.703] Value: 64 bytes of class 'list' [13:13:42.703] Early signaling: FALSE [13:13:42.703] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:42.703] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:42.704] Chunk #2 of 4 ... DONE [13:13:42.704] Chunk #3 of 4 ... [13:13:42.704] - Finding globals in 'X' for chunk #3 ... [13:13:42.704] getGlobalsAndPackages() ... [13:13:42.704] Searching for globals... [13:13:42.705] [13:13:42.705] Searching for globals ... DONE [13:13:42.705] - globals: [0] [13:13:42.705] getGlobalsAndPackages() ... DONE [13:13:42.705] + additional globals found: [n=0] [13:13:42.705] + additional namespaces needed: [n=0] [13:13:42.705] - Finding globals in 'X' for chunk #3 ... DONE [13:13:42.705] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [13:13:42.705] - seeds: [13:13:42.706] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:42.706] getGlobalsAndPackages() ... [13:13:42.706] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:42.706] Resolving globals: FALSE [13:13:42.706] Tweak future expression to call with '...' arguments ... [13:13:42.706] { [13:13:42.706] do.call(function(...) { [13:13:42.706] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:42.706] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:42.706] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:42.706] on.exit(options(oopts), add = TRUE) [13:13:42.706] } [13:13:42.706] { [13:13:42.706] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:42.706] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:42.706] ...future.FUN(...future.X_jj, ...) [13:13:42.706] }) [13:13:42.706] } [13:13:42.706] }, args = future.call.arguments) [13:13:42.706] } [13:13:42.706] Tweak future expression to call with '...' arguments ... DONE [13:13:42.707] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:42.707] [13:13:42.707] getGlobalsAndPackages() ... DONE [13:13:42.707] run() for 'Future' ... [13:13:42.707] - state: 'created' [13:13:42.708] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:13:42.708] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:42.708] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:42.708] - Field: 'label' [13:13:42.708] - Field: 'local' [13:13:42.708] - Field: 'owner' [13:13:42.708] - Field: 'envir' [13:13:42.709] - Field: 'packages' [13:13:42.709] - Field: 'gc' [13:13:42.709] - Field: 'conditions' [13:13:42.709] - Field: 'expr' [13:13:42.709] - Field: 'uuid' [13:13:42.709] - Field: 'seed' [13:13:42.709] - Field: 'version' [13:13:42.709] - Field: 'result' [13:13:42.710] - Field: 'asynchronous' [13:13:42.710] - Field: 'calls' [13:13:42.710] - Field: 'globals' [13:13:42.710] - Field: 'stdout' [13:13:42.710] - Field: 'earlySignal' [13:13:42.710] - Field: 'lazy' [13:13:42.710] - Field: 'state' [13:13:42.710] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:42.711] - Launch lazy future ... [13:13:42.711] Packages needed by the future expression (n = 0): [13:13:42.711] Packages needed by future strategies (n = 0): [13:13:42.711] { [13:13:42.711] { [13:13:42.711] { [13:13:42.711] ...future.startTime <- base::Sys.time() [13:13:42.711] { [13:13:42.711] { [13:13:42.711] { [13:13:42.711] base::local({ [13:13:42.711] has_future <- base::requireNamespace("future", [13:13:42.711] quietly = TRUE) [13:13:42.711] if (has_future) { [13:13:42.711] ns <- base::getNamespace("future") [13:13:42.711] version <- ns[[".package"]][["version"]] [13:13:42.711] if (is.null(version)) [13:13:42.711] version <- utils::packageVersion("future") [13:13:42.711] } [13:13:42.711] else { [13:13:42.711] version <- NULL [13:13:42.711] } [13:13:42.711] if (!has_future || version < "1.8.0") { [13:13:42.711] info <- base::c(r_version = base::gsub("R version ", [13:13:42.711] "", base::R.version$version.string), [13:13:42.711] platform = base::sprintf("%s (%s-bit)", [13:13:42.711] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:42.711] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:42.711] "release", "version")], collapse = " "), [13:13:42.711] hostname = base::Sys.info()[["nodename"]]) [13:13:42.711] info <- base::sprintf("%s: %s", base::names(info), [13:13:42.711] info) [13:13:42.711] info <- base::paste(info, collapse = "; ") [13:13:42.711] if (!has_future) { [13:13:42.711] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:42.711] info) [13:13:42.711] } [13:13:42.711] else { [13:13:42.711] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:42.711] info, version) [13:13:42.711] } [13:13:42.711] base::stop(msg) [13:13:42.711] } [13:13:42.711] }) [13:13:42.711] } [13:13:42.711] options(future.plan = NULL) [13:13:42.711] Sys.unsetenv("R_FUTURE_PLAN") [13:13:42.711] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:42.711] } [13:13:42.711] ...future.workdir <- getwd() [13:13:42.711] } [13:13:42.711] ...future.oldOptions <- base::as.list(base::.Options) [13:13:42.711] ...future.oldEnvVars <- base::Sys.getenv() [13:13:42.711] } [13:13:42.711] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:42.711] future.globals.maxSize = 2097152000, future.globals.method = NULL, [13:13:42.711] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:42.711] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:42.711] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:42.711] future.stdout.windows.reencode = NULL, width = 80L) [13:13:42.711] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:42.711] base::names(...future.oldOptions)) [13:13:42.711] } [13:13:42.711] if (FALSE) { [13:13:42.711] } [13:13:42.711] else { [13:13:42.711] if (TRUE) { [13:13:42.711] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:42.711] open = "w") [13:13:42.711] } [13:13:42.711] else { [13:13:42.711] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:42.711] windows = "NUL", "/dev/null"), open = "w") [13:13:42.711] } [13:13:42.711] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:42.711] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:42.711] base::sink(type = "output", split = FALSE) [13:13:42.711] base::close(...future.stdout) [13:13:42.711] }, add = TRUE) [13:13:42.711] } [13:13:42.711] ...future.frame <- base::sys.nframe() [13:13:42.711] ...future.conditions <- base::list() [13:13:42.711] ...future.rng <- base::globalenv()$.Random.seed [13:13:42.711] if (FALSE) { [13:13:42.711] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:42.711] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:42.711] } [13:13:42.711] ...future.result <- base::tryCatch({ [13:13:42.711] base::withCallingHandlers({ [13:13:42.711] ...future.value <- base::withVisible(base::local({ [13:13:42.711] do.call(function(...) { [13:13:42.711] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:42.711] if (!identical(...future.globals.maxSize.org, [13:13:42.711] ...future.globals.maxSize)) { [13:13:42.711] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:42.711] on.exit(options(oopts), add = TRUE) [13:13:42.711] } [13:13:42.711] { [13:13:42.711] lapply(seq_along(...future.elements_ii), [13:13:42.711] FUN = function(jj) { [13:13:42.711] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:42.711] ...future.FUN(...future.X_jj, ...) [13:13:42.711] }) [13:13:42.711] } [13:13:42.711] }, args = future.call.arguments) [13:13:42.711] })) [13:13:42.711] future::FutureResult(value = ...future.value$value, [13:13:42.711] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:42.711] ...future.rng), globalenv = if (FALSE) [13:13:42.711] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:42.711] ...future.globalenv.names)) [13:13:42.711] else NULL, started = ...future.startTime, version = "1.8") [13:13:42.711] }, condition = base::local({ [13:13:42.711] c <- base::c [13:13:42.711] inherits <- base::inherits [13:13:42.711] invokeRestart <- base::invokeRestart [13:13:42.711] length <- base::length [13:13:42.711] list <- base::list [13:13:42.711] seq.int <- base::seq.int [13:13:42.711] signalCondition <- base::signalCondition [13:13:42.711] sys.calls <- base::sys.calls [13:13:42.711] `[[` <- base::`[[` [13:13:42.711] `+` <- base::`+` [13:13:42.711] `<<-` <- base::`<<-` [13:13:42.711] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:42.711] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:42.711] 3L)] [13:13:42.711] } [13:13:42.711] function(cond) { [13:13:42.711] is_error <- inherits(cond, "error") [13:13:42.711] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:42.711] NULL) [13:13:42.711] if (is_error) { [13:13:42.711] sessionInformation <- function() { [13:13:42.711] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:42.711] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:42.711] search = base::search(), system = base::Sys.info()) [13:13:42.711] } [13:13:42.711] ...future.conditions[[length(...future.conditions) + [13:13:42.711] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:42.711] cond$call), session = sessionInformation(), [13:13:42.711] timestamp = base::Sys.time(), signaled = 0L) [13:13:42.711] signalCondition(cond) [13:13:42.711] } [13:13:42.711] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:42.711] "immediateCondition"))) { [13:13:42.711] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:42.711] ...future.conditions[[length(...future.conditions) + [13:13:42.711] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:42.711] if (TRUE && !signal) { [13:13:42.711] muffleCondition <- function (cond, pattern = "^muffle") [13:13:42.711] { [13:13:42.711] inherits <- base::inherits [13:13:42.711] invokeRestart <- base::invokeRestart [13:13:42.711] is.null <- base::is.null [13:13:42.711] muffled <- FALSE [13:13:42.711] if (inherits(cond, "message")) { [13:13:42.711] muffled <- grepl(pattern, "muffleMessage") [13:13:42.711] if (muffled) [13:13:42.711] invokeRestart("muffleMessage") [13:13:42.711] } [13:13:42.711] else if (inherits(cond, "warning")) { [13:13:42.711] muffled <- grepl(pattern, "muffleWarning") [13:13:42.711] if (muffled) [13:13:42.711] invokeRestart("muffleWarning") [13:13:42.711] } [13:13:42.711] else if (inherits(cond, "condition")) { [13:13:42.711] if (!is.null(pattern)) { [13:13:42.711] computeRestarts <- base::computeRestarts [13:13:42.711] grepl <- base::grepl [13:13:42.711] restarts <- computeRestarts(cond) [13:13:42.711] for (restart in restarts) { [13:13:42.711] name <- restart$name [13:13:42.711] if (is.null(name)) [13:13:42.711] next [13:13:42.711] if (!grepl(pattern, name)) [13:13:42.711] next [13:13:42.711] invokeRestart(restart) [13:13:42.711] muffled <- TRUE [13:13:42.711] break [13:13:42.711] } [13:13:42.711] } [13:13:42.711] } [13:13:42.711] invisible(muffled) [13:13:42.711] } [13:13:42.711] muffleCondition(cond, pattern = "^muffle") [13:13:42.711] } [13:13:42.711] } [13:13:42.711] else { [13:13:42.711] if (TRUE) { [13:13:42.711] muffleCondition <- function (cond, pattern = "^muffle") [13:13:42.711] { [13:13:42.711] inherits <- base::inherits [13:13:42.711] invokeRestart <- base::invokeRestart [13:13:42.711] is.null <- base::is.null [13:13:42.711] muffled <- FALSE [13:13:42.711] if (inherits(cond, "message")) { [13:13:42.711] muffled <- grepl(pattern, "muffleMessage") [13:13:42.711] if (muffled) [13:13:42.711] invokeRestart("muffleMessage") [13:13:42.711] } [13:13:42.711] else if (inherits(cond, "warning")) { [13:13:42.711] muffled <- grepl(pattern, "muffleWarning") [13:13:42.711] if (muffled) [13:13:42.711] invokeRestart("muffleWarning") [13:13:42.711] } [13:13:42.711] else if (inherits(cond, "condition")) { [13:13:42.711] if (!is.null(pattern)) { [13:13:42.711] computeRestarts <- base::computeRestarts [13:13:42.711] grepl <- base::grepl [13:13:42.711] restarts <- computeRestarts(cond) [13:13:42.711] for (restart in restarts) { [13:13:42.711] name <- restart$name [13:13:42.711] if (is.null(name)) [13:13:42.711] next [13:13:42.711] if (!grepl(pattern, name)) [13:13:42.711] next [13:13:42.711] invokeRestart(restart) [13:13:42.711] muffled <- TRUE [13:13:42.711] break [13:13:42.711] } [13:13:42.711] } [13:13:42.711] } [13:13:42.711] invisible(muffled) [13:13:42.711] } [13:13:42.711] muffleCondition(cond, pattern = "^muffle") [13:13:42.711] } [13:13:42.711] } [13:13:42.711] } [13:13:42.711] })) [13:13:42.711] }, error = function(ex) { [13:13:42.711] base::structure(base::list(value = NULL, visible = NULL, [13:13:42.711] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:42.711] ...future.rng), started = ...future.startTime, [13:13:42.711] finished = Sys.time(), session_uuid = NA_character_, [13:13:42.711] version = "1.8"), class = "FutureResult") [13:13:42.711] }, finally = { [13:13:42.711] if (!identical(...future.workdir, getwd())) [13:13:42.711] setwd(...future.workdir) [13:13:42.711] { [13:13:42.711] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:42.711] ...future.oldOptions$nwarnings <- NULL [13:13:42.711] } [13:13:42.711] base::options(...future.oldOptions) [13:13:42.711] if (.Platform$OS.type == "windows") { [13:13:42.711] old_names <- names(...future.oldEnvVars) [13:13:42.711] envs <- base::Sys.getenv() [13:13:42.711] names <- names(envs) [13:13:42.711] common <- intersect(names, old_names) [13:13:42.711] added <- setdiff(names, old_names) [13:13:42.711] removed <- setdiff(old_names, names) [13:13:42.711] changed <- common[...future.oldEnvVars[common] != [13:13:42.711] envs[common]] [13:13:42.711] NAMES <- toupper(changed) [13:13:42.711] args <- list() [13:13:42.711] for (kk in seq_along(NAMES)) { [13:13:42.711] name <- changed[[kk]] [13:13:42.711] NAME <- NAMES[[kk]] [13:13:42.711] if (name != NAME && is.element(NAME, old_names)) [13:13:42.711] next [13:13:42.711] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:42.711] } [13:13:42.711] NAMES <- toupper(added) [13:13:42.711] for (kk in seq_along(NAMES)) { [13:13:42.711] name <- added[[kk]] [13:13:42.711] NAME <- NAMES[[kk]] [13:13:42.711] if (name != NAME && is.element(NAME, old_names)) [13:13:42.711] next [13:13:42.711] args[[name]] <- "" [13:13:42.711] } [13:13:42.711] NAMES <- toupper(removed) [13:13:42.711] for (kk in seq_along(NAMES)) { [13:13:42.711] name <- removed[[kk]] [13:13:42.711] NAME <- NAMES[[kk]] [13:13:42.711] if (name != NAME && is.element(NAME, old_names)) [13:13:42.711] next [13:13:42.711] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:42.711] } [13:13:42.711] if (length(args) > 0) [13:13:42.711] base::do.call(base::Sys.setenv, args = args) [13:13:42.711] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:42.711] } [13:13:42.711] else { [13:13:42.711] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:42.711] } [13:13:42.711] { [13:13:42.711] if (base::length(...future.futureOptionsAdded) > [13:13:42.711] 0L) { [13:13:42.711] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:42.711] base::names(opts) <- ...future.futureOptionsAdded [13:13:42.711] base::options(opts) [13:13:42.711] } [13:13:42.711] { [13:13:42.711] { [13:13:42.711] NULL [13:13:42.711] RNGkind("Mersenne-Twister") [13:13:42.711] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:42.711] inherits = FALSE) [13:13:42.711] } [13:13:42.711] options(future.plan = NULL) [13:13:42.711] if (is.na(NA_character_)) [13:13:42.711] Sys.unsetenv("R_FUTURE_PLAN") [13:13:42.711] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:42.711] future::plan(list(function (..., envir = parent.frame()) [13:13:42.711] { [13:13:42.711] future <- SequentialFuture(..., envir = envir) [13:13:42.711] if (!future$lazy) [13:13:42.711] future <- run(future) [13:13:42.711] invisible(future) [13:13:42.711] }), .cleanup = FALSE, .init = FALSE) [13:13:42.711] } [13:13:42.711] } [13:13:42.711] } [13:13:42.711] }) [13:13:42.711] if (TRUE) { [13:13:42.711] base::sink(type = "output", split = FALSE) [13:13:42.711] if (TRUE) { [13:13:42.711] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:42.711] } [13:13:42.711] else { [13:13:42.711] ...future.result["stdout"] <- base::list(NULL) [13:13:42.711] } [13:13:42.711] base::close(...future.stdout) [13:13:42.711] ...future.stdout <- NULL [13:13:42.711] } [13:13:42.711] ...future.result$conditions <- ...future.conditions [13:13:42.711] ...future.result$finished <- base::Sys.time() [13:13:42.711] ...future.result [13:13:42.711] } [13:13:42.714] assign_globals() ... [13:13:42.714] List of 5 [13:13:42.714] $ ...future.FUN :function (mode = "logical", length = 0L) [13:13:42.714] $ future.call.arguments :List of 1 [13:13:42.714] ..$ length: int 2 [13:13:42.714] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:42.714] $ ...future.elements_ii :List of 1 [13:13:42.714] ..$ c: chr "character" [13:13:42.714] $ ...future.seeds_ii : NULL [13:13:42.714] $ ...future.globals.maxSize: NULL [13:13:42.714] - attr(*, "where")=List of 5 [13:13:42.714] ..$ ...future.FUN : [13:13:42.714] ..$ future.call.arguments : [13:13:42.714] ..$ ...future.elements_ii : [13:13:42.714] ..$ ...future.seeds_ii : [13:13:42.714] ..$ ...future.globals.maxSize: [13:13:42.714] - attr(*, "resolved")= logi FALSE [13:13:42.714] - attr(*, "total_size")= num 2240 [13:13:42.714] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:42.714] - attr(*, "already-done")= logi TRUE [13:13:42.720] - copied '...future.FUN' to environment [13:13:42.720] - copied 'future.call.arguments' to environment [13:13:42.720] - copied '...future.elements_ii' to environment [13:13:42.720] - copied '...future.seeds_ii' to environment [13:13:42.720] - copied '...future.globals.maxSize' to environment [13:13:42.720] assign_globals() ... done [13:13:42.721] plan(): Setting new future strategy stack: [13:13:42.721] List of future strategies: [13:13:42.721] 1. sequential: [13:13:42.721] - args: function (..., envir = parent.frame(), workers = "") [13:13:42.721] - tweaked: FALSE [13:13:42.721] - call: NULL [13:13:42.721] plan(): nbrOfWorkers() = 1 [13:13:42.722] plan(): Setting new future strategy stack: [13:13:42.722] List of future strategies: [13:13:42.722] 1. sequential: [13:13:42.722] - args: function (..., envir = parent.frame(), workers = "") [13:13:42.722] - tweaked: FALSE [13:13:42.722] - call: plan(strategy) [13:13:42.722] plan(): nbrOfWorkers() = 1 [13:13:42.723] SequentialFuture started (and completed) [13:13:42.723] - Launch lazy future ... done [13:13:42.723] run() for 'SequentialFuture' ... done [13:13:42.723] Created future: [13:13:42.723] SequentialFuture: [13:13:42.723] Label: 'future_lapply-3' [13:13:42.723] Expression: [13:13:42.723] { [13:13:42.723] do.call(function(...) { [13:13:42.723] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:42.723] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:42.723] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:42.723] on.exit(options(oopts), add = TRUE) [13:13:42.723] } [13:13:42.723] { [13:13:42.723] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:42.723] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:42.723] ...future.FUN(...future.X_jj, ...) [13:13:42.723] }) [13:13:42.723] } [13:13:42.723] }, args = future.call.arguments) [13:13:42.723] } [13:13:42.723] Lazy evaluation: FALSE [13:13:42.723] Asynchronous evaluation: FALSE [13:13:42.723] Local evaluation: TRUE [13:13:42.723] Environment: R_GlobalEnv [13:13:42.723] Capture standard output: TRUE [13:13:42.723] Capture condition classes: 'condition' (excluding 'nothing') [13:13:42.723] 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) [13:13:42.723] Packages: [13:13:42.723] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:42.723] Resolved: TRUE [13:13:42.723] Value: 120 bytes of class 'list' [13:13:42.723] Early signaling: FALSE [13:13:42.723] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:42.723] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:42.724] Chunk #3 of 4 ... DONE [13:13:42.724] Chunk #4 of 4 ... [13:13:42.724] - Finding globals in 'X' for chunk #4 ... [13:13:42.724] getGlobalsAndPackages() ... [13:13:42.725] Searching for globals... [13:13:42.725] [13:13:42.725] Searching for globals ... DONE [13:13:42.725] - globals: [0] [13:13:42.725] getGlobalsAndPackages() ... DONE [13:13:42.725] + additional globals found: [n=0] [13:13:42.725] + additional namespaces needed: [n=0] [13:13:42.725] - Finding globals in 'X' for chunk #4 ... DONE [13:13:42.726] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [13:13:42.726] - seeds: [13:13:42.726] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:42.726] getGlobalsAndPackages() ... [13:13:42.726] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:42.726] Resolving globals: FALSE [13:13:42.726] Tweak future expression to call with '...' arguments ... [13:13:42.727] { [13:13:42.727] do.call(function(...) { [13:13:42.727] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:42.727] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:42.727] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:42.727] on.exit(options(oopts), add = TRUE) [13:13:42.727] } [13:13:42.727] { [13:13:42.727] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:42.727] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:42.727] ...future.FUN(...future.X_jj, ...) [13:13:42.727] }) [13:13:42.727] } [13:13:42.727] }, args = future.call.arguments) [13:13:42.727] } [13:13:42.727] Tweak future expression to call with '...' arguments ... DONE [13:13:42.727] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:42.727] [13:13:42.728] getGlobalsAndPackages() ... DONE [13:13:42.728] run() for 'Future' ... [13:13:42.728] - state: 'created' [13:13:42.728] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:13:42.728] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:42.728] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:42.729] - Field: 'label' [13:13:42.729] - Field: 'local' [13:13:42.729] - Field: 'owner' [13:13:42.729] - Field: 'envir' [13:13:42.729] - Field: 'packages' [13:13:42.729] - Field: 'gc' [13:13:42.729] - Field: 'conditions' [13:13:42.729] - Field: 'expr' [13:13:42.730] - Field: 'uuid' [13:13:42.730] - Field: 'seed' [13:13:42.730] - Field: 'version' [13:13:42.730] - Field: 'result' [13:13:42.730] - Field: 'asynchronous' [13:13:42.730] - Field: 'calls' [13:13:42.730] - Field: 'globals' [13:13:42.730] - Field: 'stdout' [13:13:42.731] - Field: 'earlySignal' [13:13:42.731] - Field: 'lazy' [13:13:42.731] - Field: 'state' [13:13:42.731] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:42.731] - Launch lazy future ... [13:13:42.731] Packages needed by the future expression (n = 0): [13:13:42.731] Packages needed by future strategies (n = 0): [13:13:42.732] { [13:13:42.732] { [13:13:42.732] { [13:13:42.732] ...future.startTime <- base::Sys.time() [13:13:42.732] { [13:13:42.732] { [13:13:42.732] { [13:13:42.732] base::local({ [13:13:42.732] has_future <- base::requireNamespace("future", [13:13:42.732] quietly = TRUE) [13:13:42.732] if (has_future) { [13:13:42.732] ns <- base::getNamespace("future") [13:13:42.732] version <- ns[[".package"]][["version"]] [13:13:42.732] if (is.null(version)) [13:13:42.732] version <- utils::packageVersion("future") [13:13:42.732] } [13:13:42.732] else { [13:13:42.732] version <- NULL [13:13:42.732] } [13:13:42.732] if (!has_future || version < "1.8.0") { [13:13:42.732] info <- base::c(r_version = base::gsub("R version ", [13:13:42.732] "", base::R.version$version.string), [13:13:42.732] platform = base::sprintf("%s (%s-bit)", [13:13:42.732] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:42.732] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:42.732] "release", "version")], collapse = " "), [13:13:42.732] hostname = base::Sys.info()[["nodename"]]) [13:13:42.732] info <- base::sprintf("%s: %s", base::names(info), [13:13:42.732] info) [13:13:42.732] info <- base::paste(info, collapse = "; ") [13:13:42.732] if (!has_future) { [13:13:42.732] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:42.732] info) [13:13:42.732] } [13:13:42.732] else { [13:13:42.732] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:42.732] info, version) [13:13:42.732] } [13:13:42.732] base::stop(msg) [13:13:42.732] } [13:13:42.732] }) [13:13:42.732] } [13:13:42.732] options(future.plan = NULL) [13:13:42.732] Sys.unsetenv("R_FUTURE_PLAN") [13:13:42.732] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:42.732] } [13:13:42.732] ...future.workdir <- getwd() [13:13:42.732] } [13:13:42.732] ...future.oldOptions <- base::as.list(base::.Options) [13:13:42.732] ...future.oldEnvVars <- base::Sys.getenv() [13:13:42.732] } [13:13:42.732] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:42.732] future.globals.maxSize = 2097152000, future.globals.method = NULL, [13:13:42.732] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:42.732] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:42.732] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:42.732] future.stdout.windows.reencode = NULL, width = 80L) [13:13:42.732] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:42.732] base::names(...future.oldOptions)) [13:13:42.732] } [13:13:42.732] if (FALSE) { [13:13:42.732] } [13:13:42.732] else { [13:13:42.732] if (TRUE) { [13:13:42.732] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:42.732] open = "w") [13:13:42.732] } [13:13:42.732] else { [13:13:42.732] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:42.732] windows = "NUL", "/dev/null"), open = "w") [13:13:42.732] } [13:13:42.732] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:42.732] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:42.732] base::sink(type = "output", split = FALSE) [13:13:42.732] base::close(...future.stdout) [13:13:42.732] }, add = TRUE) [13:13:42.732] } [13:13:42.732] ...future.frame <- base::sys.nframe() [13:13:42.732] ...future.conditions <- base::list() [13:13:42.732] ...future.rng <- base::globalenv()$.Random.seed [13:13:42.732] if (FALSE) { [13:13:42.732] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:42.732] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:42.732] } [13:13:42.732] ...future.result <- base::tryCatch({ [13:13:42.732] base::withCallingHandlers({ [13:13:42.732] ...future.value <- base::withVisible(base::local({ [13:13:42.732] do.call(function(...) { [13:13:42.732] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:42.732] if (!identical(...future.globals.maxSize.org, [13:13:42.732] ...future.globals.maxSize)) { [13:13:42.732] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:42.732] on.exit(options(oopts), add = TRUE) [13:13:42.732] } [13:13:42.732] { [13:13:42.732] lapply(seq_along(...future.elements_ii), [13:13:42.732] FUN = function(jj) { [13:13:42.732] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:42.732] ...future.FUN(...future.X_jj, ...) [13:13:42.732] }) [13:13:42.732] } [13:13:42.732] }, args = future.call.arguments) [13:13:42.732] })) [13:13:42.732] future::FutureResult(value = ...future.value$value, [13:13:42.732] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:42.732] ...future.rng), globalenv = if (FALSE) [13:13:42.732] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:42.732] ...future.globalenv.names)) [13:13:42.732] else NULL, started = ...future.startTime, version = "1.8") [13:13:42.732] }, condition = base::local({ [13:13:42.732] c <- base::c [13:13:42.732] inherits <- base::inherits [13:13:42.732] invokeRestart <- base::invokeRestart [13:13:42.732] length <- base::length [13:13:42.732] list <- base::list [13:13:42.732] seq.int <- base::seq.int [13:13:42.732] signalCondition <- base::signalCondition [13:13:42.732] sys.calls <- base::sys.calls [13:13:42.732] `[[` <- base::`[[` [13:13:42.732] `+` <- base::`+` [13:13:42.732] `<<-` <- base::`<<-` [13:13:42.732] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:42.732] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:42.732] 3L)] [13:13:42.732] } [13:13:42.732] function(cond) { [13:13:42.732] is_error <- inherits(cond, "error") [13:13:42.732] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:42.732] NULL) [13:13:42.732] if (is_error) { [13:13:42.732] sessionInformation <- function() { [13:13:42.732] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:42.732] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:42.732] search = base::search(), system = base::Sys.info()) [13:13:42.732] } [13:13:42.732] ...future.conditions[[length(...future.conditions) + [13:13:42.732] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:42.732] cond$call), session = sessionInformation(), [13:13:42.732] timestamp = base::Sys.time(), signaled = 0L) [13:13:42.732] signalCondition(cond) [13:13:42.732] } [13:13:42.732] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:42.732] "immediateCondition"))) { [13:13:42.732] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:42.732] ...future.conditions[[length(...future.conditions) + [13:13:42.732] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:42.732] if (TRUE && !signal) { [13:13:42.732] muffleCondition <- function (cond, pattern = "^muffle") [13:13:42.732] { [13:13:42.732] inherits <- base::inherits [13:13:42.732] invokeRestart <- base::invokeRestart [13:13:42.732] is.null <- base::is.null [13:13:42.732] muffled <- FALSE [13:13:42.732] if (inherits(cond, "message")) { [13:13:42.732] muffled <- grepl(pattern, "muffleMessage") [13:13:42.732] if (muffled) [13:13:42.732] invokeRestart("muffleMessage") [13:13:42.732] } [13:13:42.732] else if (inherits(cond, "warning")) { [13:13:42.732] muffled <- grepl(pattern, "muffleWarning") [13:13:42.732] if (muffled) [13:13:42.732] invokeRestart("muffleWarning") [13:13:42.732] } [13:13:42.732] else if (inherits(cond, "condition")) { [13:13:42.732] if (!is.null(pattern)) { [13:13:42.732] computeRestarts <- base::computeRestarts [13:13:42.732] grepl <- base::grepl [13:13:42.732] restarts <- computeRestarts(cond) [13:13:42.732] for (restart in restarts) { [13:13:42.732] name <- restart$name [13:13:42.732] if (is.null(name)) [13:13:42.732] next [13:13:42.732] if (!grepl(pattern, name)) [13:13:42.732] next [13:13:42.732] invokeRestart(restart) [13:13:42.732] muffled <- TRUE [13:13:42.732] break [13:13:42.732] } [13:13:42.732] } [13:13:42.732] } [13:13:42.732] invisible(muffled) [13:13:42.732] } [13:13:42.732] muffleCondition(cond, pattern = "^muffle") [13:13:42.732] } [13:13:42.732] } [13:13:42.732] else { [13:13:42.732] if (TRUE) { [13:13:42.732] muffleCondition <- function (cond, pattern = "^muffle") [13:13:42.732] { [13:13:42.732] inherits <- base::inherits [13:13:42.732] invokeRestart <- base::invokeRestart [13:13:42.732] is.null <- base::is.null [13:13:42.732] muffled <- FALSE [13:13:42.732] if (inherits(cond, "message")) { [13:13:42.732] muffled <- grepl(pattern, "muffleMessage") [13:13:42.732] if (muffled) [13:13:42.732] invokeRestart("muffleMessage") [13:13:42.732] } [13:13:42.732] else if (inherits(cond, "warning")) { [13:13:42.732] muffled <- grepl(pattern, "muffleWarning") [13:13:42.732] if (muffled) [13:13:42.732] invokeRestart("muffleWarning") [13:13:42.732] } [13:13:42.732] else if (inherits(cond, "condition")) { [13:13:42.732] if (!is.null(pattern)) { [13:13:42.732] computeRestarts <- base::computeRestarts [13:13:42.732] grepl <- base::grepl [13:13:42.732] restarts <- computeRestarts(cond) [13:13:42.732] for (restart in restarts) { [13:13:42.732] name <- restart$name [13:13:42.732] if (is.null(name)) [13:13:42.732] next [13:13:42.732] if (!grepl(pattern, name)) [13:13:42.732] next [13:13:42.732] invokeRestart(restart) [13:13:42.732] muffled <- TRUE [13:13:42.732] break [13:13:42.732] } [13:13:42.732] } [13:13:42.732] } [13:13:42.732] invisible(muffled) [13:13:42.732] } [13:13:42.732] muffleCondition(cond, pattern = "^muffle") [13:13:42.732] } [13:13:42.732] } [13:13:42.732] } [13:13:42.732] })) [13:13:42.732] }, error = function(ex) { [13:13:42.732] base::structure(base::list(value = NULL, visible = NULL, [13:13:42.732] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:42.732] ...future.rng), started = ...future.startTime, [13:13:42.732] finished = Sys.time(), session_uuid = NA_character_, [13:13:42.732] version = "1.8"), class = "FutureResult") [13:13:42.732] }, finally = { [13:13:42.732] if (!identical(...future.workdir, getwd())) [13:13:42.732] setwd(...future.workdir) [13:13:42.732] { [13:13:42.732] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:42.732] ...future.oldOptions$nwarnings <- NULL [13:13:42.732] } [13:13:42.732] base::options(...future.oldOptions) [13:13:42.732] if (.Platform$OS.type == "windows") { [13:13:42.732] old_names <- names(...future.oldEnvVars) [13:13:42.732] envs <- base::Sys.getenv() [13:13:42.732] names <- names(envs) [13:13:42.732] common <- intersect(names, old_names) [13:13:42.732] added <- setdiff(names, old_names) [13:13:42.732] removed <- setdiff(old_names, names) [13:13:42.732] changed <- common[...future.oldEnvVars[common] != [13:13:42.732] envs[common]] [13:13:42.732] NAMES <- toupper(changed) [13:13:42.732] args <- list() [13:13:42.732] for (kk in seq_along(NAMES)) { [13:13:42.732] name <- changed[[kk]] [13:13:42.732] NAME <- NAMES[[kk]] [13:13:42.732] if (name != NAME && is.element(NAME, old_names)) [13:13:42.732] next [13:13:42.732] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:42.732] } [13:13:42.732] NAMES <- toupper(added) [13:13:42.732] for (kk in seq_along(NAMES)) { [13:13:42.732] name <- added[[kk]] [13:13:42.732] NAME <- NAMES[[kk]] [13:13:42.732] if (name != NAME && is.element(NAME, old_names)) [13:13:42.732] next [13:13:42.732] args[[name]] <- "" [13:13:42.732] } [13:13:42.732] NAMES <- toupper(removed) [13:13:42.732] for (kk in seq_along(NAMES)) { [13:13:42.732] name <- removed[[kk]] [13:13:42.732] NAME <- NAMES[[kk]] [13:13:42.732] if (name != NAME && is.element(NAME, old_names)) [13:13:42.732] next [13:13:42.732] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:42.732] } [13:13:42.732] if (length(args) > 0) [13:13:42.732] base::do.call(base::Sys.setenv, args = args) [13:13:42.732] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:42.732] } [13:13:42.732] else { [13:13:42.732] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:42.732] } [13:13:42.732] { [13:13:42.732] if (base::length(...future.futureOptionsAdded) > [13:13:42.732] 0L) { [13:13:42.732] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:42.732] base::names(opts) <- ...future.futureOptionsAdded [13:13:42.732] base::options(opts) [13:13:42.732] } [13:13:42.732] { [13:13:42.732] { [13:13:42.732] NULL [13:13:42.732] RNGkind("Mersenne-Twister") [13:13:42.732] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:42.732] inherits = FALSE) [13:13:42.732] } [13:13:42.732] options(future.plan = NULL) [13:13:42.732] if (is.na(NA_character_)) [13:13:42.732] Sys.unsetenv("R_FUTURE_PLAN") [13:13:42.732] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:42.732] future::plan(list(function (..., envir = parent.frame()) [13:13:42.732] { [13:13:42.732] future <- SequentialFuture(..., envir = envir) [13:13:42.732] if (!future$lazy) [13:13:42.732] future <- run(future) [13:13:42.732] invisible(future) [13:13:42.732] }), .cleanup = FALSE, .init = FALSE) [13:13:42.732] } [13:13:42.732] } [13:13:42.732] } [13:13:42.732] }) [13:13:42.732] if (TRUE) { [13:13:42.732] base::sink(type = "output", split = FALSE) [13:13:42.732] if (TRUE) { [13:13:42.732] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:42.732] } [13:13:42.732] else { [13:13:42.732] ...future.result["stdout"] <- base::list(NULL) [13:13:42.732] } [13:13:42.732] base::close(...future.stdout) [13:13:42.732] ...future.stdout <- NULL [13:13:42.732] } [13:13:42.732] ...future.result$conditions <- ...future.conditions [13:13:42.732] ...future.result$finished <- base::Sys.time() [13:13:42.732] ...future.result [13:13:42.732] } [13:13:42.734] assign_globals() ... [13:13:42.735] List of 5 [13:13:42.735] $ ...future.FUN :function (mode = "logical", length = 0L) [13:13:42.735] $ future.call.arguments :List of 1 [13:13:42.735] ..$ length: int 2 [13:13:42.735] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:42.735] $ ...future.elements_ii :List of 1 [13:13:42.735] ..$ c: chr "list" [13:13:42.735] $ ...future.seeds_ii : NULL [13:13:42.735] $ ...future.globals.maxSize: NULL [13:13:42.735] - attr(*, "where")=List of 5 [13:13:42.735] ..$ ...future.FUN : [13:13:42.735] ..$ future.call.arguments : [13:13:42.735] ..$ ...future.elements_ii : [13:13:42.735] ..$ ...future.seeds_ii : [13:13:42.735] ..$ ...future.globals.maxSize: [13:13:42.735] - attr(*, "resolved")= logi FALSE [13:13:42.735] - attr(*, "total_size")= num 2240 [13:13:42.735] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:42.735] - attr(*, "already-done")= logi TRUE [13:13:42.739] - copied '...future.FUN' to environment [13:13:42.739] - copied 'future.call.arguments' to environment [13:13:42.739] - copied '...future.elements_ii' to environment [13:13:42.739] - copied '...future.seeds_ii' to environment [13:13:42.739] - copied '...future.globals.maxSize' to environment [13:13:42.739] assign_globals() ... done [13:13:42.740] plan(): Setting new future strategy stack: [13:13:42.740] List of future strategies: [13:13:42.740] 1. sequential: [13:13:42.740] - args: function (..., envir = parent.frame(), workers = "") [13:13:42.740] - tweaked: FALSE [13:13:42.740] - call: NULL [13:13:42.740] plan(): nbrOfWorkers() = 1 [13:13:42.741] plan(): Setting new future strategy stack: [13:13:42.741] List of future strategies: [13:13:42.741] 1. sequential: [13:13:42.741] - args: function (..., envir = parent.frame(), workers = "") [13:13:42.741] - tweaked: FALSE [13:13:42.741] - call: plan(strategy) [13:13:42.742] plan(): nbrOfWorkers() = 1 [13:13:42.742] SequentialFuture started (and completed) [13:13:42.742] - Launch lazy future ... done [13:13:42.742] run() for 'SequentialFuture' ... done [13:13:42.742] Created future: [13:13:42.742] SequentialFuture: [13:13:42.742] Label: 'future_lapply-4' [13:13:42.742] Expression: [13:13:42.742] { [13:13:42.742] do.call(function(...) { [13:13:42.742] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:42.742] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:42.742] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:42.742] on.exit(options(oopts), add = TRUE) [13:13:42.742] } [13:13:42.742] { [13:13:42.742] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:42.742] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:42.742] ...future.FUN(...future.X_jj, ...) [13:13:42.742] }) [13:13:42.742] } [13:13:42.742] }, args = future.call.arguments) [13:13:42.742] } [13:13:42.742] Lazy evaluation: FALSE [13:13:42.742] Asynchronous evaluation: FALSE [13:13:42.742] Local evaluation: TRUE [13:13:42.742] Environment: R_GlobalEnv [13:13:42.742] Capture standard output: TRUE [13:13:42.742] Capture condition classes: 'condition' (excluding 'nothing') [13:13:42.742] 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) [13:13:42.742] Packages: [13:13:42.742] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:42.742] Resolved: TRUE [13:13:42.742] Value: 0 bytes of class 'list' [13:13:42.742] Early signaling: FALSE [13:13:42.742] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:42.742] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:42.743] Chunk #4 of 4 ... DONE [13:13:42.743] Launching 4 futures (chunks) ... DONE [13:13:42.743] Resolving 4 futures (chunks) ... [13:13:42.744] resolve() on list ... [13:13:42.744] recursive: 0 [13:13:42.744] length: 4 [13:13:42.744] [13:13:42.744] resolved() for 'SequentialFuture' ... [13:13:42.744] - state: 'finished' [13:13:42.744] - run: TRUE [13:13:42.744] - result: 'FutureResult' [13:13:42.744] resolved() for 'SequentialFuture' ... done [13:13:42.745] Future #1 [13:13:42.745] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:42.745] - nx: 4 [13:13:42.745] - relay: TRUE [13:13:42.745] - stdout: TRUE [13:13:42.745] - signal: TRUE [13:13:42.745] - resignal: FALSE [13:13:42.745] - force: TRUE [13:13:42.746] - relayed: [n=4] FALSE, FALSE, FALSE, FALSE [13:13:42.746] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [13:13:42.746] - until=1 [13:13:42.746] - relaying element #1 [13:13:42.746] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [13:13:42.746] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [13:13:42.746] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:42.746] length: 3 (resolved future 1) [13:13:42.747] resolved() for 'SequentialFuture' ... [13:13:42.747] - state: 'finished' [13:13:42.747] - run: TRUE [13:13:42.747] - result: 'FutureResult' [13:13:42.747] resolved() for 'SequentialFuture' ... done [13:13:42.747] Future #2 [13:13:42.747] signalConditionsASAP(SequentialFuture, pos=2) ... [13:13:42.747] - nx: 4 [13:13:42.748] - relay: TRUE [13:13:42.748] - stdout: TRUE [13:13:42.748] - signal: TRUE [13:13:42.748] - resignal: FALSE [13:13:42.748] - force: TRUE [13:13:42.748] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [13:13:42.748] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [13:13:42.748] - until=2 [13:13:42.748] - relaying element #2 [13:13:42.749] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [13:13:42.749] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [13:13:42.749] signalConditionsASAP(SequentialFuture, pos=2) ... done [13:13:42.749] length: 2 (resolved future 2) [13:13:42.749] resolved() for 'SequentialFuture' ... [13:13:42.749] - state: 'finished' [13:13:42.750] - run: TRUE [13:13:42.750] - result: 'FutureResult' [13:13:42.750] resolved() for 'SequentialFuture' ... done [13:13:42.750] Future #3 [13:13:42.750] signalConditionsASAP(SequentialFuture, pos=3) ... [13:13:42.750] - nx: 4 [13:13:42.750] - relay: TRUE [13:13:42.750] - stdout: TRUE [13:13:42.750] - signal: TRUE [13:13:42.751] - resignal: FALSE [13:13:42.751] - force: TRUE [13:13:42.751] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [13:13:42.751] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [13:13:42.751] - until=3 [13:13:42.751] - relaying element #3 [13:13:42.751] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [13:13:42.751] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [13:13:42.752] signalConditionsASAP(SequentialFuture, pos=3) ... done [13:13:42.752] length: 1 (resolved future 3) [13:13:42.752] resolved() for 'SequentialFuture' ... [13:13:42.752] - state: 'finished' [13:13:42.752] - run: TRUE [13:13:42.752] - result: 'FutureResult' [13:13:42.752] resolved() for 'SequentialFuture' ... done [13:13:42.752] Future #4 [13:13:42.753] signalConditionsASAP(SequentialFuture, pos=4) ... [13:13:42.753] - nx: 4 [13:13:42.753] - relay: TRUE [13:13:42.753] - stdout: TRUE [13:13:42.753] - signal: TRUE [13:13:42.753] - resignal: FALSE [13:13:42.753] - force: TRUE [13:13:42.753] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [13:13:42.753] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [13:13:42.754] - until=4 [13:13:42.754] - relaying element #4 [13:13:42.754] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [13:13:42.754] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [13:13:42.754] signalConditionsASAP(SequentialFuture, pos=4) ... done [13:13:42.754] length: 0 (resolved future 4) [13:13:42.754] Relaying remaining futures [13:13:42.754] signalConditionsASAP(NULL, pos=0) ... [13:13:42.755] - nx: 4 [13:13:42.755] - relay: TRUE [13:13:42.755] - stdout: TRUE [13:13:42.755] - signal: TRUE [13:13:42.755] - resignal: FALSE [13:13:42.755] - force: TRUE [13:13:42.755] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [13:13:42.755] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE - flush all [13:13:42.755] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [13:13:42.756] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [13:13:42.756] signalConditionsASAP(NULL, pos=0) ... done [13:13:42.756] resolve() on list ... DONE [13:13:42.756] - Number of value chunks collected: 4 [13:13:42.756] Resolving 4 futures (chunks) ... DONE [13:13:42.756] Reducing values from 4 chunks ... [13:13:42.756] - Number of values collected after concatenation: 4 [13:13:42.756] - Number of values expected: 4 [13:13:42.757] Reducing values from 4 chunks ... DONE [13:13:42.757] 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 [13:13:42.759] future_lapply() ... [13:13:42.759] Number of chunks: 4 [13:13:42.759] getGlobalsAndPackagesXApply() ... [13:13:42.760] - future.globals: TRUE [13:13:42.760] getGlobalsAndPackages() ... [13:13:42.760] Searching for globals... [13:13:42.761] - globals found: [2] 'FUN', '.Internal' [13:13:42.761] Searching for globals ... DONE [13:13:42.761] Resolving globals: FALSE [13:13:42.761] The total size of the 1 globals is 2.13 KiB (2184 bytes) [13:13:42.762] 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') [13:13:42.762] - globals: [1] 'FUN' [13:13:42.762] [13:13:42.762] getGlobalsAndPackages() ... DONE [13:13:42.762] - globals found/used: [n=1] 'FUN' [13:13:42.762] - needed namespaces: [n=0] [13:13:42.762] Finding globals ... DONE [13:13:42.763] - use_args: TRUE [13:13:42.763] - Getting '...' globals ... [13:13:42.763] resolve() on list ... [13:13:42.763] recursive: 0 [13:13:42.763] length: 1 [13:13:42.763] elements: '...' [13:13:42.763] length: 0 (resolved future 1) [13:13:42.763] resolve() on list ... DONE [13:13:42.764] - '...' content: [n=1] 'length' [13:13:42.764] List of 1 [13:13:42.764] $ ...:List of 1 [13:13:42.764] ..$ length: int 2 [13:13:42.764] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:42.764] - attr(*, "where")=List of 1 [13:13:42.764] ..$ ...: [13:13:42.764] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:42.764] - attr(*, "resolved")= logi TRUE [13:13:42.764] - attr(*, "total_size")= num NA [13:13:42.766] - Getting '...' globals ... DONE [13:13:42.766] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:42.766] List of 2 [13:13:42.766] $ ...future.FUN:function (mode = "logical", length = 0L) [13:13:42.766] $ ... :List of 1 [13:13:42.766] ..$ length: int 2 [13:13:42.766] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:42.766] - attr(*, "where")=List of 2 [13:13:42.766] ..$ ...future.FUN: [13:13:42.766] ..$ ... : [13:13:42.766] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:42.766] - attr(*, "resolved")= logi FALSE [13:13:42.766] - attr(*, "total_size")= num 2240 [13:13:42.769] Packages to be attached in all futures: [n=0] [13:13:42.769] getGlobalsAndPackagesXApply() ... DONE [13:13:42.769] Number of futures (= number of chunks): 4 [13:13:42.770] Launching 4 futures (chunks) ... [13:13:42.770] Chunk #1 of 4 ... [13:13:42.770] - Finding globals in 'X' for chunk #1 ... [13:13:42.770] getGlobalsAndPackages() ... [13:13:42.770] Searching for globals... [13:13:42.770] [13:13:42.770] Searching for globals ... DONE [13:13:42.770] - globals: [0] [13:13:42.771] getGlobalsAndPackages() ... DONE [13:13:42.771] + additional globals found: [n=0] [13:13:42.771] + additional namespaces needed: [n=0] [13:13:42.771] - Finding globals in 'X' for chunk #1 ... DONE [13:13:42.771] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [13:13:42.771] - seeds: [13:13:42.771] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:42.771] getGlobalsAndPackages() ... [13:13:42.772] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:42.772] Resolving globals: FALSE [13:13:42.772] Tweak future expression to call with '...' arguments ... [13:13:42.772] { [13:13:42.772] do.call(function(...) { [13:13:42.772] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:42.772] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:42.772] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:42.772] on.exit(options(oopts), add = TRUE) [13:13:42.772] } [13:13:42.772] { [13:13:42.772] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:42.772] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:42.772] ...future.FUN(...future.X_jj, ...) [13:13:42.772] }) [13:13:42.772] } [13:13:42.772] }, args = future.call.arguments) [13:13:42.772] } [13:13:42.772] Tweak future expression to call with '...' arguments ... DONE [13:13:42.773] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:42.773] [13:13:42.773] getGlobalsAndPackages() ... DONE [13:13:42.773] run() for 'Future' ... [13:13:42.773] - state: 'created' [13:13:42.773] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:13:42.774] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:42.774] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:42.774] - Field: 'label' [13:13:42.774] - Field: 'local' [13:13:42.774] - Field: 'owner' [13:13:42.774] - Field: 'envir' [13:13:42.774] - Field: 'packages' [13:13:42.775] - Field: 'gc' [13:13:42.775] - Field: 'conditions' [13:13:42.775] - Field: 'expr' [13:13:42.775] - Field: 'uuid' [13:13:42.775] - Field: 'seed' [13:13:42.775] - Field: 'version' [13:13:42.775] - Field: 'result' [13:13:42.775] - Field: 'asynchronous' [13:13:42.776] - Field: 'calls' [13:13:42.776] - Field: 'globals' [13:13:42.776] - Field: 'stdout' [13:13:42.776] - Field: 'earlySignal' [13:13:42.776] - Field: 'lazy' [13:13:42.776] - Field: 'state' [13:13:42.776] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:42.776] - Launch lazy future ... [13:13:42.777] Packages needed by the future expression (n = 0): [13:13:42.777] Packages needed by future strategies (n = 0): [13:13:42.777] { [13:13:42.777] { [13:13:42.777] { [13:13:42.777] ...future.startTime <- base::Sys.time() [13:13:42.777] { [13:13:42.777] { [13:13:42.777] { [13:13:42.777] base::local({ [13:13:42.777] has_future <- base::requireNamespace("future", [13:13:42.777] quietly = TRUE) [13:13:42.777] if (has_future) { [13:13:42.777] ns <- base::getNamespace("future") [13:13:42.777] version <- ns[[".package"]][["version"]] [13:13:42.777] if (is.null(version)) [13:13:42.777] version <- utils::packageVersion("future") [13:13:42.777] } [13:13:42.777] else { [13:13:42.777] version <- NULL [13:13:42.777] } [13:13:42.777] if (!has_future || version < "1.8.0") { [13:13:42.777] info <- base::c(r_version = base::gsub("R version ", [13:13:42.777] "", base::R.version$version.string), [13:13:42.777] platform = base::sprintf("%s (%s-bit)", [13:13:42.777] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:42.777] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:42.777] "release", "version")], collapse = " "), [13:13:42.777] hostname = base::Sys.info()[["nodename"]]) [13:13:42.777] info <- base::sprintf("%s: %s", base::names(info), [13:13:42.777] info) [13:13:42.777] info <- base::paste(info, collapse = "; ") [13:13:42.777] if (!has_future) { [13:13:42.777] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:42.777] info) [13:13:42.777] } [13:13:42.777] else { [13:13:42.777] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:42.777] info, version) [13:13:42.777] } [13:13:42.777] base::stop(msg) [13:13:42.777] } [13:13:42.777] }) [13:13:42.777] } [13:13:42.777] options(future.plan = NULL) [13:13:42.777] Sys.unsetenv("R_FUTURE_PLAN") [13:13:42.777] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:42.777] } [13:13:42.777] ...future.workdir <- getwd() [13:13:42.777] } [13:13:42.777] ...future.oldOptions <- base::as.list(base::.Options) [13:13:42.777] ...future.oldEnvVars <- base::Sys.getenv() [13:13:42.777] } [13:13:42.777] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:42.777] future.globals.maxSize = 2097152000, future.globals.method = NULL, [13:13:42.777] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:42.777] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:42.777] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:42.777] future.stdout.windows.reencode = NULL, width = 80L) [13:13:42.777] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:42.777] base::names(...future.oldOptions)) [13:13:42.777] } [13:13:42.777] if (FALSE) { [13:13:42.777] } [13:13:42.777] else { [13:13:42.777] if (TRUE) { [13:13:42.777] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:42.777] open = "w") [13:13:42.777] } [13:13:42.777] else { [13:13:42.777] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:42.777] windows = "NUL", "/dev/null"), open = "w") [13:13:42.777] } [13:13:42.777] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:42.777] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:42.777] base::sink(type = "output", split = FALSE) [13:13:42.777] base::close(...future.stdout) [13:13:42.777] }, add = TRUE) [13:13:42.777] } [13:13:42.777] ...future.frame <- base::sys.nframe() [13:13:42.777] ...future.conditions <- base::list() [13:13:42.777] ...future.rng <- base::globalenv()$.Random.seed [13:13:42.777] if (FALSE) { [13:13:42.777] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:42.777] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:42.777] } [13:13:42.777] ...future.result <- base::tryCatch({ [13:13:42.777] base::withCallingHandlers({ [13:13:42.777] ...future.value <- base::withVisible(base::local({ [13:13:42.777] do.call(function(...) { [13:13:42.777] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:42.777] if (!identical(...future.globals.maxSize.org, [13:13:42.777] ...future.globals.maxSize)) { [13:13:42.777] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:42.777] on.exit(options(oopts), add = TRUE) [13:13:42.777] } [13:13:42.777] { [13:13:42.777] lapply(seq_along(...future.elements_ii), [13:13:42.777] FUN = function(jj) { [13:13:42.777] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:42.777] ...future.FUN(...future.X_jj, ...) [13:13:42.777] }) [13:13:42.777] } [13:13:42.777] }, args = future.call.arguments) [13:13:42.777] })) [13:13:42.777] future::FutureResult(value = ...future.value$value, [13:13:42.777] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:42.777] ...future.rng), globalenv = if (FALSE) [13:13:42.777] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:42.777] ...future.globalenv.names)) [13:13:42.777] else NULL, started = ...future.startTime, version = "1.8") [13:13:42.777] }, condition = base::local({ [13:13:42.777] c <- base::c [13:13:42.777] inherits <- base::inherits [13:13:42.777] invokeRestart <- base::invokeRestart [13:13:42.777] length <- base::length [13:13:42.777] list <- base::list [13:13:42.777] seq.int <- base::seq.int [13:13:42.777] signalCondition <- base::signalCondition [13:13:42.777] sys.calls <- base::sys.calls [13:13:42.777] `[[` <- base::`[[` [13:13:42.777] `+` <- base::`+` [13:13:42.777] `<<-` <- base::`<<-` [13:13:42.777] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:42.777] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:42.777] 3L)] [13:13:42.777] } [13:13:42.777] function(cond) { [13:13:42.777] is_error <- inherits(cond, "error") [13:13:42.777] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:42.777] NULL) [13:13:42.777] if (is_error) { [13:13:42.777] sessionInformation <- function() { [13:13:42.777] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:42.777] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:42.777] search = base::search(), system = base::Sys.info()) [13:13:42.777] } [13:13:42.777] ...future.conditions[[length(...future.conditions) + [13:13:42.777] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:42.777] cond$call), session = sessionInformation(), [13:13:42.777] timestamp = base::Sys.time(), signaled = 0L) [13:13:42.777] signalCondition(cond) [13:13:42.777] } [13:13:42.777] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:42.777] "immediateCondition"))) { [13:13:42.777] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:42.777] ...future.conditions[[length(...future.conditions) + [13:13:42.777] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:42.777] if (TRUE && !signal) { [13:13:42.777] muffleCondition <- function (cond, pattern = "^muffle") [13:13:42.777] { [13:13:42.777] inherits <- base::inherits [13:13:42.777] invokeRestart <- base::invokeRestart [13:13:42.777] is.null <- base::is.null [13:13:42.777] muffled <- FALSE [13:13:42.777] if (inherits(cond, "message")) { [13:13:42.777] muffled <- grepl(pattern, "muffleMessage") [13:13:42.777] if (muffled) [13:13:42.777] invokeRestart("muffleMessage") [13:13:42.777] } [13:13:42.777] else if (inherits(cond, "warning")) { [13:13:42.777] muffled <- grepl(pattern, "muffleWarning") [13:13:42.777] if (muffled) [13:13:42.777] invokeRestart("muffleWarning") [13:13:42.777] } [13:13:42.777] else if (inherits(cond, "condition")) { [13:13:42.777] if (!is.null(pattern)) { [13:13:42.777] computeRestarts <- base::computeRestarts [13:13:42.777] grepl <- base::grepl [13:13:42.777] restarts <- computeRestarts(cond) [13:13:42.777] for (restart in restarts) { [13:13:42.777] name <- restart$name [13:13:42.777] if (is.null(name)) [13:13:42.777] next [13:13:42.777] if (!grepl(pattern, name)) [13:13:42.777] next [13:13:42.777] invokeRestart(restart) [13:13:42.777] muffled <- TRUE [13:13:42.777] break [13:13:42.777] } [13:13:42.777] } [13:13:42.777] } [13:13:42.777] invisible(muffled) [13:13:42.777] } [13:13:42.777] muffleCondition(cond, pattern = "^muffle") [13:13:42.777] } [13:13:42.777] } [13:13:42.777] else { [13:13:42.777] if (TRUE) { [13:13:42.777] muffleCondition <- function (cond, pattern = "^muffle") [13:13:42.777] { [13:13:42.777] inherits <- base::inherits [13:13:42.777] invokeRestart <- base::invokeRestart [13:13:42.777] is.null <- base::is.null [13:13:42.777] muffled <- FALSE [13:13:42.777] if (inherits(cond, "message")) { [13:13:42.777] muffled <- grepl(pattern, "muffleMessage") [13:13:42.777] if (muffled) [13:13:42.777] invokeRestart("muffleMessage") [13:13:42.777] } [13:13:42.777] else if (inherits(cond, "warning")) { [13:13:42.777] muffled <- grepl(pattern, "muffleWarning") [13:13:42.777] if (muffled) [13:13:42.777] invokeRestart("muffleWarning") [13:13:42.777] } [13:13:42.777] else if (inherits(cond, "condition")) { [13:13:42.777] if (!is.null(pattern)) { [13:13:42.777] computeRestarts <- base::computeRestarts [13:13:42.777] grepl <- base::grepl [13:13:42.777] restarts <- computeRestarts(cond) [13:13:42.777] for (restart in restarts) { [13:13:42.777] name <- restart$name [13:13:42.777] if (is.null(name)) [13:13:42.777] next [13:13:42.777] if (!grepl(pattern, name)) [13:13:42.777] next [13:13:42.777] invokeRestart(restart) [13:13:42.777] muffled <- TRUE [13:13:42.777] break [13:13:42.777] } [13:13:42.777] } [13:13:42.777] } [13:13:42.777] invisible(muffled) [13:13:42.777] } [13:13:42.777] muffleCondition(cond, pattern = "^muffle") [13:13:42.777] } [13:13:42.777] } [13:13:42.777] } [13:13:42.777] })) [13:13:42.777] }, error = function(ex) { [13:13:42.777] base::structure(base::list(value = NULL, visible = NULL, [13:13:42.777] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:42.777] ...future.rng), started = ...future.startTime, [13:13:42.777] finished = Sys.time(), session_uuid = NA_character_, [13:13:42.777] version = "1.8"), class = "FutureResult") [13:13:42.777] }, finally = { [13:13:42.777] if (!identical(...future.workdir, getwd())) [13:13:42.777] setwd(...future.workdir) [13:13:42.777] { [13:13:42.777] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:42.777] ...future.oldOptions$nwarnings <- NULL [13:13:42.777] } [13:13:42.777] base::options(...future.oldOptions) [13:13:42.777] if (.Platform$OS.type == "windows") { [13:13:42.777] old_names <- names(...future.oldEnvVars) [13:13:42.777] envs <- base::Sys.getenv() [13:13:42.777] names <- names(envs) [13:13:42.777] common <- intersect(names, old_names) [13:13:42.777] added <- setdiff(names, old_names) [13:13:42.777] removed <- setdiff(old_names, names) [13:13:42.777] changed <- common[...future.oldEnvVars[common] != [13:13:42.777] envs[common]] [13:13:42.777] NAMES <- toupper(changed) [13:13:42.777] args <- list() [13:13:42.777] for (kk in seq_along(NAMES)) { [13:13:42.777] name <- changed[[kk]] [13:13:42.777] NAME <- NAMES[[kk]] [13:13:42.777] if (name != NAME && is.element(NAME, old_names)) [13:13:42.777] next [13:13:42.777] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:42.777] } [13:13:42.777] NAMES <- toupper(added) [13:13:42.777] for (kk in seq_along(NAMES)) { [13:13:42.777] name <- added[[kk]] [13:13:42.777] NAME <- NAMES[[kk]] [13:13:42.777] if (name != NAME && is.element(NAME, old_names)) [13:13:42.777] next [13:13:42.777] args[[name]] <- "" [13:13:42.777] } [13:13:42.777] NAMES <- toupper(removed) [13:13:42.777] for (kk in seq_along(NAMES)) { [13:13:42.777] name <- removed[[kk]] [13:13:42.777] NAME <- NAMES[[kk]] [13:13:42.777] if (name != NAME && is.element(NAME, old_names)) [13:13:42.777] next [13:13:42.777] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:42.777] } [13:13:42.777] if (length(args) > 0) [13:13:42.777] base::do.call(base::Sys.setenv, args = args) [13:13:42.777] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:42.777] } [13:13:42.777] else { [13:13:42.777] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:42.777] } [13:13:42.777] { [13:13:42.777] if (base::length(...future.futureOptionsAdded) > [13:13:42.777] 0L) { [13:13:42.777] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:42.777] base::names(opts) <- ...future.futureOptionsAdded [13:13:42.777] base::options(opts) [13:13:42.777] } [13:13:42.777] { [13:13:42.777] { [13:13:42.777] NULL [13:13:42.777] RNGkind("Mersenne-Twister") [13:13:42.777] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:42.777] inherits = FALSE) [13:13:42.777] } [13:13:42.777] options(future.plan = NULL) [13:13:42.777] if (is.na(NA_character_)) [13:13:42.777] Sys.unsetenv("R_FUTURE_PLAN") [13:13:42.777] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:42.777] future::plan(list(function (..., envir = parent.frame()) [13:13:42.777] { [13:13:42.777] future <- SequentialFuture(..., envir = envir) [13:13:42.777] if (!future$lazy) [13:13:42.777] future <- run(future) [13:13:42.777] invisible(future) [13:13:42.777] }), .cleanup = FALSE, .init = FALSE) [13:13:42.777] } [13:13:42.777] } [13:13:42.777] } [13:13:42.777] }) [13:13:42.777] if (TRUE) { [13:13:42.777] base::sink(type = "output", split = FALSE) [13:13:42.777] if (TRUE) { [13:13:42.777] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:42.777] } [13:13:42.777] else { [13:13:42.777] ...future.result["stdout"] <- base::list(NULL) [13:13:42.777] } [13:13:42.777] base::close(...future.stdout) [13:13:42.777] ...future.stdout <- NULL [13:13:42.777] } [13:13:42.777] ...future.result$conditions <- ...future.conditions [13:13:42.777] ...future.result$finished <- base::Sys.time() [13:13:42.777] ...future.result [13:13:42.777] } [13:13:42.780] assign_globals() ... [13:13:42.780] List of 5 [13:13:42.780] $ ...future.FUN :function (mode = "logical", length = 0L) [13:13:42.780] $ future.call.arguments :List of 1 [13:13:42.780] ..$ length: int 2 [13:13:42.780] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:42.780] $ ...future.elements_ii :List of 1 [13:13:42.780] ..$ a: chr "integer" [13:13:42.780] $ ...future.seeds_ii : NULL [13:13:42.780] $ ...future.globals.maxSize: NULL [13:13:42.780] - attr(*, "where")=List of 5 [13:13:42.780] ..$ ...future.FUN : [13:13:42.780] ..$ future.call.arguments : [13:13:42.780] ..$ ...future.elements_ii : [13:13:42.780] ..$ ...future.seeds_ii : [13:13:42.780] ..$ ...future.globals.maxSize: [13:13:42.780] - attr(*, "resolved")= logi FALSE [13:13:42.780] - attr(*, "total_size")= num 2240 [13:13:42.780] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:42.780] - attr(*, "already-done")= logi TRUE [13:13:42.784] - copied '...future.FUN' to environment [13:13:42.784] - copied 'future.call.arguments' to environment [13:13:42.784] - copied '...future.elements_ii' to environment [13:13:42.785] - copied '...future.seeds_ii' to environment [13:13:42.785] - copied '...future.globals.maxSize' to environment [13:13:42.785] assign_globals() ... done [13:13:42.785] plan(): Setting new future strategy stack: [13:13:42.785] List of future strategies: [13:13:42.785] 1. sequential: [13:13:42.785] - args: function (..., envir = parent.frame(), workers = "") [13:13:42.785] - tweaked: FALSE [13:13:42.785] - call: NULL [13:13:42.786] plan(): nbrOfWorkers() = 1 [13:13:42.786] plan(): Setting new future strategy stack: [13:13:42.787] List of future strategies: [13:13:42.787] 1. sequential: [13:13:42.787] - args: function (..., envir = parent.frame(), workers = "") [13:13:42.787] - tweaked: FALSE [13:13:42.787] - call: plan(strategy) [13:13:42.787] plan(): nbrOfWorkers() = 1 [13:13:42.787] SequentialFuture started (and completed) [13:13:42.787] - Launch lazy future ... done [13:13:42.787] run() for 'SequentialFuture' ... done [13:13:42.788] Created future: [13:13:42.788] SequentialFuture: [13:13:42.788] Label: 'future_lapply-1' [13:13:42.788] Expression: [13:13:42.788] { [13:13:42.788] do.call(function(...) { [13:13:42.788] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:42.788] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:42.788] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:42.788] on.exit(options(oopts), add = TRUE) [13:13:42.788] } [13:13:42.788] { [13:13:42.788] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:42.788] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:42.788] ...future.FUN(...future.X_jj, ...) [13:13:42.788] }) [13:13:42.788] } [13:13:42.788] }, args = future.call.arguments) [13:13:42.788] } [13:13:42.788] Lazy evaluation: FALSE [13:13:42.788] Asynchronous evaluation: FALSE [13:13:42.788] Local evaluation: TRUE [13:13:42.788] Environment: R_GlobalEnv [13:13:42.788] Capture standard output: TRUE [13:13:42.788] Capture condition classes: 'condition' (excluding 'nothing') [13:13:42.788] 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) [13:13:42.788] Packages: [13:13:42.788] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:42.788] Resolved: TRUE [13:13:42.788] Value: 56 bytes of class 'list' [13:13:42.788] Early signaling: FALSE [13:13:42.788] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:42.788] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:42.789] Chunk #1 of 4 ... DONE [13:13:42.789] Chunk #2 of 4 ... [13:13:42.789] - Finding globals in 'X' for chunk #2 ... [13:13:42.789] getGlobalsAndPackages() ... [13:13:42.789] Searching for globals... [13:13:42.789] [13:13:42.789] Searching for globals ... DONE [13:13:42.790] - globals: [0] [13:13:42.790] getGlobalsAndPackages() ... DONE [13:13:42.790] + additional globals found: [n=0] [13:13:42.790] + additional namespaces needed: [n=0] [13:13:42.790] - Finding globals in 'X' for chunk #2 ... DONE [13:13:42.790] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [13:13:42.790] - seeds: [13:13:42.790] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:42.791] getGlobalsAndPackages() ... [13:13:42.791] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:42.791] Resolving globals: FALSE [13:13:42.791] Tweak future expression to call with '...' arguments ... [13:13:42.791] { [13:13:42.791] do.call(function(...) { [13:13:42.791] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:42.791] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:42.791] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:42.791] on.exit(options(oopts), add = TRUE) [13:13:42.791] } [13:13:42.791] { [13:13:42.791] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:42.791] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:42.791] ...future.FUN(...future.X_jj, ...) [13:13:42.791] }) [13:13:42.791] } [13:13:42.791] }, args = future.call.arguments) [13:13:42.791] } [13:13:42.791] Tweak future expression to call with '...' arguments ... DONE [13:13:42.792] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:42.792] [13:13:42.792] getGlobalsAndPackages() ... DONE [13:13:42.792] run() for 'Future' ... [13:13:42.792] - state: 'created' [13:13:42.792] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:13:42.793] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:42.793] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:42.793] - Field: 'label' [13:13:42.793] - Field: 'local' [13:13:42.793] - Field: 'owner' [13:13:42.793] - Field: 'envir' [13:13:42.793] - Field: 'packages' [13:13:42.794] - Field: 'gc' [13:13:42.794] - Field: 'conditions' [13:13:42.794] - Field: 'expr' [13:13:42.794] - Field: 'uuid' [13:13:42.794] - Field: 'seed' [13:13:42.794] - Field: 'version' [13:13:42.794] - Field: 'result' [13:13:42.794] - Field: 'asynchronous' [13:13:42.795] - Field: 'calls' [13:13:42.795] - Field: 'globals' [13:13:42.795] - Field: 'stdout' [13:13:42.795] - Field: 'earlySignal' [13:13:42.795] - Field: 'lazy' [13:13:42.795] - Field: 'state' [13:13:42.795] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:42.795] - Launch lazy future ... [13:13:42.796] Packages needed by the future expression (n = 0): [13:13:42.796] Packages needed by future strategies (n = 0): [13:13:42.796] { [13:13:42.796] { [13:13:42.796] { [13:13:42.796] ...future.startTime <- base::Sys.time() [13:13:42.796] { [13:13:42.796] { [13:13:42.796] { [13:13:42.796] base::local({ [13:13:42.796] has_future <- base::requireNamespace("future", [13:13:42.796] quietly = TRUE) [13:13:42.796] if (has_future) { [13:13:42.796] ns <- base::getNamespace("future") [13:13:42.796] version <- ns[[".package"]][["version"]] [13:13:42.796] if (is.null(version)) [13:13:42.796] version <- utils::packageVersion("future") [13:13:42.796] } [13:13:42.796] else { [13:13:42.796] version <- NULL [13:13:42.796] } [13:13:42.796] if (!has_future || version < "1.8.0") { [13:13:42.796] info <- base::c(r_version = base::gsub("R version ", [13:13:42.796] "", base::R.version$version.string), [13:13:42.796] platform = base::sprintf("%s (%s-bit)", [13:13:42.796] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:42.796] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:42.796] "release", "version")], collapse = " "), [13:13:42.796] hostname = base::Sys.info()[["nodename"]]) [13:13:42.796] info <- base::sprintf("%s: %s", base::names(info), [13:13:42.796] info) [13:13:42.796] info <- base::paste(info, collapse = "; ") [13:13:42.796] if (!has_future) { [13:13:42.796] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:42.796] info) [13:13:42.796] } [13:13:42.796] else { [13:13:42.796] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:42.796] info, version) [13:13:42.796] } [13:13:42.796] base::stop(msg) [13:13:42.796] } [13:13:42.796] }) [13:13:42.796] } [13:13:42.796] options(future.plan = NULL) [13:13:42.796] Sys.unsetenv("R_FUTURE_PLAN") [13:13:42.796] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:42.796] } [13:13:42.796] ...future.workdir <- getwd() [13:13:42.796] } [13:13:42.796] ...future.oldOptions <- base::as.list(base::.Options) [13:13:42.796] ...future.oldEnvVars <- base::Sys.getenv() [13:13:42.796] } [13:13:42.796] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:42.796] future.globals.maxSize = 2097152000, future.globals.method = NULL, [13:13:42.796] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:42.796] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:42.796] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:42.796] future.stdout.windows.reencode = NULL, width = 80L) [13:13:42.796] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:42.796] base::names(...future.oldOptions)) [13:13:42.796] } [13:13:42.796] if (FALSE) { [13:13:42.796] } [13:13:42.796] else { [13:13:42.796] if (TRUE) { [13:13:42.796] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:42.796] open = "w") [13:13:42.796] } [13:13:42.796] else { [13:13:42.796] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:42.796] windows = "NUL", "/dev/null"), open = "w") [13:13:42.796] } [13:13:42.796] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:42.796] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:42.796] base::sink(type = "output", split = FALSE) [13:13:42.796] base::close(...future.stdout) [13:13:42.796] }, add = TRUE) [13:13:42.796] } [13:13:42.796] ...future.frame <- base::sys.nframe() [13:13:42.796] ...future.conditions <- base::list() [13:13:42.796] ...future.rng <- base::globalenv()$.Random.seed [13:13:42.796] if (FALSE) { [13:13:42.796] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:42.796] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:42.796] } [13:13:42.796] ...future.result <- base::tryCatch({ [13:13:42.796] base::withCallingHandlers({ [13:13:42.796] ...future.value <- base::withVisible(base::local({ [13:13:42.796] do.call(function(...) { [13:13:42.796] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:42.796] if (!identical(...future.globals.maxSize.org, [13:13:42.796] ...future.globals.maxSize)) { [13:13:42.796] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:42.796] on.exit(options(oopts), add = TRUE) [13:13:42.796] } [13:13:42.796] { [13:13:42.796] lapply(seq_along(...future.elements_ii), [13:13:42.796] FUN = function(jj) { [13:13:42.796] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:42.796] ...future.FUN(...future.X_jj, ...) [13:13:42.796] }) [13:13:42.796] } [13:13:42.796] }, args = future.call.arguments) [13:13:42.796] })) [13:13:42.796] future::FutureResult(value = ...future.value$value, [13:13:42.796] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:42.796] ...future.rng), globalenv = if (FALSE) [13:13:42.796] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:42.796] ...future.globalenv.names)) [13:13:42.796] else NULL, started = ...future.startTime, version = "1.8") [13:13:42.796] }, condition = base::local({ [13:13:42.796] c <- base::c [13:13:42.796] inherits <- base::inherits [13:13:42.796] invokeRestart <- base::invokeRestart [13:13:42.796] length <- base::length [13:13:42.796] list <- base::list [13:13:42.796] seq.int <- base::seq.int [13:13:42.796] signalCondition <- base::signalCondition [13:13:42.796] sys.calls <- base::sys.calls [13:13:42.796] `[[` <- base::`[[` [13:13:42.796] `+` <- base::`+` [13:13:42.796] `<<-` <- base::`<<-` [13:13:42.796] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:42.796] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:42.796] 3L)] [13:13:42.796] } [13:13:42.796] function(cond) { [13:13:42.796] is_error <- inherits(cond, "error") [13:13:42.796] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:42.796] NULL) [13:13:42.796] if (is_error) { [13:13:42.796] sessionInformation <- function() { [13:13:42.796] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:42.796] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:42.796] search = base::search(), system = base::Sys.info()) [13:13:42.796] } [13:13:42.796] ...future.conditions[[length(...future.conditions) + [13:13:42.796] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:42.796] cond$call), session = sessionInformation(), [13:13:42.796] timestamp = base::Sys.time(), signaled = 0L) [13:13:42.796] signalCondition(cond) [13:13:42.796] } [13:13:42.796] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:42.796] "immediateCondition"))) { [13:13:42.796] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:42.796] ...future.conditions[[length(...future.conditions) + [13:13:42.796] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:42.796] if (TRUE && !signal) { [13:13:42.796] muffleCondition <- function (cond, pattern = "^muffle") [13:13:42.796] { [13:13:42.796] inherits <- base::inherits [13:13:42.796] invokeRestart <- base::invokeRestart [13:13:42.796] is.null <- base::is.null [13:13:42.796] muffled <- FALSE [13:13:42.796] if (inherits(cond, "message")) { [13:13:42.796] muffled <- grepl(pattern, "muffleMessage") [13:13:42.796] if (muffled) [13:13:42.796] invokeRestart("muffleMessage") [13:13:42.796] } [13:13:42.796] else if (inherits(cond, "warning")) { [13:13:42.796] muffled <- grepl(pattern, "muffleWarning") [13:13:42.796] if (muffled) [13:13:42.796] invokeRestart("muffleWarning") [13:13:42.796] } [13:13:42.796] else if (inherits(cond, "condition")) { [13:13:42.796] if (!is.null(pattern)) { [13:13:42.796] computeRestarts <- base::computeRestarts [13:13:42.796] grepl <- base::grepl [13:13:42.796] restarts <- computeRestarts(cond) [13:13:42.796] for (restart in restarts) { [13:13:42.796] name <- restart$name [13:13:42.796] if (is.null(name)) [13:13:42.796] next [13:13:42.796] if (!grepl(pattern, name)) [13:13:42.796] next [13:13:42.796] invokeRestart(restart) [13:13:42.796] muffled <- TRUE [13:13:42.796] break [13:13:42.796] } [13:13:42.796] } [13:13:42.796] } [13:13:42.796] invisible(muffled) [13:13:42.796] } [13:13:42.796] muffleCondition(cond, pattern = "^muffle") [13:13:42.796] } [13:13:42.796] } [13:13:42.796] else { [13:13:42.796] if (TRUE) { [13:13:42.796] muffleCondition <- function (cond, pattern = "^muffle") [13:13:42.796] { [13:13:42.796] inherits <- base::inherits [13:13:42.796] invokeRestart <- base::invokeRestart [13:13:42.796] is.null <- base::is.null [13:13:42.796] muffled <- FALSE [13:13:42.796] if (inherits(cond, "message")) { [13:13:42.796] muffled <- grepl(pattern, "muffleMessage") [13:13:42.796] if (muffled) [13:13:42.796] invokeRestart("muffleMessage") [13:13:42.796] } [13:13:42.796] else if (inherits(cond, "warning")) { [13:13:42.796] muffled <- grepl(pattern, "muffleWarning") [13:13:42.796] if (muffled) [13:13:42.796] invokeRestart("muffleWarning") [13:13:42.796] } [13:13:42.796] else if (inherits(cond, "condition")) { [13:13:42.796] if (!is.null(pattern)) { [13:13:42.796] computeRestarts <- base::computeRestarts [13:13:42.796] grepl <- base::grepl [13:13:42.796] restarts <- computeRestarts(cond) [13:13:42.796] for (restart in restarts) { [13:13:42.796] name <- restart$name [13:13:42.796] if (is.null(name)) [13:13:42.796] next [13:13:42.796] if (!grepl(pattern, name)) [13:13:42.796] next [13:13:42.796] invokeRestart(restart) [13:13:42.796] muffled <- TRUE [13:13:42.796] break [13:13:42.796] } [13:13:42.796] } [13:13:42.796] } [13:13:42.796] invisible(muffled) [13:13:42.796] } [13:13:42.796] muffleCondition(cond, pattern = "^muffle") [13:13:42.796] } [13:13:42.796] } [13:13:42.796] } [13:13:42.796] })) [13:13:42.796] }, error = function(ex) { [13:13:42.796] base::structure(base::list(value = NULL, visible = NULL, [13:13:42.796] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:42.796] ...future.rng), started = ...future.startTime, [13:13:42.796] finished = Sys.time(), session_uuid = NA_character_, [13:13:42.796] version = "1.8"), class = "FutureResult") [13:13:42.796] }, finally = { [13:13:42.796] if (!identical(...future.workdir, getwd())) [13:13:42.796] setwd(...future.workdir) [13:13:42.796] { [13:13:42.796] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:42.796] ...future.oldOptions$nwarnings <- NULL [13:13:42.796] } [13:13:42.796] base::options(...future.oldOptions) [13:13:42.796] if (.Platform$OS.type == "windows") { [13:13:42.796] old_names <- names(...future.oldEnvVars) [13:13:42.796] envs <- base::Sys.getenv() [13:13:42.796] names <- names(envs) [13:13:42.796] common <- intersect(names, old_names) [13:13:42.796] added <- setdiff(names, old_names) [13:13:42.796] removed <- setdiff(old_names, names) [13:13:42.796] changed <- common[...future.oldEnvVars[common] != [13:13:42.796] envs[common]] [13:13:42.796] NAMES <- toupper(changed) [13:13:42.796] args <- list() [13:13:42.796] for (kk in seq_along(NAMES)) { [13:13:42.796] name <- changed[[kk]] [13:13:42.796] NAME <- NAMES[[kk]] [13:13:42.796] if (name != NAME && is.element(NAME, old_names)) [13:13:42.796] next [13:13:42.796] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:42.796] } [13:13:42.796] NAMES <- toupper(added) [13:13:42.796] for (kk in seq_along(NAMES)) { [13:13:42.796] name <- added[[kk]] [13:13:42.796] NAME <- NAMES[[kk]] [13:13:42.796] if (name != NAME && is.element(NAME, old_names)) [13:13:42.796] next [13:13:42.796] args[[name]] <- "" [13:13:42.796] } [13:13:42.796] NAMES <- toupper(removed) [13:13:42.796] for (kk in seq_along(NAMES)) { [13:13:42.796] name <- removed[[kk]] [13:13:42.796] NAME <- NAMES[[kk]] [13:13:42.796] if (name != NAME && is.element(NAME, old_names)) [13:13:42.796] next [13:13:42.796] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:42.796] } [13:13:42.796] if (length(args) > 0) [13:13:42.796] base::do.call(base::Sys.setenv, args = args) [13:13:42.796] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:42.796] } [13:13:42.796] else { [13:13:42.796] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:42.796] } [13:13:42.796] { [13:13:42.796] if (base::length(...future.futureOptionsAdded) > [13:13:42.796] 0L) { [13:13:42.796] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:42.796] base::names(opts) <- ...future.futureOptionsAdded [13:13:42.796] base::options(opts) [13:13:42.796] } [13:13:42.796] { [13:13:42.796] { [13:13:42.796] NULL [13:13:42.796] RNGkind("Mersenne-Twister") [13:13:42.796] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:42.796] inherits = FALSE) [13:13:42.796] } [13:13:42.796] options(future.plan = NULL) [13:13:42.796] if (is.na(NA_character_)) [13:13:42.796] Sys.unsetenv("R_FUTURE_PLAN") [13:13:42.796] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:42.796] future::plan(list(function (..., envir = parent.frame()) [13:13:42.796] { [13:13:42.796] future <- SequentialFuture(..., envir = envir) [13:13:42.796] if (!future$lazy) [13:13:42.796] future <- run(future) [13:13:42.796] invisible(future) [13:13:42.796] }), .cleanup = FALSE, .init = FALSE) [13:13:42.796] } [13:13:42.796] } [13:13:42.796] } [13:13:42.796] }) [13:13:42.796] if (TRUE) { [13:13:42.796] base::sink(type = "output", split = FALSE) [13:13:42.796] if (TRUE) { [13:13:42.796] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:42.796] } [13:13:42.796] else { [13:13:42.796] ...future.result["stdout"] <- base::list(NULL) [13:13:42.796] } [13:13:42.796] base::close(...future.stdout) [13:13:42.796] ...future.stdout <- NULL [13:13:42.796] } [13:13:42.796] ...future.result$conditions <- ...future.conditions [13:13:42.796] ...future.result$finished <- base::Sys.time() [13:13:42.796] ...future.result [13:13:42.796] } [13:13:42.799] assign_globals() ... [13:13:42.799] List of 5 [13:13:42.799] $ ...future.FUN :function (mode = "logical", length = 0L) [13:13:42.799] $ future.call.arguments :List of 1 [13:13:42.799] ..$ length: int 2 [13:13:42.799] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:42.799] $ ...future.elements_ii :List of 1 [13:13:42.799] ..$ b: chr "numeric" [13:13:42.799] $ ...future.seeds_ii : NULL [13:13:42.799] $ ...future.globals.maxSize: NULL [13:13:42.799] - attr(*, "where")=List of 5 [13:13:42.799] ..$ ...future.FUN : [13:13:42.799] ..$ future.call.arguments : [13:13:42.799] ..$ ...future.elements_ii : [13:13:42.799] ..$ ...future.seeds_ii : [13:13:42.799] ..$ ...future.globals.maxSize: [13:13:42.799] - attr(*, "resolved")= logi FALSE [13:13:42.799] - attr(*, "total_size")= num 2240 [13:13:42.799] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:42.799] - attr(*, "already-done")= logi TRUE [13:13:42.805] - copied '...future.FUN' to environment [13:13:42.805] - copied 'future.call.arguments' to environment [13:13:42.805] - copied '...future.elements_ii' to environment [13:13:42.805] - copied '...future.seeds_ii' to environment [13:13:42.805] - copied '...future.globals.maxSize' to environment [13:13:42.805] assign_globals() ... done [13:13:42.806] plan(): Setting new future strategy stack: [13:13:42.806] List of future strategies: [13:13:42.806] 1. sequential: [13:13:42.806] - args: function (..., envir = parent.frame(), workers = "") [13:13:42.806] - tweaked: FALSE [13:13:42.806] - call: NULL [13:13:42.806] plan(): nbrOfWorkers() = 1 [13:13:42.807] plan(): Setting new future strategy stack: [13:13:42.807] List of future strategies: [13:13:42.807] 1. sequential: [13:13:42.807] - args: function (..., envir = parent.frame(), workers = "") [13:13:42.807] - tweaked: FALSE [13:13:42.807] - call: plan(strategy) [13:13:42.807] plan(): nbrOfWorkers() = 1 [13:13:42.808] SequentialFuture started (and completed) [13:13:42.808] - Launch lazy future ... done [13:13:42.808] run() for 'SequentialFuture' ... done [13:13:42.808] Created future: [13:13:42.808] SequentialFuture: [13:13:42.808] Label: 'future_lapply-2' [13:13:42.808] Expression: [13:13:42.808] { [13:13:42.808] do.call(function(...) { [13:13:42.808] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:42.808] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:42.808] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:42.808] on.exit(options(oopts), add = TRUE) [13:13:42.808] } [13:13:42.808] { [13:13:42.808] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:42.808] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:42.808] ...future.FUN(...future.X_jj, ...) [13:13:42.808] }) [13:13:42.808] } [13:13:42.808] }, args = future.call.arguments) [13:13:42.808] } [13:13:42.808] Lazy evaluation: FALSE [13:13:42.808] Asynchronous evaluation: FALSE [13:13:42.808] Local evaluation: TRUE [13:13:42.808] Environment: R_GlobalEnv [13:13:42.808] Capture standard output: TRUE [13:13:42.808] Capture condition classes: 'condition' (excluding 'nothing') [13:13:42.808] 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) [13:13:42.808] Packages: [13:13:42.808] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:42.808] Resolved: TRUE [13:13:42.808] Value: 64 bytes of class 'list' [13:13:42.808] Early signaling: FALSE [13:13:42.808] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:42.808] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:42.809] Chunk #2 of 4 ... DONE [13:13:42.809] Chunk #3 of 4 ... [13:13:42.809] - Finding globals in 'X' for chunk #3 ... [13:13:42.809] getGlobalsAndPackages() ... [13:13:42.809] Searching for globals... [13:13:42.810] [13:13:42.810] Searching for globals ... DONE [13:13:42.810] - globals: [0] [13:13:42.810] getGlobalsAndPackages() ... DONE [13:13:42.810] + additional globals found: [n=0] [13:13:42.810] + additional namespaces needed: [n=0] [13:13:42.810] - Finding globals in 'X' for chunk #3 ... DONE [13:13:42.810] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [13:13:42.811] - seeds: [13:13:42.811] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:42.811] getGlobalsAndPackages() ... [13:13:42.811] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:42.811] Resolving globals: FALSE [13:13:42.811] Tweak future expression to call with '...' arguments ... [13:13:42.811] { [13:13:42.811] do.call(function(...) { [13:13:42.811] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:42.811] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:42.811] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:42.811] on.exit(options(oopts), add = TRUE) [13:13:42.811] } [13:13:42.811] { [13:13:42.811] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:42.811] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:42.811] ...future.FUN(...future.X_jj, ...) [13:13:42.811] }) [13:13:42.811] } [13:13:42.811] }, args = future.call.arguments) [13:13:42.811] } [13:13:42.812] Tweak future expression to call with '...' arguments ... DONE [13:13:42.812] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:42.812] [13:13:42.812] getGlobalsAndPackages() ... DONE [13:13:42.812] run() for 'Future' ... [13:13:42.813] - state: 'created' [13:13:42.813] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:13:42.813] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:42.813] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:42.813] - Field: 'label' [13:13:42.813] - Field: 'local' [13:13:42.813] - Field: 'owner' [13:13:42.814] - Field: 'envir' [13:13:42.814] - Field: 'packages' [13:13:42.814] - Field: 'gc' [13:13:42.814] - Field: 'conditions' [13:13:42.814] - Field: 'expr' [13:13:42.814] - Field: 'uuid' [13:13:42.814] - Field: 'seed' [13:13:42.814] - Field: 'version' [13:13:42.815] - Field: 'result' [13:13:42.815] - Field: 'asynchronous' [13:13:42.815] - Field: 'calls' [13:13:42.815] - Field: 'globals' [13:13:42.815] - Field: 'stdout' [13:13:42.815] - Field: 'earlySignal' [13:13:42.815] - Field: 'lazy' [13:13:42.815] - Field: 'state' [13:13:42.816] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:42.816] - Launch lazy future ... [13:13:42.816] Packages needed by the future expression (n = 0): [13:13:42.816] Packages needed by future strategies (n = 0): [13:13:42.816] { [13:13:42.816] { [13:13:42.816] { [13:13:42.816] ...future.startTime <- base::Sys.time() [13:13:42.816] { [13:13:42.816] { [13:13:42.816] { [13:13:42.816] base::local({ [13:13:42.816] has_future <- base::requireNamespace("future", [13:13:42.816] quietly = TRUE) [13:13:42.816] if (has_future) { [13:13:42.816] ns <- base::getNamespace("future") [13:13:42.816] version <- ns[[".package"]][["version"]] [13:13:42.816] if (is.null(version)) [13:13:42.816] version <- utils::packageVersion("future") [13:13:42.816] } [13:13:42.816] else { [13:13:42.816] version <- NULL [13:13:42.816] } [13:13:42.816] if (!has_future || version < "1.8.0") { [13:13:42.816] info <- base::c(r_version = base::gsub("R version ", [13:13:42.816] "", base::R.version$version.string), [13:13:42.816] platform = base::sprintf("%s (%s-bit)", [13:13:42.816] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:42.816] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:42.816] "release", "version")], collapse = " "), [13:13:42.816] hostname = base::Sys.info()[["nodename"]]) [13:13:42.816] info <- base::sprintf("%s: %s", base::names(info), [13:13:42.816] info) [13:13:42.816] info <- base::paste(info, collapse = "; ") [13:13:42.816] if (!has_future) { [13:13:42.816] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:42.816] info) [13:13:42.816] } [13:13:42.816] else { [13:13:42.816] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:42.816] info, version) [13:13:42.816] } [13:13:42.816] base::stop(msg) [13:13:42.816] } [13:13:42.816] }) [13:13:42.816] } [13:13:42.816] options(future.plan = NULL) [13:13:42.816] Sys.unsetenv("R_FUTURE_PLAN") [13:13:42.816] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:42.816] } [13:13:42.816] ...future.workdir <- getwd() [13:13:42.816] } [13:13:42.816] ...future.oldOptions <- base::as.list(base::.Options) [13:13:42.816] ...future.oldEnvVars <- base::Sys.getenv() [13:13:42.816] } [13:13:42.816] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:42.816] future.globals.maxSize = 2097152000, future.globals.method = NULL, [13:13:42.816] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:42.816] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:42.816] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:42.816] future.stdout.windows.reencode = NULL, width = 80L) [13:13:42.816] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:42.816] base::names(...future.oldOptions)) [13:13:42.816] } [13:13:42.816] if (FALSE) { [13:13:42.816] } [13:13:42.816] else { [13:13:42.816] if (TRUE) { [13:13:42.816] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:42.816] open = "w") [13:13:42.816] } [13:13:42.816] else { [13:13:42.816] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:42.816] windows = "NUL", "/dev/null"), open = "w") [13:13:42.816] } [13:13:42.816] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:42.816] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:42.816] base::sink(type = "output", split = FALSE) [13:13:42.816] base::close(...future.stdout) [13:13:42.816] }, add = TRUE) [13:13:42.816] } [13:13:42.816] ...future.frame <- base::sys.nframe() [13:13:42.816] ...future.conditions <- base::list() [13:13:42.816] ...future.rng <- base::globalenv()$.Random.seed [13:13:42.816] if (FALSE) { [13:13:42.816] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:42.816] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:42.816] } [13:13:42.816] ...future.result <- base::tryCatch({ [13:13:42.816] base::withCallingHandlers({ [13:13:42.816] ...future.value <- base::withVisible(base::local({ [13:13:42.816] do.call(function(...) { [13:13:42.816] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:42.816] if (!identical(...future.globals.maxSize.org, [13:13:42.816] ...future.globals.maxSize)) { [13:13:42.816] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:42.816] on.exit(options(oopts), add = TRUE) [13:13:42.816] } [13:13:42.816] { [13:13:42.816] lapply(seq_along(...future.elements_ii), [13:13:42.816] FUN = function(jj) { [13:13:42.816] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:42.816] ...future.FUN(...future.X_jj, ...) [13:13:42.816] }) [13:13:42.816] } [13:13:42.816] }, args = future.call.arguments) [13:13:42.816] })) [13:13:42.816] future::FutureResult(value = ...future.value$value, [13:13:42.816] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:42.816] ...future.rng), globalenv = if (FALSE) [13:13:42.816] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:42.816] ...future.globalenv.names)) [13:13:42.816] else NULL, started = ...future.startTime, version = "1.8") [13:13:42.816] }, condition = base::local({ [13:13:42.816] c <- base::c [13:13:42.816] inherits <- base::inherits [13:13:42.816] invokeRestart <- base::invokeRestart [13:13:42.816] length <- base::length [13:13:42.816] list <- base::list [13:13:42.816] seq.int <- base::seq.int [13:13:42.816] signalCondition <- base::signalCondition [13:13:42.816] sys.calls <- base::sys.calls [13:13:42.816] `[[` <- base::`[[` [13:13:42.816] `+` <- base::`+` [13:13:42.816] `<<-` <- base::`<<-` [13:13:42.816] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:42.816] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:42.816] 3L)] [13:13:42.816] } [13:13:42.816] function(cond) { [13:13:42.816] is_error <- inherits(cond, "error") [13:13:42.816] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:42.816] NULL) [13:13:42.816] if (is_error) { [13:13:42.816] sessionInformation <- function() { [13:13:42.816] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:42.816] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:42.816] search = base::search(), system = base::Sys.info()) [13:13:42.816] } [13:13:42.816] ...future.conditions[[length(...future.conditions) + [13:13:42.816] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:42.816] cond$call), session = sessionInformation(), [13:13:42.816] timestamp = base::Sys.time(), signaled = 0L) [13:13:42.816] signalCondition(cond) [13:13:42.816] } [13:13:42.816] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:42.816] "immediateCondition"))) { [13:13:42.816] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:42.816] ...future.conditions[[length(...future.conditions) + [13:13:42.816] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:42.816] if (TRUE && !signal) { [13:13:42.816] muffleCondition <- function (cond, pattern = "^muffle") [13:13:42.816] { [13:13:42.816] inherits <- base::inherits [13:13:42.816] invokeRestart <- base::invokeRestart [13:13:42.816] is.null <- base::is.null [13:13:42.816] muffled <- FALSE [13:13:42.816] if (inherits(cond, "message")) { [13:13:42.816] muffled <- grepl(pattern, "muffleMessage") [13:13:42.816] if (muffled) [13:13:42.816] invokeRestart("muffleMessage") [13:13:42.816] } [13:13:42.816] else if (inherits(cond, "warning")) { [13:13:42.816] muffled <- grepl(pattern, "muffleWarning") [13:13:42.816] if (muffled) [13:13:42.816] invokeRestart("muffleWarning") [13:13:42.816] } [13:13:42.816] else if (inherits(cond, "condition")) { [13:13:42.816] if (!is.null(pattern)) { [13:13:42.816] computeRestarts <- base::computeRestarts [13:13:42.816] grepl <- base::grepl [13:13:42.816] restarts <- computeRestarts(cond) [13:13:42.816] for (restart in restarts) { [13:13:42.816] name <- restart$name [13:13:42.816] if (is.null(name)) [13:13:42.816] next [13:13:42.816] if (!grepl(pattern, name)) [13:13:42.816] next [13:13:42.816] invokeRestart(restart) [13:13:42.816] muffled <- TRUE [13:13:42.816] break [13:13:42.816] } [13:13:42.816] } [13:13:42.816] } [13:13:42.816] invisible(muffled) [13:13:42.816] } [13:13:42.816] muffleCondition(cond, pattern = "^muffle") [13:13:42.816] } [13:13:42.816] } [13:13:42.816] else { [13:13:42.816] if (TRUE) { [13:13:42.816] muffleCondition <- function (cond, pattern = "^muffle") [13:13:42.816] { [13:13:42.816] inherits <- base::inherits [13:13:42.816] invokeRestart <- base::invokeRestart [13:13:42.816] is.null <- base::is.null [13:13:42.816] muffled <- FALSE [13:13:42.816] if (inherits(cond, "message")) { [13:13:42.816] muffled <- grepl(pattern, "muffleMessage") [13:13:42.816] if (muffled) [13:13:42.816] invokeRestart("muffleMessage") [13:13:42.816] } [13:13:42.816] else if (inherits(cond, "warning")) { [13:13:42.816] muffled <- grepl(pattern, "muffleWarning") [13:13:42.816] if (muffled) [13:13:42.816] invokeRestart("muffleWarning") [13:13:42.816] } [13:13:42.816] else if (inherits(cond, "condition")) { [13:13:42.816] if (!is.null(pattern)) { [13:13:42.816] computeRestarts <- base::computeRestarts [13:13:42.816] grepl <- base::grepl [13:13:42.816] restarts <- computeRestarts(cond) [13:13:42.816] for (restart in restarts) { [13:13:42.816] name <- restart$name [13:13:42.816] if (is.null(name)) [13:13:42.816] next [13:13:42.816] if (!grepl(pattern, name)) [13:13:42.816] next [13:13:42.816] invokeRestart(restart) [13:13:42.816] muffled <- TRUE [13:13:42.816] break [13:13:42.816] } [13:13:42.816] } [13:13:42.816] } [13:13:42.816] invisible(muffled) [13:13:42.816] } [13:13:42.816] muffleCondition(cond, pattern = "^muffle") [13:13:42.816] } [13:13:42.816] } [13:13:42.816] } [13:13:42.816] })) [13:13:42.816] }, error = function(ex) { [13:13:42.816] base::structure(base::list(value = NULL, visible = NULL, [13:13:42.816] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:42.816] ...future.rng), started = ...future.startTime, [13:13:42.816] finished = Sys.time(), session_uuid = NA_character_, [13:13:42.816] version = "1.8"), class = "FutureResult") [13:13:42.816] }, finally = { [13:13:42.816] if (!identical(...future.workdir, getwd())) [13:13:42.816] setwd(...future.workdir) [13:13:42.816] { [13:13:42.816] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:42.816] ...future.oldOptions$nwarnings <- NULL [13:13:42.816] } [13:13:42.816] base::options(...future.oldOptions) [13:13:42.816] if (.Platform$OS.type == "windows") { [13:13:42.816] old_names <- names(...future.oldEnvVars) [13:13:42.816] envs <- base::Sys.getenv() [13:13:42.816] names <- names(envs) [13:13:42.816] common <- intersect(names, old_names) [13:13:42.816] added <- setdiff(names, old_names) [13:13:42.816] removed <- setdiff(old_names, names) [13:13:42.816] changed <- common[...future.oldEnvVars[common] != [13:13:42.816] envs[common]] [13:13:42.816] NAMES <- toupper(changed) [13:13:42.816] args <- list() [13:13:42.816] for (kk in seq_along(NAMES)) { [13:13:42.816] name <- changed[[kk]] [13:13:42.816] NAME <- NAMES[[kk]] [13:13:42.816] if (name != NAME && is.element(NAME, old_names)) [13:13:42.816] next [13:13:42.816] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:42.816] } [13:13:42.816] NAMES <- toupper(added) [13:13:42.816] for (kk in seq_along(NAMES)) { [13:13:42.816] name <- added[[kk]] [13:13:42.816] NAME <- NAMES[[kk]] [13:13:42.816] if (name != NAME && is.element(NAME, old_names)) [13:13:42.816] next [13:13:42.816] args[[name]] <- "" [13:13:42.816] } [13:13:42.816] NAMES <- toupper(removed) [13:13:42.816] for (kk in seq_along(NAMES)) { [13:13:42.816] name <- removed[[kk]] [13:13:42.816] NAME <- NAMES[[kk]] [13:13:42.816] if (name != NAME && is.element(NAME, old_names)) [13:13:42.816] next [13:13:42.816] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:42.816] } [13:13:42.816] if (length(args) > 0) [13:13:42.816] base::do.call(base::Sys.setenv, args = args) [13:13:42.816] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:42.816] } [13:13:42.816] else { [13:13:42.816] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:42.816] } [13:13:42.816] { [13:13:42.816] if (base::length(...future.futureOptionsAdded) > [13:13:42.816] 0L) { [13:13:42.816] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:42.816] base::names(opts) <- ...future.futureOptionsAdded [13:13:42.816] base::options(opts) [13:13:42.816] } [13:13:42.816] { [13:13:42.816] { [13:13:42.816] NULL [13:13:42.816] RNGkind("Mersenne-Twister") [13:13:42.816] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:42.816] inherits = FALSE) [13:13:42.816] } [13:13:42.816] options(future.plan = NULL) [13:13:42.816] if (is.na(NA_character_)) [13:13:42.816] Sys.unsetenv("R_FUTURE_PLAN") [13:13:42.816] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:42.816] future::plan(list(function (..., envir = parent.frame()) [13:13:42.816] { [13:13:42.816] future <- SequentialFuture(..., envir = envir) [13:13:42.816] if (!future$lazy) [13:13:42.816] future <- run(future) [13:13:42.816] invisible(future) [13:13:42.816] }), .cleanup = FALSE, .init = FALSE) [13:13:42.816] } [13:13:42.816] } [13:13:42.816] } [13:13:42.816] }) [13:13:42.816] if (TRUE) { [13:13:42.816] base::sink(type = "output", split = FALSE) [13:13:42.816] if (TRUE) { [13:13:42.816] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:42.816] } [13:13:42.816] else { [13:13:42.816] ...future.result["stdout"] <- base::list(NULL) [13:13:42.816] } [13:13:42.816] base::close(...future.stdout) [13:13:42.816] ...future.stdout <- NULL [13:13:42.816] } [13:13:42.816] ...future.result$conditions <- ...future.conditions [13:13:42.816] ...future.result$finished <- base::Sys.time() [13:13:42.816] ...future.result [13:13:42.816] } [13:13:42.819] assign_globals() ... [13:13:42.819] List of 5 [13:13:42.819] $ ...future.FUN :function (mode = "logical", length = 0L) [13:13:42.819] $ future.call.arguments :List of 1 [13:13:42.819] ..$ length: int 2 [13:13:42.819] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:42.819] $ ...future.elements_ii :List of 1 [13:13:42.819] ..$ c: chr "character" [13:13:42.819] $ ...future.seeds_ii : NULL [13:13:42.819] $ ...future.globals.maxSize: NULL [13:13:42.819] - attr(*, "where")=List of 5 [13:13:42.819] ..$ ...future.FUN : [13:13:42.819] ..$ future.call.arguments : [13:13:42.819] ..$ ...future.elements_ii : [13:13:42.819] ..$ ...future.seeds_ii : [13:13:42.819] ..$ ...future.globals.maxSize: [13:13:42.819] - attr(*, "resolved")= logi FALSE [13:13:42.819] - attr(*, "total_size")= num 2240 [13:13:42.819] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:42.819] - attr(*, "already-done")= logi TRUE [13:13:42.823] - copied '...future.FUN' to environment [13:13:42.824] - copied 'future.call.arguments' to environment [13:13:42.824] - copied '...future.elements_ii' to environment [13:13:42.824] - copied '...future.seeds_ii' to environment [13:13:42.824] - copied '...future.globals.maxSize' to environment [13:13:42.824] assign_globals() ... done [13:13:42.824] plan(): Setting new future strategy stack: [13:13:42.824] List of future strategies: [13:13:42.824] 1. sequential: [13:13:42.824] - args: function (..., envir = parent.frame(), workers = "") [13:13:42.824] - tweaked: FALSE [13:13:42.824] - call: NULL [13:13:42.825] plan(): nbrOfWorkers() = 1 [13:13:42.826] plan(): Setting new future strategy stack: [13:13:42.826] List of future strategies: [13:13:42.826] 1. sequential: [13:13:42.826] - args: function (..., envir = parent.frame(), workers = "") [13:13:42.826] - tweaked: FALSE [13:13:42.826] - call: plan(strategy) [13:13:42.826] plan(): nbrOfWorkers() = 1 [13:13:42.826] SequentialFuture started (and completed) [13:13:42.827] - Launch lazy future ... done [13:13:42.827] run() for 'SequentialFuture' ... done [13:13:42.827] Created future: [13:13:42.827] SequentialFuture: [13:13:42.827] Label: 'future_lapply-3' [13:13:42.827] Expression: [13:13:42.827] { [13:13:42.827] do.call(function(...) { [13:13:42.827] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:42.827] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:42.827] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:42.827] on.exit(options(oopts), add = TRUE) [13:13:42.827] } [13:13:42.827] { [13:13:42.827] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:42.827] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:42.827] ...future.FUN(...future.X_jj, ...) [13:13:42.827] }) [13:13:42.827] } [13:13:42.827] }, args = future.call.arguments) [13:13:42.827] } [13:13:42.827] Lazy evaluation: FALSE [13:13:42.827] Asynchronous evaluation: FALSE [13:13:42.827] Local evaluation: TRUE [13:13:42.827] Environment: R_GlobalEnv [13:13:42.827] Capture standard output: TRUE [13:13:42.827] Capture condition classes: 'condition' (excluding 'nothing') [13:13:42.827] 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) [13:13:42.827] Packages: [13:13:42.827] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:42.827] Resolved: TRUE [13:13:42.827] Value: 120 bytes of class 'list' [13:13:42.827] Early signaling: FALSE [13:13:42.827] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:42.827] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:42.828] Chunk #3 of 4 ... DONE [13:13:42.828] Chunk #4 of 4 ... [13:13:42.828] - Finding globals in 'X' for chunk #4 ... [13:13:42.828] getGlobalsAndPackages() ... [13:13:42.828] Searching for globals... [13:13:42.828] [13:13:42.829] Searching for globals ... DONE [13:13:42.829] - globals: [0] [13:13:42.829] getGlobalsAndPackages() ... DONE [13:13:42.829] + additional globals found: [n=0] [13:13:42.829] + additional namespaces needed: [n=0] [13:13:42.829] - Finding globals in 'X' for chunk #4 ... DONE [13:13:42.829] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [13:13:42.829] - seeds: [13:13:42.829] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:42.830] getGlobalsAndPackages() ... [13:13:42.830] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:42.830] Resolving globals: FALSE [13:13:42.830] Tweak future expression to call with '...' arguments ... [13:13:42.830] { [13:13:42.830] do.call(function(...) { [13:13:42.830] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:42.830] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:42.830] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:42.830] on.exit(options(oopts), add = TRUE) [13:13:42.830] } [13:13:42.830] { [13:13:42.830] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:42.830] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:42.830] ...future.FUN(...future.X_jj, ...) [13:13:42.830] }) [13:13:42.830] } [13:13:42.830] }, args = future.call.arguments) [13:13:42.830] } [13:13:42.830] Tweak future expression to call with '...' arguments ... DONE [13:13:42.831] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:42.831] [13:13:42.831] getGlobalsAndPackages() ... DONE [13:13:42.831] run() for 'Future' ... [13:13:42.831] - state: 'created' [13:13:42.831] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:13:42.832] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:42.832] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:42.832] - Field: 'label' [13:13:42.832] - Field: 'local' [13:13:42.832] - Field: 'owner' [13:13:42.832] - Field: 'envir' [13:13:42.833] - Field: 'packages' [13:13:42.833] - Field: 'gc' [13:13:42.833] - Field: 'conditions' [13:13:42.833] - Field: 'expr' [13:13:42.833] - Field: 'uuid' [13:13:42.833] - Field: 'seed' [13:13:42.833] - Field: 'version' [13:13:42.833] - Field: 'result' [13:13:42.833] - Field: 'asynchronous' [13:13:42.834] - Field: 'calls' [13:13:42.834] - Field: 'globals' [13:13:42.834] - Field: 'stdout' [13:13:42.834] - Field: 'earlySignal' [13:13:42.834] - Field: 'lazy' [13:13:42.834] - Field: 'state' [13:13:42.834] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:42.834] - Launch lazy future ... [13:13:42.835] Packages needed by the future expression (n = 0): [13:13:42.835] Packages needed by future strategies (n = 0): [13:13:42.835] { [13:13:42.835] { [13:13:42.835] { [13:13:42.835] ...future.startTime <- base::Sys.time() [13:13:42.835] { [13:13:42.835] { [13:13:42.835] { [13:13:42.835] base::local({ [13:13:42.835] has_future <- base::requireNamespace("future", [13:13:42.835] quietly = TRUE) [13:13:42.835] if (has_future) { [13:13:42.835] ns <- base::getNamespace("future") [13:13:42.835] version <- ns[[".package"]][["version"]] [13:13:42.835] if (is.null(version)) [13:13:42.835] version <- utils::packageVersion("future") [13:13:42.835] } [13:13:42.835] else { [13:13:42.835] version <- NULL [13:13:42.835] } [13:13:42.835] if (!has_future || version < "1.8.0") { [13:13:42.835] info <- base::c(r_version = base::gsub("R version ", [13:13:42.835] "", base::R.version$version.string), [13:13:42.835] platform = base::sprintf("%s (%s-bit)", [13:13:42.835] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:42.835] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:42.835] "release", "version")], collapse = " "), [13:13:42.835] hostname = base::Sys.info()[["nodename"]]) [13:13:42.835] info <- base::sprintf("%s: %s", base::names(info), [13:13:42.835] info) [13:13:42.835] info <- base::paste(info, collapse = "; ") [13:13:42.835] if (!has_future) { [13:13:42.835] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:42.835] info) [13:13:42.835] } [13:13:42.835] else { [13:13:42.835] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:42.835] info, version) [13:13:42.835] } [13:13:42.835] base::stop(msg) [13:13:42.835] } [13:13:42.835] }) [13:13:42.835] } [13:13:42.835] options(future.plan = NULL) [13:13:42.835] Sys.unsetenv("R_FUTURE_PLAN") [13:13:42.835] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:42.835] } [13:13:42.835] ...future.workdir <- getwd() [13:13:42.835] } [13:13:42.835] ...future.oldOptions <- base::as.list(base::.Options) [13:13:42.835] ...future.oldEnvVars <- base::Sys.getenv() [13:13:42.835] } [13:13:42.835] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:42.835] future.globals.maxSize = 2097152000, future.globals.method = NULL, [13:13:42.835] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:42.835] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:42.835] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:42.835] future.stdout.windows.reencode = NULL, width = 80L) [13:13:42.835] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:42.835] base::names(...future.oldOptions)) [13:13:42.835] } [13:13:42.835] if (FALSE) { [13:13:42.835] } [13:13:42.835] else { [13:13:42.835] if (TRUE) { [13:13:42.835] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:42.835] open = "w") [13:13:42.835] } [13:13:42.835] else { [13:13:42.835] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:42.835] windows = "NUL", "/dev/null"), open = "w") [13:13:42.835] } [13:13:42.835] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:42.835] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:42.835] base::sink(type = "output", split = FALSE) [13:13:42.835] base::close(...future.stdout) [13:13:42.835] }, add = TRUE) [13:13:42.835] } [13:13:42.835] ...future.frame <- base::sys.nframe() [13:13:42.835] ...future.conditions <- base::list() [13:13:42.835] ...future.rng <- base::globalenv()$.Random.seed [13:13:42.835] if (FALSE) { [13:13:42.835] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:42.835] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:42.835] } [13:13:42.835] ...future.result <- base::tryCatch({ [13:13:42.835] base::withCallingHandlers({ [13:13:42.835] ...future.value <- base::withVisible(base::local({ [13:13:42.835] do.call(function(...) { [13:13:42.835] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:42.835] if (!identical(...future.globals.maxSize.org, [13:13:42.835] ...future.globals.maxSize)) { [13:13:42.835] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:42.835] on.exit(options(oopts), add = TRUE) [13:13:42.835] } [13:13:42.835] { [13:13:42.835] lapply(seq_along(...future.elements_ii), [13:13:42.835] FUN = function(jj) { [13:13:42.835] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:42.835] ...future.FUN(...future.X_jj, ...) [13:13:42.835] }) [13:13:42.835] } [13:13:42.835] }, args = future.call.arguments) [13:13:42.835] })) [13:13:42.835] future::FutureResult(value = ...future.value$value, [13:13:42.835] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:42.835] ...future.rng), globalenv = if (FALSE) [13:13:42.835] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:42.835] ...future.globalenv.names)) [13:13:42.835] else NULL, started = ...future.startTime, version = "1.8") [13:13:42.835] }, condition = base::local({ [13:13:42.835] c <- base::c [13:13:42.835] inherits <- base::inherits [13:13:42.835] invokeRestart <- base::invokeRestart [13:13:42.835] length <- base::length [13:13:42.835] list <- base::list [13:13:42.835] seq.int <- base::seq.int [13:13:42.835] signalCondition <- base::signalCondition [13:13:42.835] sys.calls <- base::sys.calls [13:13:42.835] `[[` <- base::`[[` [13:13:42.835] `+` <- base::`+` [13:13:42.835] `<<-` <- base::`<<-` [13:13:42.835] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:42.835] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:42.835] 3L)] [13:13:42.835] } [13:13:42.835] function(cond) { [13:13:42.835] is_error <- inherits(cond, "error") [13:13:42.835] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:42.835] NULL) [13:13:42.835] if (is_error) { [13:13:42.835] sessionInformation <- function() { [13:13:42.835] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:42.835] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:42.835] search = base::search(), system = base::Sys.info()) [13:13:42.835] } [13:13:42.835] ...future.conditions[[length(...future.conditions) + [13:13:42.835] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:42.835] cond$call), session = sessionInformation(), [13:13:42.835] timestamp = base::Sys.time(), signaled = 0L) [13:13:42.835] signalCondition(cond) [13:13:42.835] } [13:13:42.835] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:42.835] "immediateCondition"))) { [13:13:42.835] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:42.835] ...future.conditions[[length(...future.conditions) + [13:13:42.835] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:42.835] if (TRUE && !signal) { [13:13:42.835] muffleCondition <- function (cond, pattern = "^muffle") [13:13:42.835] { [13:13:42.835] inherits <- base::inherits [13:13:42.835] invokeRestart <- base::invokeRestart [13:13:42.835] is.null <- base::is.null [13:13:42.835] muffled <- FALSE [13:13:42.835] if (inherits(cond, "message")) { [13:13:42.835] muffled <- grepl(pattern, "muffleMessage") [13:13:42.835] if (muffled) [13:13:42.835] invokeRestart("muffleMessage") [13:13:42.835] } [13:13:42.835] else if (inherits(cond, "warning")) { [13:13:42.835] muffled <- grepl(pattern, "muffleWarning") [13:13:42.835] if (muffled) [13:13:42.835] invokeRestart("muffleWarning") [13:13:42.835] } [13:13:42.835] else if (inherits(cond, "condition")) { [13:13:42.835] if (!is.null(pattern)) { [13:13:42.835] computeRestarts <- base::computeRestarts [13:13:42.835] grepl <- base::grepl [13:13:42.835] restarts <- computeRestarts(cond) [13:13:42.835] for (restart in restarts) { [13:13:42.835] name <- restart$name [13:13:42.835] if (is.null(name)) [13:13:42.835] next [13:13:42.835] if (!grepl(pattern, name)) [13:13:42.835] next [13:13:42.835] invokeRestart(restart) [13:13:42.835] muffled <- TRUE [13:13:42.835] break [13:13:42.835] } [13:13:42.835] } [13:13:42.835] } [13:13:42.835] invisible(muffled) [13:13:42.835] } [13:13:42.835] muffleCondition(cond, pattern = "^muffle") [13:13:42.835] } [13:13:42.835] } [13:13:42.835] else { [13:13:42.835] if (TRUE) { [13:13:42.835] muffleCondition <- function (cond, pattern = "^muffle") [13:13:42.835] { [13:13:42.835] inherits <- base::inherits [13:13:42.835] invokeRestart <- base::invokeRestart [13:13:42.835] is.null <- base::is.null [13:13:42.835] muffled <- FALSE [13:13:42.835] if (inherits(cond, "message")) { [13:13:42.835] muffled <- grepl(pattern, "muffleMessage") [13:13:42.835] if (muffled) [13:13:42.835] invokeRestart("muffleMessage") [13:13:42.835] } [13:13:42.835] else if (inherits(cond, "warning")) { [13:13:42.835] muffled <- grepl(pattern, "muffleWarning") [13:13:42.835] if (muffled) [13:13:42.835] invokeRestart("muffleWarning") [13:13:42.835] } [13:13:42.835] else if (inherits(cond, "condition")) { [13:13:42.835] if (!is.null(pattern)) { [13:13:42.835] computeRestarts <- base::computeRestarts [13:13:42.835] grepl <- base::grepl [13:13:42.835] restarts <- computeRestarts(cond) [13:13:42.835] for (restart in restarts) { [13:13:42.835] name <- restart$name [13:13:42.835] if (is.null(name)) [13:13:42.835] next [13:13:42.835] if (!grepl(pattern, name)) [13:13:42.835] next [13:13:42.835] invokeRestart(restart) [13:13:42.835] muffled <- TRUE [13:13:42.835] break [13:13:42.835] } [13:13:42.835] } [13:13:42.835] } [13:13:42.835] invisible(muffled) [13:13:42.835] } [13:13:42.835] muffleCondition(cond, pattern = "^muffle") [13:13:42.835] } [13:13:42.835] } [13:13:42.835] } [13:13:42.835] })) [13:13:42.835] }, error = function(ex) { [13:13:42.835] base::structure(base::list(value = NULL, visible = NULL, [13:13:42.835] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:42.835] ...future.rng), started = ...future.startTime, [13:13:42.835] finished = Sys.time(), session_uuid = NA_character_, [13:13:42.835] version = "1.8"), class = "FutureResult") [13:13:42.835] }, finally = { [13:13:42.835] if (!identical(...future.workdir, getwd())) [13:13:42.835] setwd(...future.workdir) [13:13:42.835] { [13:13:42.835] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:42.835] ...future.oldOptions$nwarnings <- NULL [13:13:42.835] } [13:13:42.835] base::options(...future.oldOptions) [13:13:42.835] if (.Platform$OS.type == "windows") { [13:13:42.835] old_names <- names(...future.oldEnvVars) [13:13:42.835] envs <- base::Sys.getenv() [13:13:42.835] names <- names(envs) [13:13:42.835] common <- intersect(names, old_names) [13:13:42.835] added <- setdiff(names, old_names) [13:13:42.835] removed <- setdiff(old_names, names) [13:13:42.835] changed <- common[...future.oldEnvVars[common] != [13:13:42.835] envs[common]] [13:13:42.835] NAMES <- toupper(changed) [13:13:42.835] args <- list() [13:13:42.835] for (kk in seq_along(NAMES)) { [13:13:42.835] name <- changed[[kk]] [13:13:42.835] NAME <- NAMES[[kk]] [13:13:42.835] if (name != NAME && is.element(NAME, old_names)) [13:13:42.835] next [13:13:42.835] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:42.835] } [13:13:42.835] NAMES <- toupper(added) [13:13:42.835] for (kk in seq_along(NAMES)) { [13:13:42.835] name <- added[[kk]] [13:13:42.835] NAME <- NAMES[[kk]] [13:13:42.835] if (name != NAME && is.element(NAME, old_names)) [13:13:42.835] next [13:13:42.835] args[[name]] <- "" [13:13:42.835] } [13:13:42.835] NAMES <- toupper(removed) [13:13:42.835] for (kk in seq_along(NAMES)) { [13:13:42.835] name <- removed[[kk]] [13:13:42.835] NAME <- NAMES[[kk]] [13:13:42.835] if (name != NAME && is.element(NAME, old_names)) [13:13:42.835] next [13:13:42.835] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:42.835] } [13:13:42.835] if (length(args) > 0) [13:13:42.835] base::do.call(base::Sys.setenv, args = args) [13:13:42.835] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:42.835] } [13:13:42.835] else { [13:13:42.835] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:42.835] } [13:13:42.835] { [13:13:42.835] if (base::length(...future.futureOptionsAdded) > [13:13:42.835] 0L) { [13:13:42.835] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:42.835] base::names(opts) <- ...future.futureOptionsAdded [13:13:42.835] base::options(opts) [13:13:42.835] } [13:13:42.835] { [13:13:42.835] { [13:13:42.835] NULL [13:13:42.835] RNGkind("Mersenne-Twister") [13:13:42.835] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:42.835] inherits = FALSE) [13:13:42.835] } [13:13:42.835] options(future.plan = NULL) [13:13:42.835] if (is.na(NA_character_)) [13:13:42.835] Sys.unsetenv("R_FUTURE_PLAN") [13:13:42.835] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:42.835] future::plan(list(function (..., envir = parent.frame()) [13:13:42.835] { [13:13:42.835] future <- SequentialFuture(..., envir = envir) [13:13:42.835] if (!future$lazy) [13:13:42.835] future <- run(future) [13:13:42.835] invisible(future) [13:13:42.835] }), .cleanup = FALSE, .init = FALSE) [13:13:42.835] } [13:13:42.835] } [13:13:42.835] } [13:13:42.835] }) [13:13:42.835] if (TRUE) { [13:13:42.835] base::sink(type = "output", split = FALSE) [13:13:42.835] if (TRUE) { [13:13:42.835] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:42.835] } [13:13:42.835] else { [13:13:42.835] ...future.result["stdout"] <- base::list(NULL) [13:13:42.835] } [13:13:42.835] base::close(...future.stdout) [13:13:42.835] ...future.stdout <- NULL [13:13:42.835] } [13:13:42.835] ...future.result$conditions <- ...future.conditions [13:13:42.835] ...future.result$finished <- base::Sys.time() [13:13:42.835] ...future.result [13:13:42.835] } [13:13:42.838] assign_globals() ... [13:13:42.838] List of 5 [13:13:42.838] $ ...future.FUN :function (mode = "logical", length = 0L) [13:13:42.838] $ future.call.arguments :List of 1 [13:13:42.838] ..$ length: int 2 [13:13:42.838] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:42.838] $ ...future.elements_ii :List of 1 [13:13:42.838] ..$ c: chr "list" [13:13:42.838] $ ...future.seeds_ii : NULL [13:13:42.838] $ ...future.globals.maxSize: NULL [13:13:42.838] - attr(*, "where")=List of 5 [13:13:42.838] ..$ ...future.FUN : [13:13:42.838] ..$ future.call.arguments : [13:13:42.838] ..$ ...future.elements_ii : [13:13:42.838] ..$ ...future.seeds_ii : [13:13:42.838] ..$ ...future.globals.maxSize: [13:13:42.838] - attr(*, "resolved")= logi FALSE [13:13:42.838] - attr(*, "total_size")= num 2240 [13:13:42.838] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:42.838] - attr(*, "already-done")= logi TRUE [13:13:42.842] - copied '...future.FUN' to environment [13:13:42.842] - copied 'future.call.arguments' to environment [13:13:42.843] - copied '...future.elements_ii' to environment [13:13:42.843] - copied '...future.seeds_ii' to environment [13:13:42.843] - copied '...future.globals.maxSize' to environment [13:13:42.843] assign_globals() ... done [13:13:42.843] plan(): Setting new future strategy stack: [13:13:42.843] List of future strategies: [13:13:42.843] 1. sequential: [13:13:42.843] - args: function (..., envir = parent.frame(), workers = "") [13:13:42.843] - tweaked: FALSE [13:13:42.843] - call: NULL [13:13:42.844] plan(): nbrOfWorkers() = 1 [13:13:42.845] plan(): Setting new future strategy stack: [13:13:42.845] List of future strategies: [13:13:42.845] 1. sequential: [13:13:42.845] - args: function (..., envir = parent.frame(), workers = "") [13:13:42.845] - tweaked: FALSE [13:13:42.845] - call: plan(strategy) [13:13:42.845] plan(): nbrOfWorkers() = 1 [13:13:42.845] SequentialFuture started (and completed) [13:13:42.845] - Launch lazy future ... done [13:13:42.846] run() for 'SequentialFuture' ... done [13:13:42.846] Created future: [13:13:42.846] SequentialFuture: [13:13:42.846] Label: 'future_lapply-4' [13:13:42.846] Expression: [13:13:42.846] { [13:13:42.846] do.call(function(...) { [13:13:42.846] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:42.846] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:42.846] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:42.846] on.exit(options(oopts), add = TRUE) [13:13:42.846] } [13:13:42.846] { [13:13:42.846] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:42.846] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:42.846] ...future.FUN(...future.X_jj, ...) [13:13:42.846] }) [13:13:42.846] } [13:13:42.846] }, args = future.call.arguments) [13:13:42.846] } [13:13:42.846] Lazy evaluation: FALSE [13:13:42.846] Asynchronous evaluation: FALSE [13:13:42.846] Local evaluation: TRUE [13:13:42.846] Environment: R_GlobalEnv [13:13:42.846] Capture standard output: TRUE [13:13:42.846] Capture condition classes: 'condition' (excluding 'nothing') [13:13:42.846] 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) [13:13:42.846] Packages: [13:13:42.846] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:42.846] Resolved: TRUE [13:13:42.846] Value: 0 bytes of class 'list' [13:13:42.846] Early signaling: FALSE [13:13:42.846] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:42.846] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:42.847] Chunk #4 of 4 ... DONE [13:13:42.847] Launching 4 futures (chunks) ... DONE [13:13:42.847] Resolving 4 futures (chunks) ... [13:13:42.847] resolve() on list ... [13:13:42.847] recursive: 0 [13:13:42.847] length: 4 [13:13:42.847] [13:13:42.847] resolved() for 'SequentialFuture' ... [13:13:42.848] - state: 'finished' [13:13:42.848] - run: TRUE [13:13:42.848] - result: 'FutureResult' [13:13:42.848] resolved() for 'SequentialFuture' ... done [13:13:42.848] Future #1 [13:13:42.848] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:42.848] - nx: 4 [13:13:42.849] - relay: TRUE [13:13:42.849] - stdout: TRUE [13:13:42.849] - signal: TRUE [13:13:42.849] - resignal: FALSE [13:13:42.849] - force: TRUE [13:13:42.849] - relayed: [n=4] FALSE, FALSE, FALSE, FALSE [13:13:42.849] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [13:13:42.849] - until=1 [13:13:42.849] - relaying element #1 [13:13:42.850] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [13:13:42.850] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [13:13:42.850] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:42.850] length: 3 (resolved future 1) [13:13:42.850] resolved() for 'SequentialFuture' ... [13:13:42.850] - state: 'finished' [13:13:42.850] - run: TRUE [13:13:42.850] - result: 'FutureResult' [13:13:42.851] resolved() for 'SequentialFuture' ... done [13:13:42.851] Future #2 [13:13:42.851] signalConditionsASAP(SequentialFuture, pos=2) ... [13:13:42.851] - nx: 4 [13:13:42.851] - relay: TRUE [13:13:42.851] - stdout: TRUE [13:13:42.851] - signal: TRUE [13:13:42.851] - resignal: FALSE [13:13:42.852] - force: TRUE [13:13:42.852] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [13:13:42.852] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [13:13:42.852] - until=2 [13:13:42.852] - relaying element #2 [13:13:42.852] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [13:13:42.852] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [13:13:42.852] signalConditionsASAP(SequentialFuture, pos=2) ... done [13:13:42.853] length: 2 (resolved future 2) [13:13:42.853] resolved() for 'SequentialFuture' ... [13:13:42.853] - state: 'finished' [13:13:42.853] - run: TRUE [13:13:42.853] - result: 'FutureResult' [13:13:42.853] resolved() for 'SequentialFuture' ... done [13:13:42.853] Future #3 [13:13:42.853] signalConditionsASAP(SequentialFuture, pos=3) ... [13:13:42.854] - nx: 4 [13:13:42.854] - relay: TRUE [13:13:42.854] - stdout: TRUE [13:13:42.854] - signal: TRUE [13:13:42.854] - resignal: FALSE [13:13:42.854] - force: TRUE [13:13:42.854] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [13:13:42.854] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [13:13:42.854] - until=3 [13:13:42.855] - relaying element #3 [13:13:42.855] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [13:13:42.855] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [13:13:42.855] signalConditionsASAP(SequentialFuture, pos=3) ... done [13:13:42.855] length: 1 (resolved future 3) [13:13:42.855] resolved() for 'SequentialFuture' ... [13:13:42.855] - state: 'finished' [13:13:42.855] - run: TRUE [13:13:42.856] - result: 'FutureResult' [13:13:42.856] resolved() for 'SequentialFuture' ... done [13:13:42.856] Future #4 [13:13:42.856] signalConditionsASAP(SequentialFuture, pos=4) ... [13:13:42.856] - nx: 4 [13:13:42.856] - relay: TRUE [13:13:42.856] - stdout: TRUE [13:13:42.856] - signal: TRUE [13:13:42.857] - resignal: FALSE [13:13:42.857] - force: TRUE [13:13:42.857] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [13:13:42.857] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [13:13:42.857] - until=4 [13:13:42.857] - relaying element #4 [13:13:42.857] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [13:13:42.857] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [13:13:42.857] signalConditionsASAP(SequentialFuture, pos=4) ... done [13:13:42.858] length: 0 (resolved future 4) [13:13:42.858] Relaying remaining futures [13:13:42.858] signalConditionsASAP(NULL, pos=0) ... [13:13:42.858] - nx: 4 [13:13:42.858] - relay: TRUE [13:13:42.858] - stdout: TRUE [13:13:42.858] - signal: TRUE [13:13:42.858] - resignal: FALSE [13:13:42.858] - force: TRUE [13:13:42.859] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [13:13:42.859] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE - flush all [13:13:42.859] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [13:13:42.859] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [13:13:42.859] signalConditionsASAP(NULL, pos=0) ... done [13:13:42.859] resolve() on list ... DONE [13:13:42.859] - Number of value chunks collected: 4 [13:13:42.860] Resolving 4 futures (chunks) ... DONE [13:13:42.860] Reducing values from 4 chunks ... [13:13:42.860] - Number of values collected after concatenation: 4 [13:13:42.860] - Number of values expected: 4 [13:13:42.860] Reducing values from 4 chunks ... DONE [13:13:42.860] 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, ...) ... [13:13:42.862] future_lapply() ... [13:13:42.863] Number of chunks: 4 [13:13:42.863] getGlobalsAndPackagesXApply() ... [13:13:42.863] - future.globals: TRUE [13:13:42.863] getGlobalsAndPackages() ... [13:13:42.863] Searching for globals... [13:13:42.864] - globals found: [2] 'FUN', '.Internal' [13:13:42.864] Searching for globals ... DONE [13:13:42.864] Resolving globals: FALSE [13:13:42.865] The total size of the 1 globals is 2.13 KiB (2184 bytes) [13:13:42.865] 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') [13:13:42.865] - globals: [1] 'FUN' [13:13:42.865] [13:13:42.865] getGlobalsAndPackages() ... DONE [13:13:42.866] - globals found/used: [n=1] 'FUN' [13:13:42.866] - needed namespaces: [n=0] [13:13:42.866] Finding globals ... DONE [13:13:42.866] - use_args: TRUE [13:13:42.866] - Getting '...' globals ... [13:13:42.866] resolve() on list ... [13:13:42.866] recursive: 0 [13:13:42.867] length: 1 [13:13:42.867] elements: '...' [13:13:42.867] length: 0 (resolved future 1) [13:13:42.867] resolve() on list ... DONE [13:13:42.867] - '...' content: [n=1] 'length' [13:13:42.867] List of 1 [13:13:42.867] $ ...:List of 1 [13:13:42.867] ..$ length: int 2 [13:13:42.867] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:42.867] - attr(*, "where")=List of 1 [13:13:42.867] ..$ ...: [13:13:42.867] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:42.867] - attr(*, "resolved")= logi TRUE [13:13:42.867] - attr(*, "total_size")= num NA [13:13:42.870] - Getting '...' globals ... DONE [13:13:42.870] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:42.870] List of 2 [13:13:42.870] $ ...future.FUN:function (mode = "logical", length = 0L) [13:13:42.870] $ ... :List of 1 [13:13:42.870] ..$ length: int 2 [13:13:42.870] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:42.870] - attr(*, "where")=List of 2 [13:13:42.870] ..$ ...future.FUN: [13:13:42.870] ..$ ... : [13:13:42.870] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:42.870] - attr(*, "resolved")= logi FALSE [13:13:42.870] - attr(*, "total_size")= num 2240 [13:13:42.873] Packages to be attached in all futures: [n=0] [13:13:42.873] getGlobalsAndPackagesXApply() ... DONE [13:13:42.873] Number of futures (= number of chunks): 4 [13:13:42.873] Launching 4 futures (chunks) ... [13:13:42.873] Chunk #1 of 4 ... [13:13:42.873] - Finding globals in 'X' for chunk #1 ... [13:13:42.873] getGlobalsAndPackages() ... [13:13:42.874] Searching for globals... [13:13:42.874] [13:13:42.874] Searching for globals ... DONE [13:13:42.874] - globals: [0] [13:13:42.874] getGlobalsAndPackages() ... DONE [13:13:42.874] + additional globals found: [n=0] [13:13:42.874] + additional namespaces needed: [n=0] [13:13:42.874] - Finding globals in 'X' for chunk #1 ... DONE [13:13:42.875] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [13:13:42.875] - seeds: [13:13:42.875] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:42.875] getGlobalsAndPackages() ... [13:13:42.875] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:42.875] Resolving globals: FALSE [13:13:42.875] Tweak future expression to call with '...' arguments ... [13:13:42.875] { [13:13:42.875] do.call(function(...) { [13:13:42.875] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:42.875] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:42.875] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:42.875] on.exit(options(oopts), add = TRUE) [13:13:42.875] } [13:13:42.875] { [13:13:42.875] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:42.875] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:42.875] ...future.FUN(...future.X_jj, ...) [13:13:42.875] }) [13:13:42.875] } [13:13:42.875] }, args = future.call.arguments) [13:13:42.875] } [13:13:42.876] Tweak future expression to call with '...' arguments ... DONE [13:13:42.876] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:42.876] [13:13:42.876] getGlobalsAndPackages() ... DONE [13:13:42.877] run() for 'Future' ... [13:13:42.877] - state: 'created' [13:13:42.877] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:13:42.877] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:42.877] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:42.877] - Field: 'label' [13:13:42.878] - Field: 'local' [13:13:42.878] - Field: 'owner' [13:13:42.878] - Field: 'envir' [13:13:42.878] - Field: 'packages' [13:13:42.878] - Field: 'gc' [13:13:42.878] - Field: 'conditions' [13:13:42.878] - Field: 'expr' [13:13:42.878] - Field: 'uuid' [13:13:42.878] - Field: 'seed' [13:13:42.879] - Field: 'version' [13:13:42.879] - Field: 'result' [13:13:42.879] - Field: 'asynchronous' [13:13:42.879] - Field: 'calls' [13:13:42.879] - Field: 'globals' [13:13:42.879] - Field: 'stdout' [13:13:42.879] - Field: 'earlySignal' [13:13:42.879] - Field: 'lazy' [13:13:42.880] - Field: 'state' [13:13:42.880] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:42.880] - Launch lazy future ... [13:13:42.880] Packages needed by the future expression (n = 0): [13:13:42.880] Packages needed by future strategies (n = 0): [13:13:42.881] { [13:13:42.881] { [13:13:42.881] { [13:13:42.881] ...future.startTime <- base::Sys.time() [13:13:42.881] { [13:13:42.881] { [13:13:42.881] { [13:13:42.881] base::local({ [13:13:42.881] has_future <- base::requireNamespace("future", [13:13:42.881] quietly = TRUE) [13:13:42.881] if (has_future) { [13:13:42.881] ns <- base::getNamespace("future") [13:13:42.881] version <- ns[[".package"]][["version"]] [13:13:42.881] if (is.null(version)) [13:13:42.881] version <- utils::packageVersion("future") [13:13:42.881] } [13:13:42.881] else { [13:13:42.881] version <- NULL [13:13:42.881] } [13:13:42.881] if (!has_future || version < "1.8.0") { [13:13:42.881] info <- base::c(r_version = base::gsub("R version ", [13:13:42.881] "", base::R.version$version.string), [13:13:42.881] platform = base::sprintf("%s (%s-bit)", [13:13:42.881] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:42.881] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:42.881] "release", "version")], collapse = " "), [13:13:42.881] hostname = base::Sys.info()[["nodename"]]) [13:13:42.881] info <- base::sprintf("%s: %s", base::names(info), [13:13:42.881] info) [13:13:42.881] info <- base::paste(info, collapse = "; ") [13:13:42.881] if (!has_future) { [13:13:42.881] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:42.881] info) [13:13:42.881] } [13:13:42.881] else { [13:13:42.881] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:42.881] info, version) [13:13:42.881] } [13:13:42.881] base::stop(msg) [13:13:42.881] } [13:13:42.881] }) [13:13:42.881] } [13:13:42.881] options(future.plan = NULL) [13:13:42.881] Sys.unsetenv("R_FUTURE_PLAN") [13:13:42.881] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:42.881] } [13:13:42.881] ...future.workdir <- getwd() [13:13:42.881] } [13:13:42.881] ...future.oldOptions <- base::as.list(base::.Options) [13:13:42.881] ...future.oldEnvVars <- base::Sys.getenv() [13:13:42.881] } [13:13:42.881] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:42.881] future.globals.maxSize = 2097152000, future.globals.method = NULL, [13:13:42.881] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:42.881] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:42.881] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:42.881] future.stdout.windows.reencode = NULL, width = 80L) [13:13:42.881] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:42.881] base::names(...future.oldOptions)) [13:13:42.881] } [13:13:42.881] if (FALSE) { [13:13:42.881] } [13:13:42.881] else { [13:13:42.881] if (TRUE) { [13:13:42.881] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:42.881] open = "w") [13:13:42.881] } [13:13:42.881] else { [13:13:42.881] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:42.881] windows = "NUL", "/dev/null"), open = "w") [13:13:42.881] } [13:13:42.881] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:42.881] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:42.881] base::sink(type = "output", split = FALSE) [13:13:42.881] base::close(...future.stdout) [13:13:42.881] }, add = TRUE) [13:13:42.881] } [13:13:42.881] ...future.frame <- base::sys.nframe() [13:13:42.881] ...future.conditions <- base::list() [13:13:42.881] ...future.rng <- base::globalenv()$.Random.seed [13:13:42.881] if (FALSE) { [13:13:42.881] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:42.881] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:42.881] } [13:13:42.881] ...future.result <- base::tryCatch({ [13:13:42.881] base::withCallingHandlers({ [13:13:42.881] ...future.value <- base::withVisible(base::local({ [13:13:42.881] do.call(function(...) { [13:13:42.881] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:42.881] if (!identical(...future.globals.maxSize.org, [13:13:42.881] ...future.globals.maxSize)) { [13:13:42.881] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:42.881] on.exit(options(oopts), add = TRUE) [13:13:42.881] } [13:13:42.881] { [13:13:42.881] lapply(seq_along(...future.elements_ii), [13:13:42.881] FUN = function(jj) { [13:13:42.881] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:42.881] ...future.FUN(...future.X_jj, ...) [13:13:42.881] }) [13:13:42.881] } [13:13:42.881] }, args = future.call.arguments) [13:13:42.881] })) [13:13:42.881] future::FutureResult(value = ...future.value$value, [13:13:42.881] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:42.881] ...future.rng), globalenv = if (FALSE) [13:13:42.881] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:42.881] ...future.globalenv.names)) [13:13:42.881] else NULL, started = ...future.startTime, version = "1.8") [13:13:42.881] }, condition = base::local({ [13:13:42.881] c <- base::c [13:13:42.881] inherits <- base::inherits [13:13:42.881] invokeRestart <- base::invokeRestart [13:13:42.881] length <- base::length [13:13:42.881] list <- base::list [13:13:42.881] seq.int <- base::seq.int [13:13:42.881] signalCondition <- base::signalCondition [13:13:42.881] sys.calls <- base::sys.calls [13:13:42.881] `[[` <- base::`[[` [13:13:42.881] `+` <- base::`+` [13:13:42.881] `<<-` <- base::`<<-` [13:13:42.881] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:42.881] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:42.881] 3L)] [13:13:42.881] } [13:13:42.881] function(cond) { [13:13:42.881] is_error <- inherits(cond, "error") [13:13:42.881] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:42.881] NULL) [13:13:42.881] if (is_error) { [13:13:42.881] sessionInformation <- function() { [13:13:42.881] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:42.881] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:42.881] search = base::search(), system = base::Sys.info()) [13:13:42.881] } [13:13:42.881] ...future.conditions[[length(...future.conditions) + [13:13:42.881] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:42.881] cond$call), session = sessionInformation(), [13:13:42.881] timestamp = base::Sys.time(), signaled = 0L) [13:13:42.881] signalCondition(cond) [13:13:42.881] } [13:13:42.881] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:42.881] "immediateCondition"))) { [13:13:42.881] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:42.881] ...future.conditions[[length(...future.conditions) + [13:13:42.881] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:42.881] if (TRUE && !signal) { [13:13:42.881] muffleCondition <- function (cond, pattern = "^muffle") [13:13:42.881] { [13:13:42.881] inherits <- base::inherits [13:13:42.881] invokeRestart <- base::invokeRestart [13:13:42.881] is.null <- base::is.null [13:13:42.881] muffled <- FALSE [13:13:42.881] if (inherits(cond, "message")) { [13:13:42.881] muffled <- grepl(pattern, "muffleMessage") [13:13:42.881] if (muffled) [13:13:42.881] invokeRestart("muffleMessage") [13:13:42.881] } [13:13:42.881] else if (inherits(cond, "warning")) { [13:13:42.881] muffled <- grepl(pattern, "muffleWarning") [13:13:42.881] if (muffled) [13:13:42.881] invokeRestart("muffleWarning") [13:13:42.881] } [13:13:42.881] else if (inherits(cond, "condition")) { [13:13:42.881] if (!is.null(pattern)) { [13:13:42.881] computeRestarts <- base::computeRestarts [13:13:42.881] grepl <- base::grepl [13:13:42.881] restarts <- computeRestarts(cond) [13:13:42.881] for (restart in restarts) { [13:13:42.881] name <- restart$name [13:13:42.881] if (is.null(name)) [13:13:42.881] next [13:13:42.881] if (!grepl(pattern, name)) [13:13:42.881] next [13:13:42.881] invokeRestart(restart) [13:13:42.881] muffled <- TRUE [13:13:42.881] break [13:13:42.881] } [13:13:42.881] } [13:13:42.881] } [13:13:42.881] invisible(muffled) [13:13:42.881] } [13:13:42.881] muffleCondition(cond, pattern = "^muffle") [13:13:42.881] } [13:13:42.881] } [13:13:42.881] else { [13:13:42.881] if (TRUE) { [13:13:42.881] muffleCondition <- function (cond, pattern = "^muffle") [13:13:42.881] { [13:13:42.881] inherits <- base::inherits [13:13:42.881] invokeRestart <- base::invokeRestart [13:13:42.881] is.null <- base::is.null [13:13:42.881] muffled <- FALSE [13:13:42.881] if (inherits(cond, "message")) { [13:13:42.881] muffled <- grepl(pattern, "muffleMessage") [13:13:42.881] if (muffled) [13:13:42.881] invokeRestart("muffleMessage") [13:13:42.881] } [13:13:42.881] else if (inherits(cond, "warning")) { [13:13:42.881] muffled <- grepl(pattern, "muffleWarning") [13:13:42.881] if (muffled) [13:13:42.881] invokeRestart("muffleWarning") [13:13:42.881] } [13:13:42.881] else if (inherits(cond, "condition")) { [13:13:42.881] if (!is.null(pattern)) { [13:13:42.881] computeRestarts <- base::computeRestarts [13:13:42.881] grepl <- base::grepl [13:13:42.881] restarts <- computeRestarts(cond) [13:13:42.881] for (restart in restarts) { [13:13:42.881] name <- restart$name [13:13:42.881] if (is.null(name)) [13:13:42.881] next [13:13:42.881] if (!grepl(pattern, name)) [13:13:42.881] next [13:13:42.881] invokeRestart(restart) [13:13:42.881] muffled <- TRUE [13:13:42.881] break [13:13:42.881] } [13:13:42.881] } [13:13:42.881] } [13:13:42.881] invisible(muffled) [13:13:42.881] } [13:13:42.881] muffleCondition(cond, pattern = "^muffle") [13:13:42.881] } [13:13:42.881] } [13:13:42.881] } [13:13:42.881] })) [13:13:42.881] }, error = function(ex) { [13:13:42.881] base::structure(base::list(value = NULL, visible = NULL, [13:13:42.881] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:42.881] ...future.rng), started = ...future.startTime, [13:13:42.881] finished = Sys.time(), session_uuid = NA_character_, [13:13:42.881] version = "1.8"), class = "FutureResult") [13:13:42.881] }, finally = { [13:13:42.881] if (!identical(...future.workdir, getwd())) [13:13:42.881] setwd(...future.workdir) [13:13:42.881] { [13:13:42.881] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:42.881] ...future.oldOptions$nwarnings <- NULL [13:13:42.881] } [13:13:42.881] base::options(...future.oldOptions) [13:13:42.881] if (.Platform$OS.type == "windows") { [13:13:42.881] old_names <- names(...future.oldEnvVars) [13:13:42.881] envs <- base::Sys.getenv() [13:13:42.881] names <- names(envs) [13:13:42.881] common <- intersect(names, old_names) [13:13:42.881] added <- setdiff(names, old_names) [13:13:42.881] removed <- setdiff(old_names, names) [13:13:42.881] changed <- common[...future.oldEnvVars[common] != [13:13:42.881] envs[common]] [13:13:42.881] NAMES <- toupper(changed) [13:13:42.881] args <- list() [13:13:42.881] for (kk in seq_along(NAMES)) { [13:13:42.881] name <- changed[[kk]] [13:13:42.881] NAME <- NAMES[[kk]] [13:13:42.881] if (name != NAME && is.element(NAME, old_names)) [13:13:42.881] next [13:13:42.881] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:42.881] } [13:13:42.881] NAMES <- toupper(added) [13:13:42.881] for (kk in seq_along(NAMES)) { [13:13:42.881] name <- added[[kk]] [13:13:42.881] NAME <- NAMES[[kk]] [13:13:42.881] if (name != NAME && is.element(NAME, old_names)) [13:13:42.881] next [13:13:42.881] args[[name]] <- "" [13:13:42.881] } [13:13:42.881] NAMES <- toupper(removed) [13:13:42.881] for (kk in seq_along(NAMES)) { [13:13:42.881] name <- removed[[kk]] [13:13:42.881] NAME <- NAMES[[kk]] [13:13:42.881] if (name != NAME && is.element(NAME, old_names)) [13:13:42.881] next [13:13:42.881] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:42.881] } [13:13:42.881] if (length(args) > 0) [13:13:42.881] base::do.call(base::Sys.setenv, args = args) [13:13:42.881] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:42.881] } [13:13:42.881] else { [13:13:42.881] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:42.881] } [13:13:42.881] { [13:13:42.881] if (base::length(...future.futureOptionsAdded) > [13:13:42.881] 0L) { [13:13:42.881] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:42.881] base::names(opts) <- ...future.futureOptionsAdded [13:13:42.881] base::options(opts) [13:13:42.881] } [13:13:42.881] { [13:13:42.881] { [13:13:42.881] NULL [13:13:42.881] RNGkind("Mersenne-Twister") [13:13:42.881] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:42.881] inherits = FALSE) [13:13:42.881] } [13:13:42.881] options(future.plan = NULL) [13:13:42.881] if (is.na(NA_character_)) [13:13:42.881] Sys.unsetenv("R_FUTURE_PLAN") [13:13:42.881] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:42.881] future::plan(list(function (..., envir = parent.frame()) [13:13:42.881] { [13:13:42.881] future <- SequentialFuture(..., envir = envir) [13:13:42.881] if (!future$lazy) [13:13:42.881] future <- run(future) [13:13:42.881] invisible(future) [13:13:42.881] }), .cleanup = FALSE, .init = FALSE) [13:13:42.881] } [13:13:42.881] } [13:13:42.881] } [13:13:42.881] }) [13:13:42.881] if (TRUE) { [13:13:42.881] base::sink(type = "output", split = FALSE) [13:13:42.881] if (TRUE) { [13:13:42.881] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:42.881] } [13:13:42.881] else { [13:13:42.881] ...future.result["stdout"] <- base::list(NULL) [13:13:42.881] } [13:13:42.881] base::close(...future.stdout) [13:13:42.881] ...future.stdout <- NULL [13:13:42.881] } [13:13:42.881] ...future.result$conditions <- ...future.conditions [13:13:42.881] ...future.result$finished <- base::Sys.time() [13:13:42.881] ...future.result [13:13:42.881] } [13:13:42.883] assign_globals() ... [13:13:42.884] List of 5 [13:13:42.884] $ ...future.FUN :function (mode = "logical", length = 0L) [13:13:42.884] $ future.call.arguments :List of 1 [13:13:42.884] ..$ length: int 2 [13:13:42.884] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:42.884] $ ...future.elements_ii :List of 1 [13:13:42.884] ..$ a: chr "integer" [13:13:42.884] $ ...future.seeds_ii : NULL [13:13:42.884] $ ...future.globals.maxSize: NULL [13:13:42.884] - attr(*, "where")=List of 5 [13:13:42.884] ..$ ...future.FUN : [13:13:42.884] ..$ future.call.arguments : [13:13:42.884] ..$ ...future.elements_ii : [13:13:42.884] ..$ ...future.seeds_ii : [13:13:42.884] ..$ ...future.globals.maxSize: [13:13:42.884] - attr(*, "resolved")= logi FALSE [13:13:42.884] - attr(*, "total_size")= num 2240 [13:13:42.884] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:42.884] - attr(*, "already-done")= logi TRUE [13:13:42.889] - copied '...future.FUN' to environment [13:13:42.889] - copied 'future.call.arguments' to environment [13:13:42.889] - copied '...future.elements_ii' to environment [13:13:42.890] - copied '...future.seeds_ii' to environment [13:13:42.890] - copied '...future.globals.maxSize' to environment [13:13:42.890] assign_globals() ... done [13:13:42.890] plan(): Setting new future strategy stack: [13:13:42.890] List of future strategies: [13:13:42.890] 1. sequential: [13:13:42.890] - args: function (..., envir = parent.frame(), workers = "") [13:13:42.890] - tweaked: FALSE [13:13:42.890] - call: NULL [13:13:42.891] plan(): nbrOfWorkers() = 1 [13:13:42.891] plan(): Setting new future strategy stack: [13:13:42.892] List of future strategies: [13:13:42.892] 1. sequential: [13:13:42.892] - args: function (..., envir = parent.frame(), workers = "") [13:13:42.892] - tweaked: FALSE [13:13:42.892] - call: plan(strategy) [13:13:42.892] plan(): nbrOfWorkers() = 1 [13:13:42.892] SequentialFuture started (and completed) [13:13:42.892] - Launch lazy future ... done [13:13:42.892] run() for 'SequentialFuture' ... done [13:13:42.893] Created future: [13:13:42.893] SequentialFuture: [13:13:42.893] Label: 'future_lapply-1' [13:13:42.893] Expression: [13:13:42.893] { [13:13:42.893] do.call(function(...) { [13:13:42.893] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:42.893] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:42.893] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:42.893] on.exit(options(oopts), add = TRUE) [13:13:42.893] } [13:13:42.893] { [13:13:42.893] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:42.893] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:42.893] ...future.FUN(...future.X_jj, ...) [13:13:42.893] }) [13:13:42.893] } [13:13:42.893] }, args = future.call.arguments) [13:13:42.893] } [13:13:42.893] Lazy evaluation: FALSE [13:13:42.893] Asynchronous evaluation: FALSE [13:13:42.893] Local evaluation: TRUE [13:13:42.893] Environment: R_GlobalEnv [13:13:42.893] Capture standard output: TRUE [13:13:42.893] Capture condition classes: 'condition' (excluding 'nothing') [13:13:42.893] 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) [13:13:42.893] Packages: [13:13:42.893] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:42.893] Resolved: TRUE [13:13:42.893] Value: 56 bytes of class 'list' [13:13:42.893] Early signaling: FALSE [13:13:42.893] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:42.893] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:42.894] Chunk #1 of 4 ... DONE [13:13:42.894] Chunk #2 of 4 ... [13:13:42.894] - Finding globals in 'X' for chunk #2 ... [13:13:42.894] getGlobalsAndPackages() ... [13:13:42.894] Searching for globals... [13:13:42.894] [13:13:42.894] Searching for globals ... DONE [13:13:42.895] - globals: [0] [13:13:42.895] getGlobalsAndPackages() ... DONE [13:13:42.895] + additional globals found: [n=0] [13:13:42.895] + additional namespaces needed: [n=0] [13:13:42.895] - Finding globals in 'X' for chunk #2 ... DONE [13:13:42.895] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [13:13:42.895] - seeds: [13:13:42.895] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:42.895] getGlobalsAndPackages() ... [13:13:42.896] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:42.896] Resolving globals: FALSE [13:13:42.896] Tweak future expression to call with '...' arguments ... [13:13:42.896] { [13:13:42.896] do.call(function(...) { [13:13:42.896] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:42.896] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:42.896] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:42.896] on.exit(options(oopts), add = TRUE) [13:13:42.896] } [13:13:42.896] { [13:13:42.896] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:42.896] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:42.896] ...future.FUN(...future.X_jj, ...) [13:13:42.896] }) [13:13:42.896] } [13:13:42.896] }, args = future.call.arguments) [13:13:42.896] } [13:13:42.896] Tweak future expression to call with '...' arguments ... DONE [13:13:42.897] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:42.897] [13:13:42.897] getGlobalsAndPackages() ... DONE [13:13:42.897] run() for 'Future' ... [13:13:42.897] - state: 'created' [13:13:42.897] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:13:42.898] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:42.898] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:42.898] - Field: 'label' [13:13:42.898] - Field: 'local' [13:13:42.898] - Field: 'owner' [13:13:42.898] - Field: 'envir' [13:13:42.898] - Field: 'packages' [13:13:42.898] - Field: 'gc' [13:13:42.899] - Field: 'conditions' [13:13:42.899] - Field: 'expr' [13:13:42.899] - Field: 'uuid' [13:13:42.899] - Field: 'seed' [13:13:42.899] - Field: 'version' [13:13:42.899] - Field: 'result' [13:13:42.899] - Field: 'asynchronous' [13:13:42.899] - Field: 'calls' [13:13:42.900] - Field: 'globals' [13:13:42.900] - Field: 'stdout' [13:13:42.900] - Field: 'earlySignal' [13:13:42.900] - Field: 'lazy' [13:13:42.900] - Field: 'state' [13:13:42.900] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:42.900] - Launch lazy future ... [13:13:42.900] Packages needed by the future expression (n = 0): [13:13:42.901] Packages needed by future strategies (n = 0): [13:13:42.901] { [13:13:42.901] { [13:13:42.901] { [13:13:42.901] ...future.startTime <- base::Sys.time() [13:13:42.901] { [13:13:42.901] { [13:13:42.901] { [13:13:42.901] base::local({ [13:13:42.901] has_future <- base::requireNamespace("future", [13:13:42.901] quietly = TRUE) [13:13:42.901] if (has_future) { [13:13:42.901] ns <- base::getNamespace("future") [13:13:42.901] version <- ns[[".package"]][["version"]] [13:13:42.901] if (is.null(version)) [13:13:42.901] version <- utils::packageVersion("future") [13:13:42.901] } [13:13:42.901] else { [13:13:42.901] version <- NULL [13:13:42.901] } [13:13:42.901] if (!has_future || version < "1.8.0") { [13:13:42.901] info <- base::c(r_version = base::gsub("R version ", [13:13:42.901] "", base::R.version$version.string), [13:13:42.901] platform = base::sprintf("%s (%s-bit)", [13:13:42.901] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:42.901] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:42.901] "release", "version")], collapse = " "), [13:13:42.901] hostname = base::Sys.info()[["nodename"]]) [13:13:42.901] info <- base::sprintf("%s: %s", base::names(info), [13:13:42.901] info) [13:13:42.901] info <- base::paste(info, collapse = "; ") [13:13:42.901] if (!has_future) { [13:13:42.901] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:42.901] info) [13:13:42.901] } [13:13:42.901] else { [13:13:42.901] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:42.901] info, version) [13:13:42.901] } [13:13:42.901] base::stop(msg) [13:13:42.901] } [13:13:42.901] }) [13:13:42.901] } [13:13:42.901] options(future.plan = NULL) [13:13:42.901] Sys.unsetenv("R_FUTURE_PLAN") [13:13:42.901] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:42.901] } [13:13:42.901] ...future.workdir <- getwd() [13:13:42.901] } [13:13:42.901] ...future.oldOptions <- base::as.list(base::.Options) [13:13:42.901] ...future.oldEnvVars <- base::Sys.getenv() [13:13:42.901] } [13:13:42.901] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:42.901] future.globals.maxSize = 2097152000, future.globals.method = NULL, [13:13:42.901] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:42.901] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:42.901] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:42.901] future.stdout.windows.reencode = NULL, width = 80L) [13:13:42.901] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:42.901] base::names(...future.oldOptions)) [13:13:42.901] } [13:13:42.901] if (FALSE) { [13:13:42.901] } [13:13:42.901] else { [13:13:42.901] if (TRUE) { [13:13:42.901] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:42.901] open = "w") [13:13:42.901] } [13:13:42.901] else { [13:13:42.901] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:42.901] windows = "NUL", "/dev/null"), open = "w") [13:13:42.901] } [13:13:42.901] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:42.901] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:42.901] base::sink(type = "output", split = FALSE) [13:13:42.901] base::close(...future.stdout) [13:13:42.901] }, add = TRUE) [13:13:42.901] } [13:13:42.901] ...future.frame <- base::sys.nframe() [13:13:42.901] ...future.conditions <- base::list() [13:13:42.901] ...future.rng <- base::globalenv()$.Random.seed [13:13:42.901] if (FALSE) { [13:13:42.901] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:42.901] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:42.901] } [13:13:42.901] ...future.result <- base::tryCatch({ [13:13:42.901] base::withCallingHandlers({ [13:13:42.901] ...future.value <- base::withVisible(base::local({ [13:13:42.901] do.call(function(...) { [13:13:42.901] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:42.901] if (!identical(...future.globals.maxSize.org, [13:13:42.901] ...future.globals.maxSize)) { [13:13:42.901] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:42.901] on.exit(options(oopts), add = TRUE) [13:13:42.901] } [13:13:42.901] { [13:13:42.901] lapply(seq_along(...future.elements_ii), [13:13:42.901] FUN = function(jj) { [13:13:42.901] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:42.901] ...future.FUN(...future.X_jj, ...) [13:13:42.901] }) [13:13:42.901] } [13:13:42.901] }, args = future.call.arguments) [13:13:42.901] })) [13:13:42.901] future::FutureResult(value = ...future.value$value, [13:13:42.901] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:42.901] ...future.rng), globalenv = if (FALSE) [13:13:42.901] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:42.901] ...future.globalenv.names)) [13:13:42.901] else NULL, started = ...future.startTime, version = "1.8") [13:13:42.901] }, condition = base::local({ [13:13:42.901] c <- base::c [13:13:42.901] inherits <- base::inherits [13:13:42.901] invokeRestart <- base::invokeRestart [13:13:42.901] length <- base::length [13:13:42.901] list <- base::list [13:13:42.901] seq.int <- base::seq.int [13:13:42.901] signalCondition <- base::signalCondition [13:13:42.901] sys.calls <- base::sys.calls [13:13:42.901] `[[` <- base::`[[` [13:13:42.901] `+` <- base::`+` [13:13:42.901] `<<-` <- base::`<<-` [13:13:42.901] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:42.901] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:42.901] 3L)] [13:13:42.901] } [13:13:42.901] function(cond) { [13:13:42.901] is_error <- inherits(cond, "error") [13:13:42.901] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:42.901] NULL) [13:13:42.901] if (is_error) { [13:13:42.901] sessionInformation <- function() { [13:13:42.901] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:42.901] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:42.901] search = base::search(), system = base::Sys.info()) [13:13:42.901] } [13:13:42.901] ...future.conditions[[length(...future.conditions) + [13:13:42.901] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:42.901] cond$call), session = sessionInformation(), [13:13:42.901] timestamp = base::Sys.time(), signaled = 0L) [13:13:42.901] signalCondition(cond) [13:13:42.901] } [13:13:42.901] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:42.901] "immediateCondition"))) { [13:13:42.901] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:42.901] ...future.conditions[[length(...future.conditions) + [13:13:42.901] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:42.901] if (TRUE && !signal) { [13:13:42.901] muffleCondition <- function (cond, pattern = "^muffle") [13:13:42.901] { [13:13:42.901] inherits <- base::inherits [13:13:42.901] invokeRestart <- base::invokeRestart [13:13:42.901] is.null <- base::is.null [13:13:42.901] muffled <- FALSE [13:13:42.901] if (inherits(cond, "message")) { [13:13:42.901] muffled <- grepl(pattern, "muffleMessage") [13:13:42.901] if (muffled) [13:13:42.901] invokeRestart("muffleMessage") [13:13:42.901] } [13:13:42.901] else if (inherits(cond, "warning")) { [13:13:42.901] muffled <- grepl(pattern, "muffleWarning") [13:13:42.901] if (muffled) [13:13:42.901] invokeRestart("muffleWarning") [13:13:42.901] } [13:13:42.901] else if (inherits(cond, "condition")) { [13:13:42.901] if (!is.null(pattern)) { [13:13:42.901] computeRestarts <- base::computeRestarts [13:13:42.901] grepl <- base::grepl [13:13:42.901] restarts <- computeRestarts(cond) [13:13:42.901] for (restart in restarts) { [13:13:42.901] name <- restart$name [13:13:42.901] if (is.null(name)) [13:13:42.901] next [13:13:42.901] if (!grepl(pattern, name)) [13:13:42.901] next [13:13:42.901] invokeRestart(restart) [13:13:42.901] muffled <- TRUE [13:13:42.901] break [13:13:42.901] } [13:13:42.901] } [13:13:42.901] } [13:13:42.901] invisible(muffled) [13:13:42.901] } [13:13:42.901] muffleCondition(cond, pattern = "^muffle") [13:13:42.901] } [13:13:42.901] } [13:13:42.901] else { [13:13:42.901] if (TRUE) { [13:13:42.901] muffleCondition <- function (cond, pattern = "^muffle") [13:13:42.901] { [13:13:42.901] inherits <- base::inherits [13:13:42.901] invokeRestart <- base::invokeRestart [13:13:42.901] is.null <- base::is.null [13:13:42.901] muffled <- FALSE [13:13:42.901] if (inherits(cond, "message")) { [13:13:42.901] muffled <- grepl(pattern, "muffleMessage") [13:13:42.901] if (muffled) [13:13:42.901] invokeRestart("muffleMessage") [13:13:42.901] } [13:13:42.901] else if (inherits(cond, "warning")) { [13:13:42.901] muffled <- grepl(pattern, "muffleWarning") [13:13:42.901] if (muffled) [13:13:42.901] invokeRestart("muffleWarning") [13:13:42.901] } [13:13:42.901] else if (inherits(cond, "condition")) { [13:13:42.901] if (!is.null(pattern)) { [13:13:42.901] computeRestarts <- base::computeRestarts [13:13:42.901] grepl <- base::grepl [13:13:42.901] restarts <- computeRestarts(cond) [13:13:42.901] for (restart in restarts) { [13:13:42.901] name <- restart$name [13:13:42.901] if (is.null(name)) [13:13:42.901] next [13:13:42.901] if (!grepl(pattern, name)) [13:13:42.901] next [13:13:42.901] invokeRestart(restart) [13:13:42.901] muffled <- TRUE [13:13:42.901] break [13:13:42.901] } [13:13:42.901] } [13:13:42.901] } [13:13:42.901] invisible(muffled) [13:13:42.901] } [13:13:42.901] muffleCondition(cond, pattern = "^muffle") [13:13:42.901] } [13:13:42.901] } [13:13:42.901] } [13:13:42.901] })) [13:13:42.901] }, error = function(ex) { [13:13:42.901] base::structure(base::list(value = NULL, visible = NULL, [13:13:42.901] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:42.901] ...future.rng), started = ...future.startTime, [13:13:42.901] finished = Sys.time(), session_uuid = NA_character_, [13:13:42.901] version = "1.8"), class = "FutureResult") [13:13:42.901] }, finally = { [13:13:42.901] if (!identical(...future.workdir, getwd())) [13:13:42.901] setwd(...future.workdir) [13:13:42.901] { [13:13:42.901] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:42.901] ...future.oldOptions$nwarnings <- NULL [13:13:42.901] } [13:13:42.901] base::options(...future.oldOptions) [13:13:42.901] if (.Platform$OS.type == "windows") { [13:13:42.901] old_names <- names(...future.oldEnvVars) [13:13:42.901] envs <- base::Sys.getenv() [13:13:42.901] names <- names(envs) [13:13:42.901] common <- intersect(names, old_names) [13:13:42.901] added <- setdiff(names, old_names) [13:13:42.901] removed <- setdiff(old_names, names) [13:13:42.901] changed <- common[...future.oldEnvVars[common] != [13:13:42.901] envs[common]] [13:13:42.901] NAMES <- toupper(changed) [13:13:42.901] args <- list() [13:13:42.901] for (kk in seq_along(NAMES)) { [13:13:42.901] name <- changed[[kk]] [13:13:42.901] NAME <- NAMES[[kk]] [13:13:42.901] if (name != NAME && is.element(NAME, old_names)) [13:13:42.901] next [13:13:42.901] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:42.901] } [13:13:42.901] NAMES <- toupper(added) [13:13:42.901] for (kk in seq_along(NAMES)) { [13:13:42.901] name <- added[[kk]] [13:13:42.901] NAME <- NAMES[[kk]] [13:13:42.901] if (name != NAME && is.element(NAME, old_names)) [13:13:42.901] next [13:13:42.901] args[[name]] <- "" [13:13:42.901] } [13:13:42.901] NAMES <- toupper(removed) [13:13:42.901] for (kk in seq_along(NAMES)) { [13:13:42.901] name <- removed[[kk]] [13:13:42.901] NAME <- NAMES[[kk]] [13:13:42.901] if (name != NAME && is.element(NAME, old_names)) [13:13:42.901] next [13:13:42.901] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:42.901] } [13:13:42.901] if (length(args) > 0) [13:13:42.901] base::do.call(base::Sys.setenv, args = args) [13:13:42.901] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:42.901] } [13:13:42.901] else { [13:13:42.901] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:42.901] } [13:13:42.901] { [13:13:42.901] if (base::length(...future.futureOptionsAdded) > [13:13:42.901] 0L) { [13:13:42.901] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:42.901] base::names(opts) <- ...future.futureOptionsAdded [13:13:42.901] base::options(opts) [13:13:42.901] } [13:13:42.901] { [13:13:42.901] { [13:13:42.901] NULL [13:13:42.901] RNGkind("Mersenne-Twister") [13:13:42.901] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:42.901] inherits = FALSE) [13:13:42.901] } [13:13:42.901] options(future.plan = NULL) [13:13:42.901] if (is.na(NA_character_)) [13:13:42.901] Sys.unsetenv("R_FUTURE_PLAN") [13:13:42.901] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:42.901] future::plan(list(function (..., envir = parent.frame()) [13:13:42.901] { [13:13:42.901] future <- SequentialFuture(..., envir = envir) [13:13:42.901] if (!future$lazy) [13:13:42.901] future <- run(future) [13:13:42.901] invisible(future) [13:13:42.901] }), .cleanup = FALSE, .init = FALSE) [13:13:42.901] } [13:13:42.901] } [13:13:42.901] } [13:13:42.901] }) [13:13:42.901] if (TRUE) { [13:13:42.901] base::sink(type = "output", split = FALSE) [13:13:42.901] if (TRUE) { [13:13:42.901] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:42.901] } [13:13:42.901] else { [13:13:42.901] ...future.result["stdout"] <- base::list(NULL) [13:13:42.901] } [13:13:42.901] base::close(...future.stdout) [13:13:42.901] ...future.stdout <- NULL [13:13:42.901] } [13:13:42.901] ...future.result$conditions <- ...future.conditions [13:13:42.901] ...future.result$finished <- base::Sys.time() [13:13:42.901] ...future.result [13:13:42.901] } [13:13:42.904] assign_globals() ... [13:13:42.904] List of 5 [13:13:42.904] $ ...future.FUN :function (mode = "logical", length = 0L) [13:13:42.904] $ future.call.arguments :List of 1 [13:13:42.904] ..$ length: int 2 [13:13:42.904] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:42.904] $ ...future.elements_ii :List of 1 [13:13:42.904] ..$ b: chr "numeric" [13:13:42.904] $ ...future.seeds_ii : NULL [13:13:42.904] $ ...future.globals.maxSize: NULL [13:13:42.904] - attr(*, "where")=List of 5 [13:13:42.904] ..$ ...future.FUN : [13:13:42.904] ..$ future.call.arguments : [13:13:42.904] ..$ ...future.elements_ii : [13:13:42.904] ..$ ...future.seeds_ii : [13:13:42.904] ..$ ...future.globals.maxSize: [13:13:42.904] - attr(*, "resolved")= logi FALSE [13:13:42.904] - attr(*, "total_size")= num 2240 [13:13:42.904] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:42.904] - attr(*, "already-done")= logi TRUE [13:13:42.908] - copied '...future.FUN' to environment [13:13:42.908] - copied 'future.call.arguments' to environment [13:13:42.908] - copied '...future.elements_ii' to environment [13:13:42.908] - copied '...future.seeds_ii' to environment [13:13:42.909] - copied '...future.globals.maxSize' to environment [13:13:42.909] assign_globals() ... done [13:13:42.909] plan(): Setting new future strategy stack: [13:13:42.909] List of future strategies: [13:13:42.909] 1. sequential: [13:13:42.909] - args: function (..., envir = parent.frame(), workers = "") [13:13:42.909] - tweaked: FALSE [13:13:42.909] - call: NULL [13:13:42.909] plan(): nbrOfWorkers() = 1 [13:13:42.910] plan(): Setting new future strategy stack: [13:13:42.910] List of future strategies: [13:13:42.910] 1. sequential: [13:13:42.910] - args: function (..., envir = parent.frame(), workers = "") [13:13:42.910] - tweaked: FALSE [13:13:42.910] - call: plan(strategy) [13:13:42.911] plan(): nbrOfWorkers() = 1 [13:13:42.911] SequentialFuture started (and completed) [13:13:42.911] - Launch lazy future ... done [13:13:42.911] run() for 'SequentialFuture' ... done [13:13:42.911] Created future: [13:13:42.911] SequentialFuture: [13:13:42.911] Label: 'future_lapply-2' [13:13:42.911] Expression: [13:13:42.911] { [13:13:42.911] do.call(function(...) { [13:13:42.911] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:42.911] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:42.911] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:42.911] on.exit(options(oopts), add = TRUE) [13:13:42.911] } [13:13:42.911] { [13:13:42.911] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:42.911] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:42.911] ...future.FUN(...future.X_jj, ...) [13:13:42.911] }) [13:13:42.911] } [13:13:42.911] }, args = future.call.arguments) [13:13:42.911] } [13:13:42.911] Lazy evaluation: FALSE [13:13:42.911] Asynchronous evaluation: FALSE [13:13:42.911] Local evaluation: TRUE [13:13:42.911] Environment: R_GlobalEnv [13:13:42.911] Capture standard output: TRUE [13:13:42.911] Capture condition classes: 'condition' (excluding 'nothing') [13:13:42.911] 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) [13:13:42.911] Packages: [13:13:42.911] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:42.911] Resolved: TRUE [13:13:42.911] Value: 64 bytes of class 'list' [13:13:42.911] Early signaling: FALSE [13:13:42.911] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:42.911] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:42.912] Chunk #2 of 4 ... DONE [13:13:42.912] Chunk #3 of 4 ... [13:13:42.913] - Finding globals in 'X' for chunk #3 ... [13:13:42.913] getGlobalsAndPackages() ... [13:13:42.913] Searching for globals... [13:13:42.913] [13:13:42.913] Searching for globals ... DONE [13:13:42.913] - globals: [0] [13:13:42.913] getGlobalsAndPackages() ... DONE [13:13:42.914] + additional globals found: [n=0] [13:13:42.914] + additional namespaces needed: [n=0] [13:13:42.914] - Finding globals in 'X' for chunk #3 ... DONE [13:13:42.914] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [13:13:42.914] - seeds: [13:13:42.914] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:42.914] getGlobalsAndPackages() ... [13:13:42.914] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:42.914] Resolving globals: FALSE [13:13:42.915] Tweak future expression to call with '...' arguments ... [13:13:42.915] { [13:13:42.915] do.call(function(...) { [13:13:42.915] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:42.915] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:42.915] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:42.915] on.exit(options(oopts), add = TRUE) [13:13:42.915] } [13:13:42.915] { [13:13:42.915] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:42.915] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:42.915] ...future.FUN(...future.X_jj, ...) [13:13:42.915] }) [13:13:42.915] } [13:13:42.915] }, args = future.call.arguments) [13:13:42.915] } [13:13:42.915] Tweak future expression to call with '...' arguments ... DONE [13:13:42.915] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:42.916] [13:13:42.916] getGlobalsAndPackages() ... DONE [13:13:42.916] run() for 'Future' ... [13:13:42.916] - state: 'created' [13:13:42.916] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:13:42.916] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:42.917] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:42.917] - Field: 'label' [13:13:42.917] - Field: 'local' [13:13:42.917] - Field: 'owner' [13:13:42.917] - Field: 'envir' [13:13:42.917] - Field: 'packages' [13:13:42.917] - Field: 'gc' [13:13:42.917] - Field: 'conditions' [13:13:42.918] - Field: 'expr' [13:13:42.918] - Field: 'uuid' [13:13:42.918] - Field: 'seed' [13:13:42.918] - Field: 'version' [13:13:42.918] - Field: 'result' [13:13:42.918] - Field: 'asynchronous' [13:13:42.918] - Field: 'calls' [13:13:42.918] - Field: 'globals' [13:13:42.918] - Field: 'stdout' [13:13:42.919] - Field: 'earlySignal' [13:13:42.919] - Field: 'lazy' [13:13:42.919] - Field: 'state' [13:13:42.919] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:42.919] - Launch lazy future ... [13:13:42.919] Packages needed by the future expression (n = 0): [13:13:42.919] Packages needed by future strategies (n = 0): [13:13:42.920] { [13:13:42.920] { [13:13:42.920] { [13:13:42.920] ...future.startTime <- base::Sys.time() [13:13:42.920] { [13:13:42.920] { [13:13:42.920] { [13:13:42.920] base::local({ [13:13:42.920] has_future <- base::requireNamespace("future", [13:13:42.920] quietly = TRUE) [13:13:42.920] if (has_future) { [13:13:42.920] ns <- base::getNamespace("future") [13:13:42.920] version <- ns[[".package"]][["version"]] [13:13:42.920] if (is.null(version)) [13:13:42.920] version <- utils::packageVersion("future") [13:13:42.920] } [13:13:42.920] else { [13:13:42.920] version <- NULL [13:13:42.920] } [13:13:42.920] if (!has_future || version < "1.8.0") { [13:13:42.920] info <- base::c(r_version = base::gsub("R version ", [13:13:42.920] "", base::R.version$version.string), [13:13:42.920] platform = base::sprintf("%s (%s-bit)", [13:13:42.920] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:42.920] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:42.920] "release", "version")], collapse = " "), [13:13:42.920] hostname = base::Sys.info()[["nodename"]]) [13:13:42.920] info <- base::sprintf("%s: %s", base::names(info), [13:13:42.920] info) [13:13:42.920] info <- base::paste(info, collapse = "; ") [13:13:42.920] if (!has_future) { [13:13:42.920] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:42.920] info) [13:13:42.920] } [13:13:42.920] else { [13:13:42.920] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:42.920] info, version) [13:13:42.920] } [13:13:42.920] base::stop(msg) [13:13:42.920] } [13:13:42.920] }) [13:13:42.920] } [13:13:42.920] options(future.plan = NULL) [13:13:42.920] Sys.unsetenv("R_FUTURE_PLAN") [13:13:42.920] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:42.920] } [13:13:42.920] ...future.workdir <- getwd() [13:13:42.920] } [13:13:42.920] ...future.oldOptions <- base::as.list(base::.Options) [13:13:42.920] ...future.oldEnvVars <- base::Sys.getenv() [13:13:42.920] } [13:13:42.920] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:42.920] future.globals.maxSize = 2097152000, future.globals.method = NULL, [13:13:42.920] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:42.920] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:42.920] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:42.920] future.stdout.windows.reencode = NULL, width = 80L) [13:13:42.920] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:42.920] base::names(...future.oldOptions)) [13:13:42.920] } [13:13:42.920] if (FALSE) { [13:13:42.920] } [13:13:42.920] else { [13:13:42.920] if (TRUE) { [13:13:42.920] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:42.920] open = "w") [13:13:42.920] } [13:13:42.920] else { [13:13:42.920] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:42.920] windows = "NUL", "/dev/null"), open = "w") [13:13:42.920] } [13:13:42.920] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:42.920] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:42.920] base::sink(type = "output", split = FALSE) [13:13:42.920] base::close(...future.stdout) [13:13:42.920] }, add = TRUE) [13:13:42.920] } [13:13:42.920] ...future.frame <- base::sys.nframe() [13:13:42.920] ...future.conditions <- base::list() [13:13:42.920] ...future.rng <- base::globalenv()$.Random.seed [13:13:42.920] if (FALSE) { [13:13:42.920] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:42.920] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:42.920] } [13:13:42.920] ...future.result <- base::tryCatch({ [13:13:42.920] base::withCallingHandlers({ [13:13:42.920] ...future.value <- base::withVisible(base::local({ [13:13:42.920] do.call(function(...) { [13:13:42.920] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:42.920] if (!identical(...future.globals.maxSize.org, [13:13:42.920] ...future.globals.maxSize)) { [13:13:42.920] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:42.920] on.exit(options(oopts), add = TRUE) [13:13:42.920] } [13:13:42.920] { [13:13:42.920] lapply(seq_along(...future.elements_ii), [13:13:42.920] FUN = function(jj) { [13:13:42.920] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:42.920] ...future.FUN(...future.X_jj, ...) [13:13:42.920] }) [13:13:42.920] } [13:13:42.920] }, args = future.call.arguments) [13:13:42.920] })) [13:13:42.920] future::FutureResult(value = ...future.value$value, [13:13:42.920] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:42.920] ...future.rng), globalenv = if (FALSE) [13:13:42.920] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:42.920] ...future.globalenv.names)) [13:13:42.920] else NULL, started = ...future.startTime, version = "1.8") [13:13:42.920] }, condition = base::local({ [13:13:42.920] c <- base::c [13:13:42.920] inherits <- base::inherits [13:13:42.920] invokeRestart <- base::invokeRestart [13:13:42.920] length <- base::length [13:13:42.920] list <- base::list [13:13:42.920] seq.int <- base::seq.int [13:13:42.920] signalCondition <- base::signalCondition [13:13:42.920] sys.calls <- base::sys.calls [13:13:42.920] `[[` <- base::`[[` [13:13:42.920] `+` <- base::`+` [13:13:42.920] `<<-` <- base::`<<-` [13:13:42.920] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:42.920] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:42.920] 3L)] [13:13:42.920] } [13:13:42.920] function(cond) { [13:13:42.920] is_error <- inherits(cond, "error") [13:13:42.920] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:42.920] NULL) [13:13:42.920] if (is_error) { [13:13:42.920] sessionInformation <- function() { [13:13:42.920] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:42.920] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:42.920] search = base::search(), system = base::Sys.info()) [13:13:42.920] } [13:13:42.920] ...future.conditions[[length(...future.conditions) + [13:13:42.920] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:42.920] cond$call), session = sessionInformation(), [13:13:42.920] timestamp = base::Sys.time(), signaled = 0L) [13:13:42.920] signalCondition(cond) [13:13:42.920] } [13:13:42.920] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:42.920] "immediateCondition"))) { [13:13:42.920] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:42.920] ...future.conditions[[length(...future.conditions) + [13:13:42.920] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:42.920] if (TRUE && !signal) { [13:13:42.920] muffleCondition <- function (cond, pattern = "^muffle") [13:13:42.920] { [13:13:42.920] inherits <- base::inherits [13:13:42.920] invokeRestart <- base::invokeRestart [13:13:42.920] is.null <- base::is.null [13:13:42.920] muffled <- FALSE [13:13:42.920] if (inherits(cond, "message")) { [13:13:42.920] muffled <- grepl(pattern, "muffleMessage") [13:13:42.920] if (muffled) [13:13:42.920] invokeRestart("muffleMessage") [13:13:42.920] } [13:13:42.920] else if (inherits(cond, "warning")) { [13:13:42.920] muffled <- grepl(pattern, "muffleWarning") [13:13:42.920] if (muffled) [13:13:42.920] invokeRestart("muffleWarning") [13:13:42.920] } [13:13:42.920] else if (inherits(cond, "condition")) { [13:13:42.920] if (!is.null(pattern)) { [13:13:42.920] computeRestarts <- base::computeRestarts [13:13:42.920] grepl <- base::grepl [13:13:42.920] restarts <- computeRestarts(cond) [13:13:42.920] for (restart in restarts) { [13:13:42.920] name <- restart$name [13:13:42.920] if (is.null(name)) [13:13:42.920] next [13:13:42.920] if (!grepl(pattern, name)) [13:13:42.920] next [13:13:42.920] invokeRestart(restart) [13:13:42.920] muffled <- TRUE [13:13:42.920] break [13:13:42.920] } [13:13:42.920] } [13:13:42.920] } [13:13:42.920] invisible(muffled) [13:13:42.920] } [13:13:42.920] muffleCondition(cond, pattern = "^muffle") [13:13:42.920] } [13:13:42.920] } [13:13:42.920] else { [13:13:42.920] if (TRUE) { [13:13:42.920] muffleCondition <- function (cond, pattern = "^muffle") [13:13:42.920] { [13:13:42.920] inherits <- base::inherits [13:13:42.920] invokeRestart <- base::invokeRestart [13:13:42.920] is.null <- base::is.null [13:13:42.920] muffled <- FALSE [13:13:42.920] if (inherits(cond, "message")) { [13:13:42.920] muffled <- grepl(pattern, "muffleMessage") [13:13:42.920] if (muffled) [13:13:42.920] invokeRestart("muffleMessage") [13:13:42.920] } [13:13:42.920] else if (inherits(cond, "warning")) { [13:13:42.920] muffled <- grepl(pattern, "muffleWarning") [13:13:42.920] if (muffled) [13:13:42.920] invokeRestart("muffleWarning") [13:13:42.920] } [13:13:42.920] else if (inherits(cond, "condition")) { [13:13:42.920] if (!is.null(pattern)) { [13:13:42.920] computeRestarts <- base::computeRestarts [13:13:42.920] grepl <- base::grepl [13:13:42.920] restarts <- computeRestarts(cond) [13:13:42.920] for (restart in restarts) { [13:13:42.920] name <- restart$name [13:13:42.920] if (is.null(name)) [13:13:42.920] next [13:13:42.920] if (!grepl(pattern, name)) [13:13:42.920] next [13:13:42.920] invokeRestart(restart) [13:13:42.920] muffled <- TRUE [13:13:42.920] break [13:13:42.920] } [13:13:42.920] } [13:13:42.920] } [13:13:42.920] invisible(muffled) [13:13:42.920] } [13:13:42.920] muffleCondition(cond, pattern = "^muffle") [13:13:42.920] } [13:13:42.920] } [13:13:42.920] } [13:13:42.920] })) [13:13:42.920] }, error = function(ex) { [13:13:42.920] base::structure(base::list(value = NULL, visible = NULL, [13:13:42.920] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:42.920] ...future.rng), started = ...future.startTime, [13:13:42.920] finished = Sys.time(), session_uuid = NA_character_, [13:13:42.920] version = "1.8"), class = "FutureResult") [13:13:42.920] }, finally = { [13:13:42.920] if (!identical(...future.workdir, getwd())) [13:13:42.920] setwd(...future.workdir) [13:13:42.920] { [13:13:42.920] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:42.920] ...future.oldOptions$nwarnings <- NULL [13:13:42.920] } [13:13:42.920] base::options(...future.oldOptions) [13:13:42.920] if (.Platform$OS.type == "windows") { [13:13:42.920] old_names <- names(...future.oldEnvVars) [13:13:42.920] envs <- base::Sys.getenv() [13:13:42.920] names <- names(envs) [13:13:42.920] common <- intersect(names, old_names) [13:13:42.920] added <- setdiff(names, old_names) [13:13:42.920] removed <- setdiff(old_names, names) [13:13:42.920] changed <- common[...future.oldEnvVars[common] != [13:13:42.920] envs[common]] [13:13:42.920] NAMES <- toupper(changed) [13:13:42.920] args <- list() [13:13:42.920] for (kk in seq_along(NAMES)) { [13:13:42.920] name <- changed[[kk]] [13:13:42.920] NAME <- NAMES[[kk]] [13:13:42.920] if (name != NAME && is.element(NAME, old_names)) [13:13:42.920] next [13:13:42.920] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:42.920] } [13:13:42.920] NAMES <- toupper(added) [13:13:42.920] for (kk in seq_along(NAMES)) { [13:13:42.920] name <- added[[kk]] [13:13:42.920] NAME <- NAMES[[kk]] [13:13:42.920] if (name != NAME && is.element(NAME, old_names)) [13:13:42.920] next [13:13:42.920] args[[name]] <- "" [13:13:42.920] } [13:13:42.920] NAMES <- toupper(removed) [13:13:42.920] for (kk in seq_along(NAMES)) { [13:13:42.920] name <- removed[[kk]] [13:13:42.920] NAME <- NAMES[[kk]] [13:13:42.920] if (name != NAME && is.element(NAME, old_names)) [13:13:42.920] next [13:13:42.920] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:42.920] } [13:13:42.920] if (length(args) > 0) [13:13:42.920] base::do.call(base::Sys.setenv, args = args) [13:13:42.920] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:42.920] } [13:13:42.920] else { [13:13:42.920] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:42.920] } [13:13:42.920] { [13:13:42.920] if (base::length(...future.futureOptionsAdded) > [13:13:42.920] 0L) { [13:13:42.920] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:42.920] base::names(opts) <- ...future.futureOptionsAdded [13:13:42.920] base::options(opts) [13:13:42.920] } [13:13:42.920] { [13:13:42.920] { [13:13:42.920] NULL [13:13:42.920] RNGkind("Mersenne-Twister") [13:13:42.920] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:42.920] inherits = FALSE) [13:13:42.920] } [13:13:42.920] options(future.plan = NULL) [13:13:42.920] if (is.na(NA_character_)) [13:13:42.920] Sys.unsetenv("R_FUTURE_PLAN") [13:13:42.920] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:42.920] future::plan(list(function (..., envir = parent.frame()) [13:13:42.920] { [13:13:42.920] future <- SequentialFuture(..., envir = envir) [13:13:42.920] if (!future$lazy) [13:13:42.920] future <- run(future) [13:13:42.920] invisible(future) [13:13:42.920] }), .cleanup = FALSE, .init = FALSE) [13:13:42.920] } [13:13:42.920] } [13:13:42.920] } [13:13:42.920] }) [13:13:42.920] if (TRUE) { [13:13:42.920] base::sink(type = "output", split = FALSE) [13:13:42.920] if (TRUE) { [13:13:42.920] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:42.920] } [13:13:42.920] else { [13:13:42.920] ...future.result["stdout"] <- base::list(NULL) [13:13:42.920] } [13:13:42.920] base::close(...future.stdout) [13:13:42.920] ...future.stdout <- NULL [13:13:42.920] } [13:13:42.920] ...future.result$conditions <- ...future.conditions [13:13:42.920] ...future.result$finished <- base::Sys.time() [13:13:42.920] ...future.result [13:13:42.920] } [13:13:42.923] assign_globals() ... [13:13:42.923] List of 5 [13:13:42.923] $ ...future.FUN :function (mode = "logical", length = 0L) [13:13:42.923] $ future.call.arguments :List of 1 [13:13:42.923] ..$ length: int 2 [13:13:42.923] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:42.923] $ ...future.elements_ii :List of 1 [13:13:42.923] ..$ c: chr "character" [13:13:42.923] $ ...future.seeds_ii : NULL [13:13:42.923] $ ...future.globals.maxSize: NULL [13:13:42.923] - attr(*, "where")=List of 5 [13:13:42.923] ..$ ...future.FUN : [13:13:42.923] ..$ future.call.arguments : [13:13:42.923] ..$ ...future.elements_ii : [13:13:42.923] ..$ ...future.seeds_ii : [13:13:42.923] ..$ ...future.globals.maxSize: [13:13:42.923] - attr(*, "resolved")= logi FALSE [13:13:42.923] - attr(*, "total_size")= num 2240 [13:13:42.923] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:42.923] - attr(*, "already-done")= logi TRUE [13:13:42.927] - copied '...future.FUN' to environment [13:13:42.927] - copied 'future.call.arguments' to environment [13:13:42.927] - copied '...future.elements_ii' to environment [13:13:42.927] - copied '...future.seeds_ii' to environment [13:13:42.927] - copied '...future.globals.maxSize' to environment [13:13:42.927] assign_globals() ... done [13:13:42.928] plan(): Setting new future strategy stack: [13:13:42.928] List of future strategies: [13:13:42.928] 1. sequential: [13:13:42.928] - args: function (..., envir = parent.frame(), workers = "") [13:13:42.928] - tweaked: FALSE [13:13:42.928] - call: NULL [13:13:42.928] plan(): nbrOfWorkers() = 1 [13:13:42.929] plan(): Setting new future strategy stack: [13:13:42.929] List of future strategies: [13:13:42.929] 1. sequential: [13:13:42.929] - args: function (..., envir = parent.frame(), workers = "") [13:13:42.929] - tweaked: FALSE [13:13:42.929] - call: plan(strategy) [13:13:42.930] plan(): nbrOfWorkers() = 1 [13:13:42.930] SequentialFuture started (and completed) [13:13:42.930] - Launch lazy future ... done [13:13:42.930] run() for 'SequentialFuture' ... done [13:13:42.930] Created future: [13:13:42.930] SequentialFuture: [13:13:42.930] Label: 'future_lapply-3' [13:13:42.930] Expression: [13:13:42.930] { [13:13:42.930] do.call(function(...) { [13:13:42.930] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:42.930] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:42.930] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:42.930] on.exit(options(oopts), add = TRUE) [13:13:42.930] } [13:13:42.930] { [13:13:42.930] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:42.930] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:42.930] ...future.FUN(...future.X_jj, ...) [13:13:42.930] }) [13:13:42.930] } [13:13:42.930] }, args = future.call.arguments) [13:13:42.930] } [13:13:42.930] Lazy evaluation: FALSE [13:13:42.930] Asynchronous evaluation: FALSE [13:13:42.930] Local evaluation: TRUE [13:13:42.930] Environment: R_GlobalEnv [13:13:42.930] Capture standard output: TRUE [13:13:42.930] Capture condition classes: 'condition' (excluding 'nothing') [13:13:42.930] 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) [13:13:42.930] Packages: [13:13:42.930] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:42.930] Resolved: TRUE [13:13:42.930] Value: 120 bytes of class 'list' [13:13:42.930] Early signaling: FALSE [13:13:42.930] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:42.930] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:42.931] Chunk #3 of 4 ... DONE [13:13:42.931] Chunk #4 of 4 ... [13:13:42.932] - Finding globals in 'X' for chunk #4 ... [13:13:42.932] getGlobalsAndPackages() ... [13:13:42.932] Searching for globals... [13:13:42.932] [13:13:42.932] Searching for globals ... DONE [13:13:42.932] - globals: [0] [13:13:42.932] getGlobalsAndPackages() ... DONE [13:13:42.932] + additional globals found: [n=0] [13:13:42.933] + additional namespaces needed: [n=0] [13:13:42.933] - Finding globals in 'X' for chunk #4 ... DONE [13:13:42.933] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [13:13:42.933] - seeds: [13:13:42.933] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:42.933] getGlobalsAndPackages() ... [13:13:42.933] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:42.933] Resolving globals: FALSE [13:13:42.934] Tweak future expression to call with '...' arguments ... [13:13:42.934] { [13:13:42.934] do.call(function(...) { [13:13:42.934] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:42.934] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:42.934] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:42.934] on.exit(options(oopts), add = TRUE) [13:13:42.934] } [13:13:42.934] { [13:13:42.934] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:42.934] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:42.934] ...future.FUN(...future.X_jj, ...) [13:13:42.934] }) [13:13:42.934] } [13:13:42.934] }, args = future.call.arguments) [13:13:42.934] } [13:13:42.934] Tweak future expression to call with '...' arguments ... DONE [13:13:42.934] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:42.934] [13:13:42.935] getGlobalsAndPackages() ... DONE [13:13:42.935] run() for 'Future' ... [13:13:42.935] - state: 'created' [13:13:42.935] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:13:42.935] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:42.935] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:42.936] - Field: 'label' [13:13:42.936] - Field: 'local' [13:13:42.936] - Field: 'owner' [13:13:42.936] - Field: 'envir' [13:13:42.936] - Field: 'packages' [13:13:42.936] - Field: 'gc' [13:13:42.936] - Field: 'conditions' [13:13:42.936] - Field: 'expr' [13:13:42.937] - Field: 'uuid' [13:13:42.937] - Field: 'seed' [13:13:42.937] - Field: 'version' [13:13:42.937] - Field: 'result' [13:13:42.937] - Field: 'asynchronous' [13:13:42.937] - Field: 'calls' [13:13:42.937] - Field: 'globals' [13:13:42.937] - Field: 'stdout' [13:13:42.938] - Field: 'earlySignal' [13:13:42.938] - Field: 'lazy' [13:13:42.938] - Field: 'state' [13:13:42.938] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:42.938] - Launch lazy future ... [13:13:42.938] Packages needed by the future expression (n = 0): [13:13:42.938] Packages needed by future strategies (n = 0): [13:13:42.939] { [13:13:42.939] { [13:13:42.939] { [13:13:42.939] ...future.startTime <- base::Sys.time() [13:13:42.939] { [13:13:42.939] { [13:13:42.939] { [13:13:42.939] base::local({ [13:13:42.939] has_future <- base::requireNamespace("future", [13:13:42.939] quietly = TRUE) [13:13:42.939] if (has_future) { [13:13:42.939] ns <- base::getNamespace("future") [13:13:42.939] version <- ns[[".package"]][["version"]] [13:13:42.939] if (is.null(version)) [13:13:42.939] version <- utils::packageVersion("future") [13:13:42.939] } [13:13:42.939] else { [13:13:42.939] version <- NULL [13:13:42.939] } [13:13:42.939] if (!has_future || version < "1.8.0") { [13:13:42.939] info <- base::c(r_version = base::gsub("R version ", [13:13:42.939] "", base::R.version$version.string), [13:13:42.939] platform = base::sprintf("%s (%s-bit)", [13:13:42.939] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:42.939] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:42.939] "release", "version")], collapse = " "), [13:13:42.939] hostname = base::Sys.info()[["nodename"]]) [13:13:42.939] info <- base::sprintf("%s: %s", base::names(info), [13:13:42.939] info) [13:13:42.939] info <- base::paste(info, collapse = "; ") [13:13:42.939] if (!has_future) { [13:13:42.939] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:42.939] info) [13:13:42.939] } [13:13:42.939] else { [13:13:42.939] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:42.939] info, version) [13:13:42.939] } [13:13:42.939] base::stop(msg) [13:13:42.939] } [13:13:42.939] }) [13:13:42.939] } [13:13:42.939] options(future.plan = NULL) [13:13:42.939] Sys.unsetenv("R_FUTURE_PLAN") [13:13:42.939] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:42.939] } [13:13:42.939] ...future.workdir <- getwd() [13:13:42.939] } [13:13:42.939] ...future.oldOptions <- base::as.list(base::.Options) [13:13:42.939] ...future.oldEnvVars <- base::Sys.getenv() [13:13:42.939] } [13:13:42.939] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:42.939] future.globals.maxSize = 2097152000, future.globals.method = NULL, [13:13:42.939] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:42.939] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:42.939] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:42.939] future.stdout.windows.reencode = NULL, width = 80L) [13:13:42.939] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:42.939] base::names(...future.oldOptions)) [13:13:42.939] } [13:13:42.939] if (FALSE) { [13:13:42.939] } [13:13:42.939] else { [13:13:42.939] if (TRUE) { [13:13:42.939] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:42.939] open = "w") [13:13:42.939] } [13:13:42.939] else { [13:13:42.939] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:42.939] windows = "NUL", "/dev/null"), open = "w") [13:13:42.939] } [13:13:42.939] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:42.939] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:42.939] base::sink(type = "output", split = FALSE) [13:13:42.939] base::close(...future.stdout) [13:13:42.939] }, add = TRUE) [13:13:42.939] } [13:13:42.939] ...future.frame <- base::sys.nframe() [13:13:42.939] ...future.conditions <- base::list() [13:13:42.939] ...future.rng <- base::globalenv()$.Random.seed [13:13:42.939] if (FALSE) { [13:13:42.939] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:42.939] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:42.939] } [13:13:42.939] ...future.result <- base::tryCatch({ [13:13:42.939] base::withCallingHandlers({ [13:13:42.939] ...future.value <- base::withVisible(base::local({ [13:13:42.939] do.call(function(...) { [13:13:42.939] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:42.939] if (!identical(...future.globals.maxSize.org, [13:13:42.939] ...future.globals.maxSize)) { [13:13:42.939] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:42.939] on.exit(options(oopts), add = TRUE) [13:13:42.939] } [13:13:42.939] { [13:13:42.939] lapply(seq_along(...future.elements_ii), [13:13:42.939] FUN = function(jj) { [13:13:42.939] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:42.939] ...future.FUN(...future.X_jj, ...) [13:13:42.939] }) [13:13:42.939] } [13:13:42.939] }, args = future.call.arguments) [13:13:42.939] })) [13:13:42.939] future::FutureResult(value = ...future.value$value, [13:13:42.939] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:42.939] ...future.rng), globalenv = if (FALSE) [13:13:42.939] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:42.939] ...future.globalenv.names)) [13:13:42.939] else NULL, started = ...future.startTime, version = "1.8") [13:13:42.939] }, condition = base::local({ [13:13:42.939] c <- base::c [13:13:42.939] inherits <- base::inherits [13:13:42.939] invokeRestart <- base::invokeRestart [13:13:42.939] length <- base::length [13:13:42.939] list <- base::list [13:13:42.939] seq.int <- base::seq.int [13:13:42.939] signalCondition <- base::signalCondition [13:13:42.939] sys.calls <- base::sys.calls [13:13:42.939] `[[` <- base::`[[` [13:13:42.939] `+` <- base::`+` [13:13:42.939] `<<-` <- base::`<<-` [13:13:42.939] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:42.939] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:42.939] 3L)] [13:13:42.939] } [13:13:42.939] function(cond) { [13:13:42.939] is_error <- inherits(cond, "error") [13:13:42.939] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:42.939] NULL) [13:13:42.939] if (is_error) { [13:13:42.939] sessionInformation <- function() { [13:13:42.939] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:42.939] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:42.939] search = base::search(), system = base::Sys.info()) [13:13:42.939] } [13:13:42.939] ...future.conditions[[length(...future.conditions) + [13:13:42.939] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:42.939] cond$call), session = sessionInformation(), [13:13:42.939] timestamp = base::Sys.time(), signaled = 0L) [13:13:42.939] signalCondition(cond) [13:13:42.939] } [13:13:42.939] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:42.939] "immediateCondition"))) { [13:13:42.939] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:42.939] ...future.conditions[[length(...future.conditions) + [13:13:42.939] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:42.939] if (TRUE && !signal) { [13:13:42.939] muffleCondition <- function (cond, pattern = "^muffle") [13:13:42.939] { [13:13:42.939] inherits <- base::inherits [13:13:42.939] invokeRestart <- base::invokeRestart [13:13:42.939] is.null <- base::is.null [13:13:42.939] muffled <- FALSE [13:13:42.939] if (inherits(cond, "message")) { [13:13:42.939] muffled <- grepl(pattern, "muffleMessage") [13:13:42.939] if (muffled) [13:13:42.939] invokeRestart("muffleMessage") [13:13:42.939] } [13:13:42.939] else if (inherits(cond, "warning")) { [13:13:42.939] muffled <- grepl(pattern, "muffleWarning") [13:13:42.939] if (muffled) [13:13:42.939] invokeRestart("muffleWarning") [13:13:42.939] } [13:13:42.939] else if (inherits(cond, "condition")) { [13:13:42.939] if (!is.null(pattern)) { [13:13:42.939] computeRestarts <- base::computeRestarts [13:13:42.939] grepl <- base::grepl [13:13:42.939] restarts <- computeRestarts(cond) [13:13:42.939] for (restart in restarts) { [13:13:42.939] name <- restart$name [13:13:42.939] if (is.null(name)) [13:13:42.939] next [13:13:42.939] if (!grepl(pattern, name)) [13:13:42.939] next [13:13:42.939] invokeRestart(restart) [13:13:42.939] muffled <- TRUE [13:13:42.939] break [13:13:42.939] } [13:13:42.939] } [13:13:42.939] } [13:13:42.939] invisible(muffled) [13:13:42.939] } [13:13:42.939] muffleCondition(cond, pattern = "^muffle") [13:13:42.939] } [13:13:42.939] } [13:13:42.939] else { [13:13:42.939] if (TRUE) { [13:13:42.939] muffleCondition <- function (cond, pattern = "^muffle") [13:13:42.939] { [13:13:42.939] inherits <- base::inherits [13:13:42.939] invokeRestart <- base::invokeRestart [13:13:42.939] is.null <- base::is.null [13:13:42.939] muffled <- FALSE [13:13:42.939] if (inherits(cond, "message")) { [13:13:42.939] muffled <- grepl(pattern, "muffleMessage") [13:13:42.939] if (muffled) [13:13:42.939] invokeRestart("muffleMessage") [13:13:42.939] } [13:13:42.939] else if (inherits(cond, "warning")) { [13:13:42.939] muffled <- grepl(pattern, "muffleWarning") [13:13:42.939] if (muffled) [13:13:42.939] invokeRestart("muffleWarning") [13:13:42.939] } [13:13:42.939] else if (inherits(cond, "condition")) { [13:13:42.939] if (!is.null(pattern)) { [13:13:42.939] computeRestarts <- base::computeRestarts [13:13:42.939] grepl <- base::grepl [13:13:42.939] restarts <- computeRestarts(cond) [13:13:42.939] for (restart in restarts) { [13:13:42.939] name <- restart$name [13:13:42.939] if (is.null(name)) [13:13:42.939] next [13:13:42.939] if (!grepl(pattern, name)) [13:13:42.939] next [13:13:42.939] invokeRestart(restart) [13:13:42.939] muffled <- TRUE [13:13:42.939] break [13:13:42.939] } [13:13:42.939] } [13:13:42.939] } [13:13:42.939] invisible(muffled) [13:13:42.939] } [13:13:42.939] muffleCondition(cond, pattern = "^muffle") [13:13:42.939] } [13:13:42.939] } [13:13:42.939] } [13:13:42.939] })) [13:13:42.939] }, error = function(ex) { [13:13:42.939] base::structure(base::list(value = NULL, visible = NULL, [13:13:42.939] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:42.939] ...future.rng), started = ...future.startTime, [13:13:42.939] finished = Sys.time(), session_uuid = NA_character_, [13:13:42.939] version = "1.8"), class = "FutureResult") [13:13:42.939] }, finally = { [13:13:42.939] if (!identical(...future.workdir, getwd())) [13:13:42.939] setwd(...future.workdir) [13:13:42.939] { [13:13:42.939] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:42.939] ...future.oldOptions$nwarnings <- NULL [13:13:42.939] } [13:13:42.939] base::options(...future.oldOptions) [13:13:42.939] if (.Platform$OS.type == "windows") { [13:13:42.939] old_names <- names(...future.oldEnvVars) [13:13:42.939] envs <- base::Sys.getenv() [13:13:42.939] names <- names(envs) [13:13:42.939] common <- intersect(names, old_names) [13:13:42.939] added <- setdiff(names, old_names) [13:13:42.939] removed <- setdiff(old_names, names) [13:13:42.939] changed <- common[...future.oldEnvVars[common] != [13:13:42.939] envs[common]] [13:13:42.939] NAMES <- toupper(changed) [13:13:42.939] args <- list() [13:13:42.939] for (kk in seq_along(NAMES)) { [13:13:42.939] name <- changed[[kk]] [13:13:42.939] NAME <- NAMES[[kk]] [13:13:42.939] if (name != NAME && is.element(NAME, old_names)) [13:13:42.939] next [13:13:42.939] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:42.939] } [13:13:42.939] NAMES <- toupper(added) [13:13:42.939] for (kk in seq_along(NAMES)) { [13:13:42.939] name <- added[[kk]] [13:13:42.939] NAME <- NAMES[[kk]] [13:13:42.939] if (name != NAME && is.element(NAME, old_names)) [13:13:42.939] next [13:13:42.939] args[[name]] <- "" [13:13:42.939] } [13:13:42.939] NAMES <- toupper(removed) [13:13:42.939] for (kk in seq_along(NAMES)) { [13:13:42.939] name <- removed[[kk]] [13:13:42.939] NAME <- NAMES[[kk]] [13:13:42.939] if (name != NAME && is.element(NAME, old_names)) [13:13:42.939] next [13:13:42.939] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:42.939] } [13:13:42.939] if (length(args) > 0) [13:13:42.939] base::do.call(base::Sys.setenv, args = args) [13:13:42.939] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:42.939] } [13:13:42.939] else { [13:13:42.939] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:42.939] } [13:13:42.939] { [13:13:42.939] if (base::length(...future.futureOptionsAdded) > [13:13:42.939] 0L) { [13:13:42.939] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:42.939] base::names(opts) <- ...future.futureOptionsAdded [13:13:42.939] base::options(opts) [13:13:42.939] } [13:13:42.939] { [13:13:42.939] { [13:13:42.939] NULL [13:13:42.939] RNGkind("Mersenne-Twister") [13:13:42.939] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:42.939] inherits = FALSE) [13:13:42.939] } [13:13:42.939] options(future.plan = NULL) [13:13:42.939] if (is.na(NA_character_)) [13:13:42.939] Sys.unsetenv("R_FUTURE_PLAN") [13:13:42.939] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:42.939] future::plan(list(function (..., envir = parent.frame()) [13:13:42.939] { [13:13:42.939] future <- SequentialFuture(..., envir = envir) [13:13:42.939] if (!future$lazy) [13:13:42.939] future <- run(future) [13:13:42.939] invisible(future) [13:13:42.939] }), .cleanup = FALSE, .init = FALSE) [13:13:42.939] } [13:13:42.939] } [13:13:42.939] } [13:13:42.939] }) [13:13:42.939] if (TRUE) { [13:13:42.939] base::sink(type = "output", split = FALSE) [13:13:42.939] if (TRUE) { [13:13:42.939] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:42.939] } [13:13:42.939] else { [13:13:42.939] ...future.result["stdout"] <- base::list(NULL) [13:13:42.939] } [13:13:42.939] base::close(...future.stdout) [13:13:42.939] ...future.stdout <- NULL [13:13:42.939] } [13:13:42.939] ...future.result$conditions <- ...future.conditions [13:13:42.939] ...future.result$finished <- base::Sys.time() [13:13:42.939] ...future.result [13:13:42.939] } [13:13:42.941] assign_globals() ... [13:13:42.942] List of 5 [13:13:42.942] $ ...future.FUN :function (mode = "logical", length = 0L) [13:13:42.942] $ future.call.arguments :List of 1 [13:13:42.942] ..$ length: int 2 [13:13:42.942] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:42.942] $ ...future.elements_ii :List of 1 [13:13:42.942] ..$ c: chr "list" [13:13:42.942] $ ...future.seeds_ii : NULL [13:13:42.942] $ ...future.globals.maxSize: NULL [13:13:42.942] - attr(*, "where")=List of 5 [13:13:42.942] ..$ ...future.FUN : [13:13:42.942] ..$ future.call.arguments : [13:13:42.942] ..$ ...future.elements_ii : [13:13:42.942] ..$ ...future.seeds_ii : [13:13:42.942] ..$ ...future.globals.maxSize: [13:13:42.942] - attr(*, "resolved")= logi FALSE [13:13:42.942] - attr(*, "total_size")= num 2240 [13:13:42.942] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:42.942] - attr(*, "already-done")= logi TRUE [13:13:42.946] - copied '...future.FUN' to environment [13:13:42.946] - copied 'future.call.arguments' to environment [13:13:42.946] - copied '...future.elements_ii' to environment [13:13:42.946] - copied '...future.seeds_ii' to environment [13:13:42.946] - copied '...future.globals.maxSize' to environment [13:13:42.946] assign_globals() ... done [13:13:42.947] plan(): Setting new future strategy stack: [13:13:42.947] List of future strategies: [13:13:42.947] 1. sequential: [13:13:42.947] - args: function (..., envir = parent.frame(), workers = "") [13:13:42.947] - tweaked: FALSE [13:13:42.947] - call: NULL [13:13:42.947] plan(): nbrOfWorkers() = 1 [13:13:42.948] plan(): Setting new future strategy stack: [13:13:42.948] List of future strategies: [13:13:42.948] 1. sequential: [13:13:42.948] - args: function (..., envir = parent.frame(), workers = "") [13:13:42.948] - tweaked: FALSE [13:13:42.948] - call: plan(strategy) [13:13:42.949] plan(): nbrOfWorkers() = 1 [13:13:42.949] SequentialFuture started (and completed) [13:13:42.949] - Launch lazy future ... done [13:13:42.949] run() for 'SequentialFuture' ... done [13:13:42.949] Created future: [13:13:42.949] SequentialFuture: [13:13:42.949] Label: 'future_lapply-4' [13:13:42.949] Expression: [13:13:42.949] { [13:13:42.949] do.call(function(...) { [13:13:42.949] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:42.949] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:42.949] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:42.949] on.exit(options(oopts), add = TRUE) [13:13:42.949] } [13:13:42.949] { [13:13:42.949] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:42.949] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:42.949] ...future.FUN(...future.X_jj, ...) [13:13:42.949] }) [13:13:42.949] } [13:13:42.949] }, args = future.call.arguments) [13:13:42.949] } [13:13:42.949] Lazy evaluation: FALSE [13:13:42.949] Asynchronous evaluation: FALSE [13:13:42.949] Local evaluation: TRUE [13:13:42.949] Environment: R_GlobalEnv [13:13:42.949] Capture standard output: TRUE [13:13:42.949] Capture condition classes: 'condition' (excluding 'nothing') [13:13:42.949] 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) [13:13:42.949] Packages: [13:13:42.949] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:42.949] Resolved: TRUE [13:13:42.949] Value: 0 bytes of class 'list' [13:13:42.949] Early signaling: FALSE [13:13:42.949] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:42.949] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:42.950] Chunk #4 of 4 ... DONE [13:13:42.950] Launching 4 futures (chunks) ... DONE [13:13:42.950] Resolving 4 futures (chunks) ... [13:13:42.951] resolve() on list ... [13:13:42.951] recursive: 0 [13:13:42.951] length: 4 [13:13:42.951] [13:13:42.951] resolved() for 'SequentialFuture' ... [13:13:42.951] - state: 'finished' [13:13:42.951] - run: TRUE [13:13:42.951] - result: 'FutureResult' [13:13:42.951] resolved() for 'SequentialFuture' ... done [13:13:42.952] Future #1 [13:13:42.952] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:42.952] - nx: 4 [13:13:42.952] - relay: TRUE [13:13:42.952] - stdout: TRUE [13:13:42.952] - signal: TRUE [13:13:42.952] - resignal: FALSE [13:13:42.952] - force: TRUE [13:13:42.953] - relayed: [n=4] FALSE, FALSE, FALSE, FALSE [13:13:42.953] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [13:13:42.953] - until=1 [13:13:42.953] - relaying element #1 [13:13:42.953] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [13:13:42.953] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [13:13:42.953] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:42.953] length: 3 (resolved future 1) [13:13:42.954] resolved() for 'SequentialFuture' ... [13:13:42.954] - state: 'finished' [13:13:42.954] - run: TRUE [13:13:42.954] - result: 'FutureResult' [13:13:42.954] resolved() for 'SequentialFuture' ... done [13:13:42.954] Future #2 [13:13:42.954] signalConditionsASAP(SequentialFuture, pos=2) ... [13:13:42.954] - nx: 4 [13:13:42.955] - relay: TRUE [13:13:42.955] - stdout: TRUE [13:13:42.955] - signal: TRUE [13:13:42.955] - resignal: FALSE [13:13:42.955] - force: TRUE [13:13:42.955] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [13:13:42.955] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [13:13:42.955] - until=2 [13:13:42.955] - relaying element #2 [13:13:42.956] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [13:13:42.956] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [13:13:42.956] signalConditionsASAP(SequentialFuture, pos=2) ... done [13:13:42.956] length: 2 (resolved future 2) [13:13:42.956] resolved() for 'SequentialFuture' ... [13:13:42.956] - state: 'finished' [13:13:42.956] - run: TRUE [13:13:42.957] - result: 'FutureResult' [13:13:42.957] resolved() for 'SequentialFuture' ... done [13:13:42.957] Future #3 [13:13:42.957] signalConditionsASAP(SequentialFuture, pos=3) ... [13:13:42.957] - nx: 4 [13:13:42.957] - relay: TRUE [13:13:42.957] - stdout: TRUE [13:13:42.957] - signal: TRUE [13:13:42.957] - resignal: FALSE [13:13:42.958] - force: TRUE [13:13:42.958] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [13:13:42.958] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [13:13:42.958] - until=3 [13:13:42.958] - relaying element #3 [13:13:42.958] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [13:13:42.958] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [13:13:42.958] signalConditionsASAP(SequentialFuture, pos=3) ... done [13:13:42.959] length: 1 (resolved future 3) [13:13:42.959] resolved() for 'SequentialFuture' ... [13:13:42.959] - state: 'finished' [13:13:42.959] - run: TRUE [13:13:42.959] - result: 'FutureResult' [13:13:42.959] resolved() for 'SequentialFuture' ... done [13:13:42.959] Future #4 [13:13:42.960] signalConditionsASAP(SequentialFuture, pos=4) ... [13:13:42.960] - nx: 4 [13:13:42.960] - relay: TRUE [13:13:42.960] - stdout: TRUE [13:13:42.960] - signal: TRUE [13:13:42.960] - resignal: FALSE [13:13:42.960] - force: TRUE [13:13:42.960] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [13:13:42.960] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [13:13:42.961] - until=4 [13:13:42.961] - relaying element #4 [13:13:42.961] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [13:13:42.961] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [13:13:42.961] signalConditionsASAP(SequentialFuture, pos=4) ... done [13:13:42.961] length: 0 (resolved future 4) [13:13:42.961] Relaying remaining futures [13:13:42.961] signalConditionsASAP(NULL, pos=0) ... [13:13:42.962] - nx: 4 [13:13:42.962] - relay: TRUE [13:13:42.962] - stdout: TRUE [13:13:42.962] - signal: TRUE [13:13:42.962] - resignal: FALSE [13:13:42.962] - force: TRUE [13:13:42.962] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [13:13:42.962] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE - flush all [13:13:42.962] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [13:13:42.963] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [13:13:42.963] signalConditionsASAP(NULL, pos=0) ... done [13:13:42.963] resolve() on list ... DONE [13:13:42.963] - Number of value chunks collected: 4 [13:13:42.963] Resolving 4 futures (chunks) ... DONE [13:13:42.963] Reducing values from 4 chunks ... [13:13:42.963] - Number of values collected after concatenation: 4 [13:13:42.964] - Number of values expected: 4 [13:13:42.964] Reducing values from 4 chunks ... DONE [13:13:42.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, ...) ... [13:13:42.966] future_lapply() ... [13:13:42.973] Number of chunks: 1 [13:13:42.973] getGlobalsAndPackagesXApply() ... [13:13:42.974] - future.globals: TRUE [13:13:42.974] getGlobalsAndPackages() ... [13:13:42.974] Searching for globals... [13:13:42.981] - globals found: [22] 'FUN', 'if', 'missing', 'is.finite', '{', 'is.null', '<-', 'paste', 'length', '==', 'return', '>', '+', '[', 'seq_len', 'rev', 'c', '&&', '!', ':', '(', '-' [13:13:42.981] Searching for globals ... DONE [13:13:42.981] Resolving globals: FALSE [13:13:42.982] The total size of the 1 globals is 69.62 KiB (71288 bytes) [13:13:42.982] 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') [13:13:42.982] - globals: [1] 'FUN' [13:13:42.982] - packages: [1] 'future' [13:13:42.982] getGlobalsAndPackages() ... DONE [13:13:42.983] - globals found/used: [n=1] 'FUN' [13:13:42.983] - needed namespaces: [n=1] 'future' [13:13:42.983] Finding globals ... DONE [13:13:42.983] - use_args: TRUE [13:13:42.983] - Getting '...' globals ... [13:13:42.983] resolve() on list ... [13:13:42.983] recursive: 0 [13:13:42.984] length: 1 [13:13:42.984] elements: '...' [13:13:42.984] length: 0 (resolved future 1) [13:13:42.984] resolve() on list ... DONE [13:13:42.984] - '...' content: [n=2] 'collapse', 'maxHead' [13:13:42.984] List of 1 [13:13:42.984] $ ...:List of 2 [13:13:42.984] ..$ collapse: chr "; " [13:13:42.984] ..$ maxHead : int 3 [13:13:42.984] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:42.984] - attr(*, "where")=List of 1 [13:13:42.984] ..$ ...: [13:13:42.984] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:42.984] - attr(*, "resolved")= logi TRUE [13:13:42.984] - attr(*, "total_size")= num NA [13:13:42.987] - Getting '...' globals ... DONE [13:13:42.987] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:42.987] List of 2 [13:13:42.987] $ ...future.FUN:function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [13:13:42.987] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [13:13:42.987] $ ... :List of 2 [13:13:42.987] ..$ collapse: chr "; " [13:13:42.987] ..$ maxHead : int 3 [13:13:42.987] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:42.987] - attr(*, "where")=List of 2 [13:13:42.987] ..$ ...future.FUN: [13:13:42.987] ..$ ... : [13:13:42.987] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:42.987] - attr(*, "resolved")= logi FALSE [13:13:42.987] - attr(*, "total_size")= num 71456 [13:13:42.990] Packages to be attached in all futures: [n=1] 'future' [13:13:42.990] getGlobalsAndPackagesXApply() ... DONE [13:13:42.990] Number of futures (= number of chunks): 1 [13:13:42.990] Launching 1 futures (chunks) ... [13:13:42.991] Chunk #1 of 1 ... [13:13:42.991] - Finding globals in 'X' for chunk #1 ... [13:13:42.991] getGlobalsAndPackages() ... [13:13:42.991] Searching for globals... [13:13:42.991] [13:13:42.991] Searching for globals ... DONE [13:13:42.991] - globals: [0] [13:13:42.991] getGlobalsAndPackages() ... DONE [13:13:42.992] + additional globals found: [n=0] [13:13:42.992] + additional namespaces needed: [n=0] [13:13:42.992] - Finding globals in 'X' for chunk #1 ... DONE [13:13:42.992] - seeds: [13:13:42.992] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:42.992] getGlobalsAndPackages() ... [13:13:42.992] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:42.992] Resolving globals: FALSE [13:13:42.993] Tweak future expression to call with '...' arguments ... [13:13:42.993] { [13:13:42.993] do.call(function(...) { [13:13:42.993] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:42.993] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:42.993] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:42.993] on.exit(options(oopts), add = TRUE) [13:13:42.993] } [13:13:42.993] { [13:13:42.993] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:42.993] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:42.993] ...future.FUN(...future.X_jj, ...) [13:13:42.993] }) [13:13:42.993] } [13:13:42.993] }, args = future.call.arguments) [13:13:42.993] } [13:13:42.993] Tweak future expression to call with '...' arguments ... DONE [13:13:42.993] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:42.993] - packages: [1] 'future' [13:13:42.994] getGlobalsAndPackages() ... DONE [13:13:42.994] run() for 'Future' ... [13:13:42.994] - state: 'created' [13:13:42.994] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:13:42.994] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:42.995] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:42.995] - Field: 'label' [13:13:42.995] - Field: 'local' [13:13:42.995] - Field: 'owner' [13:13:42.995] - Field: 'envir' [13:13:42.995] - Field: 'packages' [13:13:42.995] - Field: 'gc' [13:13:42.995] - Field: 'conditions' [13:13:42.996] - Field: 'expr' [13:13:42.996] - Field: 'uuid' [13:13:42.996] - Field: 'seed' [13:13:42.996] - Field: 'version' [13:13:42.996] - Field: 'result' [13:13:42.996] - Field: 'asynchronous' [13:13:42.996] - Field: 'calls' [13:13:42.996] - Field: 'globals' [13:13:42.996] - Field: 'stdout' [13:13:42.997] - Field: 'earlySignal' [13:13:42.997] - Field: 'lazy' [13:13:42.997] - Field: 'state' [13:13:42.997] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:42.997] - Launch lazy future ... [13:13:42.997] Packages needed by the future expression (n = 1): 'future' [13:13:42.997] Packages needed by future strategies (n = 0): [13:13:42.998] { [13:13:42.998] { [13:13:42.998] { [13:13:42.998] ...future.startTime <- base::Sys.time() [13:13:42.998] { [13:13:42.998] { [13:13:42.998] { [13:13:42.998] { [13:13:42.998] base::local({ [13:13:42.998] has_future <- base::requireNamespace("future", [13:13:42.998] quietly = TRUE) [13:13:42.998] if (has_future) { [13:13:42.998] ns <- base::getNamespace("future") [13:13:42.998] version <- ns[[".package"]][["version"]] [13:13:42.998] if (is.null(version)) [13:13:42.998] version <- utils::packageVersion("future") [13:13:42.998] } [13:13:42.998] else { [13:13:42.998] version <- NULL [13:13:42.998] } [13:13:42.998] if (!has_future || version < "1.8.0") { [13:13:42.998] info <- base::c(r_version = base::gsub("R version ", [13:13:42.998] "", base::R.version$version.string), [13:13:42.998] platform = base::sprintf("%s (%s-bit)", [13:13:42.998] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:42.998] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:42.998] "release", "version")], collapse = " "), [13:13:42.998] hostname = base::Sys.info()[["nodename"]]) [13:13:42.998] info <- base::sprintf("%s: %s", base::names(info), [13:13:42.998] info) [13:13:42.998] info <- base::paste(info, collapse = "; ") [13:13:42.998] if (!has_future) { [13:13:42.998] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:42.998] info) [13:13:42.998] } [13:13:42.998] else { [13:13:42.998] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:42.998] info, version) [13:13:42.998] } [13:13:42.998] base::stop(msg) [13:13:42.998] } [13:13:42.998] }) [13:13:42.998] } [13:13:42.998] base::local({ [13:13:42.998] for (pkg in "future") { [13:13:42.998] base::loadNamespace(pkg) [13:13:42.998] base::library(pkg, character.only = TRUE) [13:13:42.998] } [13:13:42.998] }) [13:13:42.998] } [13:13:42.998] options(future.plan = NULL) [13:13:42.998] Sys.unsetenv("R_FUTURE_PLAN") [13:13:42.998] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:42.998] } [13:13:42.998] ...future.workdir <- getwd() [13:13:42.998] } [13:13:42.998] ...future.oldOptions <- base::as.list(base::.Options) [13:13:42.998] ...future.oldEnvVars <- base::Sys.getenv() [13:13:42.998] } [13:13:42.998] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:42.998] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:42.998] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:42.998] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:42.998] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:42.998] future.stdout.windows.reencode = NULL, width = 80L) [13:13:42.998] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:42.998] base::names(...future.oldOptions)) [13:13:42.998] } [13:13:42.998] if (FALSE) { [13:13:42.998] } [13:13:42.998] else { [13:13:42.998] if (TRUE) { [13:13:42.998] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:42.998] open = "w") [13:13:42.998] } [13:13:42.998] else { [13:13:42.998] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:42.998] windows = "NUL", "/dev/null"), open = "w") [13:13:42.998] } [13:13:42.998] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:42.998] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:42.998] base::sink(type = "output", split = FALSE) [13:13:42.998] base::close(...future.stdout) [13:13:42.998] }, add = TRUE) [13:13:42.998] } [13:13:42.998] ...future.frame <- base::sys.nframe() [13:13:42.998] ...future.conditions <- base::list() [13:13:42.998] ...future.rng <- base::globalenv()$.Random.seed [13:13:42.998] if (FALSE) { [13:13:42.998] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:42.998] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:42.998] } [13:13:42.998] ...future.result <- base::tryCatch({ [13:13:42.998] base::withCallingHandlers({ [13:13:42.998] ...future.value <- base::withVisible(base::local({ [13:13:42.998] do.call(function(...) { [13:13:42.998] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:42.998] if (!identical(...future.globals.maxSize.org, [13:13:42.998] ...future.globals.maxSize)) { [13:13:42.998] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:42.998] on.exit(options(oopts), add = TRUE) [13:13:42.998] } [13:13:42.998] { [13:13:42.998] lapply(seq_along(...future.elements_ii), [13:13:42.998] FUN = function(jj) { [13:13:42.998] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:42.998] ...future.FUN(...future.X_jj, ...) [13:13:42.998] }) [13:13:42.998] } [13:13:42.998] }, args = future.call.arguments) [13:13:42.998] })) [13:13:42.998] future::FutureResult(value = ...future.value$value, [13:13:42.998] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:42.998] ...future.rng), globalenv = if (FALSE) [13:13:42.998] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:42.998] ...future.globalenv.names)) [13:13:42.998] else NULL, started = ...future.startTime, version = "1.8") [13:13:42.998] }, condition = base::local({ [13:13:42.998] c <- base::c [13:13:42.998] inherits <- base::inherits [13:13:42.998] invokeRestart <- base::invokeRestart [13:13:42.998] length <- base::length [13:13:42.998] list <- base::list [13:13:42.998] seq.int <- base::seq.int [13:13:42.998] signalCondition <- base::signalCondition [13:13:42.998] sys.calls <- base::sys.calls [13:13:42.998] `[[` <- base::`[[` [13:13:42.998] `+` <- base::`+` [13:13:42.998] `<<-` <- base::`<<-` [13:13:42.998] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:42.998] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:42.998] 3L)] [13:13:42.998] } [13:13:42.998] function(cond) { [13:13:42.998] is_error <- inherits(cond, "error") [13:13:42.998] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:42.998] NULL) [13:13:42.998] if (is_error) { [13:13:42.998] sessionInformation <- function() { [13:13:42.998] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:42.998] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:42.998] search = base::search(), system = base::Sys.info()) [13:13:42.998] } [13:13:42.998] ...future.conditions[[length(...future.conditions) + [13:13:42.998] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:42.998] cond$call), session = sessionInformation(), [13:13:42.998] timestamp = base::Sys.time(), signaled = 0L) [13:13:42.998] signalCondition(cond) [13:13:42.998] } [13:13:42.998] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:42.998] "immediateCondition"))) { [13:13:42.998] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:42.998] ...future.conditions[[length(...future.conditions) + [13:13:42.998] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:42.998] if (TRUE && !signal) { [13:13:42.998] muffleCondition <- function (cond, pattern = "^muffle") [13:13:42.998] { [13:13:42.998] inherits <- base::inherits [13:13:42.998] invokeRestart <- base::invokeRestart [13:13:42.998] is.null <- base::is.null [13:13:42.998] muffled <- FALSE [13:13:42.998] if (inherits(cond, "message")) { [13:13:42.998] muffled <- grepl(pattern, "muffleMessage") [13:13:42.998] if (muffled) [13:13:42.998] invokeRestart("muffleMessage") [13:13:42.998] } [13:13:42.998] else if (inherits(cond, "warning")) { [13:13:42.998] muffled <- grepl(pattern, "muffleWarning") [13:13:42.998] if (muffled) [13:13:42.998] invokeRestart("muffleWarning") [13:13:42.998] } [13:13:42.998] else if (inherits(cond, "condition")) { [13:13:42.998] if (!is.null(pattern)) { [13:13:42.998] computeRestarts <- base::computeRestarts [13:13:42.998] grepl <- base::grepl [13:13:42.998] restarts <- computeRestarts(cond) [13:13:42.998] for (restart in restarts) { [13:13:42.998] name <- restart$name [13:13:42.998] if (is.null(name)) [13:13:42.998] next [13:13:42.998] if (!grepl(pattern, name)) [13:13:42.998] next [13:13:42.998] invokeRestart(restart) [13:13:42.998] muffled <- TRUE [13:13:42.998] break [13:13:42.998] } [13:13:42.998] } [13:13:42.998] } [13:13:42.998] invisible(muffled) [13:13:42.998] } [13:13:42.998] muffleCondition(cond, pattern = "^muffle") [13:13:42.998] } [13:13:42.998] } [13:13:42.998] else { [13:13:42.998] if (TRUE) { [13:13:42.998] muffleCondition <- function (cond, pattern = "^muffle") [13:13:42.998] { [13:13:42.998] inherits <- base::inherits [13:13:42.998] invokeRestart <- base::invokeRestart [13:13:42.998] is.null <- base::is.null [13:13:42.998] muffled <- FALSE [13:13:42.998] if (inherits(cond, "message")) { [13:13:42.998] muffled <- grepl(pattern, "muffleMessage") [13:13:42.998] if (muffled) [13:13:42.998] invokeRestart("muffleMessage") [13:13:42.998] } [13:13:42.998] else if (inherits(cond, "warning")) { [13:13:42.998] muffled <- grepl(pattern, "muffleWarning") [13:13:42.998] if (muffled) [13:13:42.998] invokeRestart("muffleWarning") [13:13:42.998] } [13:13:42.998] else if (inherits(cond, "condition")) { [13:13:42.998] if (!is.null(pattern)) { [13:13:42.998] computeRestarts <- base::computeRestarts [13:13:42.998] grepl <- base::grepl [13:13:42.998] restarts <- computeRestarts(cond) [13:13:42.998] for (restart in restarts) { [13:13:42.998] name <- restart$name [13:13:42.998] if (is.null(name)) [13:13:42.998] next [13:13:42.998] if (!grepl(pattern, name)) [13:13:42.998] next [13:13:42.998] invokeRestart(restart) [13:13:42.998] muffled <- TRUE [13:13:42.998] break [13:13:42.998] } [13:13:42.998] } [13:13:42.998] } [13:13:42.998] invisible(muffled) [13:13:42.998] } [13:13:42.998] muffleCondition(cond, pattern = "^muffle") [13:13:42.998] } [13:13:42.998] } [13:13:42.998] } [13:13:42.998] })) [13:13:42.998] }, error = function(ex) { [13:13:42.998] base::structure(base::list(value = NULL, visible = NULL, [13:13:42.998] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:42.998] ...future.rng), started = ...future.startTime, [13:13:42.998] finished = Sys.time(), session_uuid = NA_character_, [13:13:42.998] version = "1.8"), class = "FutureResult") [13:13:42.998] }, finally = { [13:13:42.998] if (!identical(...future.workdir, getwd())) [13:13:42.998] setwd(...future.workdir) [13:13:42.998] { [13:13:42.998] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:42.998] ...future.oldOptions$nwarnings <- NULL [13:13:42.998] } [13:13:42.998] base::options(...future.oldOptions) [13:13:42.998] if (.Platform$OS.type == "windows") { [13:13:42.998] old_names <- names(...future.oldEnvVars) [13:13:42.998] envs <- base::Sys.getenv() [13:13:42.998] names <- names(envs) [13:13:42.998] common <- intersect(names, old_names) [13:13:42.998] added <- setdiff(names, old_names) [13:13:42.998] removed <- setdiff(old_names, names) [13:13:42.998] changed <- common[...future.oldEnvVars[common] != [13:13:42.998] envs[common]] [13:13:42.998] NAMES <- toupper(changed) [13:13:42.998] args <- list() [13:13:42.998] for (kk in seq_along(NAMES)) { [13:13:42.998] name <- changed[[kk]] [13:13:42.998] NAME <- NAMES[[kk]] [13:13:42.998] if (name != NAME && is.element(NAME, old_names)) [13:13:42.998] next [13:13:42.998] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:42.998] } [13:13:42.998] NAMES <- toupper(added) [13:13:42.998] for (kk in seq_along(NAMES)) { [13:13:42.998] name <- added[[kk]] [13:13:42.998] NAME <- NAMES[[kk]] [13:13:42.998] if (name != NAME && is.element(NAME, old_names)) [13:13:42.998] next [13:13:42.998] args[[name]] <- "" [13:13:42.998] } [13:13:42.998] NAMES <- toupper(removed) [13:13:42.998] for (kk in seq_along(NAMES)) { [13:13:42.998] name <- removed[[kk]] [13:13:42.998] NAME <- NAMES[[kk]] [13:13:42.998] if (name != NAME && is.element(NAME, old_names)) [13:13:42.998] next [13:13:42.998] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:42.998] } [13:13:42.998] if (length(args) > 0) [13:13:42.998] base::do.call(base::Sys.setenv, args = args) [13:13:42.998] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:42.998] } [13:13:42.998] else { [13:13:42.998] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:42.998] } [13:13:42.998] { [13:13:42.998] if (base::length(...future.futureOptionsAdded) > [13:13:42.998] 0L) { [13:13:42.998] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:42.998] base::names(opts) <- ...future.futureOptionsAdded [13:13:42.998] base::options(opts) [13:13:42.998] } [13:13:42.998] { [13:13:42.998] { [13:13:42.998] NULL [13:13:42.998] RNGkind("Mersenne-Twister") [13:13:42.998] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:42.998] inherits = FALSE) [13:13:42.998] } [13:13:42.998] options(future.plan = NULL) [13:13:42.998] if (is.na(NA_character_)) [13:13:42.998] Sys.unsetenv("R_FUTURE_PLAN") [13:13:42.998] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:42.998] future::plan(list(function (..., envir = parent.frame()) [13:13:42.998] { [13:13:42.998] future <- SequentialFuture(..., envir = envir) [13:13:42.998] if (!future$lazy) [13:13:42.998] future <- run(future) [13:13:42.998] invisible(future) [13:13:42.998] }), .cleanup = FALSE, .init = FALSE) [13:13:42.998] } [13:13:42.998] } [13:13:42.998] } [13:13:42.998] }) [13:13:42.998] if (TRUE) { [13:13:42.998] base::sink(type = "output", split = FALSE) [13:13:42.998] if (TRUE) { [13:13:42.998] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:42.998] } [13:13:42.998] else { [13:13:42.998] ...future.result["stdout"] <- base::list(NULL) [13:13:42.998] } [13:13:42.998] base::close(...future.stdout) [13:13:42.998] ...future.stdout <- NULL [13:13:42.998] } [13:13:42.998] ...future.result$conditions <- ...future.conditions [13:13:42.998] ...future.result$finished <- base::Sys.time() [13:13:42.998] ...future.result [13:13:42.998] } [13:13:43.001] assign_globals() ... [13:13:43.001] List of 5 [13:13:43.001] $ ...future.FUN :function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [13:13:43.001] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [13:13:43.001] $ future.call.arguments :List of 2 [13:13:43.001] ..$ collapse: chr "; " [13:13:43.001] ..$ maxHead : int 3 [13:13:43.001] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:43.001] $ ...future.elements_ii :List of 1 [13:13:43.001] ..$ a: Named chr [1:101] "hello" "1" "2" "3" ... [13:13:43.001] .. ..- attr(*, "names")= chr [1:101] "" "b1" "b2" "b3" ... [13:13:43.001] $ ...future.seeds_ii : NULL [13:13:43.001] $ ...future.globals.maxSize: NULL [13:13:43.001] - attr(*, "where")=List of 5 [13:13:43.001] ..$ ...future.FUN : [13:13:43.001] ..$ future.call.arguments : [13:13:43.001] ..$ ...future.elements_ii : [13:13:43.001] ..$ ...future.seeds_ii : [13:13:43.001] ..$ ...future.globals.maxSize: [13:13:43.001] - attr(*, "resolved")= logi FALSE [13:13:43.001] - attr(*, "total_size")= num 71456 [13:13:43.001] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:43.001] - attr(*, "already-done")= logi TRUE [13:13:43.005] - copied '...future.FUN' to environment [13:13:43.006] - copied 'future.call.arguments' to environment [13:13:43.006] - copied '...future.elements_ii' to environment [13:13:43.006] - copied '...future.seeds_ii' to environment [13:13:43.006] - copied '...future.globals.maxSize' to environment [13:13:43.006] assign_globals() ... done [13:13:43.007] plan(): Setting new future strategy stack: [13:13:43.007] List of future strategies: [13:13:43.007] 1. sequential: [13:13:43.007] - args: function (..., envir = parent.frame(), workers = "") [13:13:43.007] - tweaked: FALSE [13:13:43.007] - call: NULL [13:13:43.007] plan(): nbrOfWorkers() = 1 [13:13:43.008] plan(): Setting new future strategy stack: [13:13:43.008] List of future strategies: [13:13:43.008] 1. sequential: [13:13:43.008] - args: function (..., envir = parent.frame(), workers = "") [13:13:43.008] - tweaked: FALSE [13:13:43.008] - call: plan(strategy) [13:13:43.009] plan(): nbrOfWorkers() = 1 [13:13:43.009] SequentialFuture started (and completed) [13:13:43.009] - Launch lazy future ... done [13:13:43.009] run() for 'SequentialFuture' ... done [13:13:43.009] Created future: [13:13:43.009] SequentialFuture: [13:13:43.009] Label: 'future_lapply-1' [13:13:43.009] Expression: [13:13:43.009] { [13:13:43.009] do.call(function(...) { [13:13:43.009] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:43.009] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:43.009] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:43.009] on.exit(options(oopts), add = TRUE) [13:13:43.009] } [13:13:43.009] { [13:13:43.009] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:43.009] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:43.009] ...future.FUN(...future.X_jj, ...) [13:13:43.009] }) [13:13:43.009] } [13:13:43.009] }, args = future.call.arguments) [13:13:43.009] } [13:13:43.009] Lazy evaluation: FALSE [13:13:43.009] Asynchronous evaluation: FALSE [13:13:43.009] Local evaluation: TRUE [13:13:43.009] Environment: R_GlobalEnv [13:13:43.009] Capture standard output: TRUE [13:13:43.009] Capture condition classes: 'condition' (excluding 'nothing') [13:13:43.009] 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) [13:13:43.009] Packages: 1 packages ('future') [13:13:43.009] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:43.009] Resolved: TRUE [13:13:43.009] Value: 136 bytes of class 'list' [13:13:43.009] Early signaling: FALSE [13:13:43.009] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:43.009] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:43.010] Chunk #1 of 1 ... DONE [13:13:43.010] Launching 1 futures (chunks) ... DONE [13:13:43.010] Resolving 1 futures (chunks) ... [13:13:43.011] resolve() on list ... [13:13:43.011] recursive: 0 [13:13:43.011] length: 1 [13:13:43.011] [13:13:43.011] resolved() for 'SequentialFuture' ... [13:13:43.011] - state: 'finished' [13:13:43.011] - run: TRUE [13:13:43.011] - result: 'FutureResult' [13:13:43.011] resolved() for 'SequentialFuture' ... done [13:13:43.012] Future #1 [13:13:43.012] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:43.012] - nx: 1 [13:13:43.012] - relay: TRUE [13:13:43.012] - stdout: TRUE [13:13:43.012] - signal: TRUE [13:13:43.012] - resignal: FALSE [13:13:43.012] - force: TRUE [13:13:43.013] - relayed: [n=1] FALSE [13:13:43.013] - queued futures: [n=1] FALSE [13:13:43.013] - until=1 [13:13:43.013] - relaying element #1 [13:13:43.013] - relayed: [n=1] TRUE [13:13:43.013] - queued futures: [n=1] TRUE [13:13:43.013] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:43.013] length: 0 (resolved future 1) [13:13:43.014] Relaying remaining futures [13:13:43.014] signalConditionsASAP(NULL, pos=0) ... [13:13:43.014] - nx: 1 [13:13:43.014] - relay: TRUE [13:13:43.014] - stdout: TRUE [13:13:43.014] - signal: TRUE [13:13:43.014] - resignal: FALSE [13:13:43.014] - force: TRUE [13:13:43.014] - relayed: [n=1] TRUE [13:13:43.014] - queued futures: [n=1] TRUE - flush all [13:13:43.015] - relayed: [n=1] TRUE [13:13:43.015] - queued futures: [n=1] TRUE [13:13:43.015] signalConditionsASAP(NULL, pos=0) ... done [13:13:43.015] resolve() on list ... DONE [13:13:43.015] - Number of value chunks collected: 1 [13:13:43.015] Resolving 1 futures (chunks) ... DONE [13:13:43.015] Reducing values from 1 chunks ... [13:13:43.015] - Number of values collected after concatenation: 1 [13:13:43.016] - Number of values expected: 1 [13:13:43.016] Reducing values from 1 chunks ... DONE [13:13:43.016] future_lapply() ... DONE List of 1 $ y:List of 1 ..$ a: chr "hello; 1; 2; ...; 100" - future_lapply(x, FUN = listenv::listenv, ...) ... [13:13:43.017] future_lapply() ... [13:13:43.017] Number of chunks: 2 [13:13:43.017] getGlobalsAndPackagesXApply() ... [13:13:43.018] - future.globals: TRUE [13:13:43.018] getGlobalsAndPackages() ... [13:13:43.018] Searching for globals... [13:13:43.019] - globals found: [4] 'FUN', '{', 'get', 'parent.env' [13:13:43.019] Searching for globals ... DONE [13:13:43.019] Resolving globals: FALSE [13:13:43.019] The total size of the 1 globals is 4.85 KiB (4968 bytes) [13:13:43.020] 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') [13:13:43.020] - globals: [1] 'FUN' [13:13:43.020] - packages: [1] 'listenv' [13:13:43.020] getGlobalsAndPackages() ... DONE [13:13:43.020] - globals found/used: [n=1] 'FUN' [13:13:43.020] - needed namespaces: [n=1] 'listenv' [13:13:43.020] Finding globals ... DONE [13:13:43.021] - use_args: TRUE [13:13:43.021] - Getting '...' globals ... [13:13:43.021] resolve() on list ... [13:13:43.021] recursive: 0 [13:13:43.021] length: 1 [13:13:43.021] elements: '...' [13:13:43.021] length: 0 (resolved future 1) [13:13:43.022] resolve() on list ... DONE [13:13:43.022] - '...' content: [n=0] [13:13:43.022] List of 1 [13:13:43.022] $ ...: list() [13:13:43.022] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:43.022] - attr(*, "where")=List of 1 [13:13:43.022] ..$ ...: [13:13:43.022] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:43.022] - attr(*, "resolved")= logi TRUE [13:13:43.022] - attr(*, "total_size")= num NA [13:13:43.024] - Getting '...' globals ... DONE [13:13:43.024] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:43.024] List of 2 [13:13:43.024] $ ...future.FUN:function (x, ...) [13:13:43.024] $ ... : list() [13:13:43.024] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:43.024] - attr(*, "where")=List of 2 [13:13:43.024] ..$ ...future.FUN: [13:13:43.024] ..$ ... : [13:13:43.024] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:43.024] - attr(*, "resolved")= logi FALSE [13:13:43.024] - attr(*, "total_size")= num 4968 [13:13:43.027] Packages to be attached in all futures: [n=1] 'listenv' [13:13:43.027] getGlobalsAndPackagesXApply() ... DONE [13:13:43.027] Number of futures (= number of chunks): 2 [13:13:43.027] Launching 2 futures (chunks) ... [13:13:43.027] Chunk #1 of 2 ... [13:13:43.027] - Finding globals in 'X' for chunk #1 ... [13:13:43.027] getGlobalsAndPackages() ... [13:13:43.028] Searching for globals... [13:13:43.028] [13:13:43.028] Searching for globals ... DONE [13:13:43.028] - globals: [0] [13:13:43.028] getGlobalsAndPackages() ... DONE [13:13:43.028] + additional globals found: [n=0] [13:13:43.028] + additional namespaces needed: [n=0] [13:13:43.029] - Finding globals in 'X' for chunk #1 ... DONE [13:13:43.029] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:13:43.029] - seeds: [13:13:43.029] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:43.029] getGlobalsAndPackages() ... [13:13:43.029] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:43.029] Resolving globals: FALSE [13:13:43.029] Tweak future expression to call with '...' arguments ... [13:13:43.030] { [13:13:43.030] do.call(function(...) { [13:13:43.030] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:43.030] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:43.030] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:43.030] on.exit(options(oopts), add = TRUE) [13:13:43.030] } [13:13:43.030] { [13:13:43.030] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:43.030] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:43.030] ...future.FUN(...future.X_jj, ...) [13:13:43.030] }) [13:13:43.030] } [13:13:43.030] }, args = future.call.arguments) [13:13:43.030] } [13:13:43.030] Tweak future expression to call with '...' arguments ... DONE [13:13:43.030] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:43.030] - packages: [1] 'listenv' [13:13:43.030] getGlobalsAndPackages() ... DONE [13:13:43.031] run() for 'Future' ... [13:13:43.031] - state: 'created' [13:13:43.031] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:13:43.031] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:43.031] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:43.032] - Field: 'label' [13:13:43.032] - Field: 'local' [13:13:43.032] - Field: 'owner' [13:13:43.032] - Field: 'envir' [13:13:43.032] - Field: 'packages' [13:13:43.032] - Field: 'gc' [13:13:43.032] - Field: 'conditions' [13:13:43.032] - Field: 'expr' [13:13:43.033] - Field: 'uuid' [13:13:43.033] - Field: 'seed' [13:13:43.033] - Field: 'version' [13:13:43.033] - Field: 'result' [13:13:43.033] - Field: 'asynchronous' [13:13:43.033] - Field: 'calls' [13:13:43.033] - Field: 'globals' [13:13:43.033] - Field: 'stdout' [13:13:43.034] - Field: 'earlySignal' [13:13:43.034] - Field: 'lazy' [13:13:43.034] - Field: 'state' [13:13:43.034] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:43.034] - Launch lazy future ... [13:13:43.034] Packages needed by the future expression (n = 1): 'listenv' [13:13:43.034] Packages needed by future strategies (n = 0): [13:13:43.035] { [13:13:43.035] { [13:13:43.035] { [13:13:43.035] ...future.startTime <- base::Sys.time() [13:13:43.035] { [13:13:43.035] { [13:13:43.035] { [13:13:43.035] { [13:13:43.035] base::local({ [13:13:43.035] has_future <- base::requireNamespace("future", [13:13:43.035] quietly = TRUE) [13:13:43.035] if (has_future) { [13:13:43.035] ns <- base::getNamespace("future") [13:13:43.035] version <- ns[[".package"]][["version"]] [13:13:43.035] if (is.null(version)) [13:13:43.035] version <- utils::packageVersion("future") [13:13:43.035] } [13:13:43.035] else { [13:13:43.035] version <- NULL [13:13:43.035] } [13:13:43.035] if (!has_future || version < "1.8.0") { [13:13:43.035] info <- base::c(r_version = base::gsub("R version ", [13:13:43.035] "", base::R.version$version.string), [13:13:43.035] platform = base::sprintf("%s (%s-bit)", [13:13:43.035] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:43.035] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:43.035] "release", "version")], collapse = " "), [13:13:43.035] hostname = base::Sys.info()[["nodename"]]) [13:13:43.035] info <- base::sprintf("%s: %s", base::names(info), [13:13:43.035] info) [13:13:43.035] info <- base::paste(info, collapse = "; ") [13:13:43.035] if (!has_future) { [13:13:43.035] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:43.035] info) [13:13:43.035] } [13:13:43.035] else { [13:13:43.035] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:43.035] info, version) [13:13:43.035] } [13:13:43.035] base::stop(msg) [13:13:43.035] } [13:13:43.035] }) [13:13:43.035] } [13:13:43.035] base::local({ [13:13:43.035] for (pkg in "listenv") { [13:13:43.035] base::loadNamespace(pkg) [13:13:43.035] base::library(pkg, character.only = TRUE) [13:13:43.035] } [13:13:43.035] }) [13:13:43.035] } [13:13:43.035] options(future.plan = NULL) [13:13:43.035] Sys.unsetenv("R_FUTURE_PLAN") [13:13:43.035] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:43.035] } [13:13:43.035] ...future.workdir <- getwd() [13:13:43.035] } [13:13:43.035] ...future.oldOptions <- base::as.list(base::.Options) [13:13:43.035] ...future.oldEnvVars <- base::Sys.getenv() [13:13:43.035] } [13:13:43.035] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:43.035] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:13:43.035] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:43.035] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:43.035] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:43.035] future.stdout.windows.reencode = NULL, width = 80L) [13:13:43.035] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:43.035] base::names(...future.oldOptions)) [13:13:43.035] } [13:13:43.035] if (FALSE) { [13:13:43.035] } [13:13:43.035] else { [13:13:43.035] if (TRUE) { [13:13:43.035] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:43.035] open = "w") [13:13:43.035] } [13:13:43.035] else { [13:13:43.035] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:43.035] windows = "NUL", "/dev/null"), open = "w") [13:13:43.035] } [13:13:43.035] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:43.035] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:43.035] base::sink(type = "output", split = FALSE) [13:13:43.035] base::close(...future.stdout) [13:13:43.035] }, add = TRUE) [13:13:43.035] } [13:13:43.035] ...future.frame <- base::sys.nframe() [13:13:43.035] ...future.conditions <- base::list() [13:13:43.035] ...future.rng <- base::globalenv()$.Random.seed [13:13:43.035] if (FALSE) { [13:13:43.035] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:43.035] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:43.035] } [13:13:43.035] ...future.result <- base::tryCatch({ [13:13:43.035] base::withCallingHandlers({ [13:13:43.035] ...future.value <- base::withVisible(base::local({ [13:13:43.035] do.call(function(...) { [13:13:43.035] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:43.035] if (!identical(...future.globals.maxSize.org, [13:13:43.035] ...future.globals.maxSize)) { [13:13:43.035] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:43.035] on.exit(options(oopts), add = TRUE) [13:13:43.035] } [13:13:43.035] { [13:13:43.035] lapply(seq_along(...future.elements_ii), [13:13:43.035] FUN = function(jj) { [13:13:43.035] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:43.035] ...future.FUN(...future.X_jj, ...) [13:13:43.035] }) [13:13:43.035] } [13:13:43.035] }, args = future.call.arguments) [13:13:43.035] })) [13:13:43.035] future::FutureResult(value = ...future.value$value, [13:13:43.035] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:43.035] ...future.rng), globalenv = if (FALSE) [13:13:43.035] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:43.035] ...future.globalenv.names)) [13:13:43.035] else NULL, started = ...future.startTime, version = "1.8") [13:13:43.035] }, condition = base::local({ [13:13:43.035] c <- base::c [13:13:43.035] inherits <- base::inherits [13:13:43.035] invokeRestart <- base::invokeRestart [13:13:43.035] length <- base::length [13:13:43.035] list <- base::list [13:13:43.035] seq.int <- base::seq.int [13:13:43.035] signalCondition <- base::signalCondition [13:13:43.035] sys.calls <- base::sys.calls [13:13:43.035] `[[` <- base::`[[` [13:13:43.035] `+` <- base::`+` [13:13:43.035] `<<-` <- base::`<<-` [13:13:43.035] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:43.035] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:43.035] 3L)] [13:13:43.035] } [13:13:43.035] function(cond) { [13:13:43.035] is_error <- inherits(cond, "error") [13:13:43.035] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:43.035] NULL) [13:13:43.035] if (is_error) { [13:13:43.035] sessionInformation <- function() { [13:13:43.035] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:43.035] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:43.035] search = base::search(), system = base::Sys.info()) [13:13:43.035] } [13:13:43.035] ...future.conditions[[length(...future.conditions) + [13:13:43.035] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:43.035] cond$call), session = sessionInformation(), [13:13:43.035] timestamp = base::Sys.time(), signaled = 0L) [13:13:43.035] signalCondition(cond) [13:13:43.035] } [13:13:43.035] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:43.035] "immediateCondition"))) { [13:13:43.035] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:43.035] ...future.conditions[[length(...future.conditions) + [13:13:43.035] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:43.035] if (TRUE && !signal) { [13:13:43.035] muffleCondition <- function (cond, pattern = "^muffle") [13:13:43.035] { [13:13:43.035] inherits <- base::inherits [13:13:43.035] invokeRestart <- base::invokeRestart [13:13:43.035] is.null <- base::is.null [13:13:43.035] muffled <- FALSE [13:13:43.035] if (inherits(cond, "message")) { [13:13:43.035] muffled <- grepl(pattern, "muffleMessage") [13:13:43.035] if (muffled) [13:13:43.035] invokeRestart("muffleMessage") [13:13:43.035] } [13:13:43.035] else if (inherits(cond, "warning")) { [13:13:43.035] muffled <- grepl(pattern, "muffleWarning") [13:13:43.035] if (muffled) [13:13:43.035] invokeRestart("muffleWarning") [13:13:43.035] } [13:13:43.035] else if (inherits(cond, "condition")) { [13:13:43.035] if (!is.null(pattern)) { [13:13:43.035] computeRestarts <- base::computeRestarts [13:13:43.035] grepl <- base::grepl [13:13:43.035] restarts <- computeRestarts(cond) [13:13:43.035] for (restart in restarts) { [13:13:43.035] name <- restart$name [13:13:43.035] if (is.null(name)) [13:13:43.035] next [13:13:43.035] if (!grepl(pattern, name)) [13:13:43.035] next [13:13:43.035] invokeRestart(restart) [13:13:43.035] muffled <- TRUE [13:13:43.035] break [13:13:43.035] } [13:13:43.035] } [13:13:43.035] } [13:13:43.035] invisible(muffled) [13:13:43.035] } [13:13:43.035] muffleCondition(cond, pattern = "^muffle") [13:13:43.035] } [13:13:43.035] } [13:13:43.035] else { [13:13:43.035] if (TRUE) { [13:13:43.035] muffleCondition <- function (cond, pattern = "^muffle") [13:13:43.035] { [13:13:43.035] inherits <- base::inherits [13:13:43.035] invokeRestart <- base::invokeRestart [13:13:43.035] is.null <- base::is.null [13:13:43.035] muffled <- FALSE [13:13:43.035] if (inherits(cond, "message")) { [13:13:43.035] muffled <- grepl(pattern, "muffleMessage") [13:13:43.035] if (muffled) [13:13:43.035] invokeRestart("muffleMessage") [13:13:43.035] } [13:13:43.035] else if (inherits(cond, "warning")) { [13:13:43.035] muffled <- grepl(pattern, "muffleWarning") [13:13:43.035] if (muffled) [13:13:43.035] invokeRestart("muffleWarning") [13:13:43.035] } [13:13:43.035] else if (inherits(cond, "condition")) { [13:13:43.035] if (!is.null(pattern)) { [13:13:43.035] computeRestarts <- base::computeRestarts [13:13:43.035] grepl <- base::grepl [13:13:43.035] restarts <- computeRestarts(cond) [13:13:43.035] for (restart in restarts) { [13:13:43.035] name <- restart$name [13:13:43.035] if (is.null(name)) [13:13:43.035] next [13:13:43.035] if (!grepl(pattern, name)) [13:13:43.035] next [13:13:43.035] invokeRestart(restart) [13:13:43.035] muffled <- TRUE [13:13:43.035] break [13:13:43.035] } [13:13:43.035] } [13:13:43.035] } [13:13:43.035] invisible(muffled) [13:13:43.035] } [13:13:43.035] muffleCondition(cond, pattern = "^muffle") [13:13:43.035] } [13:13:43.035] } [13:13:43.035] } [13:13:43.035] })) [13:13:43.035] }, error = function(ex) { [13:13:43.035] base::structure(base::list(value = NULL, visible = NULL, [13:13:43.035] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:43.035] ...future.rng), started = ...future.startTime, [13:13:43.035] finished = Sys.time(), session_uuid = NA_character_, [13:13:43.035] version = "1.8"), class = "FutureResult") [13:13:43.035] }, finally = { [13:13:43.035] if (!identical(...future.workdir, getwd())) [13:13:43.035] setwd(...future.workdir) [13:13:43.035] { [13:13:43.035] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:43.035] ...future.oldOptions$nwarnings <- NULL [13:13:43.035] } [13:13:43.035] base::options(...future.oldOptions) [13:13:43.035] if (.Platform$OS.type == "windows") { [13:13:43.035] old_names <- names(...future.oldEnvVars) [13:13:43.035] envs <- base::Sys.getenv() [13:13:43.035] names <- names(envs) [13:13:43.035] common <- intersect(names, old_names) [13:13:43.035] added <- setdiff(names, old_names) [13:13:43.035] removed <- setdiff(old_names, names) [13:13:43.035] changed <- common[...future.oldEnvVars[common] != [13:13:43.035] envs[common]] [13:13:43.035] NAMES <- toupper(changed) [13:13:43.035] args <- list() [13:13:43.035] for (kk in seq_along(NAMES)) { [13:13:43.035] name <- changed[[kk]] [13:13:43.035] NAME <- NAMES[[kk]] [13:13:43.035] if (name != NAME && is.element(NAME, old_names)) [13:13:43.035] next [13:13:43.035] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:43.035] } [13:13:43.035] NAMES <- toupper(added) [13:13:43.035] for (kk in seq_along(NAMES)) { [13:13:43.035] name <- added[[kk]] [13:13:43.035] NAME <- NAMES[[kk]] [13:13:43.035] if (name != NAME && is.element(NAME, old_names)) [13:13:43.035] next [13:13:43.035] args[[name]] <- "" [13:13:43.035] } [13:13:43.035] NAMES <- toupper(removed) [13:13:43.035] for (kk in seq_along(NAMES)) { [13:13:43.035] name <- removed[[kk]] [13:13:43.035] NAME <- NAMES[[kk]] [13:13:43.035] if (name != NAME && is.element(NAME, old_names)) [13:13:43.035] next [13:13:43.035] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:43.035] } [13:13:43.035] if (length(args) > 0) [13:13:43.035] base::do.call(base::Sys.setenv, args = args) [13:13:43.035] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:43.035] } [13:13:43.035] else { [13:13:43.035] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:43.035] } [13:13:43.035] { [13:13:43.035] if (base::length(...future.futureOptionsAdded) > [13:13:43.035] 0L) { [13:13:43.035] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:43.035] base::names(opts) <- ...future.futureOptionsAdded [13:13:43.035] base::options(opts) [13:13:43.035] } [13:13:43.035] { [13:13:43.035] { [13:13:43.035] NULL [13:13:43.035] RNGkind("Mersenne-Twister") [13:13:43.035] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:43.035] inherits = FALSE) [13:13:43.035] } [13:13:43.035] options(future.plan = NULL) [13:13:43.035] if (is.na(NA_character_)) [13:13:43.035] Sys.unsetenv("R_FUTURE_PLAN") [13:13:43.035] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:43.035] future::plan(list(function (..., envir = parent.frame()) [13:13:43.035] { [13:13:43.035] future <- SequentialFuture(..., envir = envir) [13:13:43.035] if (!future$lazy) [13:13:43.035] future <- run(future) [13:13:43.035] invisible(future) [13:13:43.035] }), .cleanup = FALSE, .init = FALSE) [13:13:43.035] } [13:13:43.035] } [13:13:43.035] } [13:13:43.035] }) [13:13:43.035] if (TRUE) { [13:13:43.035] base::sink(type = "output", split = FALSE) [13:13:43.035] if (TRUE) { [13:13:43.035] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:43.035] } [13:13:43.035] else { [13:13:43.035] ...future.result["stdout"] <- base::list(NULL) [13:13:43.035] } [13:13:43.035] base::close(...future.stdout) [13:13:43.035] ...future.stdout <- NULL [13:13:43.035] } [13:13:43.035] ...future.result$conditions <- ...future.conditions [13:13:43.035] ...future.result$finished <- base::Sys.time() [13:13:43.035] ...future.result [13:13:43.035] } [13:13:43.038] assign_globals() ... [13:13:43.038] List of 5 [13:13:43.038] $ ...future.FUN :function (x, ...) [13:13:43.038] $ future.call.arguments : list() [13:13:43.038] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:43.038] $ ...future.elements_ii :List of 1 [13:13:43.038] ..$ a:Classes 'listenv', 'environment' [13:13:43.038] $ ...future.seeds_ii : NULL [13:13:43.038] $ ...future.globals.maxSize: NULL [13:13:43.038] - attr(*, "where")=List of 5 [13:13:43.038] ..$ ...future.FUN : [13:13:43.038] ..$ future.call.arguments : [13:13:43.038] ..$ ...future.elements_ii : [13:13:43.038] ..$ ...future.seeds_ii : [13:13:43.038] ..$ ...future.globals.maxSize: [13:13:43.038] - attr(*, "resolved")= logi FALSE [13:13:43.038] - attr(*, "total_size")= num 4968 [13:13:43.038] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:43.038] - attr(*, "already-done")= logi TRUE [13:13:43.042] - copied '...future.FUN' to environment [13:13:43.042] - copied 'future.call.arguments' to environment [13:13:43.042] - copied '...future.elements_ii' to environment [13:13:43.042] - copied '...future.seeds_ii' to environment [13:13:43.042] - copied '...future.globals.maxSize' to environment [13:13:43.044] assign_globals() ... done [13:13:43.044] plan(): Setting new future strategy stack: [13:13:43.044] List of future strategies: [13:13:43.044] 1. sequential: [13:13:43.044] - args: function (..., envir = parent.frame(), workers = "") [13:13:43.044] - tweaked: FALSE [13:13:43.044] - call: NULL [13:13:43.045] plan(): nbrOfWorkers() = 1 [13:13:43.046] plan(): Setting new future strategy stack: [13:13:43.046] List of future strategies: [13:13:43.046] 1. sequential: [13:13:43.046] - args: function (..., envir = parent.frame(), workers = "") [13:13:43.046] - tweaked: FALSE [13:13:43.046] - call: plan(strategy) [13:13:43.046] plan(): nbrOfWorkers() = 1 [13:13:43.046] SequentialFuture started (and completed) [13:13:43.046] - Launch lazy future ... done [13:13:43.047] run() for 'SequentialFuture' ... done [13:13:43.047] Created future: [13:13:43.047] SequentialFuture: [13:13:43.047] Label: 'future_lapply-1' [13:13:43.047] Expression: [13:13:43.047] { [13:13:43.047] do.call(function(...) { [13:13:43.047] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:43.047] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:43.047] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:43.047] on.exit(options(oopts), add = TRUE) [13:13:43.047] } [13:13:43.047] { [13:13:43.047] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:43.047] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:43.047] ...future.FUN(...future.X_jj, ...) [13:13:43.047] }) [13:13:43.047] } [13:13:43.047] }, args = future.call.arguments) [13:13:43.047] } [13:13:43.047] Lazy evaluation: FALSE [13:13:43.047] Asynchronous evaluation: FALSE [13:13:43.047] Local evaluation: TRUE [13:13:43.047] Environment: R_GlobalEnv [13:13:43.047] Capture standard output: TRUE [13:13:43.047] Capture condition classes: 'condition' (excluding 'nothing') [13:13:43.047] 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) [13:13:43.047] Packages: 1 packages ('listenv') [13:13:43.047] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:43.047] Resolved: TRUE [13:13:43.047] Value: 336 bytes of class 'list' [13:13:43.047] Early signaling: FALSE [13:13:43.047] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:43.047] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:43.048] Chunk #1 of 2 ... DONE [13:13:43.048] Chunk #2 of 2 ... [13:13:43.048] - Finding globals in 'X' for chunk #2 ... [13:13:43.048] getGlobalsAndPackages() ... [13:13:43.048] Searching for globals... [13:13:43.049] [13:13:43.049] Searching for globals ... DONE [13:13:43.049] - globals: [0] [13:13:43.049] getGlobalsAndPackages() ... DONE [13:13:43.049] + additional globals found: [n=0] [13:13:43.049] + additional namespaces needed: [n=0] [13:13:43.049] - Finding globals in 'X' for chunk #2 ... DONE [13:13:43.049] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:13:43.050] - seeds: [13:13:43.050] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:43.050] getGlobalsAndPackages() ... [13:13:43.050] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:43.050] Resolving globals: FALSE [13:13:43.050] Tweak future expression to call with '...' arguments ... [13:13:43.050] { [13:13:43.050] do.call(function(...) { [13:13:43.050] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:43.050] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:43.050] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:43.050] on.exit(options(oopts), add = TRUE) [13:13:43.050] } [13:13:43.050] { [13:13:43.050] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:43.050] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:43.050] ...future.FUN(...future.X_jj, ...) [13:13:43.050] }) [13:13:43.050] } [13:13:43.050] }, args = future.call.arguments) [13:13:43.050] } [13:13:43.051] Tweak future expression to call with '...' arguments ... DONE [13:13:43.051] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:43.051] - packages: [1] 'listenv' [13:13:43.051] getGlobalsAndPackages() ... DONE [13:13:43.051] run() for 'Future' ... [13:13:43.052] - state: 'created' [13:13:43.052] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:13:43.052] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:43.052] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:43.052] - Field: 'label' [13:13:43.052] - Field: 'local' [13:13:43.053] - Field: 'owner' [13:13:43.053] - Field: 'envir' [13:13:43.053] - Field: 'packages' [13:13:43.053] - Field: 'gc' [13:13:43.053] - Field: 'conditions' [13:13:43.053] - Field: 'expr' [13:13:43.053] - Field: 'uuid' [13:13:43.053] - Field: 'seed' [13:13:43.053] - Field: 'version' [13:13:43.054] - Field: 'result' [13:13:43.054] - Field: 'asynchronous' [13:13:43.054] - Field: 'calls' [13:13:43.054] - Field: 'globals' [13:13:43.054] - Field: 'stdout' [13:13:43.054] - Field: 'earlySignal' [13:13:43.054] - Field: 'lazy' [13:13:43.055] - Field: 'state' [13:13:43.055] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:43.055] - Launch lazy future ... [13:13:43.055] Packages needed by the future expression (n = 1): 'listenv' [13:13:43.055] Packages needed by future strategies (n = 0): [13:13:43.056] { [13:13:43.056] { [13:13:43.056] { [13:13:43.056] ...future.startTime <- base::Sys.time() [13:13:43.056] { [13:13:43.056] { [13:13:43.056] { [13:13:43.056] { [13:13:43.056] base::local({ [13:13:43.056] has_future <- base::requireNamespace("future", [13:13:43.056] quietly = TRUE) [13:13:43.056] if (has_future) { [13:13:43.056] ns <- base::getNamespace("future") [13:13:43.056] version <- ns[[".package"]][["version"]] [13:13:43.056] if (is.null(version)) [13:13:43.056] version <- utils::packageVersion("future") [13:13:43.056] } [13:13:43.056] else { [13:13:43.056] version <- NULL [13:13:43.056] } [13:13:43.056] if (!has_future || version < "1.8.0") { [13:13:43.056] info <- base::c(r_version = base::gsub("R version ", [13:13:43.056] "", base::R.version$version.string), [13:13:43.056] platform = base::sprintf("%s (%s-bit)", [13:13:43.056] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:43.056] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:43.056] "release", "version")], collapse = " "), [13:13:43.056] hostname = base::Sys.info()[["nodename"]]) [13:13:43.056] info <- base::sprintf("%s: %s", base::names(info), [13:13:43.056] info) [13:13:43.056] info <- base::paste(info, collapse = "; ") [13:13:43.056] if (!has_future) { [13:13:43.056] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:43.056] info) [13:13:43.056] } [13:13:43.056] else { [13:13:43.056] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:43.056] info, version) [13:13:43.056] } [13:13:43.056] base::stop(msg) [13:13:43.056] } [13:13:43.056] }) [13:13:43.056] } [13:13:43.056] base::local({ [13:13:43.056] for (pkg in "listenv") { [13:13:43.056] base::loadNamespace(pkg) [13:13:43.056] base::library(pkg, character.only = TRUE) [13:13:43.056] } [13:13:43.056] }) [13:13:43.056] } [13:13:43.056] options(future.plan = NULL) [13:13:43.056] Sys.unsetenv("R_FUTURE_PLAN") [13:13:43.056] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:43.056] } [13:13:43.056] ...future.workdir <- getwd() [13:13:43.056] } [13:13:43.056] ...future.oldOptions <- base::as.list(base::.Options) [13:13:43.056] ...future.oldEnvVars <- base::Sys.getenv() [13:13:43.056] } [13:13:43.056] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:43.056] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:13:43.056] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:43.056] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:43.056] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:43.056] future.stdout.windows.reencode = NULL, width = 80L) [13:13:43.056] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:43.056] base::names(...future.oldOptions)) [13:13:43.056] } [13:13:43.056] if (FALSE) { [13:13:43.056] } [13:13:43.056] else { [13:13:43.056] if (TRUE) { [13:13:43.056] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:43.056] open = "w") [13:13:43.056] } [13:13:43.056] else { [13:13:43.056] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:43.056] windows = "NUL", "/dev/null"), open = "w") [13:13:43.056] } [13:13:43.056] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:43.056] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:43.056] base::sink(type = "output", split = FALSE) [13:13:43.056] base::close(...future.stdout) [13:13:43.056] }, add = TRUE) [13:13:43.056] } [13:13:43.056] ...future.frame <- base::sys.nframe() [13:13:43.056] ...future.conditions <- base::list() [13:13:43.056] ...future.rng <- base::globalenv()$.Random.seed [13:13:43.056] if (FALSE) { [13:13:43.056] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:43.056] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:43.056] } [13:13:43.056] ...future.result <- base::tryCatch({ [13:13:43.056] base::withCallingHandlers({ [13:13:43.056] ...future.value <- base::withVisible(base::local({ [13:13:43.056] do.call(function(...) { [13:13:43.056] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:43.056] if (!identical(...future.globals.maxSize.org, [13:13:43.056] ...future.globals.maxSize)) { [13:13:43.056] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:43.056] on.exit(options(oopts), add = TRUE) [13:13:43.056] } [13:13:43.056] { [13:13:43.056] lapply(seq_along(...future.elements_ii), [13:13:43.056] FUN = function(jj) { [13:13:43.056] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:43.056] ...future.FUN(...future.X_jj, ...) [13:13:43.056] }) [13:13:43.056] } [13:13:43.056] }, args = future.call.arguments) [13:13:43.056] })) [13:13:43.056] future::FutureResult(value = ...future.value$value, [13:13:43.056] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:43.056] ...future.rng), globalenv = if (FALSE) [13:13:43.056] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:43.056] ...future.globalenv.names)) [13:13:43.056] else NULL, started = ...future.startTime, version = "1.8") [13:13:43.056] }, condition = base::local({ [13:13:43.056] c <- base::c [13:13:43.056] inherits <- base::inherits [13:13:43.056] invokeRestart <- base::invokeRestart [13:13:43.056] length <- base::length [13:13:43.056] list <- base::list [13:13:43.056] seq.int <- base::seq.int [13:13:43.056] signalCondition <- base::signalCondition [13:13:43.056] sys.calls <- base::sys.calls [13:13:43.056] `[[` <- base::`[[` [13:13:43.056] `+` <- base::`+` [13:13:43.056] `<<-` <- base::`<<-` [13:13:43.056] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:43.056] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:43.056] 3L)] [13:13:43.056] } [13:13:43.056] function(cond) { [13:13:43.056] is_error <- inherits(cond, "error") [13:13:43.056] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:43.056] NULL) [13:13:43.056] if (is_error) { [13:13:43.056] sessionInformation <- function() { [13:13:43.056] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:43.056] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:43.056] search = base::search(), system = base::Sys.info()) [13:13:43.056] } [13:13:43.056] ...future.conditions[[length(...future.conditions) + [13:13:43.056] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:43.056] cond$call), session = sessionInformation(), [13:13:43.056] timestamp = base::Sys.time(), signaled = 0L) [13:13:43.056] signalCondition(cond) [13:13:43.056] } [13:13:43.056] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:43.056] "immediateCondition"))) { [13:13:43.056] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:43.056] ...future.conditions[[length(...future.conditions) + [13:13:43.056] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:43.056] if (TRUE && !signal) { [13:13:43.056] muffleCondition <- function (cond, pattern = "^muffle") [13:13:43.056] { [13:13:43.056] inherits <- base::inherits [13:13:43.056] invokeRestart <- base::invokeRestart [13:13:43.056] is.null <- base::is.null [13:13:43.056] muffled <- FALSE [13:13:43.056] if (inherits(cond, "message")) { [13:13:43.056] muffled <- grepl(pattern, "muffleMessage") [13:13:43.056] if (muffled) [13:13:43.056] invokeRestart("muffleMessage") [13:13:43.056] } [13:13:43.056] else if (inherits(cond, "warning")) { [13:13:43.056] muffled <- grepl(pattern, "muffleWarning") [13:13:43.056] if (muffled) [13:13:43.056] invokeRestart("muffleWarning") [13:13:43.056] } [13:13:43.056] else if (inherits(cond, "condition")) { [13:13:43.056] if (!is.null(pattern)) { [13:13:43.056] computeRestarts <- base::computeRestarts [13:13:43.056] grepl <- base::grepl [13:13:43.056] restarts <- computeRestarts(cond) [13:13:43.056] for (restart in restarts) { [13:13:43.056] name <- restart$name [13:13:43.056] if (is.null(name)) [13:13:43.056] next [13:13:43.056] if (!grepl(pattern, name)) [13:13:43.056] next [13:13:43.056] invokeRestart(restart) [13:13:43.056] muffled <- TRUE [13:13:43.056] break [13:13:43.056] } [13:13:43.056] } [13:13:43.056] } [13:13:43.056] invisible(muffled) [13:13:43.056] } [13:13:43.056] muffleCondition(cond, pattern = "^muffle") [13:13:43.056] } [13:13:43.056] } [13:13:43.056] else { [13:13:43.056] if (TRUE) { [13:13:43.056] muffleCondition <- function (cond, pattern = "^muffle") [13:13:43.056] { [13:13:43.056] inherits <- base::inherits [13:13:43.056] invokeRestart <- base::invokeRestart [13:13:43.056] is.null <- base::is.null [13:13:43.056] muffled <- FALSE [13:13:43.056] if (inherits(cond, "message")) { [13:13:43.056] muffled <- grepl(pattern, "muffleMessage") [13:13:43.056] if (muffled) [13:13:43.056] invokeRestart("muffleMessage") [13:13:43.056] } [13:13:43.056] else if (inherits(cond, "warning")) { [13:13:43.056] muffled <- grepl(pattern, "muffleWarning") [13:13:43.056] if (muffled) [13:13:43.056] invokeRestart("muffleWarning") [13:13:43.056] } [13:13:43.056] else if (inherits(cond, "condition")) { [13:13:43.056] if (!is.null(pattern)) { [13:13:43.056] computeRestarts <- base::computeRestarts [13:13:43.056] grepl <- base::grepl [13:13:43.056] restarts <- computeRestarts(cond) [13:13:43.056] for (restart in restarts) { [13:13:43.056] name <- restart$name [13:13:43.056] if (is.null(name)) [13:13:43.056] next [13:13:43.056] if (!grepl(pattern, name)) [13:13:43.056] next [13:13:43.056] invokeRestart(restart) [13:13:43.056] muffled <- TRUE [13:13:43.056] break [13:13:43.056] } [13:13:43.056] } [13:13:43.056] } [13:13:43.056] invisible(muffled) [13:13:43.056] } [13:13:43.056] muffleCondition(cond, pattern = "^muffle") [13:13:43.056] } [13:13:43.056] } [13:13:43.056] } [13:13:43.056] })) [13:13:43.056] }, error = function(ex) { [13:13:43.056] base::structure(base::list(value = NULL, visible = NULL, [13:13:43.056] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:43.056] ...future.rng), started = ...future.startTime, [13:13:43.056] finished = Sys.time(), session_uuid = NA_character_, [13:13:43.056] version = "1.8"), class = "FutureResult") [13:13:43.056] }, finally = { [13:13:43.056] if (!identical(...future.workdir, getwd())) [13:13:43.056] setwd(...future.workdir) [13:13:43.056] { [13:13:43.056] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:43.056] ...future.oldOptions$nwarnings <- NULL [13:13:43.056] } [13:13:43.056] base::options(...future.oldOptions) [13:13:43.056] if (.Platform$OS.type == "windows") { [13:13:43.056] old_names <- names(...future.oldEnvVars) [13:13:43.056] envs <- base::Sys.getenv() [13:13:43.056] names <- names(envs) [13:13:43.056] common <- intersect(names, old_names) [13:13:43.056] added <- setdiff(names, old_names) [13:13:43.056] removed <- setdiff(old_names, names) [13:13:43.056] changed <- common[...future.oldEnvVars[common] != [13:13:43.056] envs[common]] [13:13:43.056] NAMES <- toupper(changed) [13:13:43.056] args <- list() [13:13:43.056] for (kk in seq_along(NAMES)) { [13:13:43.056] name <- changed[[kk]] [13:13:43.056] NAME <- NAMES[[kk]] [13:13:43.056] if (name != NAME && is.element(NAME, old_names)) [13:13:43.056] next [13:13:43.056] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:43.056] } [13:13:43.056] NAMES <- toupper(added) [13:13:43.056] for (kk in seq_along(NAMES)) { [13:13:43.056] name <- added[[kk]] [13:13:43.056] NAME <- NAMES[[kk]] [13:13:43.056] if (name != NAME && is.element(NAME, old_names)) [13:13:43.056] next [13:13:43.056] args[[name]] <- "" [13:13:43.056] } [13:13:43.056] NAMES <- toupper(removed) [13:13:43.056] for (kk in seq_along(NAMES)) { [13:13:43.056] name <- removed[[kk]] [13:13:43.056] NAME <- NAMES[[kk]] [13:13:43.056] if (name != NAME && is.element(NAME, old_names)) [13:13:43.056] next [13:13:43.056] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:43.056] } [13:13:43.056] if (length(args) > 0) [13:13:43.056] base::do.call(base::Sys.setenv, args = args) [13:13:43.056] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:43.056] } [13:13:43.056] else { [13:13:43.056] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:43.056] } [13:13:43.056] { [13:13:43.056] if (base::length(...future.futureOptionsAdded) > [13:13:43.056] 0L) { [13:13:43.056] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:43.056] base::names(opts) <- ...future.futureOptionsAdded [13:13:43.056] base::options(opts) [13:13:43.056] } [13:13:43.056] { [13:13:43.056] { [13:13:43.056] NULL [13:13:43.056] RNGkind("Mersenne-Twister") [13:13:43.056] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:43.056] inherits = FALSE) [13:13:43.056] } [13:13:43.056] options(future.plan = NULL) [13:13:43.056] if (is.na(NA_character_)) [13:13:43.056] Sys.unsetenv("R_FUTURE_PLAN") [13:13:43.056] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:43.056] future::plan(list(function (..., envir = parent.frame()) [13:13:43.056] { [13:13:43.056] future <- SequentialFuture(..., envir = envir) [13:13:43.056] if (!future$lazy) [13:13:43.056] future <- run(future) [13:13:43.056] invisible(future) [13:13:43.056] }), .cleanup = FALSE, .init = FALSE) [13:13:43.056] } [13:13:43.056] } [13:13:43.056] } [13:13:43.056] }) [13:13:43.056] if (TRUE) { [13:13:43.056] base::sink(type = "output", split = FALSE) [13:13:43.056] if (TRUE) { [13:13:43.056] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:43.056] } [13:13:43.056] else { [13:13:43.056] ...future.result["stdout"] <- base::list(NULL) [13:13:43.056] } [13:13:43.056] base::close(...future.stdout) [13:13:43.056] ...future.stdout <- NULL [13:13:43.056] } [13:13:43.056] ...future.result$conditions <- ...future.conditions [13:13:43.056] ...future.result$finished <- base::Sys.time() [13:13:43.056] ...future.result [13:13:43.056] } [13:13:43.058] assign_globals() ... [13:13:43.058] List of 5 [13:13:43.058] $ ...future.FUN :function (x, ...) [13:13:43.058] $ future.call.arguments : list() [13:13:43.058] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:43.058] $ ...future.elements_ii :List of 1 [13:13:43.058] ..$ b:Classes 'listenv', 'environment' [13:13:43.058] $ ...future.seeds_ii : NULL [13:13:43.058] $ ...future.globals.maxSize: NULL [13:13:43.058] - attr(*, "where")=List of 5 [13:13:43.058] ..$ ...future.FUN : [13:13:43.058] ..$ future.call.arguments : [13:13:43.058] ..$ ...future.elements_ii : [13:13:43.058] ..$ ...future.seeds_ii : [13:13:43.058] ..$ ...future.globals.maxSize: [13:13:43.058] - attr(*, "resolved")= logi FALSE [13:13:43.058] - attr(*, "total_size")= num 4968 [13:13:43.058] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:43.058] - attr(*, "already-done")= logi TRUE [13:13:43.062] - copied '...future.FUN' to environment [13:13:43.062] - copied 'future.call.arguments' to environment [13:13:43.063] - copied '...future.elements_ii' to environment [13:13:43.063] - copied '...future.seeds_ii' to environment [13:13:43.063] - copied '...future.globals.maxSize' to environment [13:13:43.063] assign_globals() ... done [13:13:43.063] plan(): Setting new future strategy stack: [13:13:43.063] List of future strategies: [13:13:43.063] 1. sequential: [13:13:43.063] - args: function (..., envir = parent.frame(), workers = "") [13:13:43.063] - tweaked: FALSE [13:13:43.063] - call: NULL [13:13:43.064] plan(): nbrOfWorkers() = 1 [13:13:43.065] plan(): Setting new future strategy stack: [13:13:43.065] List of future strategies: [13:13:43.065] 1. sequential: [13:13:43.065] - args: function (..., envir = parent.frame(), workers = "") [13:13:43.065] - tweaked: FALSE [13:13:43.065] - call: plan(strategy) [13:13:43.065] plan(): nbrOfWorkers() = 1 [13:13:43.065] SequentialFuture started (and completed) [13:13:43.066] - Launch lazy future ... done [13:13:43.066] run() for 'SequentialFuture' ... done [13:13:43.066] Created future: [13:13:43.066] SequentialFuture: [13:13:43.066] Label: 'future_lapply-2' [13:13:43.066] Expression: [13:13:43.066] { [13:13:43.066] do.call(function(...) { [13:13:43.066] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:43.066] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:43.066] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:43.066] on.exit(options(oopts), add = TRUE) [13:13:43.066] } [13:13:43.066] { [13:13:43.066] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:43.066] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:43.066] ...future.FUN(...future.X_jj, ...) [13:13:43.066] }) [13:13:43.066] } [13:13:43.066] }, args = future.call.arguments) [13:13:43.066] } [13:13:43.066] Lazy evaluation: FALSE [13:13:43.066] Asynchronous evaluation: FALSE [13:13:43.066] Local evaluation: TRUE [13:13:43.066] Environment: R_GlobalEnv [13:13:43.066] Capture standard output: TRUE [13:13:43.066] Capture condition classes: 'condition' (excluding 'nothing') [13:13:43.066] 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) [13:13:43.066] Packages: 1 packages ('listenv') [13:13:43.066] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:43.066] Resolved: TRUE [13:13:43.066] Value: 464 bytes of class 'list' [13:13:43.066] Early signaling: FALSE [13:13:43.066] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:43.066] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:43.067] Chunk #2 of 2 ... DONE [13:13:43.067] Launching 2 futures (chunks) ... DONE [13:13:43.067] Resolving 2 futures (chunks) ... [13:13:43.067] resolve() on list ... [13:13:43.067] recursive: 0 [13:13:43.067] length: 2 [13:13:43.068] [13:13:43.068] resolved() for 'SequentialFuture' ... [13:13:43.068] - state: 'finished' [13:13:43.068] - run: TRUE [13:13:43.068] - result: 'FutureResult' [13:13:43.068] resolved() for 'SequentialFuture' ... done [13:13:43.068] Future #1 [13:13:43.068] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:43.069] - nx: 2 [13:13:43.069] - relay: TRUE [13:13:43.069] - stdout: TRUE [13:13:43.069] - signal: TRUE [13:13:43.069] - resignal: FALSE [13:13:43.069] - force: TRUE [13:13:43.069] - relayed: [n=2] FALSE, FALSE [13:13:43.069] - queued futures: [n=2] FALSE, FALSE [13:13:43.069] - until=1 [13:13:43.070] - relaying element #1 [13:13:43.070] - relayed: [n=2] TRUE, FALSE [13:13:43.070] - queued futures: [n=2] TRUE, FALSE [13:13:43.070] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:43.070] length: 1 (resolved future 1) [13:13:43.070] resolved() for 'SequentialFuture' ... [13:13:43.070] - state: 'finished' [13:13:43.071] - run: TRUE [13:13:43.071] - result: 'FutureResult' [13:13:43.071] resolved() for 'SequentialFuture' ... done [13:13:43.071] Future #2 [13:13:43.071] signalConditionsASAP(SequentialFuture, pos=2) ... [13:13:43.071] - nx: 2 [13:13:43.071] - relay: TRUE [13:13:43.071] - stdout: TRUE [13:13:43.071] - signal: TRUE [13:13:43.072] - resignal: FALSE [13:13:43.072] - force: TRUE [13:13:43.072] - relayed: [n=2] TRUE, FALSE [13:13:43.072] - queued futures: [n=2] TRUE, FALSE [13:13:43.072] - until=2 [13:13:43.072] - relaying element #2 [13:13:43.072] - relayed: [n=2] TRUE, TRUE [13:13:43.072] - queued futures: [n=2] TRUE, TRUE [13:13:43.073] signalConditionsASAP(SequentialFuture, pos=2) ... done [13:13:43.073] length: 0 (resolved future 2) [13:13:43.073] Relaying remaining futures [13:13:43.073] signalConditionsASAP(NULL, pos=0) ... [13:13:43.073] - nx: 2 [13:13:43.073] - relay: TRUE [13:13:43.073] - stdout: TRUE [13:13:43.073] - signal: TRUE [13:13:43.073] - resignal: FALSE [13:13:43.074] - force: TRUE [13:13:43.074] - relayed: [n=2] TRUE, TRUE [13:13:43.074] - queued futures: [n=2] TRUE, TRUE - flush all [13:13:43.074] - relayed: [n=2] TRUE, TRUE [13:13:43.074] - queued futures: [n=2] TRUE, TRUE [13:13:43.074] signalConditionsASAP(NULL, pos=0) ... done [13:13:43.074] resolve() on list ... DONE [13:13:43.074] - Number of value chunks collected: 2 [13:13:43.075] Resolving 2 futures (chunks) ... DONE [13:13:43.075] Reducing values from 2 chunks ... [13:13:43.075] - Number of values collected after concatenation: 2 [13:13:43.075] - Number of values expected: 2 [13:13:43.075] Reducing values from 2 chunks ... DONE [13:13:43.075] 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, ...) ... [13:13:43.077] future_lapply() ... [13:13:43.077] Number of chunks: 1 [13:13:43.077] getGlobalsAndPackagesXApply() ... [13:13:43.077] - future.globals: TRUE [13:13:43.077] getGlobalsAndPackages() ... [13:13:43.078] Searching for globals... [13:13:43.079] - globals found: [2] 'FUN', '.Internal' [13:13:43.079] Searching for globals ... DONE [13:13:43.079] Resolving globals: FALSE [13:13:43.079] The total size of the 1 globals is 2.13 KiB (2184 bytes) [13:13:43.079] 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') [13:13:43.080] - globals: [1] 'FUN' [13:13:43.080] [13:13:43.080] getGlobalsAndPackages() ... DONE [13:13:43.080] - globals found/used: [n=1] 'FUN' [13:13:43.080] - needed namespaces: [n=0] [13:13:43.080] Finding globals ... DONE [13:13:43.080] - use_args: TRUE [13:13:43.080] - Getting '...' globals ... [13:13:43.081] resolve() on list ... [13:13:43.081] recursive: 0 [13:13:43.081] length: 1 [13:13:43.081] elements: '...' [13:13:43.081] length: 0 (resolved future 1) [13:13:43.081] resolve() on list ... DONE [13:13:43.081] - '...' content: [n=1] 'length' [13:13:43.081] List of 1 [13:13:43.081] $ ...:List of 1 [13:13:43.081] ..$ length: int 2 [13:13:43.081] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:43.081] - attr(*, "where")=List of 1 [13:13:43.081] ..$ ...: [13:13:43.081] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:43.081] - attr(*, "resolved")= logi TRUE [13:13:43.081] - attr(*, "total_size")= num NA [13:13:43.084] - Getting '...' globals ... DONE [13:13:43.084] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:43.084] List of 2 [13:13:43.084] $ ...future.FUN:function (mode = "logical", length = 0L) [13:13:43.084] $ ... :List of 1 [13:13:43.084] ..$ length: int 2 [13:13:43.084] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:43.084] - attr(*, "where")=List of 2 [13:13:43.084] ..$ ...future.FUN: [13:13:43.084] ..$ ... : [13:13:43.084] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:43.084] - attr(*, "resolved")= logi FALSE [13:13:43.084] - attr(*, "total_size")= num 2240 [13:13:43.087] Packages to be attached in all futures: [n=0] [13:13:43.087] getGlobalsAndPackagesXApply() ... DONE [13:13:43.087] Number of futures (= number of chunks): 1 [13:13:43.087] Launching 1 futures (chunks) ... [13:13:43.087] Chunk #1 of 1 ... [13:13:43.088] - Finding globals in 'X' for chunk #1 ... [13:13:43.088] getGlobalsAndPackages() ... [13:13:43.088] Searching for globals... [13:13:43.088] [13:13:43.088] Searching for globals ... DONE [13:13:43.088] - globals: [0] [13:13:43.088] getGlobalsAndPackages() ... DONE [13:13:43.088] + additional globals found: [n=0] [13:13:43.089] + additional namespaces needed: [n=0] [13:13:43.089] - Finding globals in 'X' for chunk #1 ... DONE [13:13:43.089] - seeds: [13:13:43.089] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:43.089] getGlobalsAndPackages() ... [13:13:43.089] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:43.089] Resolving globals: FALSE [13:13:43.089] Tweak future expression to call with '...' arguments ... [13:13:43.090] { [13:13:43.090] do.call(function(...) { [13:13:43.090] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:43.090] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:43.090] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:43.090] on.exit(options(oopts), add = TRUE) [13:13:43.090] } [13:13:43.090] { [13:13:43.090] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:43.090] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:43.090] ...future.FUN(...future.X_jj, ...) [13:13:43.090] }) [13:13:43.090] } [13:13:43.090] }, args = future.call.arguments) [13:13:43.090] } [13:13:43.090] Tweak future expression to call with '...' arguments ... DONE [13:13:43.090] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:43.090] [13:13:43.090] getGlobalsAndPackages() ... DONE [13:13:43.091] run() for 'Future' ... [13:13:43.091] - state: 'created' [13:13:43.091] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:13:43.091] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:43.091] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:43.091] - Field: 'label' [13:13:43.092] - Field: 'local' [13:13:43.092] - Field: 'owner' [13:13:43.092] - Field: 'envir' [13:13:43.092] - Field: 'packages' [13:13:43.092] - Field: 'gc' [13:13:43.092] - Field: 'conditions' [13:13:43.092] - Field: 'expr' [13:13:43.092] - Field: 'uuid' [13:13:43.093] - Field: 'seed' [13:13:43.093] - Field: 'version' [13:13:43.093] - Field: 'result' [13:13:43.093] - Field: 'asynchronous' [13:13:43.093] - Field: 'calls' [13:13:43.093] - Field: 'globals' [13:13:43.093] - Field: 'stdout' [13:13:43.093] - Field: 'earlySignal' [13:13:43.094] - Field: 'lazy' [13:13:43.094] - Field: 'state' [13:13:43.094] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:43.094] - Launch lazy future ... [13:13:43.094] Packages needed by the future expression (n = 0): [13:13:43.094] Packages needed by future strategies (n = 0): [13:13:43.095] { [13:13:43.095] { [13:13:43.095] { [13:13:43.095] ...future.startTime <- base::Sys.time() [13:13:43.095] { [13:13:43.095] { [13:13:43.095] { [13:13:43.095] base::local({ [13:13:43.095] has_future <- base::requireNamespace("future", [13:13:43.095] quietly = TRUE) [13:13:43.095] if (has_future) { [13:13:43.095] ns <- base::getNamespace("future") [13:13:43.095] version <- ns[[".package"]][["version"]] [13:13:43.095] if (is.null(version)) [13:13:43.095] version <- utils::packageVersion("future") [13:13:43.095] } [13:13:43.095] else { [13:13:43.095] version <- NULL [13:13:43.095] } [13:13:43.095] if (!has_future || version < "1.8.0") { [13:13:43.095] info <- base::c(r_version = base::gsub("R version ", [13:13:43.095] "", base::R.version$version.string), [13:13:43.095] platform = base::sprintf("%s (%s-bit)", [13:13:43.095] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:43.095] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:43.095] "release", "version")], collapse = " "), [13:13:43.095] hostname = base::Sys.info()[["nodename"]]) [13:13:43.095] info <- base::sprintf("%s: %s", base::names(info), [13:13:43.095] info) [13:13:43.095] info <- base::paste(info, collapse = "; ") [13:13:43.095] if (!has_future) { [13:13:43.095] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:43.095] info) [13:13:43.095] } [13:13:43.095] else { [13:13:43.095] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:43.095] info, version) [13:13:43.095] } [13:13:43.095] base::stop(msg) [13:13:43.095] } [13:13:43.095] }) [13:13:43.095] } [13:13:43.095] options(future.plan = NULL) [13:13:43.095] Sys.unsetenv("R_FUTURE_PLAN") [13:13:43.095] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:43.095] } [13:13:43.095] ...future.workdir <- getwd() [13:13:43.095] } [13:13:43.095] ...future.oldOptions <- base::as.list(base::.Options) [13:13:43.095] ...future.oldEnvVars <- base::Sys.getenv() [13:13:43.095] } [13:13:43.095] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:43.095] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:43.095] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:43.095] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:43.095] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:43.095] future.stdout.windows.reencode = NULL, width = 80L) [13:13:43.095] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:43.095] base::names(...future.oldOptions)) [13:13:43.095] } [13:13:43.095] if (FALSE) { [13:13:43.095] } [13:13:43.095] else { [13:13:43.095] if (TRUE) { [13:13:43.095] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:43.095] open = "w") [13:13:43.095] } [13:13:43.095] else { [13:13:43.095] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:43.095] windows = "NUL", "/dev/null"), open = "w") [13:13:43.095] } [13:13:43.095] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:43.095] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:43.095] base::sink(type = "output", split = FALSE) [13:13:43.095] base::close(...future.stdout) [13:13:43.095] }, add = TRUE) [13:13:43.095] } [13:13:43.095] ...future.frame <- base::sys.nframe() [13:13:43.095] ...future.conditions <- base::list() [13:13:43.095] ...future.rng <- base::globalenv()$.Random.seed [13:13:43.095] if (FALSE) { [13:13:43.095] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:43.095] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:43.095] } [13:13:43.095] ...future.result <- base::tryCatch({ [13:13:43.095] base::withCallingHandlers({ [13:13:43.095] ...future.value <- base::withVisible(base::local({ [13:13:43.095] do.call(function(...) { [13:13:43.095] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:43.095] if (!identical(...future.globals.maxSize.org, [13:13:43.095] ...future.globals.maxSize)) { [13:13:43.095] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:43.095] on.exit(options(oopts), add = TRUE) [13:13:43.095] } [13:13:43.095] { [13:13:43.095] lapply(seq_along(...future.elements_ii), [13:13:43.095] FUN = function(jj) { [13:13:43.095] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:43.095] ...future.FUN(...future.X_jj, ...) [13:13:43.095] }) [13:13:43.095] } [13:13:43.095] }, args = future.call.arguments) [13:13:43.095] })) [13:13:43.095] future::FutureResult(value = ...future.value$value, [13:13:43.095] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:43.095] ...future.rng), globalenv = if (FALSE) [13:13:43.095] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:43.095] ...future.globalenv.names)) [13:13:43.095] else NULL, started = ...future.startTime, version = "1.8") [13:13:43.095] }, condition = base::local({ [13:13:43.095] c <- base::c [13:13:43.095] inherits <- base::inherits [13:13:43.095] invokeRestart <- base::invokeRestart [13:13:43.095] length <- base::length [13:13:43.095] list <- base::list [13:13:43.095] seq.int <- base::seq.int [13:13:43.095] signalCondition <- base::signalCondition [13:13:43.095] sys.calls <- base::sys.calls [13:13:43.095] `[[` <- base::`[[` [13:13:43.095] `+` <- base::`+` [13:13:43.095] `<<-` <- base::`<<-` [13:13:43.095] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:43.095] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:43.095] 3L)] [13:13:43.095] } [13:13:43.095] function(cond) { [13:13:43.095] is_error <- inherits(cond, "error") [13:13:43.095] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:43.095] NULL) [13:13:43.095] if (is_error) { [13:13:43.095] sessionInformation <- function() { [13:13:43.095] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:43.095] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:43.095] search = base::search(), system = base::Sys.info()) [13:13:43.095] } [13:13:43.095] ...future.conditions[[length(...future.conditions) + [13:13:43.095] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:43.095] cond$call), session = sessionInformation(), [13:13:43.095] timestamp = base::Sys.time(), signaled = 0L) [13:13:43.095] signalCondition(cond) [13:13:43.095] } [13:13:43.095] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:43.095] "immediateCondition"))) { [13:13:43.095] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:43.095] ...future.conditions[[length(...future.conditions) + [13:13:43.095] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:43.095] if (TRUE && !signal) { [13:13:43.095] muffleCondition <- function (cond, pattern = "^muffle") [13:13:43.095] { [13:13:43.095] inherits <- base::inherits [13:13:43.095] invokeRestart <- base::invokeRestart [13:13:43.095] is.null <- base::is.null [13:13:43.095] muffled <- FALSE [13:13:43.095] if (inherits(cond, "message")) { [13:13:43.095] muffled <- grepl(pattern, "muffleMessage") [13:13:43.095] if (muffled) [13:13:43.095] invokeRestart("muffleMessage") [13:13:43.095] } [13:13:43.095] else if (inherits(cond, "warning")) { [13:13:43.095] muffled <- grepl(pattern, "muffleWarning") [13:13:43.095] if (muffled) [13:13:43.095] invokeRestart("muffleWarning") [13:13:43.095] } [13:13:43.095] else if (inherits(cond, "condition")) { [13:13:43.095] if (!is.null(pattern)) { [13:13:43.095] computeRestarts <- base::computeRestarts [13:13:43.095] grepl <- base::grepl [13:13:43.095] restarts <- computeRestarts(cond) [13:13:43.095] for (restart in restarts) { [13:13:43.095] name <- restart$name [13:13:43.095] if (is.null(name)) [13:13:43.095] next [13:13:43.095] if (!grepl(pattern, name)) [13:13:43.095] next [13:13:43.095] invokeRestart(restart) [13:13:43.095] muffled <- TRUE [13:13:43.095] break [13:13:43.095] } [13:13:43.095] } [13:13:43.095] } [13:13:43.095] invisible(muffled) [13:13:43.095] } [13:13:43.095] muffleCondition(cond, pattern = "^muffle") [13:13:43.095] } [13:13:43.095] } [13:13:43.095] else { [13:13:43.095] if (TRUE) { [13:13:43.095] muffleCondition <- function (cond, pattern = "^muffle") [13:13:43.095] { [13:13:43.095] inherits <- base::inherits [13:13:43.095] invokeRestart <- base::invokeRestart [13:13:43.095] is.null <- base::is.null [13:13:43.095] muffled <- FALSE [13:13:43.095] if (inherits(cond, "message")) { [13:13:43.095] muffled <- grepl(pattern, "muffleMessage") [13:13:43.095] if (muffled) [13:13:43.095] invokeRestart("muffleMessage") [13:13:43.095] } [13:13:43.095] else if (inherits(cond, "warning")) { [13:13:43.095] muffled <- grepl(pattern, "muffleWarning") [13:13:43.095] if (muffled) [13:13:43.095] invokeRestart("muffleWarning") [13:13:43.095] } [13:13:43.095] else if (inherits(cond, "condition")) { [13:13:43.095] if (!is.null(pattern)) { [13:13:43.095] computeRestarts <- base::computeRestarts [13:13:43.095] grepl <- base::grepl [13:13:43.095] restarts <- computeRestarts(cond) [13:13:43.095] for (restart in restarts) { [13:13:43.095] name <- restart$name [13:13:43.095] if (is.null(name)) [13:13:43.095] next [13:13:43.095] if (!grepl(pattern, name)) [13:13:43.095] next [13:13:43.095] invokeRestart(restart) [13:13:43.095] muffled <- TRUE [13:13:43.095] break [13:13:43.095] } [13:13:43.095] } [13:13:43.095] } [13:13:43.095] invisible(muffled) [13:13:43.095] } [13:13:43.095] muffleCondition(cond, pattern = "^muffle") [13:13:43.095] } [13:13:43.095] } [13:13:43.095] } [13:13:43.095] })) [13:13:43.095] }, error = function(ex) { [13:13:43.095] base::structure(base::list(value = NULL, visible = NULL, [13:13:43.095] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:43.095] ...future.rng), started = ...future.startTime, [13:13:43.095] finished = Sys.time(), session_uuid = NA_character_, [13:13:43.095] version = "1.8"), class = "FutureResult") [13:13:43.095] }, finally = { [13:13:43.095] if (!identical(...future.workdir, getwd())) [13:13:43.095] setwd(...future.workdir) [13:13:43.095] { [13:13:43.095] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:43.095] ...future.oldOptions$nwarnings <- NULL [13:13:43.095] } [13:13:43.095] base::options(...future.oldOptions) [13:13:43.095] if (.Platform$OS.type == "windows") { [13:13:43.095] old_names <- names(...future.oldEnvVars) [13:13:43.095] envs <- base::Sys.getenv() [13:13:43.095] names <- names(envs) [13:13:43.095] common <- intersect(names, old_names) [13:13:43.095] added <- setdiff(names, old_names) [13:13:43.095] removed <- setdiff(old_names, names) [13:13:43.095] changed <- common[...future.oldEnvVars[common] != [13:13:43.095] envs[common]] [13:13:43.095] NAMES <- toupper(changed) [13:13:43.095] args <- list() [13:13:43.095] for (kk in seq_along(NAMES)) { [13:13:43.095] name <- changed[[kk]] [13:13:43.095] NAME <- NAMES[[kk]] [13:13:43.095] if (name != NAME && is.element(NAME, old_names)) [13:13:43.095] next [13:13:43.095] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:43.095] } [13:13:43.095] NAMES <- toupper(added) [13:13:43.095] for (kk in seq_along(NAMES)) { [13:13:43.095] name <- added[[kk]] [13:13:43.095] NAME <- NAMES[[kk]] [13:13:43.095] if (name != NAME && is.element(NAME, old_names)) [13:13:43.095] next [13:13:43.095] args[[name]] <- "" [13:13:43.095] } [13:13:43.095] NAMES <- toupper(removed) [13:13:43.095] for (kk in seq_along(NAMES)) { [13:13:43.095] name <- removed[[kk]] [13:13:43.095] NAME <- NAMES[[kk]] [13:13:43.095] if (name != NAME && is.element(NAME, old_names)) [13:13:43.095] next [13:13:43.095] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:43.095] } [13:13:43.095] if (length(args) > 0) [13:13:43.095] base::do.call(base::Sys.setenv, args = args) [13:13:43.095] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:43.095] } [13:13:43.095] else { [13:13:43.095] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:43.095] } [13:13:43.095] { [13:13:43.095] if (base::length(...future.futureOptionsAdded) > [13:13:43.095] 0L) { [13:13:43.095] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:43.095] base::names(opts) <- ...future.futureOptionsAdded [13:13:43.095] base::options(opts) [13:13:43.095] } [13:13:43.095] { [13:13:43.095] { [13:13:43.095] NULL [13:13:43.095] RNGkind("Mersenne-Twister") [13:13:43.095] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:43.095] inherits = FALSE) [13:13:43.095] } [13:13:43.095] options(future.plan = NULL) [13:13:43.095] if (is.na(NA_character_)) [13:13:43.095] Sys.unsetenv("R_FUTURE_PLAN") [13:13:43.095] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:43.095] future::plan(list(function (..., envir = parent.frame()) [13:13:43.095] { [13:13:43.095] future <- SequentialFuture(..., envir = envir) [13:13:43.095] if (!future$lazy) [13:13:43.095] future <- run(future) [13:13:43.095] invisible(future) [13:13:43.095] }), .cleanup = FALSE, .init = FALSE) [13:13:43.095] } [13:13:43.095] } [13:13:43.095] } [13:13:43.095] }) [13:13:43.095] if (TRUE) { [13:13:43.095] base::sink(type = "output", split = FALSE) [13:13:43.095] if (TRUE) { [13:13:43.095] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:43.095] } [13:13:43.095] else { [13:13:43.095] ...future.result["stdout"] <- base::list(NULL) [13:13:43.095] } [13:13:43.095] base::close(...future.stdout) [13:13:43.095] ...future.stdout <- NULL [13:13:43.095] } [13:13:43.095] ...future.result$conditions <- ...future.conditions [13:13:43.095] ...future.result$finished <- base::Sys.time() [13:13:43.095] ...future.result [13:13:43.095] } [13:13:43.097] assign_globals() ... [13:13:43.097] List of 5 [13:13:43.097] $ ...future.FUN :function (mode = "logical", length = 0L) [13:13:43.097] $ future.call.arguments :List of 1 [13:13:43.097] ..$ length: int 2 [13:13:43.097] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:43.097] $ ...future.elements_ii :List of 4 [13:13:43.097] ..$ a: chr "integer" [13:13:43.097] ..$ b: chr "numeric" [13:13:43.097] ..$ c: chr "character" [13:13:43.097] ..$ c: chr "list" [13:13:43.097] $ ...future.seeds_ii : NULL [13:13:43.097] $ ...future.globals.maxSize: NULL [13:13:43.097] - attr(*, "where")=List of 5 [13:13:43.097] ..$ ...future.FUN : [13:13:43.097] ..$ future.call.arguments : [13:13:43.097] ..$ ...future.elements_ii : [13:13:43.097] ..$ ...future.seeds_ii : [13:13:43.097] ..$ ...future.globals.maxSize: [13:13:43.097] - attr(*, "resolved")= logi FALSE [13:13:43.097] - attr(*, "total_size")= num 2240 [13:13:43.097] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:43.097] - attr(*, "already-done")= logi TRUE [13:13:43.102] - copied '...future.FUN' to environment [13:13:43.102] - copied 'future.call.arguments' to environment [13:13:43.103] - copied '...future.elements_ii' to environment [13:13:43.103] - copied '...future.seeds_ii' to environment [13:13:43.103] - copied '...future.globals.maxSize' to environment [13:13:43.103] assign_globals() ... done [13:13:43.103] plan(): Setting new future strategy stack: [13:13:43.103] List of future strategies: [13:13:43.103] 1. sequential: [13:13:43.103] - args: function (..., envir = parent.frame(), workers = "") [13:13:43.103] - tweaked: FALSE [13:13:43.103] - call: NULL [13:13:43.104] plan(): nbrOfWorkers() = 1 [13:13:43.105] plan(): Setting new future strategy stack: [13:13:43.105] List of future strategies: [13:13:43.105] 1. sequential: [13:13:43.105] - args: function (..., envir = parent.frame(), workers = "") [13:13:43.105] - tweaked: FALSE [13:13:43.105] - call: plan(strategy) [13:13:43.105] plan(): nbrOfWorkers() = 1 [13:13:43.105] SequentialFuture started (and completed) [13:13:43.105] - Launch lazy future ... done [13:13:43.105] run() for 'SequentialFuture' ... done [13:13:43.106] Created future: [13:13:43.106] SequentialFuture: [13:13:43.106] Label: 'future_lapply-1' [13:13:43.106] Expression: [13:13:43.106] { [13:13:43.106] do.call(function(...) { [13:13:43.106] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:43.106] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:43.106] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:43.106] on.exit(options(oopts), add = TRUE) [13:13:43.106] } [13:13:43.106] { [13:13:43.106] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:43.106] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:43.106] ...future.FUN(...future.X_jj, ...) [13:13:43.106] }) [13:13:43.106] } [13:13:43.106] }, args = future.call.arguments) [13:13:43.106] } [13:13:43.106] Lazy evaluation: FALSE [13:13:43.106] Asynchronous evaluation: FALSE [13:13:43.106] Local evaluation: TRUE [13:13:43.106] Environment: R_GlobalEnv [13:13:43.106] Capture standard output: TRUE [13:13:43.106] Capture condition classes: 'condition' (excluding 'nothing') [13:13:43.106] 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) [13:13:43.106] Packages: [13:13:43.106] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:43.106] Resolved: TRUE [13:13:43.106] Value: 240 bytes of class 'list' [13:13:43.106] Early signaling: FALSE [13:13:43.106] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:43.106] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:43.107] Chunk #1 of 1 ... DONE [13:13:43.107] Launching 1 futures (chunks) ... DONE [13:13:43.107] Resolving 1 futures (chunks) ... [13:13:43.107] resolve() on list ... [13:13:43.107] recursive: 0 [13:13:43.107] length: 1 [13:13:43.107] [13:13:43.107] resolved() for 'SequentialFuture' ... [13:13:43.108] - state: 'finished' [13:13:43.108] - run: TRUE [13:13:43.108] - result: 'FutureResult' [13:13:43.108] resolved() for 'SequentialFuture' ... done [13:13:43.108] Future #1 [13:13:43.108] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:43.108] - nx: 1 [13:13:43.109] - relay: TRUE [13:13:43.109] - stdout: TRUE [13:13:43.109] - signal: TRUE [13:13:43.109] - resignal: FALSE [13:13:43.109] - force: TRUE [13:13:43.109] - relayed: [n=1] FALSE [13:13:43.109] - queued futures: [n=1] FALSE [13:13:43.109] - until=1 [13:13:43.109] - relaying element #1 [13:13:43.110] - relayed: [n=1] TRUE [13:13:43.110] - queued futures: [n=1] TRUE [13:13:43.110] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:43.110] length: 0 (resolved future 1) [13:13:43.110] Relaying remaining futures [13:13:43.110] signalConditionsASAP(NULL, pos=0) ... [13:13:43.110] - nx: 1 [13:13:43.110] - relay: TRUE [13:13:43.110] - stdout: TRUE [13:13:43.111] - signal: TRUE [13:13:43.111] - resignal: FALSE [13:13:43.111] - force: TRUE [13:13:43.111] - relayed: [n=1] TRUE [13:13:43.111] - queued futures: [n=1] TRUE - flush all [13:13:43.111] - relayed: [n=1] TRUE [13:13:43.111] - queued futures: [n=1] TRUE [13:13:43.111] signalConditionsASAP(NULL, pos=0) ... done [13:13:43.112] resolve() on list ... DONE [13:13:43.112] - Number of value chunks collected: 1 [13:13:43.112] Resolving 1 futures (chunks) ... DONE [13:13:43.112] Reducing values from 1 chunks ... [13:13:43.112] - Number of values collected after concatenation: 4 [13:13:43.112] - Number of values expected: 4 [13:13:43.112] Reducing values from 1 chunks ... DONE [13:13:43.112] 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 [13:13:43.114] future_lapply() ... [13:13:43.115] Number of chunks: 1 [13:13:43.115] getGlobalsAndPackagesXApply() ... [13:13:43.115] - future.globals: TRUE [13:13:43.115] getGlobalsAndPackages() ... [13:13:43.115] Searching for globals... [13:13:43.116] - globals found: [2] 'FUN', '.Internal' [13:13:43.116] Searching for globals ... DONE [13:13:43.116] Resolving globals: FALSE [13:13:43.117] The total size of the 1 globals is 2.13 KiB (2184 bytes) [13:13:43.117] 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') [13:13:43.117] - globals: [1] 'FUN' [13:13:43.117] [13:13:43.117] getGlobalsAndPackages() ... DONE [13:13:43.118] - globals found/used: [n=1] 'FUN' [13:13:43.118] - needed namespaces: [n=0] [13:13:43.118] Finding globals ... DONE [13:13:43.118] - use_args: TRUE [13:13:43.118] - Getting '...' globals ... [13:13:43.118] resolve() on list ... [13:13:43.118] recursive: 0 [13:13:43.119] length: 1 [13:13:43.119] elements: '...' [13:13:43.119] length: 0 (resolved future 1) [13:13:43.119] resolve() on list ... DONE [13:13:43.119] - '...' content: [n=1] 'length' [13:13:43.119] List of 1 [13:13:43.119] $ ...:List of 1 [13:13:43.119] ..$ length: int 2 [13:13:43.119] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:43.119] - attr(*, "where")=List of 1 [13:13:43.119] ..$ ...: [13:13:43.119] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:43.119] - attr(*, "resolved")= logi TRUE [13:13:43.119] - attr(*, "total_size")= num NA [13:13:43.123] - Getting '...' globals ... DONE [13:13:43.123] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:43.123] List of 2 [13:13:43.123] $ ...future.FUN:function (mode = "logical", length = 0L) [13:13:43.123] $ ... :List of 1 [13:13:43.123] ..$ length: int 2 [13:13:43.123] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:43.123] - attr(*, "where")=List of 2 [13:13:43.123] ..$ ...future.FUN: [13:13:43.123] ..$ ... : [13:13:43.123] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:43.123] - attr(*, "resolved")= logi FALSE [13:13:43.123] - attr(*, "total_size")= num 2240 [13:13:43.126] Packages to be attached in all futures: [n=0] [13:13:43.126] getGlobalsAndPackagesXApply() ... DONE [13:13:43.126] Number of futures (= number of chunks): 1 [13:13:43.127] Launching 1 futures (chunks) ... [13:13:43.127] Chunk #1 of 1 ... [13:13:43.127] - Finding globals in 'X' for chunk #1 ... [13:13:43.127] getGlobalsAndPackages() ... [13:13:43.127] Searching for globals... [13:13:43.127] [13:13:43.127] Searching for globals ... DONE [13:13:43.127] - globals: [0] [13:13:43.128] getGlobalsAndPackages() ... DONE [13:13:43.128] + additional globals found: [n=0] [13:13:43.128] + additional namespaces needed: [n=0] [13:13:43.128] - Finding globals in 'X' for chunk #1 ... DONE [13:13:43.128] - seeds: [13:13:43.128] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:43.128] getGlobalsAndPackages() ... [13:13:43.128] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:43.128] Resolving globals: FALSE [13:13:43.129] Tweak future expression to call with '...' arguments ... [13:13:43.129] { [13:13:43.129] do.call(function(...) { [13:13:43.129] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:43.129] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:43.129] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:43.129] on.exit(options(oopts), add = TRUE) [13:13:43.129] } [13:13:43.129] { [13:13:43.129] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:43.129] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:43.129] ...future.FUN(...future.X_jj, ...) [13:13:43.129] }) [13:13:43.129] } [13:13:43.129] }, args = future.call.arguments) [13:13:43.129] } [13:13:43.129] Tweak future expression to call with '...' arguments ... DONE [13:13:43.129] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:43.129] [13:13:43.130] getGlobalsAndPackages() ... DONE [13:13:43.130] run() for 'Future' ... [13:13:43.130] - state: 'created' [13:13:43.130] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:13:43.130] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:43.130] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:43.131] - Field: 'label' [13:13:43.131] - Field: 'local' [13:13:43.131] - Field: 'owner' [13:13:43.131] - Field: 'envir' [13:13:43.131] - Field: 'packages' [13:13:43.131] - Field: 'gc' [13:13:43.131] - Field: 'conditions' [13:13:43.131] - Field: 'expr' [13:13:43.132] - Field: 'uuid' [13:13:43.132] - Field: 'seed' [13:13:43.132] - Field: 'version' [13:13:43.132] - Field: 'result' [13:13:43.132] - Field: 'asynchronous' [13:13:43.132] - Field: 'calls' [13:13:43.132] - Field: 'globals' [13:13:43.133] - Field: 'stdout' [13:13:43.133] - Field: 'earlySignal' [13:13:43.133] - Field: 'lazy' [13:13:43.133] - Field: 'state' [13:13:43.133] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:43.133] - Launch lazy future ... [13:13:43.133] Packages needed by the future expression (n = 0): [13:13:43.134] Packages needed by future strategies (n = 0): [13:13:43.134] { [13:13:43.134] { [13:13:43.134] { [13:13:43.134] ...future.startTime <- base::Sys.time() [13:13:43.134] { [13:13:43.134] { [13:13:43.134] { [13:13:43.134] base::local({ [13:13:43.134] has_future <- base::requireNamespace("future", [13:13:43.134] quietly = TRUE) [13:13:43.134] if (has_future) { [13:13:43.134] ns <- base::getNamespace("future") [13:13:43.134] version <- ns[[".package"]][["version"]] [13:13:43.134] if (is.null(version)) [13:13:43.134] version <- utils::packageVersion("future") [13:13:43.134] } [13:13:43.134] else { [13:13:43.134] version <- NULL [13:13:43.134] } [13:13:43.134] if (!has_future || version < "1.8.0") { [13:13:43.134] info <- base::c(r_version = base::gsub("R version ", [13:13:43.134] "", base::R.version$version.string), [13:13:43.134] platform = base::sprintf("%s (%s-bit)", [13:13:43.134] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:43.134] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:43.134] "release", "version")], collapse = " "), [13:13:43.134] hostname = base::Sys.info()[["nodename"]]) [13:13:43.134] info <- base::sprintf("%s: %s", base::names(info), [13:13:43.134] info) [13:13:43.134] info <- base::paste(info, collapse = "; ") [13:13:43.134] if (!has_future) { [13:13:43.134] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:43.134] info) [13:13:43.134] } [13:13:43.134] else { [13:13:43.134] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:43.134] info, version) [13:13:43.134] } [13:13:43.134] base::stop(msg) [13:13:43.134] } [13:13:43.134] }) [13:13:43.134] } [13:13:43.134] options(future.plan = NULL) [13:13:43.134] Sys.unsetenv("R_FUTURE_PLAN") [13:13:43.134] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:43.134] } [13:13:43.134] ...future.workdir <- getwd() [13:13:43.134] } [13:13:43.134] ...future.oldOptions <- base::as.list(base::.Options) [13:13:43.134] ...future.oldEnvVars <- base::Sys.getenv() [13:13:43.134] } [13:13:43.134] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:43.134] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:43.134] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:43.134] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:43.134] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:43.134] future.stdout.windows.reencode = NULL, width = 80L) [13:13:43.134] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:43.134] base::names(...future.oldOptions)) [13:13:43.134] } [13:13:43.134] if (FALSE) { [13:13:43.134] } [13:13:43.134] else { [13:13:43.134] if (TRUE) { [13:13:43.134] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:43.134] open = "w") [13:13:43.134] } [13:13:43.134] else { [13:13:43.134] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:43.134] windows = "NUL", "/dev/null"), open = "w") [13:13:43.134] } [13:13:43.134] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:43.134] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:43.134] base::sink(type = "output", split = FALSE) [13:13:43.134] base::close(...future.stdout) [13:13:43.134] }, add = TRUE) [13:13:43.134] } [13:13:43.134] ...future.frame <- base::sys.nframe() [13:13:43.134] ...future.conditions <- base::list() [13:13:43.134] ...future.rng <- base::globalenv()$.Random.seed [13:13:43.134] if (FALSE) { [13:13:43.134] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:43.134] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:43.134] } [13:13:43.134] ...future.result <- base::tryCatch({ [13:13:43.134] base::withCallingHandlers({ [13:13:43.134] ...future.value <- base::withVisible(base::local({ [13:13:43.134] do.call(function(...) { [13:13:43.134] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:43.134] if (!identical(...future.globals.maxSize.org, [13:13:43.134] ...future.globals.maxSize)) { [13:13:43.134] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:43.134] on.exit(options(oopts), add = TRUE) [13:13:43.134] } [13:13:43.134] { [13:13:43.134] lapply(seq_along(...future.elements_ii), [13:13:43.134] FUN = function(jj) { [13:13:43.134] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:43.134] ...future.FUN(...future.X_jj, ...) [13:13:43.134] }) [13:13:43.134] } [13:13:43.134] }, args = future.call.arguments) [13:13:43.134] })) [13:13:43.134] future::FutureResult(value = ...future.value$value, [13:13:43.134] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:43.134] ...future.rng), globalenv = if (FALSE) [13:13:43.134] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:43.134] ...future.globalenv.names)) [13:13:43.134] else NULL, started = ...future.startTime, version = "1.8") [13:13:43.134] }, condition = base::local({ [13:13:43.134] c <- base::c [13:13:43.134] inherits <- base::inherits [13:13:43.134] invokeRestart <- base::invokeRestart [13:13:43.134] length <- base::length [13:13:43.134] list <- base::list [13:13:43.134] seq.int <- base::seq.int [13:13:43.134] signalCondition <- base::signalCondition [13:13:43.134] sys.calls <- base::sys.calls [13:13:43.134] `[[` <- base::`[[` [13:13:43.134] `+` <- base::`+` [13:13:43.134] `<<-` <- base::`<<-` [13:13:43.134] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:43.134] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:43.134] 3L)] [13:13:43.134] } [13:13:43.134] function(cond) { [13:13:43.134] is_error <- inherits(cond, "error") [13:13:43.134] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:43.134] NULL) [13:13:43.134] if (is_error) { [13:13:43.134] sessionInformation <- function() { [13:13:43.134] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:43.134] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:43.134] search = base::search(), system = base::Sys.info()) [13:13:43.134] } [13:13:43.134] ...future.conditions[[length(...future.conditions) + [13:13:43.134] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:43.134] cond$call), session = sessionInformation(), [13:13:43.134] timestamp = base::Sys.time(), signaled = 0L) [13:13:43.134] signalCondition(cond) [13:13:43.134] } [13:13:43.134] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:43.134] "immediateCondition"))) { [13:13:43.134] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:43.134] ...future.conditions[[length(...future.conditions) + [13:13:43.134] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:43.134] if (TRUE && !signal) { [13:13:43.134] muffleCondition <- function (cond, pattern = "^muffle") [13:13:43.134] { [13:13:43.134] inherits <- base::inherits [13:13:43.134] invokeRestart <- base::invokeRestart [13:13:43.134] is.null <- base::is.null [13:13:43.134] muffled <- FALSE [13:13:43.134] if (inherits(cond, "message")) { [13:13:43.134] muffled <- grepl(pattern, "muffleMessage") [13:13:43.134] if (muffled) [13:13:43.134] invokeRestart("muffleMessage") [13:13:43.134] } [13:13:43.134] else if (inherits(cond, "warning")) { [13:13:43.134] muffled <- grepl(pattern, "muffleWarning") [13:13:43.134] if (muffled) [13:13:43.134] invokeRestart("muffleWarning") [13:13:43.134] } [13:13:43.134] else if (inherits(cond, "condition")) { [13:13:43.134] if (!is.null(pattern)) { [13:13:43.134] computeRestarts <- base::computeRestarts [13:13:43.134] grepl <- base::grepl [13:13:43.134] restarts <- computeRestarts(cond) [13:13:43.134] for (restart in restarts) { [13:13:43.134] name <- restart$name [13:13:43.134] if (is.null(name)) [13:13:43.134] next [13:13:43.134] if (!grepl(pattern, name)) [13:13:43.134] next [13:13:43.134] invokeRestart(restart) [13:13:43.134] muffled <- TRUE [13:13:43.134] break [13:13:43.134] } [13:13:43.134] } [13:13:43.134] } [13:13:43.134] invisible(muffled) [13:13:43.134] } [13:13:43.134] muffleCondition(cond, pattern = "^muffle") [13:13:43.134] } [13:13:43.134] } [13:13:43.134] else { [13:13:43.134] if (TRUE) { [13:13:43.134] muffleCondition <- function (cond, pattern = "^muffle") [13:13:43.134] { [13:13:43.134] inherits <- base::inherits [13:13:43.134] invokeRestart <- base::invokeRestart [13:13:43.134] is.null <- base::is.null [13:13:43.134] muffled <- FALSE [13:13:43.134] if (inherits(cond, "message")) { [13:13:43.134] muffled <- grepl(pattern, "muffleMessage") [13:13:43.134] if (muffled) [13:13:43.134] invokeRestart("muffleMessage") [13:13:43.134] } [13:13:43.134] else if (inherits(cond, "warning")) { [13:13:43.134] muffled <- grepl(pattern, "muffleWarning") [13:13:43.134] if (muffled) [13:13:43.134] invokeRestart("muffleWarning") [13:13:43.134] } [13:13:43.134] else if (inherits(cond, "condition")) { [13:13:43.134] if (!is.null(pattern)) { [13:13:43.134] computeRestarts <- base::computeRestarts [13:13:43.134] grepl <- base::grepl [13:13:43.134] restarts <- computeRestarts(cond) [13:13:43.134] for (restart in restarts) { [13:13:43.134] name <- restart$name [13:13:43.134] if (is.null(name)) [13:13:43.134] next [13:13:43.134] if (!grepl(pattern, name)) [13:13:43.134] next [13:13:43.134] invokeRestart(restart) [13:13:43.134] muffled <- TRUE [13:13:43.134] break [13:13:43.134] } [13:13:43.134] } [13:13:43.134] } [13:13:43.134] invisible(muffled) [13:13:43.134] } [13:13:43.134] muffleCondition(cond, pattern = "^muffle") [13:13:43.134] } [13:13:43.134] } [13:13:43.134] } [13:13:43.134] })) [13:13:43.134] }, error = function(ex) { [13:13:43.134] base::structure(base::list(value = NULL, visible = NULL, [13:13:43.134] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:43.134] ...future.rng), started = ...future.startTime, [13:13:43.134] finished = Sys.time(), session_uuid = NA_character_, [13:13:43.134] version = "1.8"), class = "FutureResult") [13:13:43.134] }, finally = { [13:13:43.134] if (!identical(...future.workdir, getwd())) [13:13:43.134] setwd(...future.workdir) [13:13:43.134] { [13:13:43.134] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:43.134] ...future.oldOptions$nwarnings <- NULL [13:13:43.134] } [13:13:43.134] base::options(...future.oldOptions) [13:13:43.134] if (.Platform$OS.type == "windows") { [13:13:43.134] old_names <- names(...future.oldEnvVars) [13:13:43.134] envs <- base::Sys.getenv() [13:13:43.134] names <- names(envs) [13:13:43.134] common <- intersect(names, old_names) [13:13:43.134] added <- setdiff(names, old_names) [13:13:43.134] removed <- setdiff(old_names, names) [13:13:43.134] changed <- common[...future.oldEnvVars[common] != [13:13:43.134] envs[common]] [13:13:43.134] NAMES <- toupper(changed) [13:13:43.134] args <- list() [13:13:43.134] for (kk in seq_along(NAMES)) { [13:13:43.134] name <- changed[[kk]] [13:13:43.134] NAME <- NAMES[[kk]] [13:13:43.134] if (name != NAME && is.element(NAME, old_names)) [13:13:43.134] next [13:13:43.134] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:43.134] } [13:13:43.134] NAMES <- toupper(added) [13:13:43.134] for (kk in seq_along(NAMES)) { [13:13:43.134] name <- added[[kk]] [13:13:43.134] NAME <- NAMES[[kk]] [13:13:43.134] if (name != NAME && is.element(NAME, old_names)) [13:13:43.134] next [13:13:43.134] args[[name]] <- "" [13:13:43.134] } [13:13:43.134] NAMES <- toupper(removed) [13:13:43.134] for (kk in seq_along(NAMES)) { [13:13:43.134] name <- removed[[kk]] [13:13:43.134] NAME <- NAMES[[kk]] [13:13:43.134] if (name != NAME && is.element(NAME, old_names)) [13:13:43.134] next [13:13:43.134] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:43.134] } [13:13:43.134] if (length(args) > 0) [13:13:43.134] base::do.call(base::Sys.setenv, args = args) [13:13:43.134] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:43.134] } [13:13:43.134] else { [13:13:43.134] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:43.134] } [13:13:43.134] { [13:13:43.134] if (base::length(...future.futureOptionsAdded) > [13:13:43.134] 0L) { [13:13:43.134] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:43.134] base::names(opts) <- ...future.futureOptionsAdded [13:13:43.134] base::options(opts) [13:13:43.134] } [13:13:43.134] { [13:13:43.134] { [13:13:43.134] NULL [13:13:43.134] RNGkind("Mersenne-Twister") [13:13:43.134] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:43.134] inherits = FALSE) [13:13:43.134] } [13:13:43.134] options(future.plan = NULL) [13:13:43.134] if (is.na(NA_character_)) [13:13:43.134] Sys.unsetenv("R_FUTURE_PLAN") [13:13:43.134] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:43.134] future::plan(list(function (..., envir = parent.frame()) [13:13:43.134] { [13:13:43.134] future <- SequentialFuture(..., envir = envir) [13:13:43.134] if (!future$lazy) [13:13:43.134] future <- run(future) [13:13:43.134] invisible(future) [13:13:43.134] }), .cleanup = FALSE, .init = FALSE) [13:13:43.134] } [13:13:43.134] } [13:13:43.134] } [13:13:43.134] }) [13:13:43.134] if (TRUE) { [13:13:43.134] base::sink(type = "output", split = FALSE) [13:13:43.134] if (TRUE) { [13:13:43.134] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:43.134] } [13:13:43.134] else { [13:13:43.134] ...future.result["stdout"] <- base::list(NULL) [13:13:43.134] } [13:13:43.134] base::close(...future.stdout) [13:13:43.134] ...future.stdout <- NULL [13:13:43.134] } [13:13:43.134] ...future.result$conditions <- ...future.conditions [13:13:43.134] ...future.result$finished <- base::Sys.time() [13:13:43.134] ...future.result [13:13:43.134] } [13:13:43.137] assign_globals() ... [13:13:43.137] List of 5 [13:13:43.137] $ ...future.FUN :function (mode = "logical", length = 0L) [13:13:43.137] $ future.call.arguments :List of 1 [13:13:43.137] ..$ length: int 2 [13:13:43.137] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:43.137] $ ...future.elements_ii :List of 4 [13:13:43.137] ..$ a: chr "integer" [13:13:43.137] ..$ b: chr "numeric" [13:13:43.137] ..$ c: chr "character" [13:13:43.137] ..$ c: chr "list" [13:13:43.137] $ ...future.seeds_ii : NULL [13:13:43.137] $ ...future.globals.maxSize: NULL [13:13:43.137] - attr(*, "where")=List of 5 [13:13:43.137] ..$ ...future.FUN : [13:13:43.137] ..$ future.call.arguments : [13:13:43.137] ..$ ...future.elements_ii : [13:13:43.137] ..$ ...future.seeds_ii : [13:13:43.137] ..$ ...future.globals.maxSize: [13:13:43.137] - attr(*, "resolved")= logi FALSE [13:13:43.137] - attr(*, "total_size")= num 2240 [13:13:43.137] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:43.137] - attr(*, "already-done")= logi TRUE [13:13:43.142] - copied '...future.FUN' to environment [13:13:43.142] - copied 'future.call.arguments' to environment [13:13:43.142] - copied '...future.elements_ii' to environment [13:13:43.142] - copied '...future.seeds_ii' to environment [13:13:43.142] - copied '...future.globals.maxSize' to environment [13:13:43.142] assign_globals() ... done [13:13:43.142] plan(): Setting new future strategy stack: [13:13:43.143] List of future strategies: [13:13:43.143] 1. sequential: [13:13:43.143] - args: function (..., envir = parent.frame(), workers = "") [13:13:43.143] - tweaked: FALSE [13:13:43.143] - call: NULL [13:13:43.143] plan(): nbrOfWorkers() = 1 [13:13:43.144] plan(): Setting new future strategy stack: [13:13:43.144] List of future strategies: [13:13:43.144] 1. sequential: [13:13:43.144] - args: function (..., envir = parent.frame(), workers = "") [13:13:43.144] - tweaked: FALSE [13:13:43.144] - call: plan(strategy) [13:13:43.144] plan(): nbrOfWorkers() = 1 [13:13:43.144] SequentialFuture started (and completed) [13:13:43.145] - Launch lazy future ... done [13:13:43.145] run() for 'SequentialFuture' ... done [13:13:43.145] Created future: [13:13:43.145] SequentialFuture: [13:13:43.145] Label: 'future_lapply-1' [13:13:43.145] Expression: [13:13:43.145] { [13:13:43.145] do.call(function(...) { [13:13:43.145] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:43.145] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:43.145] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:43.145] on.exit(options(oopts), add = TRUE) [13:13:43.145] } [13:13:43.145] { [13:13:43.145] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:43.145] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:43.145] ...future.FUN(...future.X_jj, ...) [13:13:43.145] }) [13:13:43.145] } [13:13:43.145] }, args = future.call.arguments) [13:13:43.145] } [13:13:43.145] Lazy evaluation: FALSE [13:13:43.145] Asynchronous evaluation: FALSE [13:13:43.145] Local evaluation: TRUE [13:13:43.145] Environment: R_GlobalEnv [13:13:43.145] Capture standard output: TRUE [13:13:43.145] Capture condition classes: 'condition' (excluding 'nothing') [13:13:43.145] 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) [13:13:43.145] Packages: [13:13:43.145] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:43.145] Resolved: TRUE [13:13:43.145] Value: 240 bytes of class 'list' [13:13:43.145] Early signaling: FALSE [13:13:43.145] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:43.145] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:43.146] Chunk #1 of 1 ... DONE [13:13:43.146] Launching 1 futures (chunks) ... DONE [13:13:43.146] Resolving 1 futures (chunks) ... [13:13:43.146] resolve() on list ... [13:13:43.146] recursive: 0 [13:13:43.146] length: 1 [13:13:43.147] [13:13:43.147] resolved() for 'SequentialFuture' ... [13:13:43.147] - state: 'finished' [13:13:43.147] - run: TRUE [13:13:43.147] - result: 'FutureResult' [13:13:43.147] resolved() for 'SequentialFuture' ... done [13:13:43.147] Future #1 [13:13:43.148] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:43.148] - nx: 1 [13:13:43.148] - relay: TRUE [13:13:43.148] - stdout: TRUE [13:13:43.148] - signal: TRUE [13:13:43.148] - resignal: FALSE [13:13:43.148] - force: TRUE [13:13:43.148] - relayed: [n=1] FALSE [13:13:43.148] - queued futures: [n=1] FALSE [13:13:43.148] - until=1 [13:13:43.149] - relaying element #1 [13:13:43.149] - relayed: [n=1] TRUE [13:13:43.149] - queued futures: [n=1] TRUE [13:13:43.149] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:43.149] length: 0 (resolved future 1) [13:13:43.149] Relaying remaining futures [13:13:43.149] signalConditionsASAP(NULL, pos=0) ... [13:13:43.149] - nx: 1 [13:13:43.150] - relay: TRUE [13:13:43.150] - stdout: TRUE [13:13:43.150] - signal: TRUE [13:13:43.150] - resignal: FALSE [13:13:43.150] - force: TRUE [13:13:43.150] - relayed: [n=1] TRUE [13:13:43.150] - queued futures: [n=1] TRUE - flush all [13:13:43.150] - relayed: [n=1] TRUE [13:13:43.150] - queued futures: [n=1] TRUE [13:13:43.151] signalConditionsASAP(NULL, pos=0) ... done [13:13:43.151] resolve() on list ... DONE [13:13:43.151] - Number of value chunks collected: 1 [13:13:43.151] Resolving 1 futures (chunks) ... DONE [13:13:43.151] Reducing values from 1 chunks ... [13:13:43.151] - Number of values collected after concatenation: 4 [13:13:43.151] - Number of values expected: 4 [13:13:43.151] Reducing values from 1 chunks ... DONE [13:13:43.152] 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, ...) ... [13:13:43.153] future_lapply() ... [13:13:43.154] Number of chunks: 1 [13:13:43.154] getGlobalsAndPackagesXApply() ... [13:13:43.154] - future.globals: TRUE [13:13:43.154] getGlobalsAndPackages() ... [13:13:43.154] Searching for globals... [13:13:43.155] - globals found: [2] 'FUN', '.Internal' [13:13:43.155] Searching for globals ... DONE [13:13:43.156] Resolving globals: FALSE [13:13:43.156] The total size of the 1 globals is 2.13 KiB (2184 bytes) [13:13:43.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') [13:13:43.156] - globals: [1] 'FUN' [13:13:43.156] [13:13:43.157] getGlobalsAndPackages() ... DONE [13:13:43.157] - globals found/used: [n=1] 'FUN' [13:13:43.157] - needed namespaces: [n=0] [13:13:43.157] Finding globals ... DONE [13:13:43.157] - use_args: TRUE [13:13:43.157] - Getting '...' globals ... [13:13:43.157] resolve() on list ... [13:13:43.157] recursive: 0 [13:13:43.158] length: 1 [13:13:43.158] elements: '...' [13:13:43.158] length: 0 (resolved future 1) [13:13:43.158] resolve() on list ... DONE [13:13:43.158] - '...' content: [n=1] 'length' [13:13:43.158] List of 1 [13:13:43.158] $ ...:List of 1 [13:13:43.158] ..$ length: int 2 [13:13:43.158] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:43.158] - attr(*, "where")=List of 1 [13:13:43.158] ..$ ...: [13:13:43.158] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:43.158] - attr(*, "resolved")= logi TRUE [13:13:43.158] - attr(*, "total_size")= num NA [13:13:43.161] - Getting '...' globals ... DONE [13:13:43.161] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:43.161] List of 2 [13:13:43.161] $ ...future.FUN:function (mode = "logical", length = 0L) [13:13:43.161] $ ... :List of 1 [13:13:43.161] ..$ length: int 2 [13:13:43.161] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:43.161] - attr(*, "where")=List of 2 [13:13:43.161] ..$ ...future.FUN: [13:13:43.161] ..$ ... : [13:13:43.161] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:43.161] - attr(*, "resolved")= logi FALSE [13:13:43.161] - attr(*, "total_size")= num 2240 [13:13:43.164] Packages to be attached in all futures: [n=0] [13:13:43.164] getGlobalsAndPackagesXApply() ... DONE [13:13:43.164] Number of futures (= number of chunks): 1 [13:13:43.164] Launching 1 futures (chunks) ... [13:13:43.164] Chunk #1 of 1 ... [13:13:43.164] - Finding globals in 'X' for chunk #1 ... [13:13:43.164] getGlobalsAndPackages() ... [13:13:43.164] Searching for globals... [13:13:43.165] [13:13:43.165] Searching for globals ... DONE [13:13:43.165] - globals: [0] [13:13:43.165] getGlobalsAndPackages() ... DONE [13:13:43.165] + additional globals found: [n=0] [13:13:43.165] + additional namespaces needed: [n=0] [13:13:43.165] - Finding globals in 'X' for chunk #1 ... DONE [13:13:43.165] - seeds: [13:13:43.166] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:43.166] getGlobalsAndPackages() ... [13:13:43.166] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:43.166] Resolving globals: FALSE [13:13:43.166] Tweak future expression to call with '...' arguments ... [13:13:43.166] { [13:13:43.166] do.call(function(...) { [13:13:43.166] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:43.166] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:43.166] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:43.166] on.exit(options(oopts), add = TRUE) [13:13:43.166] } [13:13:43.166] { [13:13:43.166] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:43.166] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:43.166] ...future.FUN(...future.X_jj, ...) [13:13:43.166] }) [13:13:43.166] } [13:13:43.166] }, args = future.call.arguments) [13:13:43.166] } [13:13:43.167] Tweak future expression to call with '...' arguments ... DONE [13:13:43.167] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:43.167] [13:13:43.167] getGlobalsAndPackages() ... DONE [13:13:43.167] run() for 'Future' ... [13:13:43.167] - state: 'created' [13:13:43.168] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:13:43.168] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:43.168] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:43.168] - Field: 'label' [13:13:43.168] - Field: 'local' [13:13:43.168] - Field: 'owner' [13:13:43.169] - Field: 'envir' [13:13:43.169] - Field: 'packages' [13:13:43.169] - Field: 'gc' [13:13:43.169] - Field: 'conditions' [13:13:43.169] - Field: 'expr' [13:13:43.169] - Field: 'uuid' [13:13:43.169] - Field: 'seed' [13:13:43.169] - Field: 'version' [13:13:43.170] - Field: 'result' [13:13:43.170] - Field: 'asynchronous' [13:13:43.170] - Field: 'calls' [13:13:43.170] - Field: 'globals' [13:13:43.170] - Field: 'stdout' [13:13:43.170] - Field: 'earlySignal' [13:13:43.170] - Field: 'lazy' [13:13:43.170] - Field: 'state' [13:13:43.170] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:43.171] - Launch lazy future ... [13:13:43.171] Packages needed by the future expression (n = 0): [13:13:43.171] Packages needed by future strategies (n = 0): [13:13:43.171] { [13:13:43.171] { [13:13:43.171] { [13:13:43.171] ...future.startTime <- base::Sys.time() [13:13:43.171] { [13:13:43.171] { [13:13:43.171] { [13:13:43.171] base::local({ [13:13:43.171] has_future <- base::requireNamespace("future", [13:13:43.171] quietly = TRUE) [13:13:43.171] if (has_future) { [13:13:43.171] ns <- base::getNamespace("future") [13:13:43.171] version <- ns[[".package"]][["version"]] [13:13:43.171] if (is.null(version)) [13:13:43.171] version <- utils::packageVersion("future") [13:13:43.171] } [13:13:43.171] else { [13:13:43.171] version <- NULL [13:13:43.171] } [13:13:43.171] if (!has_future || version < "1.8.0") { [13:13:43.171] info <- base::c(r_version = base::gsub("R version ", [13:13:43.171] "", base::R.version$version.string), [13:13:43.171] platform = base::sprintf("%s (%s-bit)", [13:13:43.171] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:43.171] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:43.171] "release", "version")], collapse = " "), [13:13:43.171] hostname = base::Sys.info()[["nodename"]]) [13:13:43.171] info <- base::sprintf("%s: %s", base::names(info), [13:13:43.171] info) [13:13:43.171] info <- base::paste(info, collapse = "; ") [13:13:43.171] if (!has_future) { [13:13:43.171] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:43.171] info) [13:13:43.171] } [13:13:43.171] else { [13:13:43.171] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:43.171] info, version) [13:13:43.171] } [13:13:43.171] base::stop(msg) [13:13:43.171] } [13:13:43.171] }) [13:13:43.171] } [13:13:43.171] options(future.plan = NULL) [13:13:43.171] Sys.unsetenv("R_FUTURE_PLAN") [13:13:43.171] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:43.171] } [13:13:43.171] ...future.workdir <- getwd() [13:13:43.171] } [13:13:43.171] ...future.oldOptions <- base::as.list(base::.Options) [13:13:43.171] ...future.oldEnvVars <- base::Sys.getenv() [13:13:43.171] } [13:13:43.171] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:43.171] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:43.171] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:43.171] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:43.171] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:43.171] future.stdout.windows.reencode = NULL, width = 80L) [13:13:43.171] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:43.171] base::names(...future.oldOptions)) [13:13:43.171] } [13:13:43.171] if (FALSE) { [13:13:43.171] } [13:13:43.171] else { [13:13:43.171] if (TRUE) { [13:13:43.171] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:43.171] open = "w") [13:13:43.171] } [13:13:43.171] else { [13:13:43.171] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:43.171] windows = "NUL", "/dev/null"), open = "w") [13:13:43.171] } [13:13:43.171] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:43.171] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:43.171] base::sink(type = "output", split = FALSE) [13:13:43.171] base::close(...future.stdout) [13:13:43.171] }, add = TRUE) [13:13:43.171] } [13:13:43.171] ...future.frame <- base::sys.nframe() [13:13:43.171] ...future.conditions <- base::list() [13:13:43.171] ...future.rng <- base::globalenv()$.Random.seed [13:13:43.171] if (FALSE) { [13:13:43.171] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:43.171] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:43.171] } [13:13:43.171] ...future.result <- base::tryCatch({ [13:13:43.171] base::withCallingHandlers({ [13:13:43.171] ...future.value <- base::withVisible(base::local({ [13:13:43.171] do.call(function(...) { [13:13:43.171] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:43.171] if (!identical(...future.globals.maxSize.org, [13:13:43.171] ...future.globals.maxSize)) { [13:13:43.171] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:43.171] on.exit(options(oopts), add = TRUE) [13:13:43.171] } [13:13:43.171] { [13:13:43.171] lapply(seq_along(...future.elements_ii), [13:13:43.171] FUN = function(jj) { [13:13:43.171] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:43.171] ...future.FUN(...future.X_jj, ...) [13:13:43.171] }) [13:13:43.171] } [13:13:43.171] }, args = future.call.arguments) [13:13:43.171] })) [13:13:43.171] future::FutureResult(value = ...future.value$value, [13:13:43.171] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:43.171] ...future.rng), globalenv = if (FALSE) [13:13:43.171] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:43.171] ...future.globalenv.names)) [13:13:43.171] else NULL, started = ...future.startTime, version = "1.8") [13:13:43.171] }, condition = base::local({ [13:13:43.171] c <- base::c [13:13:43.171] inherits <- base::inherits [13:13:43.171] invokeRestart <- base::invokeRestart [13:13:43.171] length <- base::length [13:13:43.171] list <- base::list [13:13:43.171] seq.int <- base::seq.int [13:13:43.171] signalCondition <- base::signalCondition [13:13:43.171] sys.calls <- base::sys.calls [13:13:43.171] `[[` <- base::`[[` [13:13:43.171] `+` <- base::`+` [13:13:43.171] `<<-` <- base::`<<-` [13:13:43.171] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:43.171] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:43.171] 3L)] [13:13:43.171] } [13:13:43.171] function(cond) { [13:13:43.171] is_error <- inherits(cond, "error") [13:13:43.171] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:43.171] NULL) [13:13:43.171] if (is_error) { [13:13:43.171] sessionInformation <- function() { [13:13:43.171] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:43.171] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:43.171] search = base::search(), system = base::Sys.info()) [13:13:43.171] } [13:13:43.171] ...future.conditions[[length(...future.conditions) + [13:13:43.171] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:43.171] cond$call), session = sessionInformation(), [13:13:43.171] timestamp = base::Sys.time(), signaled = 0L) [13:13:43.171] signalCondition(cond) [13:13:43.171] } [13:13:43.171] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:43.171] "immediateCondition"))) { [13:13:43.171] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:43.171] ...future.conditions[[length(...future.conditions) + [13:13:43.171] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:43.171] if (TRUE && !signal) { [13:13:43.171] muffleCondition <- function (cond, pattern = "^muffle") [13:13:43.171] { [13:13:43.171] inherits <- base::inherits [13:13:43.171] invokeRestart <- base::invokeRestart [13:13:43.171] is.null <- base::is.null [13:13:43.171] muffled <- FALSE [13:13:43.171] if (inherits(cond, "message")) { [13:13:43.171] muffled <- grepl(pattern, "muffleMessage") [13:13:43.171] if (muffled) [13:13:43.171] invokeRestart("muffleMessage") [13:13:43.171] } [13:13:43.171] else if (inherits(cond, "warning")) { [13:13:43.171] muffled <- grepl(pattern, "muffleWarning") [13:13:43.171] if (muffled) [13:13:43.171] invokeRestart("muffleWarning") [13:13:43.171] } [13:13:43.171] else if (inherits(cond, "condition")) { [13:13:43.171] if (!is.null(pattern)) { [13:13:43.171] computeRestarts <- base::computeRestarts [13:13:43.171] grepl <- base::grepl [13:13:43.171] restarts <- computeRestarts(cond) [13:13:43.171] for (restart in restarts) { [13:13:43.171] name <- restart$name [13:13:43.171] if (is.null(name)) [13:13:43.171] next [13:13:43.171] if (!grepl(pattern, name)) [13:13:43.171] next [13:13:43.171] invokeRestart(restart) [13:13:43.171] muffled <- TRUE [13:13:43.171] break [13:13:43.171] } [13:13:43.171] } [13:13:43.171] } [13:13:43.171] invisible(muffled) [13:13:43.171] } [13:13:43.171] muffleCondition(cond, pattern = "^muffle") [13:13:43.171] } [13:13:43.171] } [13:13:43.171] else { [13:13:43.171] if (TRUE) { [13:13:43.171] muffleCondition <- function (cond, pattern = "^muffle") [13:13:43.171] { [13:13:43.171] inherits <- base::inherits [13:13:43.171] invokeRestart <- base::invokeRestart [13:13:43.171] is.null <- base::is.null [13:13:43.171] muffled <- FALSE [13:13:43.171] if (inherits(cond, "message")) { [13:13:43.171] muffled <- grepl(pattern, "muffleMessage") [13:13:43.171] if (muffled) [13:13:43.171] invokeRestart("muffleMessage") [13:13:43.171] } [13:13:43.171] else if (inherits(cond, "warning")) { [13:13:43.171] muffled <- grepl(pattern, "muffleWarning") [13:13:43.171] if (muffled) [13:13:43.171] invokeRestart("muffleWarning") [13:13:43.171] } [13:13:43.171] else if (inherits(cond, "condition")) { [13:13:43.171] if (!is.null(pattern)) { [13:13:43.171] computeRestarts <- base::computeRestarts [13:13:43.171] grepl <- base::grepl [13:13:43.171] restarts <- computeRestarts(cond) [13:13:43.171] for (restart in restarts) { [13:13:43.171] name <- restart$name [13:13:43.171] if (is.null(name)) [13:13:43.171] next [13:13:43.171] if (!grepl(pattern, name)) [13:13:43.171] next [13:13:43.171] invokeRestart(restart) [13:13:43.171] muffled <- TRUE [13:13:43.171] break [13:13:43.171] } [13:13:43.171] } [13:13:43.171] } [13:13:43.171] invisible(muffled) [13:13:43.171] } [13:13:43.171] muffleCondition(cond, pattern = "^muffle") [13:13:43.171] } [13:13:43.171] } [13:13:43.171] } [13:13:43.171] })) [13:13:43.171] }, error = function(ex) { [13:13:43.171] base::structure(base::list(value = NULL, visible = NULL, [13:13:43.171] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:43.171] ...future.rng), started = ...future.startTime, [13:13:43.171] finished = Sys.time(), session_uuid = NA_character_, [13:13:43.171] version = "1.8"), class = "FutureResult") [13:13:43.171] }, finally = { [13:13:43.171] if (!identical(...future.workdir, getwd())) [13:13:43.171] setwd(...future.workdir) [13:13:43.171] { [13:13:43.171] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:43.171] ...future.oldOptions$nwarnings <- NULL [13:13:43.171] } [13:13:43.171] base::options(...future.oldOptions) [13:13:43.171] if (.Platform$OS.type == "windows") { [13:13:43.171] old_names <- names(...future.oldEnvVars) [13:13:43.171] envs <- base::Sys.getenv() [13:13:43.171] names <- names(envs) [13:13:43.171] common <- intersect(names, old_names) [13:13:43.171] added <- setdiff(names, old_names) [13:13:43.171] removed <- setdiff(old_names, names) [13:13:43.171] changed <- common[...future.oldEnvVars[common] != [13:13:43.171] envs[common]] [13:13:43.171] NAMES <- toupper(changed) [13:13:43.171] args <- list() [13:13:43.171] for (kk in seq_along(NAMES)) { [13:13:43.171] name <- changed[[kk]] [13:13:43.171] NAME <- NAMES[[kk]] [13:13:43.171] if (name != NAME && is.element(NAME, old_names)) [13:13:43.171] next [13:13:43.171] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:43.171] } [13:13:43.171] NAMES <- toupper(added) [13:13:43.171] for (kk in seq_along(NAMES)) { [13:13:43.171] name <- added[[kk]] [13:13:43.171] NAME <- NAMES[[kk]] [13:13:43.171] if (name != NAME && is.element(NAME, old_names)) [13:13:43.171] next [13:13:43.171] args[[name]] <- "" [13:13:43.171] } [13:13:43.171] NAMES <- toupper(removed) [13:13:43.171] for (kk in seq_along(NAMES)) { [13:13:43.171] name <- removed[[kk]] [13:13:43.171] NAME <- NAMES[[kk]] [13:13:43.171] if (name != NAME && is.element(NAME, old_names)) [13:13:43.171] next [13:13:43.171] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:43.171] } [13:13:43.171] if (length(args) > 0) [13:13:43.171] base::do.call(base::Sys.setenv, args = args) [13:13:43.171] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:43.171] } [13:13:43.171] else { [13:13:43.171] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:43.171] } [13:13:43.171] { [13:13:43.171] if (base::length(...future.futureOptionsAdded) > [13:13:43.171] 0L) { [13:13:43.171] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:43.171] base::names(opts) <- ...future.futureOptionsAdded [13:13:43.171] base::options(opts) [13:13:43.171] } [13:13:43.171] { [13:13:43.171] { [13:13:43.171] NULL [13:13:43.171] RNGkind("Mersenne-Twister") [13:13:43.171] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:43.171] inherits = FALSE) [13:13:43.171] } [13:13:43.171] options(future.plan = NULL) [13:13:43.171] if (is.na(NA_character_)) [13:13:43.171] Sys.unsetenv("R_FUTURE_PLAN") [13:13:43.171] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:43.171] future::plan(list(function (..., envir = parent.frame()) [13:13:43.171] { [13:13:43.171] future <- SequentialFuture(..., envir = envir) [13:13:43.171] if (!future$lazy) [13:13:43.171] future <- run(future) [13:13:43.171] invisible(future) [13:13:43.171] }), .cleanup = FALSE, .init = FALSE) [13:13:43.171] } [13:13:43.171] } [13:13:43.171] } [13:13:43.171] }) [13:13:43.171] if (TRUE) { [13:13:43.171] base::sink(type = "output", split = FALSE) [13:13:43.171] if (TRUE) { [13:13:43.171] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:43.171] } [13:13:43.171] else { [13:13:43.171] ...future.result["stdout"] <- base::list(NULL) [13:13:43.171] } [13:13:43.171] base::close(...future.stdout) [13:13:43.171] ...future.stdout <- NULL [13:13:43.171] } [13:13:43.171] ...future.result$conditions <- ...future.conditions [13:13:43.171] ...future.result$finished <- base::Sys.time() [13:13:43.171] ...future.result [13:13:43.171] } [13:13:43.174] assign_globals() ... [13:13:43.174] List of 5 [13:13:43.174] $ ...future.FUN :function (mode = "logical", length = 0L) [13:13:43.174] $ future.call.arguments :List of 1 [13:13:43.174] ..$ length: int 2 [13:13:43.174] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:43.174] $ ...future.elements_ii :List of 4 [13:13:43.174] ..$ a: chr "integer" [13:13:43.174] ..$ b: chr "numeric" [13:13:43.174] ..$ c: chr "character" [13:13:43.174] ..$ c: chr "list" [13:13:43.174] $ ...future.seeds_ii : NULL [13:13:43.174] $ ...future.globals.maxSize: NULL [13:13:43.174] - attr(*, "where")=List of 5 [13:13:43.174] ..$ ...future.FUN : [13:13:43.174] ..$ future.call.arguments : [13:13:43.174] ..$ ...future.elements_ii : [13:13:43.174] ..$ ...future.seeds_ii : [13:13:43.174] ..$ ...future.globals.maxSize: [13:13:43.174] - attr(*, "resolved")= logi FALSE [13:13:43.174] - attr(*, "total_size")= num 2240 [13:13:43.174] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:43.174] - attr(*, "already-done")= logi TRUE [13:13:43.179] - copied '...future.FUN' to environment [13:13:43.179] - copied 'future.call.arguments' to environment [13:13:43.179] - copied '...future.elements_ii' to environment [13:13:43.179] - copied '...future.seeds_ii' to environment [13:13:43.180] - copied '...future.globals.maxSize' to environment [13:13:43.180] assign_globals() ... done [13:13:43.180] plan(): Setting new future strategy stack: [13:13:43.180] List of future strategies: [13:13:43.180] 1. sequential: [13:13:43.180] - args: function (..., envir = parent.frame(), workers = "") [13:13:43.180] - tweaked: FALSE [13:13:43.180] - call: NULL [13:13:43.181] plan(): nbrOfWorkers() = 1 [13:13:43.181] plan(): Setting new future strategy stack: [13:13:43.181] List of future strategies: [13:13:43.181] 1. sequential: [13:13:43.181] - args: function (..., envir = parent.frame(), workers = "") [13:13:43.181] - tweaked: FALSE [13:13:43.181] - call: plan(strategy) [13:13:43.182] plan(): nbrOfWorkers() = 1 [13:13:43.182] SequentialFuture started (and completed) [13:13:43.182] - Launch lazy future ... done [13:13:43.182] run() for 'SequentialFuture' ... done [13:13:43.182] Created future: [13:13:43.183] SequentialFuture: [13:13:43.183] Label: 'future_lapply-1' [13:13:43.183] Expression: [13:13:43.183] { [13:13:43.183] do.call(function(...) { [13:13:43.183] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:43.183] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:43.183] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:43.183] on.exit(options(oopts), add = TRUE) [13:13:43.183] } [13:13:43.183] { [13:13:43.183] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:43.183] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:43.183] ...future.FUN(...future.X_jj, ...) [13:13:43.183] }) [13:13:43.183] } [13:13:43.183] }, args = future.call.arguments) [13:13:43.183] } [13:13:43.183] Lazy evaluation: FALSE [13:13:43.183] Asynchronous evaluation: FALSE [13:13:43.183] Local evaluation: TRUE [13:13:43.183] Environment: R_GlobalEnv [13:13:43.183] Capture standard output: TRUE [13:13:43.183] Capture condition classes: 'condition' (excluding 'nothing') [13:13:43.183] 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) [13:13:43.183] Packages: [13:13:43.183] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:43.183] Resolved: TRUE [13:13:43.183] Value: 240 bytes of class 'list' [13:13:43.183] Early signaling: FALSE [13:13:43.183] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:43.183] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:43.184] Chunk #1 of 1 ... DONE [13:13:43.184] Launching 1 futures (chunks) ... DONE [13:13:43.184] Resolving 1 futures (chunks) ... [13:13:43.184] resolve() on list ... [13:13:43.184] recursive: 0 [13:13:43.184] length: 1 [13:13:43.184] [13:13:43.184] resolved() for 'SequentialFuture' ... [13:13:43.184] - state: 'finished' [13:13:43.185] - run: TRUE [13:13:43.185] - result: 'FutureResult' [13:13:43.185] resolved() for 'SequentialFuture' ... done [13:13:43.185] Future #1 [13:13:43.185] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:43.185] - nx: 1 [13:13:43.185] - relay: TRUE [13:13:43.185] - stdout: TRUE [13:13:43.186] - signal: TRUE [13:13:43.186] - resignal: FALSE [13:13:43.186] - force: TRUE [13:13:43.186] - relayed: [n=1] FALSE [13:13:43.186] - queued futures: [n=1] FALSE [13:13:43.186] - until=1 [13:13:43.186] - relaying element #1 [13:13:43.186] - relayed: [n=1] TRUE [13:13:43.187] - queued futures: [n=1] TRUE [13:13:43.187] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:43.187] length: 0 (resolved future 1) [13:13:43.187] Relaying remaining futures [13:13:43.187] signalConditionsASAP(NULL, pos=0) ... [13:13:43.187] - nx: 1 [13:13:43.187] - relay: TRUE [13:13:43.187] - stdout: TRUE [13:13:43.187] - signal: TRUE [13:13:43.188] - resignal: FALSE [13:13:43.188] - force: TRUE [13:13:43.188] - relayed: [n=1] TRUE [13:13:43.188] - queued futures: [n=1] TRUE - flush all [13:13:43.188] - relayed: [n=1] TRUE [13:13:43.188] - queued futures: [n=1] TRUE [13:13:43.188] signalConditionsASAP(NULL, pos=0) ... done [13:13:43.188] resolve() on list ... DONE [13:13:43.189] - Number of value chunks collected: 1 [13:13:43.189] Resolving 1 futures (chunks) ... DONE [13:13:43.189] Reducing values from 1 chunks ... [13:13:43.189] - Number of values collected after concatenation: 4 [13:13:43.189] - Number of values expected: 4 [13:13:43.189] Reducing values from 1 chunks ... DONE [13:13:43.189] 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, ...) ... [13:13:43.191] future_lapply() ... [13:13:43.199] Number of chunks: 1 [13:13:43.199] getGlobalsAndPackagesXApply() ... [13:13:43.199] - future.globals: TRUE [13:13:43.199] getGlobalsAndPackages() ... [13:13:43.199] Searching for globals... [13:13:43.206] - globals found: [22] 'FUN', 'if', 'missing', 'is.finite', '{', 'is.null', '<-', 'paste', 'length', '==', 'return', '>', '+', '[', 'seq_len', 'rev', 'c', '&&', '!', ':', '(', '-' [13:13:43.206] Searching for globals ... DONE [13:13:43.206] Resolving globals: FALSE [13:13:43.207] The total size of the 1 globals is 69.62 KiB (71288 bytes) [13:13:43.207] 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') [13:13:43.208] - globals: [1] 'FUN' [13:13:43.208] - packages: [1] 'future' [13:13:43.208] getGlobalsAndPackages() ... DONE [13:13:43.208] - globals found/used: [n=1] 'FUN' [13:13:43.208] - needed namespaces: [n=1] 'future' [13:13:43.208] Finding globals ... DONE [13:13:43.208] - use_args: TRUE [13:13:43.208] - Getting '...' globals ... [13:13:43.209] resolve() on list ... [13:13:43.209] recursive: 0 [13:13:43.209] length: 1 [13:13:43.209] elements: '...' [13:13:43.209] length: 0 (resolved future 1) [13:13:43.209] resolve() on list ... DONE [13:13:43.209] - '...' content: [n=2] 'collapse', 'maxHead' [13:13:43.210] List of 1 [13:13:43.210] $ ...:List of 2 [13:13:43.210] ..$ collapse: chr "; " [13:13:43.210] ..$ maxHead : int 3 [13:13:43.210] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:43.210] - attr(*, "where")=List of 1 [13:13:43.210] ..$ ...: [13:13:43.210] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:43.210] - attr(*, "resolved")= logi TRUE [13:13:43.210] - attr(*, "total_size")= num NA [13:13:43.212] - Getting '...' globals ... DONE [13:13:43.212] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:43.213] List of 2 [13:13:43.213] $ ...future.FUN:function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [13:13:43.213] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [13:13:43.213] $ ... :List of 2 [13:13:43.213] ..$ collapse: chr "; " [13:13:43.213] ..$ maxHead : int 3 [13:13:43.213] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:43.213] - attr(*, "where")=List of 2 [13:13:43.213] ..$ ...future.FUN: [13:13:43.213] ..$ ... : [13:13:43.213] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:43.213] - attr(*, "resolved")= logi FALSE [13:13:43.213] - attr(*, "total_size")= num 71456 [13:13:43.215] Packages to be attached in all futures: [n=1] 'future' [13:13:43.215] getGlobalsAndPackagesXApply() ... DONE [13:13:43.216] Number of futures (= number of chunks): 1 [13:13:43.216] Launching 1 futures (chunks) ... [13:13:43.216] Chunk #1 of 1 ... [13:13:43.216] - Finding globals in 'X' for chunk #1 ... [13:13:43.216] getGlobalsAndPackages() ... [13:13:43.216] Searching for globals... [13:13:43.217] [13:13:43.217] Searching for globals ... DONE [13:13:43.217] - globals: [0] [13:13:43.217] getGlobalsAndPackages() ... DONE [13:13:43.217] + additional globals found: [n=0] [13:13:43.217] + additional namespaces needed: [n=0] [13:13:43.217] - Finding globals in 'X' for chunk #1 ... DONE [13:13:43.217] - seeds: [13:13:43.217] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:43.218] getGlobalsAndPackages() ... [13:13:43.218] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:43.218] Resolving globals: FALSE [13:13:43.218] Tweak future expression to call with '...' arguments ... [13:13:43.218] { [13:13:43.218] do.call(function(...) { [13:13:43.218] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:43.218] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:43.218] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:43.218] on.exit(options(oopts), add = TRUE) [13:13:43.218] } [13:13:43.218] { [13:13:43.218] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:43.218] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:43.218] ...future.FUN(...future.X_jj, ...) [13:13:43.218] }) [13:13:43.218] } [13:13:43.218] }, args = future.call.arguments) [13:13:43.218] } [13:13:43.218] Tweak future expression to call with '...' arguments ... DONE [13:13:43.219] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:43.219] - packages: [1] 'future' [13:13:43.219] getGlobalsAndPackages() ... DONE [13:13:43.219] run() for 'Future' ... [13:13:43.219] - state: 'created' [13:13:43.219] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:13:43.220] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:43.220] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:43.220] - Field: 'label' [13:13:43.220] - Field: 'local' [13:13:43.220] - Field: 'owner' [13:13:43.220] - Field: 'envir' [13:13:43.221] - Field: 'packages' [13:13:43.221] - Field: 'gc' [13:13:43.221] - Field: 'conditions' [13:13:43.221] - Field: 'expr' [13:13:43.221] - Field: 'uuid' [13:13:43.221] - Field: 'seed' [13:13:43.221] - Field: 'version' [13:13:43.221] - Field: 'result' [13:13:43.221] - Field: 'asynchronous' [13:13:43.222] - Field: 'calls' [13:13:43.222] - Field: 'globals' [13:13:43.222] - Field: 'stdout' [13:13:43.222] - Field: 'earlySignal' [13:13:43.222] - Field: 'lazy' [13:13:43.222] - Field: 'state' [13:13:43.222] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:43.222] - Launch lazy future ... [13:13:43.223] Packages needed by the future expression (n = 1): 'future' [13:13:43.223] Packages needed by future strategies (n = 0): [13:13:43.223] { [13:13:43.223] { [13:13:43.223] { [13:13:43.223] ...future.startTime <- base::Sys.time() [13:13:43.223] { [13:13:43.223] { [13:13:43.223] { [13:13:43.223] { [13:13:43.223] base::local({ [13:13:43.223] has_future <- base::requireNamespace("future", [13:13:43.223] quietly = TRUE) [13:13:43.223] if (has_future) { [13:13:43.223] ns <- base::getNamespace("future") [13:13:43.223] version <- ns[[".package"]][["version"]] [13:13:43.223] if (is.null(version)) [13:13:43.223] version <- utils::packageVersion("future") [13:13:43.223] } [13:13:43.223] else { [13:13:43.223] version <- NULL [13:13:43.223] } [13:13:43.223] if (!has_future || version < "1.8.0") { [13:13:43.223] info <- base::c(r_version = base::gsub("R version ", [13:13:43.223] "", base::R.version$version.string), [13:13:43.223] platform = base::sprintf("%s (%s-bit)", [13:13:43.223] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:43.223] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:43.223] "release", "version")], collapse = " "), [13:13:43.223] hostname = base::Sys.info()[["nodename"]]) [13:13:43.223] info <- base::sprintf("%s: %s", base::names(info), [13:13:43.223] info) [13:13:43.223] info <- base::paste(info, collapse = "; ") [13:13:43.223] if (!has_future) { [13:13:43.223] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:43.223] info) [13:13:43.223] } [13:13:43.223] else { [13:13:43.223] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:43.223] info, version) [13:13:43.223] } [13:13:43.223] base::stop(msg) [13:13:43.223] } [13:13:43.223] }) [13:13:43.223] } [13:13:43.223] base::local({ [13:13:43.223] for (pkg in "future") { [13:13:43.223] base::loadNamespace(pkg) [13:13:43.223] base::library(pkg, character.only = TRUE) [13:13:43.223] } [13:13:43.223] }) [13:13:43.223] } [13:13:43.223] options(future.plan = NULL) [13:13:43.223] Sys.unsetenv("R_FUTURE_PLAN") [13:13:43.223] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:43.223] } [13:13:43.223] ...future.workdir <- getwd() [13:13:43.223] } [13:13:43.223] ...future.oldOptions <- base::as.list(base::.Options) [13:13:43.223] ...future.oldEnvVars <- base::Sys.getenv() [13:13:43.223] } [13:13:43.223] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:43.223] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:43.223] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:43.223] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:43.223] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:43.223] future.stdout.windows.reencode = NULL, width = 80L) [13:13:43.223] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:43.223] base::names(...future.oldOptions)) [13:13:43.223] } [13:13:43.223] if (FALSE) { [13:13:43.223] } [13:13:43.223] else { [13:13:43.223] if (TRUE) { [13:13:43.223] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:43.223] open = "w") [13:13:43.223] } [13:13:43.223] else { [13:13:43.223] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:43.223] windows = "NUL", "/dev/null"), open = "w") [13:13:43.223] } [13:13:43.223] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:43.223] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:43.223] base::sink(type = "output", split = FALSE) [13:13:43.223] base::close(...future.stdout) [13:13:43.223] }, add = TRUE) [13:13:43.223] } [13:13:43.223] ...future.frame <- base::sys.nframe() [13:13:43.223] ...future.conditions <- base::list() [13:13:43.223] ...future.rng <- base::globalenv()$.Random.seed [13:13:43.223] if (FALSE) { [13:13:43.223] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:43.223] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:43.223] } [13:13:43.223] ...future.result <- base::tryCatch({ [13:13:43.223] base::withCallingHandlers({ [13:13:43.223] ...future.value <- base::withVisible(base::local({ [13:13:43.223] do.call(function(...) { [13:13:43.223] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:43.223] if (!identical(...future.globals.maxSize.org, [13:13:43.223] ...future.globals.maxSize)) { [13:13:43.223] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:43.223] on.exit(options(oopts), add = TRUE) [13:13:43.223] } [13:13:43.223] { [13:13:43.223] lapply(seq_along(...future.elements_ii), [13:13:43.223] FUN = function(jj) { [13:13:43.223] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:43.223] ...future.FUN(...future.X_jj, ...) [13:13:43.223] }) [13:13:43.223] } [13:13:43.223] }, args = future.call.arguments) [13:13:43.223] })) [13:13:43.223] future::FutureResult(value = ...future.value$value, [13:13:43.223] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:43.223] ...future.rng), globalenv = if (FALSE) [13:13:43.223] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:43.223] ...future.globalenv.names)) [13:13:43.223] else NULL, started = ...future.startTime, version = "1.8") [13:13:43.223] }, condition = base::local({ [13:13:43.223] c <- base::c [13:13:43.223] inherits <- base::inherits [13:13:43.223] invokeRestart <- base::invokeRestart [13:13:43.223] length <- base::length [13:13:43.223] list <- base::list [13:13:43.223] seq.int <- base::seq.int [13:13:43.223] signalCondition <- base::signalCondition [13:13:43.223] sys.calls <- base::sys.calls [13:13:43.223] `[[` <- base::`[[` [13:13:43.223] `+` <- base::`+` [13:13:43.223] `<<-` <- base::`<<-` [13:13:43.223] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:43.223] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:43.223] 3L)] [13:13:43.223] } [13:13:43.223] function(cond) { [13:13:43.223] is_error <- inherits(cond, "error") [13:13:43.223] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:43.223] NULL) [13:13:43.223] if (is_error) { [13:13:43.223] sessionInformation <- function() { [13:13:43.223] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:43.223] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:43.223] search = base::search(), system = base::Sys.info()) [13:13:43.223] } [13:13:43.223] ...future.conditions[[length(...future.conditions) + [13:13:43.223] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:43.223] cond$call), session = sessionInformation(), [13:13:43.223] timestamp = base::Sys.time(), signaled = 0L) [13:13:43.223] signalCondition(cond) [13:13:43.223] } [13:13:43.223] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:43.223] "immediateCondition"))) { [13:13:43.223] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:43.223] ...future.conditions[[length(...future.conditions) + [13:13:43.223] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:43.223] if (TRUE && !signal) { [13:13:43.223] muffleCondition <- function (cond, pattern = "^muffle") [13:13:43.223] { [13:13:43.223] inherits <- base::inherits [13:13:43.223] invokeRestart <- base::invokeRestart [13:13:43.223] is.null <- base::is.null [13:13:43.223] muffled <- FALSE [13:13:43.223] if (inherits(cond, "message")) { [13:13:43.223] muffled <- grepl(pattern, "muffleMessage") [13:13:43.223] if (muffled) [13:13:43.223] invokeRestart("muffleMessage") [13:13:43.223] } [13:13:43.223] else if (inherits(cond, "warning")) { [13:13:43.223] muffled <- grepl(pattern, "muffleWarning") [13:13:43.223] if (muffled) [13:13:43.223] invokeRestart("muffleWarning") [13:13:43.223] } [13:13:43.223] else if (inherits(cond, "condition")) { [13:13:43.223] if (!is.null(pattern)) { [13:13:43.223] computeRestarts <- base::computeRestarts [13:13:43.223] grepl <- base::grepl [13:13:43.223] restarts <- computeRestarts(cond) [13:13:43.223] for (restart in restarts) { [13:13:43.223] name <- restart$name [13:13:43.223] if (is.null(name)) [13:13:43.223] next [13:13:43.223] if (!grepl(pattern, name)) [13:13:43.223] next [13:13:43.223] invokeRestart(restart) [13:13:43.223] muffled <- TRUE [13:13:43.223] break [13:13:43.223] } [13:13:43.223] } [13:13:43.223] } [13:13:43.223] invisible(muffled) [13:13:43.223] } [13:13:43.223] muffleCondition(cond, pattern = "^muffle") [13:13:43.223] } [13:13:43.223] } [13:13:43.223] else { [13:13:43.223] if (TRUE) { [13:13:43.223] muffleCondition <- function (cond, pattern = "^muffle") [13:13:43.223] { [13:13:43.223] inherits <- base::inherits [13:13:43.223] invokeRestart <- base::invokeRestart [13:13:43.223] is.null <- base::is.null [13:13:43.223] muffled <- FALSE [13:13:43.223] if (inherits(cond, "message")) { [13:13:43.223] muffled <- grepl(pattern, "muffleMessage") [13:13:43.223] if (muffled) [13:13:43.223] invokeRestart("muffleMessage") [13:13:43.223] } [13:13:43.223] else if (inherits(cond, "warning")) { [13:13:43.223] muffled <- grepl(pattern, "muffleWarning") [13:13:43.223] if (muffled) [13:13:43.223] invokeRestart("muffleWarning") [13:13:43.223] } [13:13:43.223] else if (inherits(cond, "condition")) { [13:13:43.223] if (!is.null(pattern)) { [13:13:43.223] computeRestarts <- base::computeRestarts [13:13:43.223] grepl <- base::grepl [13:13:43.223] restarts <- computeRestarts(cond) [13:13:43.223] for (restart in restarts) { [13:13:43.223] name <- restart$name [13:13:43.223] if (is.null(name)) [13:13:43.223] next [13:13:43.223] if (!grepl(pattern, name)) [13:13:43.223] next [13:13:43.223] invokeRestart(restart) [13:13:43.223] muffled <- TRUE [13:13:43.223] break [13:13:43.223] } [13:13:43.223] } [13:13:43.223] } [13:13:43.223] invisible(muffled) [13:13:43.223] } [13:13:43.223] muffleCondition(cond, pattern = "^muffle") [13:13:43.223] } [13:13:43.223] } [13:13:43.223] } [13:13:43.223] })) [13:13:43.223] }, error = function(ex) { [13:13:43.223] base::structure(base::list(value = NULL, visible = NULL, [13:13:43.223] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:43.223] ...future.rng), started = ...future.startTime, [13:13:43.223] finished = Sys.time(), session_uuid = NA_character_, [13:13:43.223] version = "1.8"), class = "FutureResult") [13:13:43.223] }, finally = { [13:13:43.223] if (!identical(...future.workdir, getwd())) [13:13:43.223] setwd(...future.workdir) [13:13:43.223] { [13:13:43.223] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:43.223] ...future.oldOptions$nwarnings <- NULL [13:13:43.223] } [13:13:43.223] base::options(...future.oldOptions) [13:13:43.223] if (.Platform$OS.type == "windows") { [13:13:43.223] old_names <- names(...future.oldEnvVars) [13:13:43.223] envs <- base::Sys.getenv() [13:13:43.223] names <- names(envs) [13:13:43.223] common <- intersect(names, old_names) [13:13:43.223] added <- setdiff(names, old_names) [13:13:43.223] removed <- setdiff(old_names, names) [13:13:43.223] changed <- common[...future.oldEnvVars[common] != [13:13:43.223] envs[common]] [13:13:43.223] NAMES <- toupper(changed) [13:13:43.223] args <- list() [13:13:43.223] for (kk in seq_along(NAMES)) { [13:13:43.223] name <- changed[[kk]] [13:13:43.223] NAME <- NAMES[[kk]] [13:13:43.223] if (name != NAME && is.element(NAME, old_names)) [13:13:43.223] next [13:13:43.223] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:43.223] } [13:13:43.223] NAMES <- toupper(added) [13:13:43.223] for (kk in seq_along(NAMES)) { [13:13:43.223] name <- added[[kk]] [13:13:43.223] NAME <- NAMES[[kk]] [13:13:43.223] if (name != NAME && is.element(NAME, old_names)) [13:13:43.223] next [13:13:43.223] args[[name]] <- "" [13:13:43.223] } [13:13:43.223] NAMES <- toupper(removed) [13:13:43.223] for (kk in seq_along(NAMES)) { [13:13:43.223] name <- removed[[kk]] [13:13:43.223] NAME <- NAMES[[kk]] [13:13:43.223] if (name != NAME && is.element(NAME, old_names)) [13:13:43.223] next [13:13:43.223] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:43.223] } [13:13:43.223] if (length(args) > 0) [13:13:43.223] base::do.call(base::Sys.setenv, args = args) [13:13:43.223] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:43.223] } [13:13:43.223] else { [13:13:43.223] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:43.223] } [13:13:43.223] { [13:13:43.223] if (base::length(...future.futureOptionsAdded) > [13:13:43.223] 0L) { [13:13:43.223] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:43.223] base::names(opts) <- ...future.futureOptionsAdded [13:13:43.223] base::options(opts) [13:13:43.223] } [13:13:43.223] { [13:13:43.223] { [13:13:43.223] NULL [13:13:43.223] RNGkind("Mersenne-Twister") [13:13:43.223] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:43.223] inherits = FALSE) [13:13:43.223] } [13:13:43.223] options(future.plan = NULL) [13:13:43.223] if (is.na(NA_character_)) [13:13:43.223] Sys.unsetenv("R_FUTURE_PLAN") [13:13:43.223] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:43.223] future::plan(list(function (..., envir = parent.frame()) [13:13:43.223] { [13:13:43.223] future <- SequentialFuture(..., envir = envir) [13:13:43.223] if (!future$lazy) [13:13:43.223] future <- run(future) [13:13:43.223] invisible(future) [13:13:43.223] }), .cleanup = FALSE, .init = FALSE) [13:13:43.223] } [13:13:43.223] } [13:13:43.223] } [13:13:43.223] }) [13:13:43.223] if (TRUE) { [13:13:43.223] base::sink(type = "output", split = FALSE) [13:13:43.223] if (TRUE) { [13:13:43.223] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:43.223] } [13:13:43.223] else { [13:13:43.223] ...future.result["stdout"] <- base::list(NULL) [13:13:43.223] } [13:13:43.223] base::close(...future.stdout) [13:13:43.223] ...future.stdout <- NULL [13:13:43.223] } [13:13:43.223] ...future.result$conditions <- ...future.conditions [13:13:43.223] ...future.result$finished <- base::Sys.time() [13:13:43.223] ...future.result [13:13:43.223] } [13:13:43.226] assign_globals() ... [13:13:43.226] List of 5 [13:13:43.226] $ ...future.FUN :function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [13:13:43.226] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [13:13:43.226] $ future.call.arguments :List of 2 [13:13:43.226] ..$ collapse: chr "; " [13:13:43.226] ..$ maxHead : int 3 [13:13:43.226] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:43.226] $ ...future.elements_ii :List of 1 [13:13:43.226] ..$ a: Named chr [1:101] "hello" "1" "2" "3" ... [13:13:43.226] .. ..- attr(*, "names")= chr [1:101] "" "b1" "b2" "b3" ... [13:13:43.226] $ ...future.seeds_ii : NULL [13:13:43.226] $ ...future.globals.maxSize: NULL [13:13:43.226] - attr(*, "where")=List of 5 [13:13:43.226] ..$ ...future.FUN : [13:13:43.226] ..$ future.call.arguments : [13:13:43.226] ..$ ...future.elements_ii : [13:13:43.226] ..$ ...future.seeds_ii : [13:13:43.226] ..$ ...future.globals.maxSize: [13:13:43.226] - attr(*, "resolved")= logi FALSE [13:13:43.226] - attr(*, "total_size")= num 71456 [13:13:43.226] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:43.226] - attr(*, "already-done")= logi TRUE [13:13:43.231] - copied '...future.FUN' to environment [13:13:43.231] - copied 'future.call.arguments' to environment [13:13:43.231] - copied '...future.elements_ii' to environment [13:13:43.231] - copied '...future.seeds_ii' to environment [13:13:43.231] - copied '...future.globals.maxSize' to environment [13:13:43.231] assign_globals() ... done [13:13:43.232] plan(): Setting new future strategy stack: [13:13:43.232] List of future strategies: [13:13:43.232] 1. sequential: [13:13:43.232] - args: function (..., envir = parent.frame(), workers = "") [13:13:43.232] - tweaked: FALSE [13:13:43.232] - call: NULL [13:13:43.232] plan(): nbrOfWorkers() = 1 [13:13:43.233] plan(): Setting new future strategy stack: [13:13:43.233] List of future strategies: [13:13:43.233] 1. sequential: [13:13:43.233] - args: function (..., envir = parent.frame(), workers = "") [13:13:43.233] - tweaked: FALSE [13:13:43.233] - call: plan(strategy) [13:13:43.234] plan(): nbrOfWorkers() = 1 [13:13:43.234] SequentialFuture started (and completed) [13:13:43.234] - Launch lazy future ... done [13:13:43.234] run() for 'SequentialFuture' ... done [13:13:43.234] Created future: [13:13:43.235] SequentialFuture: [13:13:43.235] Label: 'future_lapply-1' [13:13:43.235] Expression: [13:13:43.235] { [13:13:43.235] do.call(function(...) { [13:13:43.235] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:43.235] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:43.235] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:43.235] on.exit(options(oopts), add = TRUE) [13:13:43.235] } [13:13:43.235] { [13:13:43.235] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:43.235] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:43.235] ...future.FUN(...future.X_jj, ...) [13:13:43.235] }) [13:13:43.235] } [13:13:43.235] }, args = future.call.arguments) [13:13:43.235] } [13:13:43.235] Lazy evaluation: FALSE [13:13:43.235] Asynchronous evaluation: FALSE [13:13:43.235] Local evaluation: TRUE [13:13:43.235] Environment: R_GlobalEnv [13:13:43.235] Capture standard output: TRUE [13:13:43.235] Capture condition classes: 'condition' (excluding 'nothing') [13:13:43.235] 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) [13:13:43.235] Packages: 1 packages ('future') [13:13:43.235] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:43.235] Resolved: TRUE [13:13:43.235] Value: 136 bytes of class 'list' [13:13:43.235] Early signaling: FALSE [13:13:43.235] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:43.235] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:43.236] Chunk #1 of 1 ... DONE [13:13:43.236] Launching 1 futures (chunks) ... DONE [13:13:43.236] Resolving 1 futures (chunks) ... [13:13:43.236] resolve() on list ... [13:13:43.236] recursive: 0 [13:13:43.236] length: 1 [13:13:43.236] [13:13:43.236] resolved() for 'SequentialFuture' ... [13:13:43.236] - state: 'finished' [13:13:43.237] - run: TRUE [13:13:43.237] - result: 'FutureResult' [13:13:43.237] resolved() for 'SequentialFuture' ... done [13:13:43.237] Future #1 [13:13:43.237] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:43.237] - nx: 1 [13:13:43.237] - relay: TRUE [13:13:43.237] - stdout: TRUE [13:13:43.238] - signal: TRUE [13:13:43.238] - resignal: FALSE [13:13:43.238] - force: TRUE [13:13:43.238] - relayed: [n=1] FALSE [13:13:43.238] - queued futures: [n=1] FALSE [13:13:43.238] - until=1 [13:13:43.238] - relaying element #1 [13:13:43.238] - relayed: [n=1] TRUE [13:13:43.239] - queued futures: [n=1] TRUE [13:13:43.239] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:43.239] length: 0 (resolved future 1) [13:13:43.239] Relaying remaining futures [13:13:43.239] signalConditionsASAP(NULL, pos=0) ... [13:13:43.239] - nx: 1 [13:13:43.239] - relay: TRUE [13:13:43.239] - stdout: TRUE [13:13:43.239] - signal: TRUE [13:13:43.240] - resignal: FALSE [13:13:43.240] - force: TRUE [13:13:43.240] - relayed: [n=1] TRUE [13:13:43.240] - queued futures: [n=1] TRUE - flush all [13:13:43.240] - relayed: [n=1] TRUE [13:13:43.240] - queued futures: [n=1] TRUE [13:13:43.240] signalConditionsASAP(NULL, pos=0) ... done [13:13:43.240] resolve() on list ... DONE [13:13:43.240] - Number of value chunks collected: 1 [13:13:43.241] Resolving 1 futures (chunks) ... DONE [13:13:43.241] Reducing values from 1 chunks ... [13:13:43.241] - Number of values collected after concatenation: 1 [13:13:43.241] - Number of values expected: 1 [13:13:43.241] Reducing values from 1 chunks ... DONE [13:13:43.241] future_lapply() ... DONE List of 1 $ y:List of 1 ..$ a: chr "hello; 1; 2; ...; 100" - future_lapply(x, FUN = listenv::listenv, ...) ... [13:13:43.242] future_lapply() ... [13:13:43.242] Number of chunks: 1 [13:13:43.243] getGlobalsAndPackagesXApply() ... [13:13:43.243] - future.globals: TRUE [13:13:43.243] getGlobalsAndPackages() ... [13:13:43.243] Searching for globals... [13:13:43.244] - globals found: [4] 'FUN', '{', 'get', 'parent.env' [13:13:43.244] Searching for globals ... DONE [13:13:43.244] Resolving globals: FALSE [13:13:43.245] The total size of the 1 globals is 4.85 KiB (4968 bytes) [13:13:43.245] 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') [13:13:43.245] - globals: [1] 'FUN' [13:13:43.245] - packages: [1] 'listenv' [13:13:43.245] getGlobalsAndPackages() ... DONE [13:13:43.245] - globals found/used: [n=1] 'FUN' [13:13:43.246] - needed namespaces: [n=1] 'listenv' [13:13:43.246] Finding globals ... DONE [13:13:43.246] - use_args: TRUE [13:13:43.246] - Getting '...' globals ... [13:13:43.246] resolve() on list ... [13:13:43.246] recursive: 0 [13:13:43.246] length: 1 [13:13:43.247] elements: '...' [13:13:43.247] length: 0 (resolved future 1) [13:13:43.247] resolve() on list ... DONE [13:13:43.247] - '...' content: [n=0] [13:13:43.247] List of 1 [13:13:43.247] $ ...: list() [13:13:43.247] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:43.247] - attr(*, "where")=List of 1 [13:13:43.247] ..$ ...: [13:13:43.247] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:43.247] - attr(*, "resolved")= logi TRUE [13:13:43.247] - attr(*, "total_size")= num NA [13:13:43.249] - Getting '...' globals ... DONE [13:13:43.249] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:43.249] List of 2 [13:13:43.249] $ ...future.FUN:function (x, ...) [13:13:43.249] $ ... : list() [13:13:43.249] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:43.249] - attr(*, "where")=List of 2 [13:13:43.249] ..$ ...future.FUN: [13:13:43.249] ..$ ... : [13:13:43.249] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:43.249] - attr(*, "resolved")= logi FALSE [13:13:43.249] - attr(*, "total_size")= num 4968 [13:13:43.252] Packages to be attached in all futures: [n=1] 'listenv' [13:13:43.252] getGlobalsAndPackagesXApply() ... DONE [13:13:43.252] Number of futures (= number of chunks): 1 [13:13:43.252] Launching 1 futures (chunks) ... [13:13:43.252] Chunk #1 of 1 ... [13:13:43.252] - Finding globals in 'X' for chunk #1 ... [13:13:43.252] getGlobalsAndPackages() ... [13:13:43.253] Searching for globals... [13:13:43.253] [13:13:43.253] Searching for globals ... DONE [13:13:43.253] - globals: [0] [13:13:43.253] getGlobalsAndPackages() ... DONE [13:13:43.253] + additional globals found: [n=0] [13:13:43.254] + additional namespaces needed: [n=0] [13:13:43.254] - Finding globals in 'X' for chunk #1 ... DONE [13:13:43.254] - seeds: [13:13:43.254] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:43.254] getGlobalsAndPackages() ... [13:13:43.254] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:43.254] Resolving globals: FALSE [13:13:43.254] Tweak future expression to call with '...' arguments ... [13:13:43.255] { [13:13:43.255] do.call(function(...) { [13:13:43.255] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:43.255] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:43.255] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:43.255] on.exit(options(oopts), add = TRUE) [13:13:43.255] } [13:13:43.255] { [13:13:43.255] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:43.255] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:43.255] ...future.FUN(...future.X_jj, ...) [13:13:43.255] }) [13:13:43.255] } [13:13:43.255] }, args = future.call.arguments) [13:13:43.255] } [13:13:43.255] Tweak future expression to call with '...' arguments ... DONE [13:13:43.255] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:43.255] - packages: [1] 'listenv' [13:13:43.256] getGlobalsAndPackages() ... DONE [13:13:43.256] run() for 'Future' ... [13:13:43.256] - state: 'created' [13:13:43.256] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:13:43.256] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:43.256] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:43.257] - Field: 'label' [13:13:43.257] - Field: 'local' [13:13:43.257] - Field: 'owner' [13:13:43.257] - Field: 'envir' [13:13:43.257] - Field: 'packages' [13:13:43.257] - Field: 'gc' [13:13:43.257] - Field: 'conditions' [13:13:43.257] - Field: 'expr' [13:13:43.258] - Field: 'uuid' [13:13:43.258] - Field: 'seed' [13:13:43.258] - Field: 'version' [13:13:43.258] - Field: 'result' [13:13:43.258] - Field: 'asynchronous' [13:13:43.258] - Field: 'calls' [13:13:43.258] - Field: 'globals' [13:13:43.258] - Field: 'stdout' [13:13:43.259] - Field: 'earlySignal' [13:13:43.259] - Field: 'lazy' [13:13:43.259] - Field: 'state' [13:13:43.259] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:43.259] - Launch lazy future ... [13:13:43.259] Packages needed by the future expression (n = 1): 'listenv' [13:13:43.259] Packages needed by future strategies (n = 0): [13:13:43.260] { [13:13:43.260] { [13:13:43.260] { [13:13:43.260] ...future.startTime <- base::Sys.time() [13:13:43.260] { [13:13:43.260] { [13:13:43.260] { [13:13:43.260] { [13:13:43.260] base::local({ [13:13:43.260] has_future <- base::requireNamespace("future", [13:13:43.260] quietly = TRUE) [13:13:43.260] if (has_future) { [13:13:43.260] ns <- base::getNamespace("future") [13:13:43.260] version <- ns[[".package"]][["version"]] [13:13:43.260] if (is.null(version)) [13:13:43.260] version <- utils::packageVersion("future") [13:13:43.260] } [13:13:43.260] else { [13:13:43.260] version <- NULL [13:13:43.260] } [13:13:43.260] if (!has_future || version < "1.8.0") { [13:13:43.260] info <- base::c(r_version = base::gsub("R version ", [13:13:43.260] "", base::R.version$version.string), [13:13:43.260] platform = base::sprintf("%s (%s-bit)", [13:13:43.260] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:43.260] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:43.260] "release", "version")], collapse = " "), [13:13:43.260] hostname = base::Sys.info()[["nodename"]]) [13:13:43.260] info <- base::sprintf("%s: %s", base::names(info), [13:13:43.260] info) [13:13:43.260] info <- base::paste(info, collapse = "; ") [13:13:43.260] if (!has_future) { [13:13:43.260] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:43.260] info) [13:13:43.260] } [13:13:43.260] else { [13:13:43.260] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:43.260] info, version) [13:13:43.260] } [13:13:43.260] base::stop(msg) [13:13:43.260] } [13:13:43.260] }) [13:13:43.260] } [13:13:43.260] base::local({ [13:13:43.260] for (pkg in "listenv") { [13:13:43.260] base::loadNamespace(pkg) [13:13:43.260] base::library(pkg, character.only = TRUE) [13:13:43.260] } [13:13:43.260] }) [13:13:43.260] } [13:13:43.260] options(future.plan = NULL) [13:13:43.260] Sys.unsetenv("R_FUTURE_PLAN") [13:13:43.260] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:43.260] } [13:13:43.260] ...future.workdir <- getwd() [13:13:43.260] } [13:13:43.260] ...future.oldOptions <- base::as.list(base::.Options) [13:13:43.260] ...future.oldEnvVars <- base::Sys.getenv() [13:13:43.260] } [13:13:43.260] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:43.260] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:43.260] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:43.260] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:43.260] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:43.260] future.stdout.windows.reencode = NULL, width = 80L) [13:13:43.260] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:43.260] base::names(...future.oldOptions)) [13:13:43.260] } [13:13:43.260] if (FALSE) { [13:13:43.260] } [13:13:43.260] else { [13:13:43.260] if (TRUE) { [13:13:43.260] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:43.260] open = "w") [13:13:43.260] } [13:13:43.260] else { [13:13:43.260] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:43.260] windows = "NUL", "/dev/null"), open = "w") [13:13:43.260] } [13:13:43.260] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:43.260] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:43.260] base::sink(type = "output", split = FALSE) [13:13:43.260] base::close(...future.stdout) [13:13:43.260] }, add = TRUE) [13:13:43.260] } [13:13:43.260] ...future.frame <- base::sys.nframe() [13:13:43.260] ...future.conditions <- base::list() [13:13:43.260] ...future.rng <- base::globalenv()$.Random.seed [13:13:43.260] if (FALSE) { [13:13:43.260] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:43.260] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:43.260] } [13:13:43.260] ...future.result <- base::tryCatch({ [13:13:43.260] base::withCallingHandlers({ [13:13:43.260] ...future.value <- base::withVisible(base::local({ [13:13:43.260] do.call(function(...) { [13:13:43.260] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:43.260] if (!identical(...future.globals.maxSize.org, [13:13:43.260] ...future.globals.maxSize)) { [13:13:43.260] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:43.260] on.exit(options(oopts), add = TRUE) [13:13:43.260] } [13:13:43.260] { [13:13:43.260] lapply(seq_along(...future.elements_ii), [13:13:43.260] FUN = function(jj) { [13:13:43.260] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:43.260] ...future.FUN(...future.X_jj, ...) [13:13:43.260] }) [13:13:43.260] } [13:13:43.260] }, args = future.call.arguments) [13:13:43.260] })) [13:13:43.260] future::FutureResult(value = ...future.value$value, [13:13:43.260] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:43.260] ...future.rng), globalenv = if (FALSE) [13:13:43.260] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:43.260] ...future.globalenv.names)) [13:13:43.260] else NULL, started = ...future.startTime, version = "1.8") [13:13:43.260] }, condition = base::local({ [13:13:43.260] c <- base::c [13:13:43.260] inherits <- base::inherits [13:13:43.260] invokeRestart <- base::invokeRestart [13:13:43.260] length <- base::length [13:13:43.260] list <- base::list [13:13:43.260] seq.int <- base::seq.int [13:13:43.260] signalCondition <- base::signalCondition [13:13:43.260] sys.calls <- base::sys.calls [13:13:43.260] `[[` <- base::`[[` [13:13:43.260] `+` <- base::`+` [13:13:43.260] `<<-` <- base::`<<-` [13:13:43.260] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:43.260] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:43.260] 3L)] [13:13:43.260] } [13:13:43.260] function(cond) { [13:13:43.260] is_error <- inherits(cond, "error") [13:13:43.260] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:43.260] NULL) [13:13:43.260] if (is_error) { [13:13:43.260] sessionInformation <- function() { [13:13:43.260] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:43.260] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:43.260] search = base::search(), system = base::Sys.info()) [13:13:43.260] } [13:13:43.260] ...future.conditions[[length(...future.conditions) + [13:13:43.260] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:43.260] cond$call), session = sessionInformation(), [13:13:43.260] timestamp = base::Sys.time(), signaled = 0L) [13:13:43.260] signalCondition(cond) [13:13:43.260] } [13:13:43.260] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:43.260] "immediateCondition"))) { [13:13:43.260] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:43.260] ...future.conditions[[length(...future.conditions) + [13:13:43.260] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:43.260] if (TRUE && !signal) { [13:13:43.260] muffleCondition <- function (cond, pattern = "^muffle") [13:13:43.260] { [13:13:43.260] inherits <- base::inherits [13:13:43.260] invokeRestart <- base::invokeRestart [13:13:43.260] is.null <- base::is.null [13:13:43.260] muffled <- FALSE [13:13:43.260] if (inherits(cond, "message")) { [13:13:43.260] muffled <- grepl(pattern, "muffleMessage") [13:13:43.260] if (muffled) [13:13:43.260] invokeRestart("muffleMessage") [13:13:43.260] } [13:13:43.260] else if (inherits(cond, "warning")) { [13:13:43.260] muffled <- grepl(pattern, "muffleWarning") [13:13:43.260] if (muffled) [13:13:43.260] invokeRestart("muffleWarning") [13:13:43.260] } [13:13:43.260] else if (inherits(cond, "condition")) { [13:13:43.260] if (!is.null(pattern)) { [13:13:43.260] computeRestarts <- base::computeRestarts [13:13:43.260] grepl <- base::grepl [13:13:43.260] restarts <- computeRestarts(cond) [13:13:43.260] for (restart in restarts) { [13:13:43.260] name <- restart$name [13:13:43.260] if (is.null(name)) [13:13:43.260] next [13:13:43.260] if (!grepl(pattern, name)) [13:13:43.260] next [13:13:43.260] invokeRestart(restart) [13:13:43.260] muffled <- TRUE [13:13:43.260] break [13:13:43.260] } [13:13:43.260] } [13:13:43.260] } [13:13:43.260] invisible(muffled) [13:13:43.260] } [13:13:43.260] muffleCondition(cond, pattern = "^muffle") [13:13:43.260] } [13:13:43.260] } [13:13:43.260] else { [13:13:43.260] if (TRUE) { [13:13:43.260] muffleCondition <- function (cond, pattern = "^muffle") [13:13:43.260] { [13:13:43.260] inherits <- base::inherits [13:13:43.260] invokeRestart <- base::invokeRestart [13:13:43.260] is.null <- base::is.null [13:13:43.260] muffled <- FALSE [13:13:43.260] if (inherits(cond, "message")) { [13:13:43.260] muffled <- grepl(pattern, "muffleMessage") [13:13:43.260] if (muffled) [13:13:43.260] invokeRestart("muffleMessage") [13:13:43.260] } [13:13:43.260] else if (inherits(cond, "warning")) { [13:13:43.260] muffled <- grepl(pattern, "muffleWarning") [13:13:43.260] if (muffled) [13:13:43.260] invokeRestart("muffleWarning") [13:13:43.260] } [13:13:43.260] else if (inherits(cond, "condition")) { [13:13:43.260] if (!is.null(pattern)) { [13:13:43.260] computeRestarts <- base::computeRestarts [13:13:43.260] grepl <- base::grepl [13:13:43.260] restarts <- computeRestarts(cond) [13:13:43.260] for (restart in restarts) { [13:13:43.260] name <- restart$name [13:13:43.260] if (is.null(name)) [13:13:43.260] next [13:13:43.260] if (!grepl(pattern, name)) [13:13:43.260] next [13:13:43.260] invokeRestart(restart) [13:13:43.260] muffled <- TRUE [13:13:43.260] break [13:13:43.260] } [13:13:43.260] } [13:13:43.260] } [13:13:43.260] invisible(muffled) [13:13:43.260] } [13:13:43.260] muffleCondition(cond, pattern = "^muffle") [13:13:43.260] } [13:13:43.260] } [13:13:43.260] } [13:13:43.260] })) [13:13:43.260] }, error = function(ex) { [13:13:43.260] base::structure(base::list(value = NULL, visible = NULL, [13:13:43.260] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:43.260] ...future.rng), started = ...future.startTime, [13:13:43.260] finished = Sys.time(), session_uuid = NA_character_, [13:13:43.260] version = "1.8"), class = "FutureResult") [13:13:43.260] }, finally = { [13:13:43.260] if (!identical(...future.workdir, getwd())) [13:13:43.260] setwd(...future.workdir) [13:13:43.260] { [13:13:43.260] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:43.260] ...future.oldOptions$nwarnings <- NULL [13:13:43.260] } [13:13:43.260] base::options(...future.oldOptions) [13:13:43.260] if (.Platform$OS.type == "windows") { [13:13:43.260] old_names <- names(...future.oldEnvVars) [13:13:43.260] envs <- base::Sys.getenv() [13:13:43.260] names <- names(envs) [13:13:43.260] common <- intersect(names, old_names) [13:13:43.260] added <- setdiff(names, old_names) [13:13:43.260] removed <- setdiff(old_names, names) [13:13:43.260] changed <- common[...future.oldEnvVars[common] != [13:13:43.260] envs[common]] [13:13:43.260] NAMES <- toupper(changed) [13:13:43.260] args <- list() [13:13:43.260] for (kk in seq_along(NAMES)) { [13:13:43.260] name <- changed[[kk]] [13:13:43.260] NAME <- NAMES[[kk]] [13:13:43.260] if (name != NAME && is.element(NAME, old_names)) [13:13:43.260] next [13:13:43.260] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:43.260] } [13:13:43.260] NAMES <- toupper(added) [13:13:43.260] for (kk in seq_along(NAMES)) { [13:13:43.260] name <- added[[kk]] [13:13:43.260] NAME <- NAMES[[kk]] [13:13:43.260] if (name != NAME && is.element(NAME, old_names)) [13:13:43.260] next [13:13:43.260] args[[name]] <- "" [13:13:43.260] } [13:13:43.260] NAMES <- toupper(removed) [13:13:43.260] for (kk in seq_along(NAMES)) { [13:13:43.260] name <- removed[[kk]] [13:13:43.260] NAME <- NAMES[[kk]] [13:13:43.260] if (name != NAME && is.element(NAME, old_names)) [13:13:43.260] next [13:13:43.260] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:43.260] } [13:13:43.260] if (length(args) > 0) [13:13:43.260] base::do.call(base::Sys.setenv, args = args) [13:13:43.260] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:43.260] } [13:13:43.260] else { [13:13:43.260] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:43.260] } [13:13:43.260] { [13:13:43.260] if (base::length(...future.futureOptionsAdded) > [13:13:43.260] 0L) { [13:13:43.260] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:43.260] base::names(opts) <- ...future.futureOptionsAdded [13:13:43.260] base::options(opts) [13:13:43.260] } [13:13:43.260] { [13:13:43.260] { [13:13:43.260] NULL [13:13:43.260] RNGkind("Mersenne-Twister") [13:13:43.260] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:43.260] inherits = FALSE) [13:13:43.260] } [13:13:43.260] options(future.plan = NULL) [13:13:43.260] if (is.na(NA_character_)) [13:13:43.260] Sys.unsetenv("R_FUTURE_PLAN") [13:13:43.260] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:43.260] future::plan(list(function (..., envir = parent.frame()) [13:13:43.260] { [13:13:43.260] future <- SequentialFuture(..., envir = envir) [13:13:43.260] if (!future$lazy) [13:13:43.260] future <- run(future) [13:13:43.260] invisible(future) [13:13:43.260] }), .cleanup = FALSE, .init = FALSE) [13:13:43.260] } [13:13:43.260] } [13:13:43.260] } [13:13:43.260] }) [13:13:43.260] if (TRUE) { [13:13:43.260] base::sink(type = "output", split = FALSE) [13:13:43.260] if (TRUE) { [13:13:43.260] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:43.260] } [13:13:43.260] else { [13:13:43.260] ...future.result["stdout"] <- base::list(NULL) [13:13:43.260] } [13:13:43.260] base::close(...future.stdout) [13:13:43.260] ...future.stdout <- NULL [13:13:43.260] } [13:13:43.260] ...future.result$conditions <- ...future.conditions [13:13:43.260] ...future.result$finished <- base::Sys.time() [13:13:43.260] ...future.result [13:13:43.260] } [13:13:43.263] assign_globals() ... [13:13:43.263] List of 5 [13:13:43.263] $ ...future.FUN :function (x, ...) [13:13:43.263] $ future.call.arguments : list() [13:13:43.263] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:43.263] $ ...future.elements_ii :List of 2 [13:13:43.263] ..$ a:Classes 'listenv', 'environment' [13:13:43.263] ..$ b:Classes 'listenv', 'environment' [13:13:43.263] $ ...future.seeds_ii : NULL [13:13:43.263] $ ...future.globals.maxSize: NULL [13:13:43.263] - attr(*, "where")=List of 5 [13:13:43.263] ..$ ...future.FUN : [13:13:43.263] ..$ future.call.arguments : [13:13:43.263] ..$ ...future.elements_ii : [13:13:43.263] ..$ ...future.seeds_ii : [13:13:43.263] ..$ ...future.globals.maxSize: [13:13:43.263] - attr(*, "resolved")= logi FALSE [13:13:43.263] - attr(*, "total_size")= num 4968 [13:13:43.263] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:43.263] - attr(*, "already-done")= logi TRUE [13:13:43.267] - copied '...future.FUN' to environment [13:13:43.267] - copied 'future.call.arguments' to environment [13:13:43.267] - copied '...future.elements_ii' to environment [13:13:43.267] - copied '...future.seeds_ii' to environment [13:13:43.268] - copied '...future.globals.maxSize' to environment [13:13:43.268] assign_globals() ... done [13:13:43.268] plan(): Setting new future strategy stack: [13:13:43.268] List of future strategies: [13:13:43.268] 1. sequential: [13:13:43.268] - args: function (..., envir = parent.frame(), workers = "") [13:13:43.268] - tweaked: FALSE [13:13:43.268] - call: NULL [13:13:43.269] plan(): nbrOfWorkers() = 1 [13:13:43.269] plan(): Setting new future strategy stack: [13:13:43.270] List of future strategies: [13:13:43.270] 1. sequential: [13:13:43.270] - args: function (..., envir = parent.frame(), workers = "") [13:13:43.270] - tweaked: FALSE [13:13:43.270] - call: plan(strategy) [13:13:43.270] plan(): nbrOfWorkers() = 1 [13:13:43.270] SequentialFuture started (and completed) [13:13:43.270] - Launch lazy future ... done [13:13:43.270] run() for 'SequentialFuture' ... done [13:13:43.271] Created future: [13:13:43.271] SequentialFuture: [13:13:43.271] Label: 'future_lapply-1' [13:13:43.271] Expression: [13:13:43.271] { [13:13:43.271] do.call(function(...) { [13:13:43.271] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:43.271] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:43.271] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:43.271] on.exit(options(oopts), add = TRUE) [13:13:43.271] } [13:13:43.271] { [13:13:43.271] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:43.271] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:43.271] ...future.FUN(...future.X_jj, ...) [13:13:43.271] }) [13:13:43.271] } [13:13:43.271] }, args = future.call.arguments) [13:13:43.271] } [13:13:43.271] Lazy evaluation: FALSE [13:13:43.271] Asynchronous evaluation: FALSE [13:13:43.271] Local evaluation: TRUE [13:13:43.271] Environment: R_GlobalEnv [13:13:43.271] Capture standard output: TRUE [13:13:43.271] Capture condition classes: 'condition' (excluding 'nothing') [13:13:43.271] 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) [13:13:43.271] Packages: 1 packages ('listenv') [13:13:43.271] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:43.271] Resolved: TRUE [13:13:43.271] Value: 800 bytes of class 'list' [13:13:43.271] Early signaling: FALSE [13:13:43.271] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:43.271] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:43.273] Chunk #1 of 1 ... DONE [13:13:43.274] Launching 1 futures (chunks) ... DONE [13:13:43.274] Resolving 1 futures (chunks) ... [13:13:43.274] resolve() on list ... [13:13:43.274] recursive: 0 [13:13:43.274] length: 1 [13:13:43.274] [13:13:43.274] resolved() for 'SequentialFuture' ... [13:13:43.274] - state: 'finished' [13:13:43.274] - run: TRUE [13:13:43.275] - result: 'FutureResult' [13:13:43.275] resolved() for 'SequentialFuture' ... done [13:13:43.275] Future #1 [13:13:43.275] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:43.275] - nx: 1 [13:13:43.275] - relay: TRUE [13:13:43.275] - stdout: TRUE [13:13:43.275] - signal: TRUE [13:13:43.276] - resignal: FALSE [13:13:43.276] - force: TRUE [13:13:43.276] - relayed: [n=1] FALSE [13:13:43.276] - queued futures: [n=1] FALSE [13:13:43.276] - until=1 [13:13:43.276] - relaying element #1 [13:13:43.276] - relayed: [n=1] TRUE [13:13:43.276] - queued futures: [n=1] TRUE [13:13:43.277] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:43.277] length: 0 (resolved future 1) [13:13:43.277] Relaying remaining futures [13:13:43.277] signalConditionsASAP(NULL, pos=0) ... [13:13:43.277] - nx: 1 [13:13:43.277] - relay: TRUE [13:13:43.277] - stdout: TRUE [13:13:43.277] - signal: TRUE [13:13:43.277] - resignal: FALSE [13:13:43.277] - force: TRUE [13:13:43.278] - relayed: [n=1] TRUE [13:13:43.278] - queued futures: [n=1] TRUE - flush all [13:13:43.278] - relayed: [n=1] TRUE [13:13:43.278] - queued futures: [n=1] TRUE [13:13:43.278] signalConditionsASAP(NULL, pos=0) ... done [13:13:43.278] resolve() on list ... DONE [13:13:43.278] - Number of value chunks collected: 1 [13:13:43.278] Resolving 1 futures (chunks) ... DONE [13:13:43.279] Reducing values from 1 chunks ... [13:13:43.279] - Number of values collected after concatenation: 2 [13:13:43.279] - Number of values expected: 2 [13:13:43.279] Reducing values from 1 chunks ... DONE [13:13:43.279] 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, ...) ... [13:13:43.280] future_lapply() ... [13:13:43.281] Number of chunks: 1 [13:13:43.281] Index remapping (attribute 'ordering'): [n = 4] 4, 2, 3, 1 [13:13:43.281] getGlobalsAndPackagesXApply() ... [13:13:43.281] - future.globals: TRUE [13:13:43.282] getGlobalsAndPackages() ... [13:13:43.282] Searching for globals... [13:13:43.283] - globals found: [2] 'FUN', '.Internal' [13:13:43.283] Searching for globals ... DONE [13:13:43.283] Resolving globals: FALSE [13:13:43.283] The total size of the 1 globals is 2.13 KiB (2184 bytes) [13:13:43.283] 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') [13:13:43.284] - globals: [1] 'FUN' [13:13:43.284] [13:13:43.284] getGlobalsAndPackages() ... DONE [13:13:43.284] - globals found/used: [n=1] 'FUN' [13:13:43.284] - needed namespaces: [n=0] [13:13:43.284] Finding globals ... DONE [13:13:43.284] - use_args: TRUE [13:13:43.284] - Getting '...' globals ... [13:13:43.285] resolve() on list ... [13:13:43.285] recursive: 0 [13:13:43.285] length: 1 [13:13:43.285] elements: '...' [13:13:43.285] length: 0 (resolved future 1) [13:13:43.285] resolve() on list ... DONE [13:13:43.285] - '...' content: [n=1] 'length' [13:13:43.285] List of 1 [13:13:43.285] $ ...:List of 1 [13:13:43.285] ..$ length: int 2 [13:13:43.285] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:43.285] - attr(*, "where")=List of 1 [13:13:43.285] ..$ ...: [13:13:43.285] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:43.285] - attr(*, "resolved")= logi TRUE [13:13:43.285] - attr(*, "total_size")= num NA [13:13:43.288] - Getting '...' globals ... DONE [13:13:43.288] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:43.288] List of 2 [13:13:43.288] $ ...future.FUN:function (mode = "logical", length = 0L) [13:13:43.288] $ ... :List of 1 [13:13:43.288] ..$ length: int 2 [13:13:43.288] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:43.288] - attr(*, "where")=List of 2 [13:13:43.288] ..$ ...future.FUN: [13:13:43.288] ..$ ... : [13:13:43.288] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:43.288] - attr(*, "resolved")= logi FALSE [13:13:43.288] - attr(*, "total_size")= num 2240 [13:13:43.291] Packages to be attached in all futures: [n=0] [13:13:43.291] getGlobalsAndPackagesXApply() ... DONE [13:13:43.291] Number of futures (= number of chunks): 1 [13:13:43.291] Launching 1 futures (chunks) ... [13:13:43.291] Chunk #1 of 1 ... [13:13:43.292] - Finding globals in 'X' for chunk #1 ... [13:13:43.292] getGlobalsAndPackages() ... [13:13:43.292] Searching for globals... [13:13:43.292] [13:13:43.292] Searching for globals ... DONE [13:13:43.292] - globals: [0] [13:13:43.292] getGlobalsAndPackages() ... DONE [13:13:43.292] + additional globals found: [n=0] [13:13:43.293] + additional namespaces needed: [n=0] [13:13:43.293] - Finding globals in 'X' for chunk #1 ... DONE [13:13:43.293] - seeds: [13:13:43.293] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:43.293] getGlobalsAndPackages() ... [13:13:43.293] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:43.293] Resolving globals: FALSE [13:13:43.293] Tweak future expression to call with '...' arguments ... [13:13:43.293] { [13:13:43.293] do.call(function(...) { [13:13:43.293] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:43.293] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:43.293] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:43.293] on.exit(options(oopts), add = TRUE) [13:13:43.293] } [13:13:43.293] { [13:13:43.293] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:43.293] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:43.293] ...future.FUN(...future.X_jj, ...) [13:13:43.293] }) [13:13:43.293] } [13:13:43.293] }, args = future.call.arguments) [13:13:43.293] } [13:13:43.294] Tweak future expression to call with '...' arguments ... DONE [13:13:43.294] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:43.294] [13:13:43.294] getGlobalsAndPackages() ... DONE [13:13:43.295] run() for 'Future' ... [13:13:43.295] - state: 'created' [13:13:43.295] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:13:43.295] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:43.295] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:43.295] - Field: 'label' [13:13:43.296] - Field: 'local' [13:13:43.296] - Field: 'owner' [13:13:43.296] - Field: 'envir' [13:13:43.296] - Field: 'packages' [13:13:43.296] - Field: 'gc' [13:13:43.296] - Field: 'conditions' [13:13:43.296] - Field: 'expr' [13:13:43.296] - Field: 'uuid' [13:13:43.297] - Field: 'seed' [13:13:43.297] - Field: 'version' [13:13:43.297] - Field: 'result' [13:13:43.297] - Field: 'asynchronous' [13:13:43.297] - Field: 'calls' [13:13:43.297] - Field: 'globals' [13:13:43.297] - Field: 'stdout' [13:13:43.297] - Field: 'earlySignal' [13:13:43.298] - Field: 'lazy' [13:13:43.298] - Field: 'state' [13:13:43.298] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:43.298] - Launch lazy future ... [13:13:43.298] Packages needed by the future expression (n = 0): [13:13:43.298] Packages needed by future strategies (n = 0): [13:13:43.299] { [13:13:43.299] { [13:13:43.299] { [13:13:43.299] ...future.startTime <- base::Sys.time() [13:13:43.299] { [13:13:43.299] { [13:13:43.299] { [13:13:43.299] base::local({ [13:13:43.299] has_future <- base::requireNamespace("future", [13:13:43.299] quietly = TRUE) [13:13:43.299] if (has_future) { [13:13:43.299] ns <- base::getNamespace("future") [13:13:43.299] version <- ns[[".package"]][["version"]] [13:13:43.299] if (is.null(version)) [13:13:43.299] version <- utils::packageVersion("future") [13:13:43.299] } [13:13:43.299] else { [13:13:43.299] version <- NULL [13:13:43.299] } [13:13:43.299] if (!has_future || version < "1.8.0") { [13:13:43.299] info <- base::c(r_version = base::gsub("R version ", [13:13:43.299] "", base::R.version$version.string), [13:13:43.299] platform = base::sprintf("%s (%s-bit)", [13:13:43.299] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:43.299] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:43.299] "release", "version")], collapse = " "), [13:13:43.299] hostname = base::Sys.info()[["nodename"]]) [13:13:43.299] info <- base::sprintf("%s: %s", base::names(info), [13:13:43.299] info) [13:13:43.299] info <- base::paste(info, collapse = "; ") [13:13:43.299] if (!has_future) { [13:13:43.299] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:43.299] info) [13:13:43.299] } [13:13:43.299] else { [13:13:43.299] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:43.299] info, version) [13:13:43.299] } [13:13:43.299] base::stop(msg) [13:13:43.299] } [13:13:43.299] }) [13:13:43.299] } [13:13:43.299] options(future.plan = NULL) [13:13:43.299] Sys.unsetenv("R_FUTURE_PLAN") [13:13:43.299] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:43.299] } [13:13:43.299] ...future.workdir <- getwd() [13:13:43.299] } [13:13:43.299] ...future.oldOptions <- base::as.list(base::.Options) [13:13:43.299] ...future.oldEnvVars <- base::Sys.getenv() [13:13:43.299] } [13:13:43.299] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:43.299] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:43.299] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:43.299] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:43.299] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:43.299] future.stdout.windows.reencode = NULL, width = 80L) [13:13:43.299] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:43.299] base::names(...future.oldOptions)) [13:13:43.299] } [13:13:43.299] if (FALSE) { [13:13:43.299] } [13:13:43.299] else { [13:13:43.299] if (TRUE) { [13:13:43.299] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:43.299] open = "w") [13:13:43.299] } [13:13:43.299] else { [13:13:43.299] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:43.299] windows = "NUL", "/dev/null"), open = "w") [13:13:43.299] } [13:13:43.299] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:43.299] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:43.299] base::sink(type = "output", split = FALSE) [13:13:43.299] base::close(...future.stdout) [13:13:43.299] }, add = TRUE) [13:13:43.299] } [13:13:43.299] ...future.frame <- base::sys.nframe() [13:13:43.299] ...future.conditions <- base::list() [13:13:43.299] ...future.rng <- base::globalenv()$.Random.seed [13:13:43.299] if (FALSE) { [13:13:43.299] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:43.299] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:43.299] } [13:13:43.299] ...future.result <- base::tryCatch({ [13:13:43.299] base::withCallingHandlers({ [13:13:43.299] ...future.value <- base::withVisible(base::local({ [13:13:43.299] do.call(function(...) { [13:13:43.299] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:43.299] if (!identical(...future.globals.maxSize.org, [13:13:43.299] ...future.globals.maxSize)) { [13:13:43.299] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:43.299] on.exit(options(oopts), add = TRUE) [13:13:43.299] } [13:13:43.299] { [13:13:43.299] lapply(seq_along(...future.elements_ii), [13:13:43.299] FUN = function(jj) { [13:13:43.299] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:43.299] ...future.FUN(...future.X_jj, ...) [13:13:43.299] }) [13:13:43.299] } [13:13:43.299] }, args = future.call.arguments) [13:13:43.299] })) [13:13:43.299] future::FutureResult(value = ...future.value$value, [13:13:43.299] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:43.299] ...future.rng), globalenv = if (FALSE) [13:13:43.299] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:43.299] ...future.globalenv.names)) [13:13:43.299] else NULL, started = ...future.startTime, version = "1.8") [13:13:43.299] }, condition = base::local({ [13:13:43.299] c <- base::c [13:13:43.299] inherits <- base::inherits [13:13:43.299] invokeRestart <- base::invokeRestart [13:13:43.299] length <- base::length [13:13:43.299] list <- base::list [13:13:43.299] seq.int <- base::seq.int [13:13:43.299] signalCondition <- base::signalCondition [13:13:43.299] sys.calls <- base::sys.calls [13:13:43.299] `[[` <- base::`[[` [13:13:43.299] `+` <- base::`+` [13:13:43.299] `<<-` <- base::`<<-` [13:13:43.299] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:43.299] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:43.299] 3L)] [13:13:43.299] } [13:13:43.299] function(cond) { [13:13:43.299] is_error <- inherits(cond, "error") [13:13:43.299] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:43.299] NULL) [13:13:43.299] if (is_error) { [13:13:43.299] sessionInformation <- function() { [13:13:43.299] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:43.299] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:43.299] search = base::search(), system = base::Sys.info()) [13:13:43.299] } [13:13:43.299] ...future.conditions[[length(...future.conditions) + [13:13:43.299] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:43.299] cond$call), session = sessionInformation(), [13:13:43.299] timestamp = base::Sys.time(), signaled = 0L) [13:13:43.299] signalCondition(cond) [13:13:43.299] } [13:13:43.299] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:43.299] "immediateCondition"))) { [13:13:43.299] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:43.299] ...future.conditions[[length(...future.conditions) + [13:13:43.299] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:43.299] if (TRUE && !signal) { [13:13:43.299] muffleCondition <- function (cond, pattern = "^muffle") [13:13:43.299] { [13:13:43.299] inherits <- base::inherits [13:13:43.299] invokeRestart <- base::invokeRestart [13:13:43.299] is.null <- base::is.null [13:13:43.299] muffled <- FALSE [13:13:43.299] if (inherits(cond, "message")) { [13:13:43.299] muffled <- grepl(pattern, "muffleMessage") [13:13:43.299] if (muffled) [13:13:43.299] invokeRestart("muffleMessage") [13:13:43.299] } [13:13:43.299] else if (inherits(cond, "warning")) { [13:13:43.299] muffled <- grepl(pattern, "muffleWarning") [13:13:43.299] if (muffled) [13:13:43.299] invokeRestart("muffleWarning") [13:13:43.299] } [13:13:43.299] else if (inherits(cond, "condition")) { [13:13:43.299] if (!is.null(pattern)) { [13:13:43.299] computeRestarts <- base::computeRestarts [13:13:43.299] grepl <- base::grepl [13:13:43.299] restarts <- computeRestarts(cond) [13:13:43.299] for (restart in restarts) { [13:13:43.299] name <- restart$name [13:13:43.299] if (is.null(name)) [13:13:43.299] next [13:13:43.299] if (!grepl(pattern, name)) [13:13:43.299] next [13:13:43.299] invokeRestart(restart) [13:13:43.299] muffled <- TRUE [13:13:43.299] break [13:13:43.299] } [13:13:43.299] } [13:13:43.299] } [13:13:43.299] invisible(muffled) [13:13:43.299] } [13:13:43.299] muffleCondition(cond, pattern = "^muffle") [13:13:43.299] } [13:13:43.299] } [13:13:43.299] else { [13:13:43.299] if (TRUE) { [13:13:43.299] muffleCondition <- function (cond, pattern = "^muffle") [13:13:43.299] { [13:13:43.299] inherits <- base::inherits [13:13:43.299] invokeRestart <- base::invokeRestart [13:13:43.299] is.null <- base::is.null [13:13:43.299] muffled <- FALSE [13:13:43.299] if (inherits(cond, "message")) { [13:13:43.299] muffled <- grepl(pattern, "muffleMessage") [13:13:43.299] if (muffled) [13:13:43.299] invokeRestart("muffleMessage") [13:13:43.299] } [13:13:43.299] else if (inherits(cond, "warning")) { [13:13:43.299] muffled <- grepl(pattern, "muffleWarning") [13:13:43.299] if (muffled) [13:13:43.299] invokeRestart("muffleWarning") [13:13:43.299] } [13:13:43.299] else if (inherits(cond, "condition")) { [13:13:43.299] if (!is.null(pattern)) { [13:13:43.299] computeRestarts <- base::computeRestarts [13:13:43.299] grepl <- base::grepl [13:13:43.299] restarts <- computeRestarts(cond) [13:13:43.299] for (restart in restarts) { [13:13:43.299] name <- restart$name [13:13:43.299] if (is.null(name)) [13:13:43.299] next [13:13:43.299] if (!grepl(pattern, name)) [13:13:43.299] next [13:13:43.299] invokeRestart(restart) [13:13:43.299] muffled <- TRUE [13:13:43.299] break [13:13:43.299] } [13:13:43.299] } [13:13:43.299] } [13:13:43.299] invisible(muffled) [13:13:43.299] } [13:13:43.299] muffleCondition(cond, pattern = "^muffle") [13:13:43.299] } [13:13:43.299] } [13:13:43.299] } [13:13:43.299] })) [13:13:43.299] }, error = function(ex) { [13:13:43.299] base::structure(base::list(value = NULL, visible = NULL, [13:13:43.299] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:43.299] ...future.rng), started = ...future.startTime, [13:13:43.299] finished = Sys.time(), session_uuid = NA_character_, [13:13:43.299] version = "1.8"), class = "FutureResult") [13:13:43.299] }, finally = { [13:13:43.299] if (!identical(...future.workdir, getwd())) [13:13:43.299] setwd(...future.workdir) [13:13:43.299] { [13:13:43.299] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:43.299] ...future.oldOptions$nwarnings <- NULL [13:13:43.299] } [13:13:43.299] base::options(...future.oldOptions) [13:13:43.299] if (.Platform$OS.type == "windows") { [13:13:43.299] old_names <- names(...future.oldEnvVars) [13:13:43.299] envs <- base::Sys.getenv() [13:13:43.299] names <- names(envs) [13:13:43.299] common <- intersect(names, old_names) [13:13:43.299] added <- setdiff(names, old_names) [13:13:43.299] removed <- setdiff(old_names, names) [13:13:43.299] changed <- common[...future.oldEnvVars[common] != [13:13:43.299] envs[common]] [13:13:43.299] NAMES <- toupper(changed) [13:13:43.299] args <- list() [13:13:43.299] for (kk in seq_along(NAMES)) { [13:13:43.299] name <- changed[[kk]] [13:13:43.299] NAME <- NAMES[[kk]] [13:13:43.299] if (name != NAME && is.element(NAME, old_names)) [13:13:43.299] next [13:13:43.299] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:43.299] } [13:13:43.299] NAMES <- toupper(added) [13:13:43.299] for (kk in seq_along(NAMES)) { [13:13:43.299] name <- added[[kk]] [13:13:43.299] NAME <- NAMES[[kk]] [13:13:43.299] if (name != NAME && is.element(NAME, old_names)) [13:13:43.299] next [13:13:43.299] args[[name]] <- "" [13:13:43.299] } [13:13:43.299] NAMES <- toupper(removed) [13:13:43.299] for (kk in seq_along(NAMES)) { [13:13:43.299] name <- removed[[kk]] [13:13:43.299] NAME <- NAMES[[kk]] [13:13:43.299] if (name != NAME && is.element(NAME, old_names)) [13:13:43.299] next [13:13:43.299] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:43.299] } [13:13:43.299] if (length(args) > 0) [13:13:43.299] base::do.call(base::Sys.setenv, args = args) [13:13:43.299] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:43.299] } [13:13:43.299] else { [13:13:43.299] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:43.299] } [13:13:43.299] { [13:13:43.299] if (base::length(...future.futureOptionsAdded) > [13:13:43.299] 0L) { [13:13:43.299] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:43.299] base::names(opts) <- ...future.futureOptionsAdded [13:13:43.299] base::options(opts) [13:13:43.299] } [13:13:43.299] { [13:13:43.299] { [13:13:43.299] NULL [13:13:43.299] RNGkind("Mersenne-Twister") [13:13:43.299] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:43.299] inherits = FALSE) [13:13:43.299] } [13:13:43.299] options(future.plan = NULL) [13:13:43.299] if (is.na(NA_character_)) [13:13:43.299] Sys.unsetenv("R_FUTURE_PLAN") [13:13:43.299] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:43.299] future::plan(list(function (..., envir = parent.frame()) [13:13:43.299] { [13:13:43.299] future <- SequentialFuture(..., envir = envir) [13:13:43.299] if (!future$lazy) [13:13:43.299] future <- run(future) [13:13:43.299] invisible(future) [13:13:43.299] }), .cleanup = FALSE, .init = FALSE) [13:13:43.299] } [13:13:43.299] } [13:13:43.299] } [13:13:43.299] }) [13:13:43.299] if (TRUE) { [13:13:43.299] base::sink(type = "output", split = FALSE) [13:13:43.299] if (TRUE) { [13:13:43.299] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:43.299] } [13:13:43.299] else { [13:13:43.299] ...future.result["stdout"] <- base::list(NULL) [13:13:43.299] } [13:13:43.299] base::close(...future.stdout) [13:13:43.299] ...future.stdout <- NULL [13:13:43.299] } [13:13:43.299] ...future.result$conditions <- ...future.conditions [13:13:43.299] ...future.result$finished <- base::Sys.time() [13:13:43.299] ...future.result [13:13:43.299] } [13:13:43.301] assign_globals() ... [13:13:43.301] List of 5 [13:13:43.301] $ ...future.FUN :function (mode = "logical", length = 0L) [13:13:43.301] $ future.call.arguments :List of 1 [13:13:43.301] ..$ length: int 2 [13:13:43.301] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:43.301] $ ...future.elements_ii :List of 4 [13:13:43.301] ..$ c: chr "list" [13:13:43.301] ..$ b: chr "numeric" [13:13:43.301] ..$ c: chr "character" [13:13:43.301] ..$ a: chr "integer" [13:13:43.301] $ ...future.seeds_ii : NULL [13:13:43.301] $ ...future.globals.maxSize: NULL [13:13:43.301] - attr(*, "where")=List of 5 [13:13:43.301] ..$ ...future.FUN : [13:13:43.301] ..$ future.call.arguments : [13:13:43.301] ..$ ...future.elements_ii : [13:13:43.301] ..$ ...future.seeds_ii : [13:13:43.301] ..$ ...future.globals.maxSize: [13:13:43.301] - attr(*, "resolved")= logi FALSE [13:13:43.301] - attr(*, "total_size")= num 2240 [13:13:43.301] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:43.301] - attr(*, "already-done")= logi TRUE [13:13:43.306] - copied '...future.FUN' to environment [13:13:43.306] - copied 'future.call.arguments' to environment [13:13:43.306] - copied '...future.elements_ii' to environment [13:13:43.307] - copied '...future.seeds_ii' to environment [13:13:43.307] - copied '...future.globals.maxSize' to environment [13:13:43.307] assign_globals() ... done [13:13:43.307] plan(): Setting new future strategy stack: [13:13:43.307] List of future strategies: [13:13:43.307] 1. sequential: [13:13:43.307] - args: function (..., envir = parent.frame(), workers = "") [13:13:43.307] - tweaked: FALSE [13:13:43.307] - call: NULL [13:13:43.308] plan(): nbrOfWorkers() = 1 [13:13:43.308] plan(): Setting new future strategy stack: [13:13:43.309] List of future strategies: [13:13:43.309] 1. sequential: [13:13:43.309] - args: function (..., envir = parent.frame(), workers = "") [13:13:43.309] - tweaked: FALSE [13:13:43.309] - call: plan(strategy) [13:13:43.309] plan(): nbrOfWorkers() = 1 [13:13:43.309] SequentialFuture started (and completed) [13:13:43.309] - Launch lazy future ... done [13:13:43.309] run() for 'SequentialFuture' ... done [13:13:43.310] Created future: [13:13:43.310] SequentialFuture: [13:13:43.310] Label: 'future_lapply-1' [13:13:43.310] Expression: [13:13:43.310] { [13:13:43.310] do.call(function(...) { [13:13:43.310] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:43.310] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:43.310] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:43.310] on.exit(options(oopts), add = TRUE) [13:13:43.310] } [13:13:43.310] { [13:13:43.310] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:43.310] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:43.310] ...future.FUN(...future.X_jj, ...) [13:13:43.310] }) [13:13:43.310] } [13:13:43.310] }, args = future.call.arguments) [13:13:43.310] } [13:13:43.310] Lazy evaluation: FALSE [13:13:43.310] Asynchronous evaluation: FALSE [13:13:43.310] Local evaluation: TRUE [13:13:43.310] Environment: R_GlobalEnv [13:13:43.310] Capture standard output: TRUE [13:13:43.310] Capture condition classes: 'condition' (excluding 'nothing') [13:13:43.310] 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) [13:13:43.310] Packages: [13:13:43.310] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:43.310] Resolved: TRUE [13:13:43.310] Value: 240 bytes of class 'list' [13:13:43.310] Early signaling: FALSE [13:13:43.310] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:43.310] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:43.311] Chunk #1 of 1 ... DONE [13:13:43.311] Launching 1 futures (chunks) ... DONE [13:13:43.311] Resolving 1 futures (chunks) ... [13:13:43.311] resolve() on list ... [13:13:43.311] recursive: 0 [13:13:43.311] length: 1 [13:13:43.311] [13:13:43.311] resolved() for 'SequentialFuture' ... [13:13:43.312] - state: 'finished' [13:13:43.312] - run: TRUE [13:13:43.312] - result: 'FutureResult' [13:13:43.312] resolved() for 'SequentialFuture' ... done [13:13:43.312] Future #1 [13:13:43.312] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:43.312] - nx: 1 [13:13:43.312] - relay: TRUE [13:13:43.313] - stdout: TRUE [13:13:43.313] - signal: TRUE [13:13:43.313] - resignal: FALSE [13:13:43.313] - force: TRUE [13:13:43.313] - relayed: [n=1] FALSE [13:13:43.313] - queued futures: [n=1] FALSE [13:13:43.313] - until=1 [13:13:43.313] - relaying element #1 [13:13:43.313] - relayed: [n=1] TRUE [13:13:43.314] - queued futures: [n=1] TRUE [13:13:43.314] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:43.314] length: 0 (resolved future 1) [13:13:43.314] Relaying remaining futures [13:13:43.314] signalConditionsASAP(NULL, pos=0) ... [13:13:43.314] - nx: 1 [13:13:43.314] - relay: TRUE [13:13:43.314] - stdout: TRUE [13:13:43.314] - signal: TRUE [13:13:43.315] - resignal: FALSE [13:13:43.315] - force: TRUE [13:13:43.315] - relayed: [n=1] TRUE [13:13:43.315] - queued futures: [n=1] TRUE - flush all [13:13:43.315] - relayed: [n=1] TRUE [13:13:43.315] - queued futures: [n=1] TRUE [13:13:43.315] signalConditionsASAP(NULL, pos=0) ... done [13:13:43.315] resolve() on list ... DONE [13:13:43.316] - Number of value chunks collected: 1 [13:13:43.316] Resolving 1 futures (chunks) ... DONE [13:13:43.316] Reducing values from 1 chunks ... [13:13:43.316] - Number of values collected after concatenation: 4 [13:13:43.316] - Number of values expected: 4 [13:13:43.316] Reverse index remapping (attribute 'ordering'): [n = 4] 4, 2, 3, 1 [13:13:43.316] Reducing values from 1 chunks ... DONE [13:13:43.316] 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 [13:13:43.318] future_lapply() ... [13:13:43.319] Number of chunks: 1 [13:13:43.319] Index remapping (attribute 'ordering'): [n = 4] 4, 3, 2, 1 [13:13:43.319] getGlobalsAndPackagesXApply() ... [13:13:43.319] - future.globals: TRUE [13:13:43.319] getGlobalsAndPackages() ... [13:13:43.319] Searching for globals... [13:13:43.320] - globals found: [2] 'FUN', '.Internal' [13:13:43.320] Searching for globals ... DONE [13:13:43.321] Resolving globals: FALSE [13:13:43.321] The total size of the 1 globals is 2.13 KiB (2184 bytes) [13:13:43.321] 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') [13:13:43.321] - globals: [1] 'FUN' [13:13:43.321] [13:13:43.322] getGlobalsAndPackages() ... DONE [13:13:43.322] - globals found/used: [n=1] 'FUN' [13:13:43.322] - needed namespaces: [n=0] [13:13:43.322] Finding globals ... DONE [13:13:43.322] - use_args: TRUE [13:13:43.322] - Getting '...' globals ... [13:13:43.322] resolve() on list ... [13:13:43.322] recursive: 0 [13:13:43.323] length: 1 [13:13:43.323] elements: '...' [13:13:43.323] length: 0 (resolved future 1) [13:13:43.323] resolve() on list ... DONE [13:13:43.323] - '...' content: [n=1] 'length' [13:13:43.323] List of 1 [13:13:43.323] $ ...:List of 1 [13:13:43.323] ..$ length: int 2 [13:13:43.323] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:43.323] - attr(*, "where")=List of 1 [13:13:43.323] ..$ ...: [13:13:43.323] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:43.323] - attr(*, "resolved")= logi TRUE [13:13:43.323] - attr(*, "total_size")= num NA [13:13:43.326] - Getting '...' globals ... DONE [13:13:43.326] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:43.326] List of 2 [13:13:43.326] $ ...future.FUN:function (mode = "logical", length = 0L) [13:13:43.326] $ ... :List of 1 [13:13:43.326] ..$ length: int 2 [13:13:43.326] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:43.326] - attr(*, "where")=List of 2 [13:13:43.326] ..$ ...future.FUN: [13:13:43.326] ..$ ... : [13:13:43.326] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:43.326] - attr(*, "resolved")= logi FALSE [13:13:43.326] - attr(*, "total_size")= num 2240 [13:13:43.329] Packages to be attached in all futures: [n=0] [13:13:43.329] getGlobalsAndPackagesXApply() ... DONE [13:13:43.329] Number of futures (= number of chunks): 1 [13:13:43.329] Launching 1 futures (chunks) ... [13:13:43.329] Chunk #1 of 1 ... [13:13:43.329] - Finding globals in 'X' for chunk #1 ... [13:13:43.329] getGlobalsAndPackages() ... [13:13:43.329] Searching for globals... [13:13:43.330] [13:13:43.330] Searching for globals ... DONE [13:13:43.330] - globals: [0] [13:13:43.330] getGlobalsAndPackages() ... DONE [13:13:43.330] + additional globals found: [n=0] [13:13:43.330] + additional namespaces needed: [n=0] [13:13:43.330] - Finding globals in 'X' for chunk #1 ... DONE [13:13:43.331] - seeds: [13:13:43.331] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:43.331] getGlobalsAndPackages() ... [13:13:43.331] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:43.331] Resolving globals: FALSE [13:13:43.331] Tweak future expression to call with '...' arguments ... [13:13:43.331] { [13:13:43.331] do.call(function(...) { [13:13:43.331] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:43.331] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:43.331] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:43.331] on.exit(options(oopts), add = TRUE) [13:13:43.331] } [13:13:43.331] { [13:13:43.331] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:43.331] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:43.331] ...future.FUN(...future.X_jj, ...) [13:13:43.331] }) [13:13:43.331] } [13:13:43.331] }, args = future.call.arguments) [13:13:43.331] } [13:13:43.332] Tweak future expression to call with '...' arguments ... DONE [13:13:43.332] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:43.332] [13:13:43.332] getGlobalsAndPackages() ... DONE [13:13:43.332] run() for 'Future' ... [13:13:43.333] - state: 'created' [13:13:43.333] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:13:43.333] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:43.333] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:43.333] - Field: 'label' [13:13:43.333] - Field: 'local' [13:13:43.333] - Field: 'owner' [13:13:43.334] - Field: 'envir' [13:13:43.334] - Field: 'packages' [13:13:43.334] - Field: 'gc' [13:13:43.334] - Field: 'conditions' [13:13:43.334] - Field: 'expr' [13:13:43.334] - Field: 'uuid' [13:13:43.334] - Field: 'seed' [13:13:43.334] - Field: 'version' [13:13:43.335] - Field: 'result' [13:13:43.335] - Field: 'asynchronous' [13:13:43.335] - Field: 'calls' [13:13:43.335] - Field: 'globals' [13:13:43.335] - Field: 'stdout' [13:13:43.335] - Field: 'earlySignal' [13:13:43.335] - Field: 'lazy' [13:13:43.336] - Field: 'state' [13:13:43.336] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:43.336] - Launch lazy future ... [13:13:43.336] Packages needed by the future expression (n = 0): [13:13:43.336] Packages needed by future strategies (n = 0): [13:13:43.336] { [13:13:43.336] { [13:13:43.336] { [13:13:43.336] ...future.startTime <- base::Sys.time() [13:13:43.336] { [13:13:43.336] { [13:13:43.336] { [13:13:43.336] base::local({ [13:13:43.336] has_future <- base::requireNamespace("future", [13:13:43.336] quietly = TRUE) [13:13:43.336] if (has_future) { [13:13:43.336] ns <- base::getNamespace("future") [13:13:43.336] version <- ns[[".package"]][["version"]] [13:13:43.336] if (is.null(version)) [13:13:43.336] version <- utils::packageVersion("future") [13:13:43.336] } [13:13:43.336] else { [13:13:43.336] version <- NULL [13:13:43.336] } [13:13:43.336] if (!has_future || version < "1.8.0") { [13:13:43.336] info <- base::c(r_version = base::gsub("R version ", [13:13:43.336] "", base::R.version$version.string), [13:13:43.336] platform = base::sprintf("%s (%s-bit)", [13:13:43.336] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:43.336] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:43.336] "release", "version")], collapse = " "), [13:13:43.336] hostname = base::Sys.info()[["nodename"]]) [13:13:43.336] info <- base::sprintf("%s: %s", base::names(info), [13:13:43.336] info) [13:13:43.336] info <- base::paste(info, collapse = "; ") [13:13:43.336] if (!has_future) { [13:13:43.336] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:43.336] info) [13:13:43.336] } [13:13:43.336] else { [13:13:43.336] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:43.336] info, version) [13:13:43.336] } [13:13:43.336] base::stop(msg) [13:13:43.336] } [13:13:43.336] }) [13:13:43.336] } [13:13:43.336] options(future.plan = NULL) [13:13:43.336] Sys.unsetenv("R_FUTURE_PLAN") [13:13:43.336] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:43.336] } [13:13:43.336] ...future.workdir <- getwd() [13:13:43.336] } [13:13:43.336] ...future.oldOptions <- base::as.list(base::.Options) [13:13:43.336] ...future.oldEnvVars <- base::Sys.getenv() [13:13:43.336] } [13:13:43.336] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:43.336] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:43.336] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:43.336] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:43.336] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:43.336] future.stdout.windows.reencode = NULL, width = 80L) [13:13:43.336] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:43.336] base::names(...future.oldOptions)) [13:13:43.336] } [13:13:43.336] if (FALSE) { [13:13:43.336] } [13:13:43.336] else { [13:13:43.336] if (TRUE) { [13:13:43.336] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:43.336] open = "w") [13:13:43.336] } [13:13:43.336] else { [13:13:43.336] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:43.336] windows = "NUL", "/dev/null"), open = "w") [13:13:43.336] } [13:13:43.336] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:43.336] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:43.336] base::sink(type = "output", split = FALSE) [13:13:43.336] base::close(...future.stdout) [13:13:43.336] }, add = TRUE) [13:13:43.336] } [13:13:43.336] ...future.frame <- base::sys.nframe() [13:13:43.336] ...future.conditions <- base::list() [13:13:43.336] ...future.rng <- base::globalenv()$.Random.seed [13:13:43.336] if (FALSE) { [13:13:43.336] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:43.336] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:43.336] } [13:13:43.336] ...future.result <- base::tryCatch({ [13:13:43.336] base::withCallingHandlers({ [13:13:43.336] ...future.value <- base::withVisible(base::local({ [13:13:43.336] do.call(function(...) { [13:13:43.336] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:43.336] if (!identical(...future.globals.maxSize.org, [13:13:43.336] ...future.globals.maxSize)) { [13:13:43.336] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:43.336] on.exit(options(oopts), add = TRUE) [13:13:43.336] } [13:13:43.336] { [13:13:43.336] lapply(seq_along(...future.elements_ii), [13:13:43.336] FUN = function(jj) { [13:13:43.336] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:43.336] ...future.FUN(...future.X_jj, ...) [13:13:43.336] }) [13:13:43.336] } [13:13:43.336] }, args = future.call.arguments) [13:13:43.336] })) [13:13:43.336] future::FutureResult(value = ...future.value$value, [13:13:43.336] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:43.336] ...future.rng), globalenv = if (FALSE) [13:13:43.336] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:43.336] ...future.globalenv.names)) [13:13:43.336] else NULL, started = ...future.startTime, version = "1.8") [13:13:43.336] }, condition = base::local({ [13:13:43.336] c <- base::c [13:13:43.336] inherits <- base::inherits [13:13:43.336] invokeRestart <- base::invokeRestart [13:13:43.336] length <- base::length [13:13:43.336] list <- base::list [13:13:43.336] seq.int <- base::seq.int [13:13:43.336] signalCondition <- base::signalCondition [13:13:43.336] sys.calls <- base::sys.calls [13:13:43.336] `[[` <- base::`[[` [13:13:43.336] `+` <- base::`+` [13:13:43.336] `<<-` <- base::`<<-` [13:13:43.336] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:43.336] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:43.336] 3L)] [13:13:43.336] } [13:13:43.336] function(cond) { [13:13:43.336] is_error <- inherits(cond, "error") [13:13:43.336] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:43.336] NULL) [13:13:43.336] if (is_error) { [13:13:43.336] sessionInformation <- function() { [13:13:43.336] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:43.336] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:43.336] search = base::search(), system = base::Sys.info()) [13:13:43.336] } [13:13:43.336] ...future.conditions[[length(...future.conditions) + [13:13:43.336] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:43.336] cond$call), session = sessionInformation(), [13:13:43.336] timestamp = base::Sys.time(), signaled = 0L) [13:13:43.336] signalCondition(cond) [13:13:43.336] } [13:13:43.336] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:43.336] "immediateCondition"))) { [13:13:43.336] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:43.336] ...future.conditions[[length(...future.conditions) + [13:13:43.336] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:43.336] if (TRUE && !signal) { [13:13:43.336] muffleCondition <- function (cond, pattern = "^muffle") [13:13:43.336] { [13:13:43.336] inherits <- base::inherits [13:13:43.336] invokeRestart <- base::invokeRestart [13:13:43.336] is.null <- base::is.null [13:13:43.336] muffled <- FALSE [13:13:43.336] if (inherits(cond, "message")) { [13:13:43.336] muffled <- grepl(pattern, "muffleMessage") [13:13:43.336] if (muffled) [13:13:43.336] invokeRestart("muffleMessage") [13:13:43.336] } [13:13:43.336] else if (inherits(cond, "warning")) { [13:13:43.336] muffled <- grepl(pattern, "muffleWarning") [13:13:43.336] if (muffled) [13:13:43.336] invokeRestart("muffleWarning") [13:13:43.336] } [13:13:43.336] else if (inherits(cond, "condition")) { [13:13:43.336] if (!is.null(pattern)) { [13:13:43.336] computeRestarts <- base::computeRestarts [13:13:43.336] grepl <- base::grepl [13:13:43.336] restarts <- computeRestarts(cond) [13:13:43.336] for (restart in restarts) { [13:13:43.336] name <- restart$name [13:13:43.336] if (is.null(name)) [13:13:43.336] next [13:13:43.336] if (!grepl(pattern, name)) [13:13:43.336] next [13:13:43.336] invokeRestart(restart) [13:13:43.336] muffled <- TRUE [13:13:43.336] break [13:13:43.336] } [13:13:43.336] } [13:13:43.336] } [13:13:43.336] invisible(muffled) [13:13:43.336] } [13:13:43.336] muffleCondition(cond, pattern = "^muffle") [13:13:43.336] } [13:13:43.336] } [13:13:43.336] else { [13:13:43.336] if (TRUE) { [13:13:43.336] muffleCondition <- function (cond, pattern = "^muffle") [13:13:43.336] { [13:13:43.336] inherits <- base::inherits [13:13:43.336] invokeRestart <- base::invokeRestart [13:13:43.336] is.null <- base::is.null [13:13:43.336] muffled <- FALSE [13:13:43.336] if (inherits(cond, "message")) { [13:13:43.336] muffled <- grepl(pattern, "muffleMessage") [13:13:43.336] if (muffled) [13:13:43.336] invokeRestart("muffleMessage") [13:13:43.336] } [13:13:43.336] else if (inherits(cond, "warning")) { [13:13:43.336] muffled <- grepl(pattern, "muffleWarning") [13:13:43.336] if (muffled) [13:13:43.336] invokeRestart("muffleWarning") [13:13:43.336] } [13:13:43.336] else if (inherits(cond, "condition")) { [13:13:43.336] if (!is.null(pattern)) { [13:13:43.336] computeRestarts <- base::computeRestarts [13:13:43.336] grepl <- base::grepl [13:13:43.336] restarts <- computeRestarts(cond) [13:13:43.336] for (restart in restarts) { [13:13:43.336] name <- restart$name [13:13:43.336] if (is.null(name)) [13:13:43.336] next [13:13:43.336] if (!grepl(pattern, name)) [13:13:43.336] next [13:13:43.336] invokeRestart(restart) [13:13:43.336] muffled <- TRUE [13:13:43.336] break [13:13:43.336] } [13:13:43.336] } [13:13:43.336] } [13:13:43.336] invisible(muffled) [13:13:43.336] } [13:13:43.336] muffleCondition(cond, pattern = "^muffle") [13:13:43.336] } [13:13:43.336] } [13:13:43.336] } [13:13:43.336] })) [13:13:43.336] }, error = function(ex) { [13:13:43.336] base::structure(base::list(value = NULL, visible = NULL, [13:13:43.336] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:43.336] ...future.rng), started = ...future.startTime, [13:13:43.336] finished = Sys.time(), session_uuid = NA_character_, [13:13:43.336] version = "1.8"), class = "FutureResult") [13:13:43.336] }, finally = { [13:13:43.336] if (!identical(...future.workdir, getwd())) [13:13:43.336] setwd(...future.workdir) [13:13:43.336] { [13:13:43.336] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:43.336] ...future.oldOptions$nwarnings <- NULL [13:13:43.336] } [13:13:43.336] base::options(...future.oldOptions) [13:13:43.336] if (.Platform$OS.type == "windows") { [13:13:43.336] old_names <- names(...future.oldEnvVars) [13:13:43.336] envs <- base::Sys.getenv() [13:13:43.336] names <- names(envs) [13:13:43.336] common <- intersect(names, old_names) [13:13:43.336] added <- setdiff(names, old_names) [13:13:43.336] removed <- setdiff(old_names, names) [13:13:43.336] changed <- common[...future.oldEnvVars[common] != [13:13:43.336] envs[common]] [13:13:43.336] NAMES <- toupper(changed) [13:13:43.336] args <- list() [13:13:43.336] for (kk in seq_along(NAMES)) { [13:13:43.336] name <- changed[[kk]] [13:13:43.336] NAME <- NAMES[[kk]] [13:13:43.336] if (name != NAME && is.element(NAME, old_names)) [13:13:43.336] next [13:13:43.336] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:43.336] } [13:13:43.336] NAMES <- toupper(added) [13:13:43.336] for (kk in seq_along(NAMES)) { [13:13:43.336] name <- added[[kk]] [13:13:43.336] NAME <- NAMES[[kk]] [13:13:43.336] if (name != NAME && is.element(NAME, old_names)) [13:13:43.336] next [13:13:43.336] args[[name]] <- "" [13:13:43.336] } [13:13:43.336] NAMES <- toupper(removed) [13:13:43.336] for (kk in seq_along(NAMES)) { [13:13:43.336] name <- removed[[kk]] [13:13:43.336] NAME <- NAMES[[kk]] [13:13:43.336] if (name != NAME && is.element(NAME, old_names)) [13:13:43.336] next [13:13:43.336] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:43.336] } [13:13:43.336] if (length(args) > 0) [13:13:43.336] base::do.call(base::Sys.setenv, args = args) [13:13:43.336] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:43.336] } [13:13:43.336] else { [13:13:43.336] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:43.336] } [13:13:43.336] { [13:13:43.336] if (base::length(...future.futureOptionsAdded) > [13:13:43.336] 0L) { [13:13:43.336] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:43.336] base::names(opts) <- ...future.futureOptionsAdded [13:13:43.336] base::options(opts) [13:13:43.336] } [13:13:43.336] { [13:13:43.336] { [13:13:43.336] NULL [13:13:43.336] RNGkind("Mersenne-Twister") [13:13:43.336] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:43.336] inherits = FALSE) [13:13:43.336] } [13:13:43.336] options(future.plan = NULL) [13:13:43.336] if (is.na(NA_character_)) [13:13:43.336] Sys.unsetenv("R_FUTURE_PLAN") [13:13:43.336] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:43.336] future::plan(list(function (..., envir = parent.frame()) [13:13:43.336] { [13:13:43.336] future <- SequentialFuture(..., envir = envir) [13:13:43.336] if (!future$lazy) [13:13:43.336] future <- run(future) [13:13:43.336] invisible(future) [13:13:43.336] }), .cleanup = FALSE, .init = FALSE) [13:13:43.336] } [13:13:43.336] } [13:13:43.336] } [13:13:43.336] }) [13:13:43.336] if (TRUE) { [13:13:43.336] base::sink(type = "output", split = FALSE) [13:13:43.336] if (TRUE) { [13:13:43.336] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:43.336] } [13:13:43.336] else { [13:13:43.336] ...future.result["stdout"] <- base::list(NULL) [13:13:43.336] } [13:13:43.336] base::close(...future.stdout) [13:13:43.336] ...future.stdout <- NULL [13:13:43.336] } [13:13:43.336] ...future.result$conditions <- ...future.conditions [13:13:43.336] ...future.result$finished <- base::Sys.time() [13:13:43.336] ...future.result [13:13:43.336] } [13:13:43.339] assign_globals() ... [13:13:43.339] List of 5 [13:13:43.339] $ ...future.FUN :function (mode = "logical", length = 0L) [13:13:43.339] $ future.call.arguments :List of 1 [13:13:43.339] ..$ length: int 2 [13:13:43.339] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:43.339] $ ...future.elements_ii :List of 4 [13:13:43.339] ..$ c: chr "list" [13:13:43.339] ..$ c: chr "character" [13:13:43.339] ..$ b: chr "numeric" [13:13:43.339] ..$ a: chr "integer" [13:13:43.339] $ ...future.seeds_ii : NULL [13:13:43.339] $ ...future.globals.maxSize: NULL [13:13:43.339] - attr(*, "where")=List of 5 [13:13:43.339] ..$ ...future.FUN : [13:13:43.339] ..$ future.call.arguments : [13:13:43.339] ..$ ...future.elements_ii : [13:13:43.339] ..$ ...future.seeds_ii : [13:13:43.339] ..$ ...future.globals.maxSize: [13:13:43.339] - attr(*, "resolved")= logi FALSE [13:13:43.339] - attr(*, "total_size")= num 2240 [13:13:43.339] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:43.339] - attr(*, "already-done")= logi TRUE [13:13:43.344] - copied '...future.FUN' to environment [13:13:43.344] - copied 'future.call.arguments' to environment [13:13:43.345] - copied '...future.elements_ii' to environment [13:13:43.345] - copied '...future.seeds_ii' to environment [13:13:43.345] - copied '...future.globals.maxSize' to environment [13:13:43.345] assign_globals() ... done [13:13:43.345] plan(): Setting new future strategy stack: [13:13:43.345] List of future strategies: [13:13:43.345] 1. sequential: [13:13:43.345] - args: function (..., envir = parent.frame(), workers = "") [13:13:43.345] - tweaked: FALSE [13:13:43.345] - call: NULL [13:13:43.346] plan(): nbrOfWorkers() = 1 [13:13:43.347] plan(): Setting new future strategy stack: [13:13:43.347] List of future strategies: [13:13:43.347] 1. sequential: [13:13:43.347] - args: function (..., envir = parent.frame(), workers = "") [13:13:43.347] - tweaked: FALSE [13:13:43.347] - call: plan(strategy) [13:13:43.347] plan(): nbrOfWorkers() = 1 [13:13:43.347] SequentialFuture started (and completed) [13:13:43.348] - Launch lazy future ... done [13:13:43.348] run() for 'SequentialFuture' ... done [13:13:43.349] Created future: [13:13:43.349] SequentialFuture: [13:13:43.349] Label: 'future_lapply-1' [13:13:43.349] Expression: [13:13:43.349] { [13:13:43.349] do.call(function(...) { [13:13:43.349] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:43.349] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:43.349] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:43.349] on.exit(options(oopts), add = TRUE) [13:13:43.349] } [13:13:43.349] { [13:13:43.349] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:43.349] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:43.349] ...future.FUN(...future.X_jj, ...) [13:13:43.349] }) [13:13:43.349] } [13:13:43.349] }, args = future.call.arguments) [13:13:43.349] } [13:13:43.349] Lazy evaluation: FALSE [13:13:43.349] Asynchronous evaluation: FALSE [13:13:43.349] Local evaluation: TRUE [13:13:43.349] Environment: R_GlobalEnv [13:13:43.349] Capture standard output: TRUE [13:13:43.349] Capture condition classes: 'condition' (excluding 'nothing') [13:13:43.349] 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) [13:13:43.349] Packages: [13:13:43.349] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:43.349] Resolved: TRUE [13:13:43.349] Value: 240 bytes of class 'list' [13:13:43.349] Early signaling: FALSE [13:13:43.349] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:43.349] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:43.350] Chunk #1 of 1 ... DONE [13:13:43.350] Launching 1 futures (chunks) ... DONE [13:13:43.351] Resolving 1 futures (chunks) ... [13:13:43.351] resolve() on list ... [13:13:43.351] recursive: 0 [13:13:43.351] length: 1 [13:13:43.351] [13:13:43.351] resolved() for 'SequentialFuture' ... [13:13:43.351] - state: 'finished' [13:13:43.351] - run: TRUE [13:13:43.352] - result: 'FutureResult' [13:13:43.352] resolved() for 'SequentialFuture' ... done [13:13:43.352] Future #1 [13:13:43.352] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:43.352] - nx: 1 [13:13:43.352] - relay: TRUE [13:13:43.352] - stdout: TRUE [13:13:43.352] - signal: TRUE [13:13:43.352] - resignal: FALSE [13:13:43.353] - force: TRUE [13:13:43.353] - relayed: [n=1] FALSE [13:13:43.353] - queued futures: [n=1] FALSE [13:13:43.353] - until=1 [13:13:43.353] - relaying element #1 [13:13:43.353] - relayed: [n=1] TRUE [13:13:43.353] - queued futures: [n=1] TRUE [13:13:43.353] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:43.354] length: 0 (resolved future 1) [13:13:43.354] Relaying remaining futures [13:13:43.354] signalConditionsASAP(NULL, pos=0) ... [13:13:43.354] - nx: 1 [13:13:43.354] - relay: TRUE [13:13:43.354] - stdout: TRUE [13:13:43.354] - signal: TRUE [13:13:43.354] - resignal: FALSE [13:13:43.354] - force: TRUE [13:13:43.355] - relayed: [n=1] TRUE [13:13:43.355] - queued futures: [n=1] TRUE - flush all [13:13:43.355] - relayed: [n=1] TRUE [13:13:43.355] - queued futures: [n=1] TRUE [13:13:43.355] signalConditionsASAP(NULL, pos=0) ... done [13:13:43.355] resolve() on list ... DONE [13:13:43.355] - Number of value chunks collected: 1 [13:13:43.355] Resolving 1 futures (chunks) ... DONE [13:13:43.356] Reducing values from 1 chunks ... [13:13:43.356] - Number of values collected after concatenation: 4 [13:13:43.356] - Number of values expected: 4 [13:13:43.356] Reverse index remapping (attribute 'ordering'): [n = 4] 4, 3, 2, 1 [13:13:43.356] Reducing values from 1 chunks ... DONE [13:13:43.356] 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, ...) ... [13:13:43.358] future_lapply() ... [13:13:43.358] Number of chunks: 1 [13:13:43.359] Index remapping (attribute 'ordering'): [n = 4] 4, 2, 1, 3 [13:13:43.359] getGlobalsAndPackagesXApply() ... [13:13:43.359] - future.globals: TRUE [13:13:43.359] getGlobalsAndPackages() ... [13:13:43.359] Searching for globals... [13:13:43.360] - globals found: [2] 'FUN', '.Internal' [13:13:43.360] Searching for globals ... DONE [13:13:43.360] Resolving globals: FALSE [13:13:43.361] The total size of the 1 globals is 2.13 KiB (2184 bytes) [13:13:43.361] 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') [13:13:43.361] - globals: [1] 'FUN' [13:13:43.361] [13:13:43.361] getGlobalsAndPackages() ... DONE [13:13:43.361] - globals found/used: [n=1] 'FUN' [13:13:43.362] - needed namespaces: [n=0] [13:13:43.362] Finding globals ... DONE [13:13:43.362] - use_args: TRUE [13:13:43.362] - Getting '...' globals ... [13:13:43.362] resolve() on list ... [13:13:43.362] recursive: 0 [13:13:43.362] length: 1 [13:13:43.362] elements: '...' [13:13:43.363] length: 0 (resolved future 1) [13:13:43.363] resolve() on list ... DONE [13:13:43.363] - '...' content: [n=1] 'length' [13:13:43.363] List of 1 [13:13:43.363] $ ...:List of 1 [13:13:43.363] ..$ length: int 2 [13:13:43.363] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:43.363] - attr(*, "where")=List of 1 [13:13:43.363] ..$ ...: [13:13:43.363] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:43.363] - attr(*, "resolved")= logi TRUE [13:13:43.363] - attr(*, "total_size")= num NA [13:13:43.365] - Getting '...' globals ... DONE [13:13:43.366] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:43.366] List of 2 [13:13:43.366] $ ...future.FUN:function (mode = "logical", length = 0L) [13:13:43.366] $ ... :List of 1 [13:13:43.366] ..$ length: int 2 [13:13:43.366] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:43.366] - attr(*, "where")=List of 2 [13:13:43.366] ..$ ...future.FUN: [13:13:43.366] ..$ ... : [13:13:43.366] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:43.366] - attr(*, "resolved")= logi FALSE [13:13:43.366] - attr(*, "total_size")= num 2240 [13:13:43.368] Packages to be attached in all futures: [n=0] [13:13:43.369] getGlobalsAndPackagesXApply() ... DONE [13:13:43.369] Number of futures (= number of chunks): 1 [13:13:43.369] Launching 1 futures (chunks) ... [13:13:43.369] Chunk #1 of 1 ... [13:13:43.369] - Finding globals in 'X' for chunk #1 ... [13:13:43.369] getGlobalsAndPackages() ... [13:13:43.369] Searching for globals... [13:13:43.370] [13:13:43.370] Searching for globals ... DONE [13:13:43.370] - globals: [0] [13:13:43.370] getGlobalsAndPackages() ... DONE [13:13:43.370] + additional globals found: [n=0] [13:13:43.370] + additional namespaces needed: [n=0] [13:13:43.370] - Finding globals in 'X' for chunk #1 ... DONE [13:13:43.370] - seeds: [13:13:43.370] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:43.371] getGlobalsAndPackages() ... [13:13:43.371] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:43.371] Resolving globals: FALSE [13:13:43.371] Tweak future expression to call with '...' arguments ... [13:13:43.371] { [13:13:43.371] do.call(function(...) { [13:13:43.371] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:43.371] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:43.371] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:43.371] on.exit(options(oopts), add = TRUE) [13:13:43.371] } [13:13:43.371] { [13:13:43.371] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:43.371] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:43.371] ...future.FUN(...future.X_jj, ...) [13:13:43.371] }) [13:13:43.371] } [13:13:43.371] }, args = future.call.arguments) [13:13:43.371] } [13:13:43.371] Tweak future expression to call with '...' arguments ... DONE [13:13:43.372] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:43.372] [13:13:43.372] getGlobalsAndPackages() ... DONE [13:13:43.372] run() for 'Future' ... [13:13:43.372] - state: 'created' [13:13:43.372] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:13:43.373] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:43.373] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:43.373] - Field: 'label' [13:13:43.373] - Field: 'local' [13:13:43.373] - Field: 'owner' [13:13:43.373] - Field: 'envir' [13:13:43.373] - Field: 'packages' [13:13:43.374] - Field: 'gc' [13:13:43.374] - Field: 'conditions' [13:13:43.374] - Field: 'expr' [13:13:43.374] - Field: 'uuid' [13:13:43.374] - Field: 'seed' [13:13:43.374] - Field: 'version' [13:13:43.374] - Field: 'result' [13:13:43.374] - Field: 'asynchronous' [13:13:43.375] - Field: 'calls' [13:13:43.375] - Field: 'globals' [13:13:43.375] - Field: 'stdout' [13:13:43.375] - Field: 'earlySignal' [13:13:43.375] - Field: 'lazy' [13:13:43.375] - Field: 'state' [13:13:43.375] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:43.375] - Launch lazy future ... [13:13:43.376] Packages needed by the future expression (n = 0): [13:13:43.376] Packages needed by future strategies (n = 0): [13:13:43.376] { [13:13:43.376] { [13:13:43.376] { [13:13:43.376] ...future.startTime <- base::Sys.time() [13:13:43.376] { [13:13:43.376] { [13:13:43.376] { [13:13:43.376] base::local({ [13:13:43.376] has_future <- base::requireNamespace("future", [13:13:43.376] quietly = TRUE) [13:13:43.376] if (has_future) { [13:13:43.376] ns <- base::getNamespace("future") [13:13:43.376] version <- ns[[".package"]][["version"]] [13:13:43.376] if (is.null(version)) [13:13:43.376] version <- utils::packageVersion("future") [13:13:43.376] } [13:13:43.376] else { [13:13:43.376] version <- NULL [13:13:43.376] } [13:13:43.376] if (!has_future || version < "1.8.0") { [13:13:43.376] info <- base::c(r_version = base::gsub("R version ", [13:13:43.376] "", base::R.version$version.string), [13:13:43.376] platform = base::sprintf("%s (%s-bit)", [13:13:43.376] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:43.376] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:43.376] "release", "version")], collapse = " "), [13:13:43.376] hostname = base::Sys.info()[["nodename"]]) [13:13:43.376] info <- base::sprintf("%s: %s", base::names(info), [13:13:43.376] info) [13:13:43.376] info <- base::paste(info, collapse = "; ") [13:13:43.376] if (!has_future) { [13:13:43.376] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:43.376] info) [13:13:43.376] } [13:13:43.376] else { [13:13:43.376] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:43.376] info, version) [13:13:43.376] } [13:13:43.376] base::stop(msg) [13:13:43.376] } [13:13:43.376] }) [13:13:43.376] } [13:13:43.376] options(future.plan = NULL) [13:13:43.376] Sys.unsetenv("R_FUTURE_PLAN") [13:13:43.376] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:43.376] } [13:13:43.376] ...future.workdir <- getwd() [13:13:43.376] } [13:13:43.376] ...future.oldOptions <- base::as.list(base::.Options) [13:13:43.376] ...future.oldEnvVars <- base::Sys.getenv() [13:13:43.376] } [13:13:43.376] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:43.376] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:43.376] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:43.376] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:43.376] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:43.376] future.stdout.windows.reencode = NULL, width = 80L) [13:13:43.376] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:43.376] base::names(...future.oldOptions)) [13:13:43.376] } [13:13:43.376] if (FALSE) { [13:13:43.376] } [13:13:43.376] else { [13:13:43.376] if (TRUE) { [13:13:43.376] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:43.376] open = "w") [13:13:43.376] } [13:13:43.376] else { [13:13:43.376] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:43.376] windows = "NUL", "/dev/null"), open = "w") [13:13:43.376] } [13:13:43.376] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:43.376] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:43.376] base::sink(type = "output", split = FALSE) [13:13:43.376] base::close(...future.stdout) [13:13:43.376] }, add = TRUE) [13:13:43.376] } [13:13:43.376] ...future.frame <- base::sys.nframe() [13:13:43.376] ...future.conditions <- base::list() [13:13:43.376] ...future.rng <- base::globalenv()$.Random.seed [13:13:43.376] if (FALSE) { [13:13:43.376] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:43.376] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:43.376] } [13:13:43.376] ...future.result <- base::tryCatch({ [13:13:43.376] base::withCallingHandlers({ [13:13:43.376] ...future.value <- base::withVisible(base::local({ [13:13:43.376] do.call(function(...) { [13:13:43.376] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:43.376] if (!identical(...future.globals.maxSize.org, [13:13:43.376] ...future.globals.maxSize)) { [13:13:43.376] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:43.376] on.exit(options(oopts), add = TRUE) [13:13:43.376] } [13:13:43.376] { [13:13:43.376] lapply(seq_along(...future.elements_ii), [13:13:43.376] FUN = function(jj) { [13:13:43.376] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:43.376] ...future.FUN(...future.X_jj, ...) [13:13:43.376] }) [13:13:43.376] } [13:13:43.376] }, args = future.call.arguments) [13:13:43.376] })) [13:13:43.376] future::FutureResult(value = ...future.value$value, [13:13:43.376] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:43.376] ...future.rng), globalenv = if (FALSE) [13:13:43.376] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:43.376] ...future.globalenv.names)) [13:13:43.376] else NULL, started = ...future.startTime, version = "1.8") [13:13:43.376] }, condition = base::local({ [13:13:43.376] c <- base::c [13:13:43.376] inherits <- base::inherits [13:13:43.376] invokeRestart <- base::invokeRestart [13:13:43.376] length <- base::length [13:13:43.376] list <- base::list [13:13:43.376] seq.int <- base::seq.int [13:13:43.376] signalCondition <- base::signalCondition [13:13:43.376] sys.calls <- base::sys.calls [13:13:43.376] `[[` <- base::`[[` [13:13:43.376] `+` <- base::`+` [13:13:43.376] `<<-` <- base::`<<-` [13:13:43.376] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:43.376] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:43.376] 3L)] [13:13:43.376] } [13:13:43.376] function(cond) { [13:13:43.376] is_error <- inherits(cond, "error") [13:13:43.376] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:43.376] NULL) [13:13:43.376] if (is_error) { [13:13:43.376] sessionInformation <- function() { [13:13:43.376] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:43.376] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:43.376] search = base::search(), system = base::Sys.info()) [13:13:43.376] } [13:13:43.376] ...future.conditions[[length(...future.conditions) + [13:13:43.376] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:43.376] cond$call), session = sessionInformation(), [13:13:43.376] timestamp = base::Sys.time(), signaled = 0L) [13:13:43.376] signalCondition(cond) [13:13:43.376] } [13:13:43.376] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:43.376] "immediateCondition"))) { [13:13:43.376] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:43.376] ...future.conditions[[length(...future.conditions) + [13:13:43.376] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:43.376] if (TRUE && !signal) { [13:13:43.376] muffleCondition <- function (cond, pattern = "^muffle") [13:13:43.376] { [13:13:43.376] inherits <- base::inherits [13:13:43.376] invokeRestart <- base::invokeRestart [13:13:43.376] is.null <- base::is.null [13:13:43.376] muffled <- FALSE [13:13:43.376] if (inherits(cond, "message")) { [13:13:43.376] muffled <- grepl(pattern, "muffleMessage") [13:13:43.376] if (muffled) [13:13:43.376] invokeRestart("muffleMessage") [13:13:43.376] } [13:13:43.376] else if (inherits(cond, "warning")) { [13:13:43.376] muffled <- grepl(pattern, "muffleWarning") [13:13:43.376] if (muffled) [13:13:43.376] invokeRestart("muffleWarning") [13:13:43.376] } [13:13:43.376] else if (inherits(cond, "condition")) { [13:13:43.376] if (!is.null(pattern)) { [13:13:43.376] computeRestarts <- base::computeRestarts [13:13:43.376] grepl <- base::grepl [13:13:43.376] restarts <- computeRestarts(cond) [13:13:43.376] for (restart in restarts) { [13:13:43.376] name <- restart$name [13:13:43.376] if (is.null(name)) [13:13:43.376] next [13:13:43.376] if (!grepl(pattern, name)) [13:13:43.376] next [13:13:43.376] invokeRestart(restart) [13:13:43.376] muffled <- TRUE [13:13:43.376] break [13:13:43.376] } [13:13:43.376] } [13:13:43.376] } [13:13:43.376] invisible(muffled) [13:13:43.376] } [13:13:43.376] muffleCondition(cond, pattern = "^muffle") [13:13:43.376] } [13:13:43.376] } [13:13:43.376] else { [13:13:43.376] if (TRUE) { [13:13:43.376] muffleCondition <- function (cond, pattern = "^muffle") [13:13:43.376] { [13:13:43.376] inherits <- base::inherits [13:13:43.376] invokeRestart <- base::invokeRestart [13:13:43.376] is.null <- base::is.null [13:13:43.376] muffled <- FALSE [13:13:43.376] if (inherits(cond, "message")) { [13:13:43.376] muffled <- grepl(pattern, "muffleMessage") [13:13:43.376] if (muffled) [13:13:43.376] invokeRestart("muffleMessage") [13:13:43.376] } [13:13:43.376] else if (inherits(cond, "warning")) { [13:13:43.376] muffled <- grepl(pattern, "muffleWarning") [13:13:43.376] if (muffled) [13:13:43.376] invokeRestart("muffleWarning") [13:13:43.376] } [13:13:43.376] else if (inherits(cond, "condition")) { [13:13:43.376] if (!is.null(pattern)) { [13:13:43.376] computeRestarts <- base::computeRestarts [13:13:43.376] grepl <- base::grepl [13:13:43.376] restarts <- computeRestarts(cond) [13:13:43.376] for (restart in restarts) { [13:13:43.376] name <- restart$name [13:13:43.376] if (is.null(name)) [13:13:43.376] next [13:13:43.376] if (!grepl(pattern, name)) [13:13:43.376] next [13:13:43.376] invokeRestart(restart) [13:13:43.376] muffled <- TRUE [13:13:43.376] break [13:13:43.376] } [13:13:43.376] } [13:13:43.376] } [13:13:43.376] invisible(muffled) [13:13:43.376] } [13:13:43.376] muffleCondition(cond, pattern = "^muffle") [13:13:43.376] } [13:13:43.376] } [13:13:43.376] } [13:13:43.376] })) [13:13:43.376] }, error = function(ex) { [13:13:43.376] base::structure(base::list(value = NULL, visible = NULL, [13:13:43.376] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:43.376] ...future.rng), started = ...future.startTime, [13:13:43.376] finished = Sys.time(), session_uuid = NA_character_, [13:13:43.376] version = "1.8"), class = "FutureResult") [13:13:43.376] }, finally = { [13:13:43.376] if (!identical(...future.workdir, getwd())) [13:13:43.376] setwd(...future.workdir) [13:13:43.376] { [13:13:43.376] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:43.376] ...future.oldOptions$nwarnings <- NULL [13:13:43.376] } [13:13:43.376] base::options(...future.oldOptions) [13:13:43.376] if (.Platform$OS.type == "windows") { [13:13:43.376] old_names <- names(...future.oldEnvVars) [13:13:43.376] envs <- base::Sys.getenv() [13:13:43.376] names <- names(envs) [13:13:43.376] common <- intersect(names, old_names) [13:13:43.376] added <- setdiff(names, old_names) [13:13:43.376] removed <- setdiff(old_names, names) [13:13:43.376] changed <- common[...future.oldEnvVars[common] != [13:13:43.376] envs[common]] [13:13:43.376] NAMES <- toupper(changed) [13:13:43.376] args <- list() [13:13:43.376] for (kk in seq_along(NAMES)) { [13:13:43.376] name <- changed[[kk]] [13:13:43.376] NAME <- NAMES[[kk]] [13:13:43.376] if (name != NAME && is.element(NAME, old_names)) [13:13:43.376] next [13:13:43.376] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:43.376] } [13:13:43.376] NAMES <- toupper(added) [13:13:43.376] for (kk in seq_along(NAMES)) { [13:13:43.376] name <- added[[kk]] [13:13:43.376] NAME <- NAMES[[kk]] [13:13:43.376] if (name != NAME && is.element(NAME, old_names)) [13:13:43.376] next [13:13:43.376] args[[name]] <- "" [13:13:43.376] } [13:13:43.376] NAMES <- toupper(removed) [13:13:43.376] for (kk in seq_along(NAMES)) { [13:13:43.376] name <- removed[[kk]] [13:13:43.376] NAME <- NAMES[[kk]] [13:13:43.376] if (name != NAME && is.element(NAME, old_names)) [13:13:43.376] next [13:13:43.376] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:43.376] } [13:13:43.376] if (length(args) > 0) [13:13:43.376] base::do.call(base::Sys.setenv, args = args) [13:13:43.376] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:43.376] } [13:13:43.376] else { [13:13:43.376] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:43.376] } [13:13:43.376] { [13:13:43.376] if (base::length(...future.futureOptionsAdded) > [13:13:43.376] 0L) { [13:13:43.376] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:43.376] base::names(opts) <- ...future.futureOptionsAdded [13:13:43.376] base::options(opts) [13:13:43.376] } [13:13:43.376] { [13:13:43.376] { [13:13:43.376] NULL [13:13:43.376] RNGkind("Mersenne-Twister") [13:13:43.376] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:43.376] inherits = FALSE) [13:13:43.376] } [13:13:43.376] options(future.plan = NULL) [13:13:43.376] if (is.na(NA_character_)) [13:13:43.376] Sys.unsetenv("R_FUTURE_PLAN") [13:13:43.376] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:43.376] future::plan(list(function (..., envir = parent.frame()) [13:13:43.376] { [13:13:43.376] future <- SequentialFuture(..., envir = envir) [13:13:43.376] if (!future$lazy) [13:13:43.376] future <- run(future) [13:13:43.376] invisible(future) [13:13:43.376] }), .cleanup = FALSE, .init = FALSE) [13:13:43.376] } [13:13:43.376] } [13:13:43.376] } [13:13:43.376] }) [13:13:43.376] if (TRUE) { [13:13:43.376] base::sink(type = "output", split = FALSE) [13:13:43.376] if (TRUE) { [13:13:43.376] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:43.376] } [13:13:43.376] else { [13:13:43.376] ...future.result["stdout"] <- base::list(NULL) [13:13:43.376] } [13:13:43.376] base::close(...future.stdout) [13:13:43.376] ...future.stdout <- NULL [13:13:43.376] } [13:13:43.376] ...future.result$conditions <- ...future.conditions [13:13:43.376] ...future.result$finished <- base::Sys.time() [13:13:43.376] ...future.result [13:13:43.376] } [13:13:43.379] assign_globals() ... [13:13:43.379] List of 5 [13:13:43.379] $ ...future.FUN :function (mode = "logical", length = 0L) [13:13:43.379] $ future.call.arguments :List of 1 [13:13:43.379] ..$ length: int 2 [13:13:43.379] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:43.379] $ ...future.elements_ii :List of 4 [13:13:43.379] ..$ c: chr "list" [13:13:43.379] ..$ b: chr "numeric" [13:13:43.379] ..$ a: chr "integer" [13:13:43.379] ..$ c: chr "character" [13:13:43.379] $ ...future.seeds_ii : NULL [13:13:43.379] $ ...future.globals.maxSize: NULL [13:13:43.379] - attr(*, "where")=List of 5 [13:13:43.379] ..$ ...future.FUN : [13:13:43.379] ..$ future.call.arguments : [13:13:43.379] ..$ ...future.elements_ii : [13:13:43.379] ..$ ...future.seeds_ii : [13:13:43.379] ..$ ...future.globals.maxSize: [13:13:43.379] - attr(*, "resolved")= logi FALSE [13:13:43.379] - attr(*, "total_size")= num 2240 [13:13:43.379] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:43.379] - attr(*, "already-done")= logi TRUE [13:13:43.384] - copied '...future.FUN' to environment [13:13:43.384] - copied 'future.call.arguments' to environment [13:13:43.384] - copied '...future.elements_ii' to environment [13:13:43.384] - copied '...future.seeds_ii' to environment [13:13:43.384] - copied '...future.globals.maxSize' to environment [13:13:43.384] assign_globals() ... done [13:13:43.385] plan(): Setting new future strategy stack: [13:13:43.385] List of future strategies: [13:13:43.385] 1. sequential: [13:13:43.385] - args: function (..., envir = parent.frame(), workers = "") [13:13:43.385] - tweaked: FALSE [13:13:43.385] - call: NULL [13:13:43.385] plan(): nbrOfWorkers() = 1 [13:13:43.386] plan(): Setting new future strategy stack: [13:13:43.386] List of future strategies: [13:13:43.386] 1. sequential: [13:13:43.386] - args: function (..., envir = parent.frame(), workers = "") [13:13:43.386] - tweaked: FALSE [13:13:43.386] - call: plan(strategy) [13:13:43.387] plan(): nbrOfWorkers() = 1 [13:13:43.387] SequentialFuture started (and completed) [13:13:43.387] - Launch lazy future ... done [13:13:43.387] run() for 'SequentialFuture' ... done [13:13:43.387] Created future: [13:13:43.387] SequentialFuture: [13:13:43.387] Label: 'future_lapply-1' [13:13:43.387] Expression: [13:13:43.387] { [13:13:43.387] do.call(function(...) { [13:13:43.387] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:43.387] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:43.387] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:43.387] on.exit(options(oopts), add = TRUE) [13:13:43.387] } [13:13:43.387] { [13:13:43.387] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:43.387] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:43.387] ...future.FUN(...future.X_jj, ...) [13:13:43.387] }) [13:13:43.387] } [13:13:43.387] }, args = future.call.arguments) [13:13:43.387] } [13:13:43.387] Lazy evaluation: FALSE [13:13:43.387] Asynchronous evaluation: FALSE [13:13:43.387] Local evaluation: TRUE [13:13:43.387] Environment: R_GlobalEnv [13:13:43.387] Capture standard output: TRUE [13:13:43.387] Capture condition classes: 'condition' (excluding 'nothing') [13:13:43.387] 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) [13:13:43.387] Packages: [13:13:43.387] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:43.387] Resolved: TRUE [13:13:43.387] Value: 240 bytes of class 'list' [13:13:43.387] Early signaling: FALSE [13:13:43.387] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:43.387] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:43.388] Chunk #1 of 1 ... DONE [13:13:43.388] Launching 1 futures (chunks) ... DONE [13:13:43.388] Resolving 1 futures (chunks) ... [13:13:43.389] resolve() on list ... [13:13:43.389] recursive: 0 [13:13:43.389] length: 1 [13:13:43.389] [13:13:43.389] resolved() for 'SequentialFuture' ... [13:13:43.389] - state: 'finished' [13:13:43.389] - run: TRUE [13:13:43.389] - result: 'FutureResult' [13:13:43.390] resolved() for 'SequentialFuture' ... done [13:13:43.390] Future #1 [13:13:43.390] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:43.390] - nx: 1 [13:13:43.390] - relay: TRUE [13:13:43.390] - stdout: TRUE [13:13:43.390] - signal: TRUE [13:13:43.390] - resignal: FALSE [13:13:43.390] - force: TRUE [13:13:43.391] - relayed: [n=1] FALSE [13:13:43.391] - queued futures: [n=1] FALSE [13:13:43.391] - until=1 [13:13:43.391] - relaying element #1 [13:13:43.391] - relayed: [n=1] TRUE [13:13:43.391] - queued futures: [n=1] TRUE [13:13:43.391] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:43.391] length: 0 (resolved future 1) [13:13:43.392] Relaying remaining futures [13:13:43.392] signalConditionsASAP(NULL, pos=0) ... [13:13:43.392] - nx: 1 [13:13:43.392] - relay: TRUE [13:13:43.392] - stdout: TRUE [13:13:43.392] - signal: TRUE [13:13:43.392] - resignal: FALSE [13:13:43.392] - force: TRUE [13:13:43.392] - relayed: [n=1] TRUE [13:13:43.393] - queued futures: [n=1] TRUE - flush all [13:13:43.393] - relayed: [n=1] TRUE [13:13:43.393] - queued futures: [n=1] TRUE [13:13:43.393] signalConditionsASAP(NULL, pos=0) ... done [13:13:43.393] resolve() on list ... DONE [13:13:43.393] - Number of value chunks collected: 1 [13:13:43.393] Resolving 1 futures (chunks) ... DONE [13:13:43.393] Reducing values from 1 chunks ... [13:13:43.394] - Number of values collected after concatenation: 4 [13:13:43.394] - Number of values expected: 4 [13:13:43.394] Reverse index remapping (attribute 'ordering'): [n = 4] 3, 2, 4, 1 [13:13:43.394] Reducing values from 1 chunks ... DONE [13:13:43.394] 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, ...) ... [13:13:43.396] future_lapply() ... [13:13:43.402] Number of chunks: 1 [13:13:43.402] getGlobalsAndPackagesXApply() ... [13:13:43.402] - future.globals: TRUE [13:13:43.402] getGlobalsAndPackages() ... [13:13:43.403] Searching for globals... [13:13:43.409] - globals found: [22] 'FUN', 'if', 'missing', 'is.finite', '{', 'is.null', '<-', 'paste', 'length', '==', 'return', '>', '+', '[', 'seq_len', 'rev', 'c', '&&', '!', ':', '(', '-' [13:13:43.410] Searching for globals ... DONE [13:13:43.410] Resolving globals: FALSE [13:13:43.411] The total size of the 1 globals is 69.62 KiB (71288 bytes) [13:13:43.411] 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') [13:13:43.411] - globals: [1] 'FUN' [13:13:43.411] - packages: [1] 'future' [13:13:43.411] getGlobalsAndPackages() ... DONE [13:13:43.411] - globals found/used: [n=1] 'FUN' [13:13:43.412] - needed namespaces: [n=1] 'future' [13:13:43.412] Finding globals ... DONE [13:13:43.412] - use_args: TRUE [13:13:43.412] - Getting '...' globals ... [13:13:43.412] resolve() on list ... [13:13:43.412] recursive: 0 [13:13:43.412] length: 1 [13:13:43.412] elements: '...' [13:13:43.413] length: 0 (resolved future 1) [13:13:43.413] resolve() on list ... DONE [13:13:43.413] - '...' content: [n=2] 'collapse', 'maxHead' [13:13:43.413] List of 1 [13:13:43.413] $ ...:List of 2 [13:13:43.413] ..$ collapse: chr "; " [13:13:43.413] ..$ maxHead : int 3 [13:13:43.413] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:43.413] - attr(*, "where")=List of 1 [13:13:43.413] ..$ ...: [13:13:43.413] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:43.413] - attr(*, "resolved")= logi TRUE [13:13:43.413] - attr(*, "total_size")= num NA [13:13:43.416] - Getting '...' globals ... DONE [13:13:43.416] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:43.416] List of 2 [13:13:43.416] $ ...future.FUN:function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [13:13:43.416] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [13:13:43.416] $ ... :List of 2 [13:13:43.416] ..$ collapse: chr "; " [13:13:43.416] ..$ maxHead : int 3 [13:13:43.416] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:43.416] - attr(*, "where")=List of 2 [13:13:43.416] ..$ ...future.FUN: [13:13:43.416] ..$ ... : [13:13:43.416] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:43.416] - attr(*, "resolved")= logi FALSE [13:13:43.416] - attr(*, "total_size")= num 71456 [13:13:43.420] Packages to be attached in all futures: [n=1] 'future' [13:13:43.421] getGlobalsAndPackagesXApply() ... DONE [13:13:43.421] Number of futures (= number of chunks): 1 [13:13:43.421] Launching 1 futures (chunks) ... [13:13:43.421] Chunk #1 of 1 ... [13:13:43.421] - Finding globals in 'X' for chunk #1 ... [13:13:43.421] getGlobalsAndPackages() ... [13:13:43.421] Searching for globals... [13:13:43.422] [13:13:43.422] Searching for globals ... DONE [13:13:43.422] - globals: [0] [13:13:43.422] getGlobalsAndPackages() ... DONE [13:13:43.422] + additional globals found: [n=0] [13:13:43.422] + additional namespaces needed: [n=0] [13:13:43.422] - Finding globals in 'X' for chunk #1 ... DONE [13:13:43.422] - seeds: [13:13:43.423] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:43.423] getGlobalsAndPackages() ... [13:13:43.423] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:43.423] Resolving globals: FALSE [13:13:43.423] Tweak future expression to call with '...' arguments ... [13:13:43.423] { [13:13:43.423] do.call(function(...) { [13:13:43.423] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:43.423] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:43.423] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:43.423] on.exit(options(oopts), add = TRUE) [13:13:43.423] } [13:13:43.423] { [13:13:43.423] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:43.423] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:43.423] ...future.FUN(...future.X_jj, ...) [13:13:43.423] }) [13:13:43.423] } [13:13:43.423] }, args = future.call.arguments) [13:13:43.423] } [13:13:43.423] Tweak future expression to call with '...' arguments ... DONE [13:13:43.424] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:43.424] - packages: [1] 'future' [13:13:43.424] getGlobalsAndPackages() ... DONE [13:13:43.424] run() for 'Future' ... [13:13:43.424] - state: 'created' [13:13:43.425] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:13:43.425] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:43.425] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:43.425] - Field: 'label' [13:13:43.425] - Field: 'local' [13:13:43.425] - Field: 'owner' [13:13:43.426] - Field: 'envir' [13:13:43.426] - Field: 'packages' [13:13:43.426] - Field: 'gc' [13:13:43.426] - Field: 'conditions' [13:13:43.426] - Field: 'expr' [13:13:43.426] - Field: 'uuid' [13:13:43.426] - Field: 'seed' [13:13:43.426] - Field: 'version' [13:13:43.427] - Field: 'result' [13:13:43.427] - Field: 'asynchronous' [13:13:43.427] - Field: 'calls' [13:13:43.427] - Field: 'globals' [13:13:43.427] - Field: 'stdout' [13:13:43.427] - Field: 'earlySignal' [13:13:43.427] - Field: 'lazy' [13:13:43.427] - Field: 'state' [13:13:43.427] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:43.428] - Launch lazy future ... [13:13:43.428] Packages needed by the future expression (n = 1): 'future' [13:13:43.428] Packages needed by future strategies (n = 0): [13:13:43.428] { [13:13:43.428] { [13:13:43.428] { [13:13:43.428] ...future.startTime <- base::Sys.time() [13:13:43.428] { [13:13:43.428] { [13:13:43.428] { [13:13:43.428] { [13:13:43.428] base::local({ [13:13:43.428] has_future <- base::requireNamespace("future", [13:13:43.428] quietly = TRUE) [13:13:43.428] if (has_future) { [13:13:43.428] ns <- base::getNamespace("future") [13:13:43.428] version <- ns[[".package"]][["version"]] [13:13:43.428] if (is.null(version)) [13:13:43.428] version <- utils::packageVersion("future") [13:13:43.428] } [13:13:43.428] else { [13:13:43.428] version <- NULL [13:13:43.428] } [13:13:43.428] if (!has_future || version < "1.8.0") { [13:13:43.428] info <- base::c(r_version = base::gsub("R version ", [13:13:43.428] "", base::R.version$version.string), [13:13:43.428] platform = base::sprintf("%s (%s-bit)", [13:13:43.428] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:43.428] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:43.428] "release", "version")], collapse = " "), [13:13:43.428] hostname = base::Sys.info()[["nodename"]]) [13:13:43.428] info <- base::sprintf("%s: %s", base::names(info), [13:13:43.428] info) [13:13:43.428] info <- base::paste(info, collapse = "; ") [13:13:43.428] if (!has_future) { [13:13:43.428] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:43.428] info) [13:13:43.428] } [13:13:43.428] else { [13:13:43.428] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:43.428] info, version) [13:13:43.428] } [13:13:43.428] base::stop(msg) [13:13:43.428] } [13:13:43.428] }) [13:13:43.428] } [13:13:43.428] base::local({ [13:13:43.428] for (pkg in "future") { [13:13:43.428] base::loadNamespace(pkg) [13:13:43.428] base::library(pkg, character.only = TRUE) [13:13:43.428] } [13:13:43.428] }) [13:13:43.428] } [13:13:43.428] options(future.plan = NULL) [13:13:43.428] Sys.unsetenv("R_FUTURE_PLAN") [13:13:43.428] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:43.428] } [13:13:43.428] ...future.workdir <- getwd() [13:13:43.428] } [13:13:43.428] ...future.oldOptions <- base::as.list(base::.Options) [13:13:43.428] ...future.oldEnvVars <- base::Sys.getenv() [13:13:43.428] } [13:13:43.428] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:43.428] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:43.428] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:43.428] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:43.428] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:43.428] future.stdout.windows.reencode = NULL, width = 80L) [13:13:43.428] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:43.428] base::names(...future.oldOptions)) [13:13:43.428] } [13:13:43.428] if (FALSE) { [13:13:43.428] } [13:13:43.428] else { [13:13:43.428] if (TRUE) { [13:13:43.428] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:43.428] open = "w") [13:13:43.428] } [13:13:43.428] else { [13:13:43.428] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:43.428] windows = "NUL", "/dev/null"), open = "w") [13:13:43.428] } [13:13:43.428] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:43.428] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:43.428] base::sink(type = "output", split = FALSE) [13:13:43.428] base::close(...future.stdout) [13:13:43.428] }, add = TRUE) [13:13:43.428] } [13:13:43.428] ...future.frame <- base::sys.nframe() [13:13:43.428] ...future.conditions <- base::list() [13:13:43.428] ...future.rng <- base::globalenv()$.Random.seed [13:13:43.428] if (FALSE) { [13:13:43.428] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:43.428] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:43.428] } [13:13:43.428] ...future.result <- base::tryCatch({ [13:13:43.428] base::withCallingHandlers({ [13:13:43.428] ...future.value <- base::withVisible(base::local({ [13:13:43.428] do.call(function(...) { [13:13:43.428] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:43.428] if (!identical(...future.globals.maxSize.org, [13:13:43.428] ...future.globals.maxSize)) { [13:13:43.428] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:43.428] on.exit(options(oopts), add = TRUE) [13:13:43.428] } [13:13:43.428] { [13:13:43.428] lapply(seq_along(...future.elements_ii), [13:13:43.428] FUN = function(jj) { [13:13:43.428] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:43.428] ...future.FUN(...future.X_jj, ...) [13:13:43.428] }) [13:13:43.428] } [13:13:43.428] }, args = future.call.arguments) [13:13:43.428] })) [13:13:43.428] future::FutureResult(value = ...future.value$value, [13:13:43.428] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:43.428] ...future.rng), globalenv = if (FALSE) [13:13:43.428] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:43.428] ...future.globalenv.names)) [13:13:43.428] else NULL, started = ...future.startTime, version = "1.8") [13:13:43.428] }, condition = base::local({ [13:13:43.428] c <- base::c [13:13:43.428] inherits <- base::inherits [13:13:43.428] invokeRestart <- base::invokeRestart [13:13:43.428] length <- base::length [13:13:43.428] list <- base::list [13:13:43.428] seq.int <- base::seq.int [13:13:43.428] signalCondition <- base::signalCondition [13:13:43.428] sys.calls <- base::sys.calls [13:13:43.428] `[[` <- base::`[[` [13:13:43.428] `+` <- base::`+` [13:13:43.428] `<<-` <- base::`<<-` [13:13:43.428] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:43.428] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:43.428] 3L)] [13:13:43.428] } [13:13:43.428] function(cond) { [13:13:43.428] is_error <- inherits(cond, "error") [13:13:43.428] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:43.428] NULL) [13:13:43.428] if (is_error) { [13:13:43.428] sessionInformation <- function() { [13:13:43.428] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:43.428] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:43.428] search = base::search(), system = base::Sys.info()) [13:13:43.428] } [13:13:43.428] ...future.conditions[[length(...future.conditions) + [13:13:43.428] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:43.428] cond$call), session = sessionInformation(), [13:13:43.428] timestamp = base::Sys.time(), signaled = 0L) [13:13:43.428] signalCondition(cond) [13:13:43.428] } [13:13:43.428] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:43.428] "immediateCondition"))) { [13:13:43.428] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:43.428] ...future.conditions[[length(...future.conditions) + [13:13:43.428] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:43.428] if (TRUE && !signal) { [13:13:43.428] muffleCondition <- function (cond, pattern = "^muffle") [13:13:43.428] { [13:13:43.428] inherits <- base::inherits [13:13:43.428] invokeRestart <- base::invokeRestart [13:13:43.428] is.null <- base::is.null [13:13:43.428] muffled <- FALSE [13:13:43.428] if (inherits(cond, "message")) { [13:13:43.428] muffled <- grepl(pattern, "muffleMessage") [13:13:43.428] if (muffled) [13:13:43.428] invokeRestart("muffleMessage") [13:13:43.428] } [13:13:43.428] else if (inherits(cond, "warning")) { [13:13:43.428] muffled <- grepl(pattern, "muffleWarning") [13:13:43.428] if (muffled) [13:13:43.428] invokeRestart("muffleWarning") [13:13:43.428] } [13:13:43.428] else if (inherits(cond, "condition")) { [13:13:43.428] if (!is.null(pattern)) { [13:13:43.428] computeRestarts <- base::computeRestarts [13:13:43.428] grepl <- base::grepl [13:13:43.428] restarts <- computeRestarts(cond) [13:13:43.428] for (restart in restarts) { [13:13:43.428] name <- restart$name [13:13:43.428] if (is.null(name)) [13:13:43.428] next [13:13:43.428] if (!grepl(pattern, name)) [13:13:43.428] next [13:13:43.428] invokeRestart(restart) [13:13:43.428] muffled <- TRUE [13:13:43.428] break [13:13:43.428] } [13:13:43.428] } [13:13:43.428] } [13:13:43.428] invisible(muffled) [13:13:43.428] } [13:13:43.428] muffleCondition(cond, pattern = "^muffle") [13:13:43.428] } [13:13:43.428] } [13:13:43.428] else { [13:13:43.428] if (TRUE) { [13:13:43.428] muffleCondition <- function (cond, pattern = "^muffle") [13:13:43.428] { [13:13:43.428] inherits <- base::inherits [13:13:43.428] invokeRestart <- base::invokeRestart [13:13:43.428] is.null <- base::is.null [13:13:43.428] muffled <- FALSE [13:13:43.428] if (inherits(cond, "message")) { [13:13:43.428] muffled <- grepl(pattern, "muffleMessage") [13:13:43.428] if (muffled) [13:13:43.428] invokeRestart("muffleMessage") [13:13:43.428] } [13:13:43.428] else if (inherits(cond, "warning")) { [13:13:43.428] muffled <- grepl(pattern, "muffleWarning") [13:13:43.428] if (muffled) [13:13:43.428] invokeRestart("muffleWarning") [13:13:43.428] } [13:13:43.428] else if (inherits(cond, "condition")) { [13:13:43.428] if (!is.null(pattern)) { [13:13:43.428] computeRestarts <- base::computeRestarts [13:13:43.428] grepl <- base::grepl [13:13:43.428] restarts <- computeRestarts(cond) [13:13:43.428] for (restart in restarts) { [13:13:43.428] name <- restart$name [13:13:43.428] if (is.null(name)) [13:13:43.428] next [13:13:43.428] if (!grepl(pattern, name)) [13:13:43.428] next [13:13:43.428] invokeRestart(restart) [13:13:43.428] muffled <- TRUE [13:13:43.428] break [13:13:43.428] } [13:13:43.428] } [13:13:43.428] } [13:13:43.428] invisible(muffled) [13:13:43.428] } [13:13:43.428] muffleCondition(cond, pattern = "^muffle") [13:13:43.428] } [13:13:43.428] } [13:13:43.428] } [13:13:43.428] })) [13:13:43.428] }, error = function(ex) { [13:13:43.428] base::structure(base::list(value = NULL, visible = NULL, [13:13:43.428] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:43.428] ...future.rng), started = ...future.startTime, [13:13:43.428] finished = Sys.time(), session_uuid = NA_character_, [13:13:43.428] version = "1.8"), class = "FutureResult") [13:13:43.428] }, finally = { [13:13:43.428] if (!identical(...future.workdir, getwd())) [13:13:43.428] setwd(...future.workdir) [13:13:43.428] { [13:13:43.428] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:43.428] ...future.oldOptions$nwarnings <- NULL [13:13:43.428] } [13:13:43.428] base::options(...future.oldOptions) [13:13:43.428] if (.Platform$OS.type == "windows") { [13:13:43.428] old_names <- names(...future.oldEnvVars) [13:13:43.428] envs <- base::Sys.getenv() [13:13:43.428] names <- names(envs) [13:13:43.428] common <- intersect(names, old_names) [13:13:43.428] added <- setdiff(names, old_names) [13:13:43.428] removed <- setdiff(old_names, names) [13:13:43.428] changed <- common[...future.oldEnvVars[common] != [13:13:43.428] envs[common]] [13:13:43.428] NAMES <- toupper(changed) [13:13:43.428] args <- list() [13:13:43.428] for (kk in seq_along(NAMES)) { [13:13:43.428] name <- changed[[kk]] [13:13:43.428] NAME <- NAMES[[kk]] [13:13:43.428] if (name != NAME && is.element(NAME, old_names)) [13:13:43.428] next [13:13:43.428] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:43.428] } [13:13:43.428] NAMES <- toupper(added) [13:13:43.428] for (kk in seq_along(NAMES)) { [13:13:43.428] name <- added[[kk]] [13:13:43.428] NAME <- NAMES[[kk]] [13:13:43.428] if (name != NAME && is.element(NAME, old_names)) [13:13:43.428] next [13:13:43.428] args[[name]] <- "" [13:13:43.428] } [13:13:43.428] NAMES <- toupper(removed) [13:13:43.428] for (kk in seq_along(NAMES)) { [13:13:43.428] name <- removed[[kk]] [13:13:43.428] NAME <- NAMES[[kk]] [13:13:43.428] if (name != NAME && is.element(NAME, old_names)) [13:13:43.428] next [13:13:43.428] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:43.428] } [13:13:43.428] if (length(args) > 0) [13:13:43.428] base::do.call(base::Sys.setenv, args = args) [13:13:43.428] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:43.428] } [13:13:43.428] else { [13:13:43.428] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:43.428] } [13:13:43.428] { [13:13:43.428] if (base::length(...future.futureOptionsAdded) > [13:13:43.428] 0L) { [13:13:43.428] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:43.428] base::names(opts) <- ...future.futureOptionsAdded [13:13:43.428] base::options(opts) [13:13:43.428] } [13:13:43.428] { [13:13:43.428] { [13:13:43.428] NULL [13:13:43.428] RNGkind("Mersenne-Twister") [13:13:43.428] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:43.428] inherits = FALSE) [13:13:43.428] } [13:13:43.428] options(future.plan = NULL) [13:13:43.428] if (is.na(NA_character_)) [13:13:43.428] Sys.unsetenv("R_FUTURE_PLAN") [13:13:43.428] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:43.428] future::plan(list(function (..., envir = parent.frame()) [13:13:43.428] { [13:13:43.428] future <- SequentialFuture(..., envir = envir) [13:13:43.428] if (!future$lazy) [13:13:43.428] future <- run(future) [13:13:43.428] invisible(future) [13:13:43.428] }), .cleanup = FALSE, .init = FALSE) [13:13:43.428] } [13:13:43.428] } [13:13:43.428] } [13:13:43.428] }) [13:13:43.428] if (TRUE) { [13:13:43.428] base::sink(type = "output", split = FALSE) [13:13:43.428] if (TRUE) { [13:13:43.428] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:43.428] } [13:13:43.428] else { [13:13:43.428] ...future.result["stdout"] <- base::list(NULL) [13:13:43.428] } [13:13:43.428] base::close(...future.stdout) [13:13:43.428] ...future.stdout <- NULL [13:13:43.428] } [13:13:43.428] ...future.result$conditions <- ...future.conditions [13:13:43.428] ...future.result$finished <- base::Sys.time() [13:13:43.428] ...future.result [13:13:43.428] } [13:13:43.431] assign_globals() ... [13:13:43.431] List of 5 [13:13:43.431] $ ...future.FUN :function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [13:13:43.431] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [13:13:43.431] $ future.call.arguments :List of 2 [13:13:43.431] ..$ collapse: chr "; " [13:13:43.431] ..$ maxHead : int 3 [13:13:43.431] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:43.431] $ ...future.elements_ii :List of 1 [13:13:43.431] ..$ a: Named chr [1:101] "hello" "1" "2" "3" ... [13:13:43.431] .. ..- attr(*, "names")= chr [1:101] "" "b1" "b2" "b3" ... [13:13:43.431] $ ...future.seeds_ii : NULL [13:13:43.431] $ ...future.globals.maxSize: NULL [13:13:43.431] - attr(*, "where")=List of 5 [13:13:43.431] ..$ ...future.FUN : [13:13:43.431] ..$ future.call.arguments : [13:13:43.431] ..$ ...future.elements_ii : [13:13:43.431] ..$ ...future.seeds_ii : [13:13:43.431] ..$ ...future.globals.maxSize: [13:13:43.431] - attr(*, "resolved")= logi FALSE [13:13:43.431] - attr(*, "total_size")= num 71456 [13:13:43.431] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:43.431] - attr(*, "already-done")= logi TRUE [13:13:43.436] - copied '...future.FUN' to environment [13:13:43.436] - copied 'future.call.arguments' to environment [13:13:43.436] - copied '...future.elements_ii' to environment [13:13:43.436] - copied '...future.seeds_ii' to environment [13:13:43.437] - copied '...future.globals.maxSize' to environment [13:13:43.437] assign_globals() ... done [13:13:43.437] plan(): Setting new future strategy stack: [13:13:43.437] List of future strategies: [13:13:43.437] 1. sequential: [13:13:43.437] - args: function (..., envir = parent.frame(), workers = "") [13:13:43.437] - tweaked: FALSE [13:13:43.437] - call: NULL [13:13:43.438] plan(): nbrOfWorkers() = 1 [13:13:43.439] plan(): Setting new future strategy stack: [13:13:43.439] List of future strategies: [13:13:43.439] 1. sequential: [13:13:43.439] - args: function (..., envir = parent.frame(), workers = "") [13:13:43.439] - tweaked: FALSE [13:13:43.439] - call: plan(strategy) [13:13:43.439] plan(): nbrOfWorkers() = 1 [13:13:43.439] SequentialFuture started (and completed) [13:13:43.439] - Launch lazy future ... done [13:13:43.440] run() for 'SequentialFuture' ... done [13:13:43.440] Created future: [13:13:43.440] SequentialFuture: [13:13:43.440] Label: 'future_lapply-1' [13:13:43.440] Expression: [13:13:43.440] { [13:13:43.440] do.call(function(...) { [13:13:43.440] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:43.440] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:43.440] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:43.440] on.exit(options(oopts), add = TRUE) [13:13:43.440] } [13:13:43.440] { [13:13:43.440] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:43.440] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:43.440] ...future.FUN(...future.X_jj, ...) [13:13:43.440] }) [13:13:43.440] } [13:13:43.440] }, args = future.call.arguments) [13:13:43.440] } [13:13:43.440] Lazy evaluation: FALSE [13:13:43.440] Asynchronous evaluation: FALSE [13:13:43.440] Local evaluation: TRUE [13:13:43.440] Environment: R_GlobalEnv [13:13:43.440] Capture standard output: TRUE [13:13:43.440] Capture condition classes: 'condition' (excluding 'nothing') [13:13:43.440] 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) [13:13:43.440] Packages: 1 packages ('future') [13:13:43.440] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:43.440] Resolved: TRUE [13:13:43.440] Value: 136 bytes of class 'list' [13:13:43.440] Early signaling: FALSE [13:13:43.440] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:43.440] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:43.441] Chunk #1 of 1 ... DONE [13:13:43.441] Launching 1 futures (chunks) ... DONE [13:13:43.441] Resolving 1 futures (chunks) ... [13:13:43.441] resolve() on list ... [13:13:43.441] recursive: 0 [13:13:43.441] length: 1 [13:13:43.441] [13:13:43.442] resolved() for 'SequentialFuture' ... [13:13:43.442] - state: 'finished' [13:13:43.442] - run: TRUE [13:13:43.442] - result: 'FutureResult' [13:13:43.442] resolved() for 'SequentialFuture' ... done [13:13:43.442] Future #1 [13:13:43.442] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:43.442] - nx: 1 [13:13:43.443] - relay: TRUE [13:13:43.443] - stdout: TRUE [13:13:43.443] - signal: TRUE [13:13:43.443] - resignal: FALSE [13:13:43.443] - force: TRUE [13:13:43.443] - relayed: [n=1] FALSE [13:13:43.443] - queued futures: [n=1] FALSE [13:13:43.443] - until=1 [13:13:43.443] - relaying element #1 [13:13:43.444] - relayed: [n=1] TRUE [13:13:43.444] - queued futures: [n=1] TRUE [13:13:43.444] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:43.444] length: 0 (resolved future 1) [13:13:43.444] Relaying remaining futures [13:13:43.444] signalConditionsASAP(NULL, pos=0) ... [13:13:43.444] - nx: 1 [13:13:43.444] - relay: TRUE [13:13:43.445] - stdout: TRUE [13:13:43.445] - signal: TRUE [13:13:43.445] - resignal: FALSE [13:13:43.445] - force: TRUE [13:13:43.445] - relayed: [n=1] TRUE [13:13:43.445] - queued futures: [n=1] TRUE - flush all [13:13:43.445] - relayed: [n=1] TRUE [13:13:43.445] - queued futures: [n=1] TRUE [13:13:43.445] signalConditionsASAP(NULL, pos=0) ... done [13:13:43.446] resolve() on list ... DONE [13:13:43.446] - Number of value chunks collected: 1 [13:13:43.446] Resolving 1 futures (chunks) ... DONE [13:13:43.446] Reducing values from 1 chunks ... [13:13:43.446] - Number of values collected after concatenation: 1 [13:13:43.446] - Number of values expected: 1 [13:13:43.446] Reducing values from 1 chunks ... DONE [13:13:43.446] future_lapply() ... DONE List of 1 $ y:List of 1 ..$ a: chr "hello; 1; 2; ...; 100" - future_lapply(x, FUN = listenv::listenv, ...) ... [13:13:43.447] future_lapply() ... [13:13:43.448] Number of chunks: 1 [13:13:43.448] Index remapping (attribute 'ordering'): [n = 2] 2, 1 [13:13:43.448] getGlobalsAndPackagesXApply() ... [13:13:43.448] - future.globals: TRUE [13:13:43.448] getGlobalsAndPackages() ... [13:13:43.448] Searching for globals... [13:13:43.449] - globals found: [4] 'FUN', '{', 'get', 'parent.env' [13:13:43.450] Searching for globals ... DONE [13:13:43.450] Resolving globals: FALSE [13:13:43.450] The total size of the 1 globals is 4.85 KiB (4968 bytes) [13:13:43.450] 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') [13:13:43.450] - globals: [1] 'FUN' [13:13:43.451] - packages: [1] 'listenv' [13:13:43.451] getGlobalsAndPackages() ... DONE [13:13:43.451] - globals found/used: [n=1] 'FUN' [13:13:43.451] - needed namespaces: [n=1] 'listenv' [13:13:43.451] Finding globals ... DONE [13:13:43.451] - use_args: TRUE [13:13:43.451] - Getting '...' globals ... [13:13:43.452] resolve() on list ... [13:13:43.452] recursive: 0 [13:13:43.452] length: 1 [13:13:43.452] elements: '...' [13:13:43.452] length: 0 (resolved future 1) [13:13:43.452] resolve() on list ... DONE [13:13:43.452] - '...' content: [n=0] [13:13:43.452] List of 1 [13:13:43.452] $ ...: list() [13:13:43.452] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:43.452] - attr(*, "where")=List of 1 [13:13:43.452] ..$ ...: [13:13:43.452] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:43.452] - attr(*, "resolved")= logi TRUE [13:13:43.452] - attr(*, "total_size")= num NA [13:13:43.454] - Getting '...' globals ... DONE [13:13:43.455] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:43.455] List of 2 [13:13:43.455] $ ...future.FUN:function (x, ...) [13:13:43.455] $ ... : list() [13:13:43.455] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:43.455] - attr(*, "where")=List of 2 [13:13:43.455] ..$ ...future.FUN: [13:13:43.455] ..$ ... : [13:13:43.455] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:43.455] - attr(*, "resolved")= logi FALSE [13:13:43.455] - attr(*, "total_size")= num 4968 [13:13:43.457] Packages to be attached in all futures: [n=1] 'listenv' [13:13:43.457] getGlobalsAndPackagesXApply() ... DONE [13:13:43.457] Number of futures (= number of chunks): 1 [13:13:43.457] Launching 1 futures (chunks) ... [13:13:43.458] Chunk #1 of 1 ... [13:13:43.458] - Finding globals in 'X' for chunk #1 ... [13:13:43.458] getGlobalsAndPackages() ... [13:13:43.458] Searching for globals... [13:13:43.458] [13:13:43.459] Searching for globals ... DONE [13:13:43.459] - globals: [0] [13:13:43.459] getGlobalsAndPackages() ... DONE [13:13:43.459] + additional globals found: [n=0] [13:13:43.459] + additional namespaces needed: [n=0] [13:13:43.459] - Finding globals in 'X' for chunk #1 ... DONE [13:13:43.459] - seeds: [13:13:43.459] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:43.459] getGlobalsAndPackages() ... [13:13:43.460] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:43.460] Resolving globals: FALSE [13:13:43.460] Tweak future expression to call with '...' arguments ... [13:13:43.460] { [13:13:43.460] do.call(function(...) { [13:13:43.460] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:43.460] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:43.460] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:43.460] on.exit(options(oopts), add = TRUE) [13:13:43.460] } [13:13:43.460] { [13:13:43.460] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:43.460] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:43.460] ...future.FUN(...future.X_jj, ...) [13:13:43.460] }) [13:13:43.460] } [13:13:43.460] }, args = future.call.arguments) [13:13:43.460] } [13:13:43.460] Tweak future expression to call with '...' arguments ... DONE [13:13:43.461] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:43.461] - packages: [1] 'listenv' [13:13:43.461] getGlobalsAndPackages() ... DONE [13:13:43.461] run() for 'Future' ... [13:13:43.461] - state: 'created' [13:13:43.461] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:13:43.462] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:43.462] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:43.462] - Field: 'label' [13:13:43.462] - Field: 'local' [13:13:43.462] - Field: 'owner' [13:13:43.462] - Field: 'envir' [13:13:43.462] - Field: 'packages' [13:13:43.463] - Field: 'gc' [13:13:43.463] - Field: 'conditions' [13:13:43.463] - Field: 'expr' [13:13:43.463] - Field: 'uuid' [13:13:43.463] - Field: 'seed' [13:13:43.463] - Field: 'version' [13:13:43.463] - Field: 'result' [13:13:43.463] - Field: 'asynchronous' [13:13:43.464] - Field: 'calls' [13:13:43.464] - Field: 'globals' [13:13:43.464] - Field: 'stdout' [13:13:43.464] - Field: 'earlySignal' [13:13:43.464] - Field: 'lazy' [13:13:43.464] - Field: 'state' [13:13:43.464] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:43.464] - Launch lazy future ... [13:13:43.465] Packages needed by the future expression (n = 1): 'listenv' [13:13:43.465] Packages needed by future strategies (n = 0): [13:13:43.465] { [13:13:43.465] { [13:13:43.465] { [13:13:43.465] ...future.startTime <- base::Sys.time() [13:13:43.465] { [13:13:43.465] { [13:13:43.465] { [13:13:43.465] { [13:13:43.465] base::local({ [13:13:43.465] has_future <- base::requireNamespace("future", [13:13:43.465] quietly = TRUE) [13:13:43.465] if (has_future) { [13:13:43.465] ns <- base::getNamespace("future") [13:13:43.465] version <- ns[[".package"]][["version"]] [13:13:43.465] if (is.null(version)) [13:13:43.465] version <- utils::packageVersion("future") [13:13:43.465] } [13:13:43.465] else { [13:13:43.465] version <- NULL [13:13:43.465] } [13:13:43.465] if (!has_future || version < "1.8.0") { [13:13:43.465] info <- base::c(r_version = base::gsub("R version ", [13:13:43.465] "", base::R.version$version.string), [13:13:43.465] platform = base::sprintf("%s (%s-bit)", [13:13:43.465] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:43.465] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:43.465] "release", "version")], collapse = " "), [13:13:43.465] hostname = base::Sys.info()[["nodename"]]) [13:13:43.465] info <- base::sprintf("%s: %s", base::names(info), [13:13:43.465] info) [13:13:43.465] info <- base::paste(info, collapse = "; ") [13:13:43.465] if (!has_future) { [13:13:43.465] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:43.465] info) [13:13:43.465] } [13:13:43.465] else { [13:13:43.465] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:43.465] info, version) [13:13:43.465] } [13:13:43.465] base::stop(msg) [13:13:43.465] } [13:13:43.465] }) [13:13:43.465] } [13:13:43.465] base::local({ [13:13:43.465] for (pkg in "listenv") { [13:13:43.465] base::loadNamespace(pkg) [13:13:43.465] base::library(pkg, character.only = TRUE) [13:13:43.465] } [13:13:43.465] }) [13:13:43.465] } [13:13:43.465] options(future.plan = NULL) [13:13:43.465] Sys.unsetenv("R_FUTURE_PLAN") [13:13:43.465] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:43.465] } [13:13:43.465] ...future.workdir <- getwd() [13:13:43.465] } [13:13:43.465] ...future.oldOptions <- base::as.list(base::.Options) [13:13:43.465] ...future.oldEnvVars <- base::Sys.getenv() [13:13:43.465] } [13:13:43.465] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:43.465] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:43.465] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:43.465] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:43.465] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:43.465] future.stdout.windows.reencode = NULL, width = 80L) [13:13:43.465] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:43.465] base::names(...future.oldOptions)) [13:13:43.465] } [13:13:43.465] if (FALSE) { [13:13:43.465] } [13:13:43.465] else { [13:13:43.465] if (TRUE) { [13:13:43.465] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:43.465] open = "w") [13:13:43.465] } [13:13:43.465] else { [13:13:43.465] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:43.465] windows = "NUL", "/dev/null"), open = "w") [13:13:43.465] } [13:13:43.465] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:43.465] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:43.465] base::sink(type = "output", split = FALSE) [13:13:43.465] base::close(...future.stdout) [13:13:43.465] }, add = TRUE) [13:13:43.465] } [13:13:43.465] ...future.frame <- base::sys.nframe() [13:13:43.465] ...future.conditions <- base::list() [13:13:43.465] ...future.rng <- base::globalenv()$.Random.seed [13:13:43.465] if (FALSE) { [13:13:43.465] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:43.465] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:43.465] } [13:13:43.465] ...future.result <- base::tryCatch({ [13:13:43.465] base::withCallingHandlers({ [13:13:43.465] ...future.value <- base::withVisible(base::local({ [13:13:43.465] do.call(function(...) { [13:13:43.465] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:43.465] if (!identical(...future.globals.maxSize.org, [13:13:43.465] ...future.globals.maxSize)) { [13:13:43.465] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:43.465] on.exit(options(oopts), add = TRUE) [13:13:43.465] } [13:13:43.465] { [13:13:43.465] lapply(seq_along(...future.elements_ii), [13:13:43.465] FUN = function(jj) { [13:13:43.465] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:43.465] ...future.FUN(...future.X_jj, ...) [13:13:43.465] }) [13:13:43.465] } [13:13:43.465] }, args = future.call.arguments) [13:13:43.465] })) [13:13:43.465] future::FutureResult(value = ...future.value$value, [13:13:43.465] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:43.465] ...future.rng), globalenv = if (FALSE) [13:13:43.465] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:43.465] ...future.globalenv.names)) [13:13:43.465] else NULL, started = ...future.startTime, version = "1.8") [13:13:43.465] }, condition = base::local({ [13:13:43.465] c <- base::c [13:13:43.465] inherits <- base::inherits [13:13:43.465] invokeRestart <- base::invokeRestart [13:13:43.465] length <- base::length [13:13:43.465] list <- base::list [13:13:43.465] seq.int <- base::seq.int [13:13:43.465] signalCondition <- base::signalCondition [13:13:43.465] sys.calls <- base::sys.calls [13:13:43.465] `[[` <- base::`[[` [13:13:43.465] `+` <- base::`+` [13:13:43.465] `<<-` <- base::`<<-` [13:13:43.465] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:43.465] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:43.465] 3L)] [13:13:43.465] } [13:13:43.465] function(cond) { [13:13:43.465] is_error <- inherits(cond, "error") [13:13:43.465] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:43.465] NULL) [13:13:43.465] if (is_error) { [13:13:43.465] sessionInformation <- function() { [13:13:43.465] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:43.465] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:43.465] search = base::search(), system = base::Sys.info()) [13:13:43.465] } [13:13:43.465] ...future.conditions[[length(...future.conditions) + [13:13:43.465] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:43.465] cond$call), session = sessionInformation(), [13:13:43.465] timestamp = base::Sys.time(), signaled = 0L) [13:13:43.465] signalCondition(cond) [13:13:43.465] } [13:13:43.465] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:43.465] "immediateCondition"))) { [13:13:43.465] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:43.465] ...future.conditions[[length(...future.conditions) + [13:13:43.465] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:43.465] if (TRUE && !signal) { [13:13:43.465] muffleCondition <- function (cond, pattern = "^muffle") [13:13:43.465] { [13:13:43.465] inherits <- base::inherits [13:13:43.465] invokeRestart <- base::invokeRestart [13:13:43.465] is.null <- base::is.null [13:13:43.465] muffled <- FALSE [13:13:43.465] if (inherits(cond, "message")) { [13:13:43.465] muffled <- grepl(pattern, "muffleMessage") [13:13:43.465] if (muffled) [13:13:43.465] invokeRestart("muffleMessage") [13:13:43.465] } [13:13:43.465] else if (inherits(cond, "warning")) { [13:13:43.465] muffled <- grepl(pattern, "muffleWarning") [13:13:43.465] if (muffled) [13:13:43.465] invokeRestart("muffleWarning") [13:13:43.465] } [13:13:43.465] else if (inherits(cond, "condition")) { [13:13:43.465] if (!is.null(pattern)) { [13:13:43.465] computeRestarts <- base::computeRestarts [13:13:43.465] grepl <- base::grepl [13:13:43.465] restarts <- computeRestarts(cond) [13:13:43.465] for (restart in restarts) { [13:13:43.465] name <- restart$name [13:13:43.465] if (is.null(name)) [13:13:43.465] next [13:13:43.465] if (!grepl(pattern, name)) [13:13:43.465] next [13:13:43.465] invokeRestart(restart) [13:13:43.465] muffled <- TRUE [13:13:43.465] break [13:13:43.465] } [13:13:43.465] } [13:13:43.465] } [13:13:43.465] invisible(muffled) [13:13:43.465] } [13:13:43.465] muffleCondition(cond, pattern = "^muffle") [13:13:43.465] } [13:13:43.465] } [13:13:43.465] else { [13:13:43.465] if (TRUE) { [13:13:43.465] muffleCondition <- function (cond, pattern = "^muffle") [13:13:43.465] { [13:13:43.465] inherits <- base::inherits [13:13:43.465] invokeRestart <- base::invokeRestart [13:13:43.465] is.null <- base::is.null [13:13:43.465] muffled <- FALSE [13:13:43.465] if (inherits(cond, "message")) { [13:13:43.465] muffled <- grepl(pattern, "muffleMessage") [13:13:43.465] if (muffled) [13:13:43.465] invokeRestart("muffleMessage") [13:13:43.465] } [13:13:43.465] else if (inherits(cond, "warning")) { [13:13:43.465] muffled <- grepl(pattern, "muffleWarning") [13:13:43.465] if (muffled) [13:13:43.465] invokeRestart("muffleWarning") [13:13:43.465] } [13:13:43.465] else if (inherits(cond, "condition")) { [13:13:43.465] if (!is.null(pattern)) { [13:13:43.465] computeRestarts <- base::computeRestarts [13:13:43.465] grepl <- base::grepl [13:13:43.465] restarts <- computeRestarts(cond) [13:13:43.465] for (restart in restarts) { [13:13:43.465] name <- restart$name [13:13:43.465] if (is.null(name)) [13:13:43.465] next [13:13:43.465] if (!grepl(pattern, name)) [13:13:43.465] next [13:13:43.465] invokeRestart(restart) [13:13:43.465] muffled <- TRUE [13:13:43.465] break [13:13:43.465] } [13:13:43.465] } [13:13:43.465] } [13:13:43.465] invisible(muffled) [13:13:43.465] } [13:13:43.465] muffleCondition(cond, pattern = "^muffle") [13:13:43.465] } [13:13:43.465] } [13:13:43.465] } [13:13:43.465] })) [13:13:43.465] }, error = function(ex) { [13:13:43.465] base::structure(base::list(value = NULL, visible = NULL, [13:13:43.465] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:43.465] ...future.rng), started = ...future.startTime, [13:13:43.465] finished = Sys.time(), session_uuid = NA_character_, [13:13:43.465] version = "1.8"), class = "FutureResult") [13:13:43.465] }, finally = { [13:13:43.465] if (!identical(...future.workdir, getwd())) [13:13:43.465] setwd(...future.workdir) [13:13:43.465] { [13:13:43.465] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:43.465] ...future.oldOptions$nwarnings <- NULL [13:13:43.465] } [13:13:43.465] base::options(...future.oldOptions) [13:13:43.465] if (.Platform$OS.type == "windows") { [13:13:43.465] old_names <- names(...future.oldEnvVars) [13:13:43.465] envs <- base::Sys.getenv() [13:13:43.465] names <- names(envs) [13:13:43.465] common <- intersect(names, old_names) [13:13:43.465] added <- setdiff(names, old_names) [13:13:43.465] removed <- setdiff(old_names, names) [13:13:43.465] changed <- common[...future.oldEnvVars[common] != [13:13:43.465] envs[common]] [13:13:43.465] NAMES <- toupper(changed) [13:13:43.465] args <- list() [13:13:43.465] for (kk in seq_along(NAMES)) { [13:13:43.465] name <- changed[[kk]] [13:13:43.465] NAME <- NAMES[[kk]] [13:13:43.465] if (name != NAME && is.element(NAME, old_names)) [13:13:43.465] next [13:13:43.465] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:43.465] } [13:13:43.465] NAMES <- toupper(added) [13:13:43.465] for (kk in seq_along(NAMES)) { [13:13:43.465] name <- added[[kk]] [13:13:43.465] NAME <- NAMES[[kk]] [13:13:43.465] if (name != NAME && is.element(NAME, old_names)) [13:13:43.465] next [13:13:43.465] args[[name]] <- "" [13:13:43.465] } [13:13:43.465] NAMES <- toupper(removed) [13:13:43.465] for (kk in seq_along(NAMES)) { [13:13:43.465] name <- removed[[kk]] [13:13:43.465] NAME <- NAMES[[kk]] [13:13:43.465] if (name != NAME && is.element(NAME, old_names)) [13:13:43.465] next [13:13:43.465] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:43.465] } [13:13:43.465] if (length(args) > 0) [13:13:43.465] base::do.call(base::Sys.setenv, args = args) [13:13:43.465] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:43.465] } [13:13:43.465] else { [13:13:43.465] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:43.465] } [13:13:43.465] { [13:13:43.465] if (base::length(...future.futureOptionsAdded) > [13:13:43.465] 0L) { [13:13:43.465] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:43.465] base::names(opts) <- ...future.futureOptionsAdded [13:13:43.465] base::options(opts) [13:13:43.465] } [13:13:43.465] { [13:13:43.465] { [13:13:43.465] NULL [13:13:43.465] RNGkind("Mersenne-Twister") [13:13:43.465] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:43.465] inherits = FALSE) [13:13:43.465] } [13:13:43.465] options(future.plan = NULL) [13:13:43.465] if (is.na(NA_character_)) [13:13:43.465] Sys.unsetenv("R_FUTURE_PLAN") [13:13:43.465] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:43.465] future::plan(list(function (..., envir = parent.frame()) [13:13:43.465] { [13:13:43.465] future <- SequentialFuture(..., envir = envir) [13:13:43.465] if (!future$lazy) [13:13:43.465] future <- run(future) [13:13:43.465] invisible(future) [13:13:43.465] }), .cleanup = FALSE, .init = FALSE) [13:13:43.465] } [13:13:43.465] } [13:13:43.465] } [13:13:43.465] }) [13:13:43.465] if (TRUE) { [13:13:43.465] base::sink(type = "output", split = FALSE) [13:13:43.465] if (TRUE) { [13:13:43.465] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:43.465] } [13:13:43.465] else { [13:13:43.465] ...future.result["stdout"] <- base::list(NULL) [13:13:43.465] } [13:13:43.465] base::close(...future.stdout) [13:13:43.465] ...future.stdout <- NULL [13:13:43.465] } [13:13:43.465] ...future.result$conditions <- ...future.conditions [13:13:43.465] ...future.result$finished <- base::Sys.time() [13:13:43.465] ...future.result [13:13:43.465] } [13:13:43.468] assign_globals() ... [13:13:43.468] List of 5 [13:13:43.468] $ ...future.FUN :function (x, ...) [13:13:43.468] $ future.call.arguments : list() [13:13:43.468] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:43.468] $ ...future.elements_ii :List of 2 [13:13:43.468] ..$ b:Classes 'listenv', 'environment' [13:13:43.468] ..$ a:Classes 'listenv', 'environment' [13:13:43.468] $ ...future.seeds_ii : NULL [13:13:43.468] $ ...future.globals.maxSize: NULL [13:13:43.468] - attr(*, "where")=List of 5 [13:13:43.468] ..$ ...future.FUN : [13:13:43.468] ..$ future.call.arguments : [13:13:43.468] ..$ ...future.elements_ii : [13:13:43.468] ..$ ...future.seeds_ii : [13:13:43.468] ..$ ...future.globals.maxSize: [13:13:43.468] - attr(*, "resolved")= logi FALSE [13:13:43.468] - attr(*, "total_size")= num 4968 [13:13:43.468] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:43.468] - attr(*, "already-done")= logi TRUE [13:13:43.472] - copied '...future.FUN' to environment [13:13:43.472] - copied 'future.call.arguments' to environment [13:13:43.472] - copied '...future.elements_ii' to environment [13:13:43.472] - copied '...future.seeds_ii' to environment [13:13:43.473] - copied '...future.globals.maxSize' to environment [13:13:43.473] assign_globals() ... done [13:13:43.473] plan(): Setting new future strategy stack: [13:13:43.473] List of future strategies: [13:13:43.473] 1. sequential: [13:13:43.473] - args: function (..., envir = parent.frame(), workers = "") [13:13:43.473] - tweaked: FALSE [13:13:43.473] - call: NULL [13:13:43.474] plan(): nbrOfWorkers() = 1 [13:13:43.475] plan(): Setting new future strategy stack: [13:13:43.475] List of future strategies: [13:13:43.475] 1. sequential: [13:13:43.475] - args: function (..., envir = parent.frame(), workers = "") [13:13:43.475] - tweaked: FALSE [13:13:43.475] - call: plan(strategy) [13:13:43.475] plan(): nbrOfWorkers() = 1 [13:13:43.475] SequentialFuture started (and completed) [13:13:43.475] - Launch lazy future ... done [13:13:43.476] run() for 'SequentialFuture' ... done [13:13:43.476] Created future: [13:13:43.476] SequentialFuture: [13:13:43.476] Label: 'future_lapply-1' [13:13:43.476] Expression: [13:13:43.476] { [13:13:43.476] do.call(function(...) { [13:13:43.476] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:43.476] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:43.476] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:43.476] on.exit(options(oopts), add = TRUE) [13:13:43.476] } [13:13:43.476] { [13:13:43.476] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:43.476] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:43.476] ...future.FUN(...future.X_jj, ...) [13:13:43.476] }) [13:13:43.476] } [13:13:43.476] }, args = future.call.arguments) [13:13:43.476] } [13:13:43.476] Lazy evaluation: FALSE [13:13:43.476] Asynchronous evaluation: FALSE [13:13:43.476] Local evaluation: TRUE [13:13:43.476] Environment: R_GlobalEnv [13:13:43.476] Capture standard output: TRUE [13:13:43.476] Capture condition classes: 'condition' (excluding 'nothing') [13:13:43.476] 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) [13:13:43.476] Packages: 1 packages ('listenv') [13:13:43.476] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:43.476] Resolved: TRUE [13:13:43.476] Value: 800 bytes of class 'list' [13:13:43.476] Early signaling: FALSE [13:13:43.476] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:43.476] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:43.477] Chunk #1 of 1 ... DONE [13:13:43.477] Launching 1 futures (chunks) ... DONE [13:13:43.477] Resolving 1 futures (chunks) ... [13:13:43.477] resolve() on list ... [13:13:43.477] recursive: 0 [13:13:43.478] length: 1 [13:13:43.478] [13:13:43.478] resolved() for 'SequentialFuture' ... [13:13:43.478] - state: 'finished' [13:13:43.478] - run: TRUE [13:13:43.478] - result: 'FutureResult' [13:13:43.478] resolved() for 'SequentialFuture' ... done [13:13:43.478] Future #1 [13:13:43.479] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:43.479] - nx: 1 [13:13:43.479] - relay: TRUE [13:13:43.479] - stdout: TRUE [13:13:43.479] - signal: TRUE [13:13:43.479] - resignal: FALSE [13:13:43.479] - force: TRUE [13:13:43.479] - relayed: [n=1] FALSE [13:13:43.479] - queued futures: [n=1] FALSE [13:13:43.480] - until=1 [13:13:43.480] - relaying element #1 [13:13:43.480] - relayed: [n=1] TRUE [13:13:43.480] - queued futures: [n=1] TRUE [13:13:43.480] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:43.480] length: 0 (resolved future 1) [13:13:43.480] Relaying remaining futures [13:13:43.480] signalConditionsASAP(NULL, pos=0) ... [13:13:43.481] - nx: 1 [13:13:43.481] - relay: TRUE [13:13:43.481] - stdout: TRUE [13:13:43.481] - signal: TRUE [13:13:43.481] - resignal: FALSE [13:13:43.481] - force: TRUE [13:13:43.481] - relayed: [n=1] TRUE [13:13:43.481] - queued futures: [n=1] TRUE - flush all [13:13:43.482] - relayed: [n=1] TRUE [13:13:43.482] - queued futures: [n=1] TRUE [13:13:43.482] signalConditionsASAP(NULL, pos=0) ... done [13:13:43.482] resolve() on list ... DONE [13:13:43.482] - Number of value chunks collected: 1 [13:13:43.482] Resolving 1 futures (chunks) ... DONE [13:13:43.482] Reducing values from 1 chunks ... [13:13:43.482] - Number of values collected after concatenation: 2 [13:13:43.482] - Number of values expected: 2 [13:13:43.483] Reverse index remapping (attribute 'ordering'): [n = 2] 2, 1 [13:13:43.483] Reducing values from 1 chunks ... DONE [13:13:43.483] 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, ...) ... [13:13:43.484] future_lapply() ... [13:13:43.485] Number of chunks: 1 [13:13:43.485] Index remapping (attribute 'ordering'): [n = 4] 4, 3, 2, 1 [13:13:43.485] getGlobalsAndPackagesXApply() ... [13:13:43.485] - future.globals: TRUE [13:13:43.485] getGlobalsAndPackages() ... [13:13:43.485] Searching for globals... [13:13:43.486] - globals found: [2] 'FUN', '.Internal' [13:13:43.486] Searching for globals ... DONE [13:13:43.487] Resolving globals: FALSE [13:13:43.487] The total size of the 1 globals is 2.13 KiB (2184 bytes) [13:13:43.487] 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') [13:13:43.487] - globals: [1] 'FUN' [13:13:43.488] [13:13:43.488] getGlobalsAndPackages() ... DONE [13:13:43.488] - globals found/used: [n=1] 'FUN' [13:13:43.488] - needed namespaces: [n=0] [13:13:43.488] Finding globals ... DONE [13:13:43.488] - use_args: TRUE [13:13:43.488] - Getting '...' globals ... [13:13:43.488] resolve() on list ... [13:13:43.489] recursive: 0 [13:13:43.489] length: 1 [13:13:43.489] elements: '...' [13:13:43.489] length: 0 (resolved future 1) [13:13:43.489] resolve() on list ... DONE [13:13:43.489] - '...' content: [n=1] 'length' [13:13:43.489] List of 1 [13:13:43.489] $ ...:List of 1 [13:13:43.489] ..$ length: int 2 [13:13:43.489] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:43.489] - attr(*, "where")=List of 1 [13:13:43.489] ..$ ...: [13:13:43.489] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:43.489] - attr(*, "resolved")= logi TRUE [13:13:43.489] - attr(*, "total_size")= num NA [13:13:43.492] - Getting '...' globals ... DONE [13:13:43.492] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:43.492] List of 2 [13:13:43.492] $ ...future.FUN:function (mode = "logical", length = 0L) [13:13:43.492] $ ... :List of 1 [13:13:43.492] ..$ length: int 2 [13:13:43.492] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:43.492] - attr(*, "where")=List of 2 [13:13:43.492] ..$ ...future.FUN: [13:13:43.492] ..$ ... : [13:13:43.492] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:43.492] - attr(*, "resolved")= logi FALSE [13:13:43.492] - attr(*, "total_size")= num 2240 [13:13:43.496] Packages to be attached in all futures: [n=0] [13:13:43.497] getGlobalsAndPackagesXApply() ... DONE [13:13:43.497] Number of futures (= number of chunks): 1 [13:13:43.497] Launching 1 futures (chunks) ... [13:13:43.497] Chunk #1 of 1 ... [13:13:43.497] - Finding globals in 'X' for chunk #1 ... [13:13:43.497] getGlobalsAndPackages() ... [13:13:43.497] Searching for globals... [13:13:43.498] [13:13:43.498] Searching for globals ... DONE [13:13:43.498] - globals: [0] [13:13:43.498] getGlobalsAndPackages() ... DONE [13:13:43.498] + additional globals found: [n=0] [13:13:43.498] + additional namespaces needed: [n=0] [13:13:43.498] - Finding globals in 'X' for chunk #1 ... DONE [13:13:43.498] - seeds: [13:13:43.499] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:43.499] getGlobalsAndPackages() ... [13:13:43.499] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:43.499] Resolving globals: FALSE [13:13:43.499] Tweak future expression to call with '...' arguments ... [13:13:43.499] { [13:13:43.499] do.call(function(...) { [13:13:43.499] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:43.499] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:43.499] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:43.499] on.exit(options(oopts), add = TRUE) [13:13:43.499] } [13:13:43.499] { [13:13:43.499] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:43.499] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:43.499] ...future.FUN(...future.X_jj, ...) [13:13:43.499] }) [13:13:43.499] } [13:13:43.499] }, args = future.call.arguments) [13:13:43.499] } [13:13:43.499] Tweak future expression to call with '...' arguments ... DONE [13:13:43.500] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:43.500] [13:13:43.500] getGlobalsAndPackages() ... DONE [13:13:43.500] run() for 'Future' ... [13:13:43.500] - state: 'created' [13:13:43.501] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:13:43.501] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:43.501] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:43.501] - Field: 'label' [13:13:43.501] - Field: 'local' [13:13:43.501] - Field: 'owner' [13:13:43.501] - Field: 'envir' [13:13:43.502] - Field: 'packages' [13:13:43.502] - Field: 'gc' [13:13:43.502] - Field: 'conditions' [13:13:43.502] - Field: 'expr' [13:13:43.502] - Field: 'uuid' [13:13:43.502] - Field: 'seed' [13:13:43.502] - Field: 'version' [13:13:43.502] - Field: 'result' [13:13:43.503] - Field: 'asynchronous' [13:13:43.503] - Field: 'calls' [13:13:43.503] - Field: 'globals' [13:13:43.503] - Field: 'stdout' [13:13:43.503] - Field: 'earlySignal' [13:13:43.503] - Field: 'lazy' [13:13:43.503] - Field: 'state' [13:13:43.503] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:43.504] - Launch lazy future ... [13:13:43.504] Packages needed by the future expression (n = 0): [13:13:43.504] Packages needed by future strategies (n = 0): [13:13:43.504] { [13:13:43.504] { [13:13:43.504] { [13:13:43.504] ...future.startTime <- base::Sys.time() [13:13:43.504] { [13:13:43.504] { [13:13:43.504] { [13:13:43.504] base::local({ [13:13:43.504] has_future <- base::requireNamespace("future", [13:13:43.504] quietly = TRUE) [13:13:43.504] if (has_future) { [13:13:43.504] ns <- base::getNamespace("future") [13:13:43.504] version <- ns[[".package"]][["version"]] [13:13:43.504] if (is.null(version)) [13:13:43.504] version <- utils::packageVersion("future") [13:13:43.504] } [13:13:43.504] else { [13:13:43.504] version <- NULL [13:13:43.504] } [13:13:43.504] if (!has_future || version < "1.8.0") { [13:13:43.504] info <- base::c(r_version = base::gsub("R version ", [13:13:43.504] "", base::R.version$version.string), [13:13:43.504] platform = base::sprintf("%s (%s-bit)", [13:13:43.504] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:43.504] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:43.504] "release", "version")], collapse = " "), [13:13:43.504] hostname = base::Sys.info()[["nodename"]]) [13:13:43.504] info <- base::sprintf("%s: %s", base::names(info), [13:13:43.504] info) [13:13:43.504] info <- base::paste(info, collapse = "; ") [13:13:43.504] if (!has_future) { [13:13:43.504] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:43.504] info) [13:13:43.504] } [13:13:43.504] else { [13:13:43.504] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:43.504] info, version) [13:13:43.504] } [13:13:43.504] base::stop(msg) [13:13:43.504] } [13:13:43.504] }) [13:13:43.504] } [13:13:43.504] options(future.plan = NULL) [13:13:43.504] Sys.unsetenv("R_FUTURE_PLAN") [13:13:43.504] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:43.504] } [13:13:43.504] ...future.workdir <- getwd() [13:13:43.504] } [13:13:43.504] ...future.oldOptions <- base::as.list(base::.Options) [13:13:43.504] ...future.oldEnvVars <- base::Sys.getenv() [13:13:43.504] } [13:13:43.504] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:43.504] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:43.504] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:43.504] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:43.504] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:43.504] future.stdout.windows.reencode = NULL, width = 80L) [13:13:43.504] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:43.504] base::names(...future.oldOptions)) [13:13:43.504] } [13:13:43.504] if (FALSE) { [13:13:43.504] } [13:13:43.504] else { [13:13:43.504] if (TRUE) { [13:13:43.504] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:43.504] open = "w") [13:13:43.504] } [13:13:43.504] else { [13:13:43.504] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:43.504] windows = "NUL", "/dev/null"), open = "w") [13:13:43.504] } [13:13:43.504] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:43.504] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:43.504] base::sink(type = "output", split = FALSE) [13:13:43.504] base::close(...future.stdout) [13:13:43.504] }, add = TRUE) [13:13:43.504] } [13:13:43.504] ...future.frame <- base::sys.nframe() [13:13:43.504] ...future.conditions <- base::list() [13:13:43.504] ...future.rng <- base::globalenv()$.Random.seed [13:13:43.504] if (FALSE) { [13:13:43.504] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:43.504] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:43.504] } [13:13:43.504] ...future.result <- base::tryCatch({ [13:13:43.504] base::withCallingHandlers({ [13:13:43.504] ...future.value <- base::withVisible(base::local({ [13:13:43.504] do.call(function(...) { [13:13:43.504] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:43.504] if (!identical(...future.globals.maxSize.org, [13:13:43.504] ...future.globals.maxSize)) { [13:13:43.504] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:43.504] on.exit(options(oopts), add = TRUE) [13:13:43.504] } [13:13:43.504] { [13:13:43.504] lapply(seq_along(...future.elements_ii), [13:13:43.504] FUN = function(jj) { [13:13:43.504] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:43.504] ...future.FUN(...future.X_jj, ...) [13:13:43.504] }) [13:13:43.504] } [13:13:43.504] }, args = future.call.arguments) [13:13:43.504] })) [13:13:43.504] future::FutureResult(value = ...future.value$value, [13:13:43.504] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:43.504] ...future.rng), globalenv = if (FALSE) [13:13:43.504] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:43.504] ...future.globalenv.names)) [13:13:43.504] else NULL, started = ...future.startTime, version = "1.8") [13:13:43.504] }, condition = base::local({ [13:13:43.504] c <- base::c [13:13:43.504] inherits <- base::inherits [13:13:43.504] invokeRestart <- base::invokeRestart [13:13:43.504] length <- base::length [13:13:43.504] list <- base::list [13:13:43.504] seq.int <- base::seq.int [13:13:43.504] signalCondition <- base::signalCondition [13:13:43.504] sys.calls <- base::sys.calls [13:13:43.504] `[[` <- base::`[[` [13:13:43.504] `+` <- base::`+` [13:13:43.504] `<<-` <- base::`<<-` [13:13:43.504] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:43.504] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:43.504] 3L)] [13:13:43.504] } [13:13:43.504] function(cond) { [13:13:43.504] is_error <- inherits(cond, "error") [13:13:43.504] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:43.504] NULL) [13:13:43.504] if (is_error) { [13:13:43.504] sessionInformation <- function() { [13:13:43.504] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:43.504] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:43.504] search = base::search(), system = base::Sys.info()) [13:13:43.504] } [13:13:43.504] ...future.conditions[[length(...future.conditions) + [13:13:43.504] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:43.504] cond$call), session = sessionInformation(), [13:13:43.504] timestamp = base::Sys.time(), signaled = 0L) [13:13:43.504] signalCondition(cond) [13:13:43.504] } [13:13:43.504] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:43.504] "immediateCondition"))) { [13:13:43.504] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:43.504] ...future.conditions[[length(...future.conditions) + [13:13:43.504] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:43.504] if (TRUE && !signal) { [13:13:43.504] muffleCondition <- function (cond, pattern = "^muffle") [13:13:43.504] { [13:13:43.504] inherits <- base::inherits [13:13:43.504] invokeRestart <- base::invokeRestart [13:13:43.504] is.null <- base::is.null [13:13:43.504] muffled <- FALSE [13:13:43.504] if (inherits(cond, "message")) { [13:13:43.504] muffled <- grepl(pattern, "muffleMessage") [13:13:43.504] if (muffled) [13:13:43.504] invokeRestart("muffleMessage") [13:13:43.504] } [13:13:43.504] else if (inherits(cond, "warning")) { [13:13:43.504] muffled <- grepl(pattern, "muffleWarning") [13:13:43.504] if (muffled) [13:13:43.504] invokeRestart("muffleWarning") [13:13:43.504] } [13:13:43.504] else if (inherits(cond, "condition")) { [13:13:43.504] if (!is.null(pattern)) { [13:13:43.504] computeRestarts <- base::computeRestarts [13:13:43.504] grepl <- base::grepl [13:13:43.504] restarts <- computeRestarts(cond) [13:13:43.504] for (restart in restarts) { [13:13:43.504] name <- restart$name [13:13:43.504] if (is.null(name)) [13:13:43.504] next [13:13:43.504] if (!grepl(pattern, name)) [13:13:43.504] next [13:13:43.504] invokeRestart(restart) [13:13:43.504] muffled <- TRUE [13:13:43.504] break [13:13:43.504] } [13:13:43.504] } [13:13:43.504] } [13:13:43.504] invisible(muffled) [13:13:43.504] } [13:13:43.504] muffleCondition(cond, pattern = "^muffle") [13:13:43.504] } [13:13:43.504] } [13:13:43.504] else { [13:13:43.504] if (TRUE) { [13:13:43.504] muffleCondition <- function (cond, pattern = "^muffle") [13:13:43.504] { [13:13:43.504] inherits <- base::inherits [13:13:43.504] invokeRestart <- base::invokeRestart [13:13:43.504] is.null <- base::is.null [13:13:43.504] muffled <- FALSE [13:13:43.504] if (inherits(cond, "message")) { [13:13:43.504] muffled <- grepl(pattern, "muffleMessage") [13:13:43.504] if (muffled) [13:13:43.504] invokeRestart("muffleMessage") [13:13:43.504] } [13:13:43.504] else if (inherits(cond, "warning")) { [13:13:43.504] muffled <- grepl(pattern, "muffleWarning") [13:13:43.504] if (muffled) [13:13:43.504] invokeRestart("muffleWarning") [13:13:43.504] } [13:13:43.504] else if (inherits(cond, "condition")) { [13:13:43.504] if (!is.null(pattern)) { [13:13:43.504] computeRestarts <- base::computeRestarts [13:13:43.504] grepl <- base::grepl [13:13:43.504] restarts <- computeRestarts(cond) [13:13:43.504] for (restart in restarts) { [13:13:43.504] name <- restart$name [13:13:43.504] if (is.null(name)) [13:13:43.504] next [13:13:43.504] if (!grepl(pattern, name)) [13:13:43.504] next [13:13:43.504] invokeRestart(restart) [13:13:43.504] muffled <- TRUE [13:13:43.504] break [13:13:43.504] } [13:13:43.504] } [13:13:43.504] } [13:13:43.504] invisible(muffled) [13:13:43.504] } [13:13:43.504] muffleCondition(cond, pattern = "^muffle") [13:13:43.504] } [13:13:43.504] } [13:13:43.504] } [13:13:43.504] })) [13:13:43.504] }, error = function(ex) { [13:13:43.504] base::structure(base::list(value = NULL, visible = NULL, [13:13:43.504] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:43.504] ...future.rng), started = ...future.startTime, [13:13:43.504] finished = Sys.time(), session_uuid = NA_character_, [13:13:43.504] version = "1.8"), class = "FutureResult") [13:13:43.504] }, finally = { [13:13:43.504] if (!identical(...future.workdir, getwd())) [13:13:43.504] setwd(...future.workdir) [13:13:43.504] { [13:13:43.504] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:43.504] ...future.oldOptions$nwarnings <- NULL [13:13:43.504] } [13:13:43.504] base::options(...future.oldOptions) [13:13:43.504] if (.Platform$OS.type == "windows") { [13:13:43.504] old_names <- names(...future.oldEnvVars) [13:13:43.504] envs <- base::Sys.getenv() [13:13:43.504] names <- names(envs) [13:13:43.504] common <- intersect(names, old_names) [13:13:43.504] added <- setdiff(names, old_names) [13:13:43.504] removed <- setdiff(old_names, names) [13:13:43.504] changed <- common[...future.oldEnvVars[common] != [13:13:43.504] envs[common]] [13:13:43.504] NAMES <- toupper(changed) [13:13:43.504] args <- list() [13:13:43.504] for (kk in seq_along(NAMES)) { [13:13:43.504] name <- changed[[kk]] [13:13:43.504] NAME <- NAMES[[kk]] [13:13:43.504] if (name != NAME && is.element(NAME, old_names)) [13:13:43.504] next [13:13:43.504] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:43.504] } [13:13:43.504] NAMES <- toupper(added) [13:13:43.504] for (kk in seq_along(NAMES)) { [13:13:43.504] name <- added[[kk]] [13:13:43.504] NAME <- NAMES[[kk]] [13:13:43.504] if (name != NAME && is.element(NAME, old_names)) [13:13:43.504] next [13:13:43.504] args[[name]] <- "" [13:13:43.504] } [13:13:43.504] NAMES <- toupper(removed) [13:13:43.504] for (kk in seq_along(NAMES)) { [13:13:43.504] name <- removed[[kk]] [13:13:43.504] NAME <- NAMES[[kk]] [13:13:43.504] if (name != NAME && is.element(NAME, old_names)) [13:13:43.504] next [13:13:43.504] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:43.504] } [13:13:43.504] if (length(args) > 0) [13:13:43.504] base::do.call(base::Sys.setenv, args = args) [13:13:43.504] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:43.504] } [13:13:43.504] else { [13:13:43.504] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:43.504] } [13:13:43.504] { [13:13:43.504] if (base::length(...future.futureOptionsAdded) > [13:13:43.504] 0L) { [13:13:43.504] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:43.504] base::names(opts) <- ...future.futureOptionsAdded [13:13:43.504] base::options(opts) [13:13:43.504] } [13:13:43.504] { [13:13:43.504] { [13:13:43.504] NULL [13:13:43.504] RNGkind("Mersenne-Twister") [13:13:43.504] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:43.504] inherits = FALSE) [13:13:43.504] } [13:13:43.504] options(future.plan = NULL) [13:13:43.504] if (is.na(NA_character_)) [13:13:43.504] Sys.unsetenv("R_FUTURE_PLAN") [13:13:43.504] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:43.504] future::plan(list(function (..., envir = parent.frame()) [13:13:43.504] { [13:13:43.504] future <- SequentialFuture(..., envir = envir) [13:13:43.504] if (!future$lazy) [13:13:43.504] future <- run(future) [13:13:43.504] invisible(future) [13:13:43.504] }), .cleanup = FALSE, .init = FALSE) [13:13:43.504] } [13:13:43.504] } [13:13:43.504] } [13:13:43.504] }) [13:13:43.504] if (TRUE) { [13:13:43.504] base::sink(type = "output", split = FALSE) [13:13:43.504] if (TRUE) { [13:13:43.504] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:43.504] } [13:13:43.504] else { [13:13:43.504] ...future.result["stdout"] <- base::list(NULL) [13:13:43.504] } [13:13:43.504] base::close(...future.stdout) [13:13:43.504] ...future.stdout <- NULL [13:13:43.504] } [13:13:43.504] ...future.result$conditions <- ...future.conditions [13:13:43.504] ...future.result$finished <- base::Sys.time() [13:13:43.504] ...future.result [13:13:43.504] } [13:13:43.507] assign_globals() ... [13:13:43.507] List of 5 [13:13:43.507] $ ...future.FUN :function (mode = "logical", length = 0L) [13:13:43.507] $ future.call.arguments :List of 1 [13:13:43.507] ..$ length: int 2 [13:13:43.507] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:43.507] $ ...future.elements_ii :List of 4 [13:13:43.507] ..$ c: chr "list" [13:13:43.507] ..$ c: chr "character" [13:13:43.507] ..$ b: chr "numeric" [13:13:43.507] ..$ a: chr "integer" [13:13:43.507] $ ...future.seeds_ii : NULL [13:13:43.507] $ ...future.globals.maxSize: NULL [13:13:43.507] - attr(*, "where")=List of 5 [13:13:43.507] ..$ ...future.FUN : [13:13:43.507] ..$ future.call.arguments : [13:13:43.507] ..$ ...future.elements_ii : [13:13:43.507] ..$ ...future.seeds_ii : [13:13:43.507] ..$ ...future.globals.maxSize: [13:13:43.507] - attr(*, "resolved")= logi FALSE [13:13:43.507] - attr(*, "total_size")= num 2240 [13:13:43.507] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:43.507] - attr(*, "already-done")= logi TRUE [13:13:43.512] - copied '...future.FUN' to environment [13:13:43.512] - copied 'future.call.arguments' to environment [13:13:43.512] - copied '...future.elements_ii' to environment [13:13:43.512] - copied '...future.seeds_ii' to environment [13:13:43.513] - copied '...future.globals.maxSize' to environment [13:13:43.513] assign_globals() ... done [13:13:43.513] plan(): Setting new future strategy stack: [13:13:43.513] List of future strategies: [13:13:43.513] 1. sequential: [13:13:43.513] - args: function (..., envir = parent.frame(), workers = "") [13:13:43.513] - tweaked: FALSE [13:13:43.513] - call: NULL [13:13:43.513] plan(): nbrOfWorkers() = 1 [13:13:43.514] plan(): Setting new future strategy stack: [13:13:43.514] List of future strategies: [13:13:43.514] 1. sequential: [13:13:43.514] - args: function (..., envir = parent.frame(), workers = "") [13:13:43.514] - tweaked: FALSE [13:13:43.514] - call: plan(strategy) [13:13:43.515] plan(): nbrOfWorkers() = 1 [13:13:43.515] SequentialFuture started (and completed) [13:13:43.515] - Launch lazy future ... done [13:13:43.515] run() for 'SequentialFuture' ... done [13:13:43.515] Created future: [13:13:43.516] SequentialFuture: [13:13:43.516] Label: 'future_lapply-1' [13:13:43.516] Expression: [13:13:43.516] { [13:13:43.516] do.call(function(...) { [13:13:43.516] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:43.516] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:43.516] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:43.516] on.exit(options(oopts), add = TRUE) [13:13:43.516] } [13:13:43.516] { [13:13:43.516] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:43.516] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:43.516] ...future.FUN(...future.X_jj, ...) [13:13:43.516] }) [13:13:43.516] } [13:13:43.516] }, args = future.call.arguments) [13:13:43.516] } [13:13:43.516] Lazy evaluation: FALSE [13:13:43.516] Asynchronous evaluation: FALSE [13:13:43.516] Local evaluation: TRUE [13:13:43.516] Environment: R_GlobalEnv [13:13:43.516] Capture standard output: TRUE [13:13:43.516] Capture condition classes: 'condition' (excluding 'nothing') [13:13:43.516] 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) [13:13:43.516] Packages: [13:13:43.516] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:43.516] Resolved: TRUE [13:13:43.516] Value: 240 bytes of class 'list' [13:13:43.516] Early signaling: FALSE [13:13:43.516] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:43.516] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:43.516] Chunk #1 of 1 ... DONE [13:13:43.517] Launching 1 futures (chunks) ... DONE [13:13:43.517] Resolving 1 futures (chunks) ... [13:13:43.517] resolve() on list ... [13:13:43.517] recursive: 0 [13:13:43.517] length: 1 [13:13:43.517] [13:13:43.517] resolved() for 'SequentialFuture' ... [13:13:43.517] - state: 'finished' [13:13:43.518] - run: TRUE [13:13:43.518] - result: 'FutureResult' [13:13:43.518] resolved() for 'SequentialFuture' ... done [13:13:43.518] Future #1 [13:13:43.518] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:43.518] - nx: 1 [13:13:43.518] - relay: TRUE [13:13:43.518] - stdout: TRUE [13:13:43.518] - signal: TRUE [13:13:43.519] - resignal: FALSE [13:13:43.519] - force: TRUE [13:13:43.519] - relayed: [n=1] FALSE [13:13:43.519] - queued futures: [n=1] FALSE [13:13:43.519] - until=1 [13:13:43.519] - relaying element #1 [13:13:43.519] - relayed: [n=1] TRUE [13:13:43.519] - queued futures: [n=1] TRUE [13:13:43.520] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:43.520] length: 0 (resolved future 1) [13:13:43.520] Relaying remaining futures [13:13:43.520] signalConditionsASAP(NULL, pos=0) ... [13:13:43.520] - nx: 1 [13:13:43.520] - relay: TRUE [13:13:43.520] - stdout: TRUE [13:13:43.520] - signal: TRUE [13:13:43.520] - resignal: FALSE [13:13:43.521] - force: TRUE [13:13:43.521] - relayed: [n=1] TRUE [13:13:43.521] - queued futures: [n=1] TRUE - flush all [13:13:43.521] - relayed: [n=1] TRUE [13:13:43.521] - queued futures: [n=1] TRUE [13:13:43.521] signalConditionsASAP(NULL, pos=0) ... done [13:13:43.521] resolve() on list ... DONE [13:13:43.521] - Number of value chunks collected: 1 [13:13:43.522] Resolving 1 futures (chunks) ... DONE [13:13:43.522] Reducing values from 1 chunks ... [13:13:43.522] - Number of values collected after concatenation: 4 [13:13:43.522] - Number of values expected: 4 [13:13:43.522] Reverse index remapping (attribute 'ordering'): [n = 4] 4, 3, 2, 1 [13:13:43.522] Reducing values from 1 chunks ... DONE [13:13:43.522] 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 [13:13:43.524] future_lapply() ... [13:13:43.525] Number of chunks: 1 [13:13:43.525] Index remapping (attribute 'ordering'): [n = 4] 4, 3, 2, 1 [13:13:43.525] getGlobalsAndPackagesXApply() ... [13:13:43.525] - future.globals: TRUE [13:13:43.525] getGlobalsAndPackages() ... [13:13:43.525] Searching for globals... [13:13:43.526] - globals found: [2] 'FUN', '.Internal' [13:13:43.526] Searching for globals ... DONE [13:13:43.526] Resolving globals: FALSE [13:13:43.527] The total size of the 1 globals is 2.13 KiB (2184 bytes) [13:13:43.527] 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') [13:13:43.527] - globals: [1] 'FUN' [13:13:43.527] [13:13:43.527] getGlobalsAndPackages() ... DONE [13:13:43.527] - globals found/used: [n=1] 'FUN' [13:13:43.528] - needed namespaces: [n=0] [13:13:43.528] Finding globals ... DONE [13:13:43.528] - use_args: TRUE [13:13:43.528] - Getting '...' globals ... [13:13:43.528] resolve() on list ... [13:13:43.528] recursive: 0 [13:13:43.528] length: 1 [13:13:43.529] elements: '...' [13:13:43.529] length: 0 (resolved future 1) [13:13:43.529] resolve() on list ... DONE [13:13:43.529] - '...' content: [n=1] 'length' [13:13:43.529] List of 1 [13:13:43.529] $ ...:List of 1 [13:13:43.529] ..$ length: int 2 [13:13:43.529] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:43.529] - attr(*, "where")=List of 1 [13:13:43.529] ..$ ...: [13:13:43.529] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:43.529] - attr(*, "resolved")= logi TRUE [13:13:43.529] - attr(*, "total_size")= num NA [13:13:43.531] - Getting '...' globals ... DONE [13:13:43.532] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:43.532] List of 2 [13:13:43.532] $ ...future.FUN:function (mode = "logical", length = 0L) [13:13:43.532] $ ... :List of 1 [13:13:43.532] ..$ length: int 2 [13:13:43.532] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:43.532] - attr(*, "where")=List of 2 [13:13:43.532] ..$ ...future.FUN: [13:13:43.532] ..$ ... : [13:13:43.532] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:43.532] - attr(*, "resolved")= logi FALSE [13:13:43.532] - attr(*, "total_size")= num 2240 [13:13:43.534] Packages to be attached in all futures: [n=0] [13:13:43.535] getGlobalsAndPackagesXApply() ... DONE [13:13:43.535] Number of futures (= number of chunks): 1 [13:13:43.535] Launching 1 futures (chunks) ... [13:13:43.535] Chunk #1 of 1 ... [13:13:43.535] - Finding globals in 'X' for chunk #1 ... [13:13:43.535] getGlobalsAndPackages() ... [13:13:43.535] Searching for globals... [13:13:43.536] [13:13:43.536] Searching for globals ... DONE [13:13:43.536] - globals: [0] [13:13:43.536] getGlobalsAndPackages() ... DONE [13:13:43.536] + additional globals found: [n=0] [13:13:43.536] + additional namespaces needed: [n=0] [13:13:43.536] - Finding globals in 'X' for chunk #1 ... DONE [13:13:43.536] - seeds: [13:13:43.536] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:43.537] getGlobalsAndPackages() ... [13:13:43.537] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:43.537] Resolving globals: FALSE [13:13:43.537] Tweak future expression to call with '...' arguments ... [13:13:43.537] { [13:13:43.537] do.call(function(...) { [13:13:43.537] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:43.537] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:43.537] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:43.537] on.exit(options(oopts), add = TRUE) [13:13:43.537] } [13:13:43.537] { [13:13:43.537] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:43.537] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:43.537] ...future.FUN(...future.X_jj, ...) [13:13:43.537] }) [13:13:43.537] } [13:13:43.537] }, args = future.call.arguments) [13:13:43.537] } [13:13:43.537] Tweak future expression to call with '...' arguments ... DONE [13:13:43.538] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:43.538] [13:13:43.538] getGlobalsAndPackages() ... DONE [13:13:43.538] run() for 'Future' ... [13:13:43.538] - state: 'created' [13:13:43.538] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:13:43.539] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:43.539] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:43.539] - Field: 'label' [13:13:43.539] - Field: 'local' [13:13:43.539] - Field: 'owner' [13:13:43.539] - Field: 'envir' [13:13:43.540] - Field: 'packages' [13:13:43.540] - Field: 'gc' [13:13:43.540] - Field: 'conditions' [13:13:43.540] - Field: 'expr' [13:13:43.540] - Field: 'uuid' [13:13:43.540] - Field: 'seed' [13:13:43.540] - Field: 'version' [13:13:43.540] - Field: 'result' [13:13:43.541] - Field: 'asynchronous' [13:13:43.541] - Field: 'calls' [13:13:43.541] - Field: 'globals' [13:13:43.541] - Field: 'stdout' [13:13:43.541] - Field: 'earlySignal' [13:13:43.541] - Field: 'lazy' [13:13:43.541] - Field: 'state' [13:13:43.541] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:43.542] - Launch lazy future ... [13:13:43.542] Packages needed by the future expression (n = 0): [13:13:43.542] Packages needed by future strategies (n = 0): [13:13:43.542] { [13:13:43.542] { [13:13:43.542] { [13:13:43.542] ...future.startTime <- base::Sys.time() [13:13:43.542] { [13:13:43.542] { [13:13:43.542] { [13:13:43.542] base::local({ [13:13:43.542] has_future <- base::requireNamespace("future", [13:13:43.542] quietly = TRUE) [13:13:43.542] if (has_future) { [13:13:43.542] ns <- base::getNamespace("future") [13:13:43.542] version <- ns[[".package"]][["version"]] [13:13:43.542] if (is.null(version)) [13:13:43.542] version <- utils::packageVersion("future") [13:13:43.542] } [13:13:43.542] else { [13:13:43.542] version <- NULL [13:13:43.542] } [13:13:43.542] if (!has_future || version < "1.8.0") { [13:13:43.542] info <- base::c(r_version = base::gsub("R version ", [13:13:43.542] "", base::R.version$version.string), [13:13:43.542] platform = base::sprintf("%s (%s-bit)", [13:13:43.542] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:43.542] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:43.542] "release", "version")], collapse = " "), [13:13:43.542] hostname = base::Sys.info()[["nodename"]]) [13:13:43.542] info <- base::sprintf("%s: %s", base::names(info), [13:13:43.542] info) [13:13:43.542] info <- base::paste(info, collapse = "; ") [13:13:43.542] if (!has_future) { [13:13:43.542] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:43.542] info) [13:13:43.542] } [13:13:43.542] else { [13:13:43.542] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:43.542] info, version) [13:13:43.542] } [13:13:43.542] base::stop(msg) [13:13:43.542] } [13:13:43.542] }) [13:13:43.542] } [13:13:43.542] options(future.plan = NULL) [13:13:43.542] Sys.unsetenv("R_FUTURE_PLAN") [13:13:43.542] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:43.542] } [13:13:43.542] ...future.workdir <- getwd() [13:13:43.542] } [13:13:43.542] ...future.oldOptions <- base::as.list(base::.Options) [13:13:43.542] ...future.oldEnvVars <- base::Sys.getenv() [13:13:43.542] } [13:13:43.542] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:43.542] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:43.542] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:43.542] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:43.542] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:43.542] future.stdout.windows.reencode = NULL, width = 80L) [13:13:43.542] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:43.542] base::names(...future.oldOptions)) [13:13:43.542] } [13:13:43.542] if (FALSE) { [13:13:43.542] } [13:13:43.542] else { [13:13:43.542] if (TRUE) { [13:13:43.542] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:43.542] open = "w") [13:13:43.542] } [13:13:43.542] else { [13:13:43.542] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:43.542] windows = "NUL", "/dev/null"), open = "w") [13:13:43.542] } [13:13:43.542] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:43.542] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:43.542] base::sink(type = "output", split = FALSE) [13:13:43.542] base::close(...future.stdout) [13:13:43.542] }, add = TRUE) [13:13:43.542] } [13:13:43.542] ...future.frame <- base::sys.nframe() [13:13:43.542] ...future.conditions <- base::list() [13:13:43.542] ...future.rng <- base::globalenv()$.Random.seed [13:13:43.542] if (FALSE) { [13:13:43.542] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:43.542] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:43.542] } [13:13:43.542] ...future.result <- base::tryCatch({ [13:13:43.542] base::withCallingHandlers({ [13:13:43.542] ...future.value <- base::withVisible(base::local({ [13:13:43.542] do.call(function(...) { [13:13:43.542] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:43.542] if (!identical(...future.globals.maxSize.org, [13:13:43.542] ...future.globals.maxSize)) { [13:13:43.542] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:43.542] on.exit(options(oopts), add = TRUE) [13:13:43.542] } [13:13:43.542] { [13:13:43.542] lapply(seq_along(...future.elements_ii), [13:13:43.542] FUN = function(jj) { [13:13:43.542] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:43.542] ...future.FUN(...future.X_jj, ...) [13:13:43.542] }) [13:13:43.542] } [13:13:43.542] }, args = future.call.arguments) [13:13:43.542] })) [13:13:43.542] future::FutureResult(value = ...future.value$value, [13:13:43.542] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:43.542] ...future.rng), globalenv = if (FALSE) [13:13:43.542] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:43.542] ...future.globalenv.names)) [13:13:43.542] else NULL, started = ...future.startTime, version = "1.8") [13:13:43.542] }, condition = base::local({ [13:13:43.542] c <- base::c [13:13:43.542] inherits <- base::inherits [13:13:43.542] invokeRestart <- base::invokeRestart [13:13:43.542] length <- base::length [13:13:43.542] list <- base::list [13:13:43.542] seq.int <- base::seq.int [13:13:43.542] signalCondition <- base::signalCondition [13:13:43.542] sys.calls <- base::sys.calls [13:13:43.542] `[[` <- base::`[[` [13:13:43.542] `+` <- base::`+` [13:13:43.542] `<<-` <- base::`<<-` [13:13:43.542] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:43.542] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:43.542] 3L)] [13:13:43.542] } [13:13:43.542] function(cond) { [13:13:43.542] is_error <- inherits(cond, "error") [13:13:43.542] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:43.542] NULL) [13:13:43.542] if (is_error) { [13:13:43.542] sessionInformation <- function() { [13:13:43.542] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:43.542] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:43.542] search = base::search(), system = base::Sys.info()) [13:13:43.542] } [13:13:43.542] ...future.conditions[[length(...future.conditions) + [13:13:43.542] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:43.542] cond$call), session = sessionInformation(), [13:13:43.542] timestamp = base::Sys.time(), signaled = 0L) [13:13:43.542] signalCondition(cond) [13:13:43.542] } [13:13:43.542] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:43.542] "immediateCondition"))) { [13:13:43.542] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:43.542] ...future.conditions[[length(...future.conditions) + [13:13:43.542] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:43.542] if (TRUE && !signal) { [13:13:43.542] muffleCondition <- function (cond, pattern = "^muffle") [13:13:43.542] { [13:13:43.542] inherits <- base::inherits [13:13:43.542] invokeRestart <- base::invokeRestart [13:13:43.542] is.null <- base::is.null [13:13:43.542] muffled <- FALSE [13:13:43.542] if (inherits(cond, "message")) { [13:13:43.542] muffled <- grepl(pattern, "muffleMessage") [13:13:43.542] if (muffled) [13:13:43.542] invokeRestart("muffleMessage") [13:13:43.542] } [13:13:43.542] else if (inherits(cond, "warning")) { [13:13:43.542] muffled <- grepl(pattern, "muffleWarning") [13:13:43.542] if (muffled) [13:13:43.542] invokeRestart("muffleWarning") [13:13:43.542] } [13:13:43.542] else if (inherits(cond, "condition")) { [13:13:43.542] if (!is.null(pattern)) { [13:13:43.542] computeRestarts <- base::computeRestarts [13:13:43.542] grepl <- base::grepl [13:13:43.542] restarts <- computeRestarts(cond) [13:13:43.542] for (restart in restarts) { [13:13:43.542] name <- restart$name [13:13:43.542] if (is.null(name)) [13:13:43.542] next [13:13:43.542] if (!grepl(pattern, name)) [13:13:43.542] next [13:13:43.542] invokeRestart(restart) [13:13:43.542] muffled <- TRUE [13:13:43.542] break [13:13:43.542] } [13:13:43.542] } [13:13:43.542] } [13:13:43.542] invisible(muffled) [13:13:43.542] } [13:13:43.542] muffleCondition(cond, pattern = "^muffle") [13:13:43.542] } [13:13:43.542] } [13:13:43.542] else { [13:13:43.542] if (TRUE) { [13:13:43.542] muffleCondition <- function (cond, pattern = "^muffle") [13:13:43.542] { [13:13:43.542] inherits <- base::inherits [13:13:43.542] invokeRestart <- base::invokeRestart [13:13:43.542] is.null <- base::is.null [13:13:43.542] muffled <- FALSE [13:13:43.542] if (inherits(cond, "message")) { [13:13:43.542] muffled <- grepl(pattern, "muffleMessage") [13:13:43.542] if (muffled) [13:13:43.542] invokeRestart("muffleMessage") [13:13:43.542] } [13:13:43.542] else if (inherits(cond, "warning")) { [13:13:43.542] muffled <- grepl(pattern, "muffleWarning") [13:13:43.542] if (muffled) [13:13:43.542] invokeRestart("muffleWarning") [13:13:43.542] } [13:13:43.542] else if (inherits(cond, "condition")) { [13:13:43.542] if (!is.null(pattern)) { [13:13:43.542] computeRestarts <- base::computeRestarts [13:13:43.542] grepl <- base::grepl [13:13:43.542] restarts <- computeRestarts(cond) [13:13:43.542] for (restart in restarts) { [13:13:43.542] name <- restart$name [13:13:43.542] if (is.null(name)) [13:13:43.542] next [13:13:43.542] if (!grepl(pattern, name)) [13:13:43.542] next [13:13:43.542] invokeRestart(restart) [13:13:43.542] muffled <- TRUE [13:13:43.542] break [13:13:43.542] } [13:13:43.542] } [13:13:43.542] } [13:13:43.542] invisible(muffled) [13:13:43.542] } [13:13:43.542] muffleCondition(cond, pattern = "^muffle") [13:13:43.542] } [13:13:43.542] } [13:13:43.542] } [13:13:43.542] })) [13:13:43.542] }, error = function(ex) { [13:13:43.542] base::structure(base::list(value = NULL, visible = NULL, [13:13:43.542] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:43.542] ...future.rng), started = ...future.startTime, [13:13:43.542] finished = Sys.time(), session_uuid = NA_character_, [13:13:43.542] version = "1.8"), class = "FutureResult") [13:13:43.542] }, finally = { [13:13:43.542] if (!identical(...future.workdir, getwd())) [13:13:43.542] setwd(...future.workdir) [13:13:43.542] { [13:13:43.542] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:43.542] ...future.oldOptions$nwarnings <- NULL [13:13:43.542] } [13:13:43.542] base::options(...future.oldOptions) [13:13:43.542] if (.Platform$OS.type == "windows") { [13:13:43.542] old_names <- names(...future.oldEnvVars) [13:13:43.542] envs <- base::Sys.getenv() [13:13:43.542] names <- names(envs) [13:13:43.542] common <- intersect(names, old_names) [13:13:43.542] added <- setdiff(names, old_names) [13:13:43.542] removed <- setdiff(old_names, names) [13:13:43.542] changed <- common[...future.oldEnvVars[common] != [13:13:43.542] envs[common]] [13:13:43.542] NAMES <- toupper(changed) [13:13:43.542] args <- list() [13:13:43.542] for (kk in seq_along(NAMES)) { [13:13:43.542] name <- changed[[kk]] [13:13:43.542] NAME <- NAMES[[kk]] [13:13:43.542] if (name != NAME && is.element(NAME, old_names)) [13:13:43.542] next [13:13:43.542] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:43.542] } [13:13:43.542] NAMES <- toupper(added) [13:13:43.542] for (kk in seq_along(NAMES)) { [13:13:43.542] name <- added[[kk]] [13:13:43.542] NAME <- NAMES[[kk]] [13:13:43.542] if (name != NAME && is.element(NAME, old_names)) [13:13:43.542] next [13:13:43.542] args[[name]] <- "" [13:13:43.542] } [13:13:43.542] NAMES <- toupper(removed) [13:13:43.542] for (kk in seq_along(NAMES)) { [13:13:43.542] name <- removed[[kk]] [13:13:43.542] NAME <- NAMES[[kk]] [13:13:43.542] if (name != NAME && is.element(NAME, old_names)) [13:13:43.542] next [13:13:43.542] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:43.542] } [13:13:43.542] if (length(args) > 0) [13:13:43.542] base::do.call(base::Sys.setenv, args = args) [13:13:43.542] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:43.542] } [13:13:43.542] else { [13:13:43.542] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:43.542] } [13:13:43.542] { [13:13:43.542] if (base::length(...future.futureOptionsAdded) > [13:13:43.542] 0L) { [13:13:43.542] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:43.542] base::names(opts) <- ...future.futureOptionsAdded [13:13:43.542] base::options(opts) [13:13:43.542] } [13:13:43.542] { [13:13:43.542] { [13:13:43.542] NULL [13:13:43.542] RNGkind("Mersenne-Twister") [13:13:43.542] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:43.542] inherits = FALSE) [13:13:43.542] } [13:13:43.542] options(future.plan = NULL) [13:13:43.542] if (is.na(NA_character_)) [13:13:43.542] Sys.unsetenv("R_FUTURE_PLAN") [13:13:43.542] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:43.542] future::plan(list(function (..., envir = parent.frame()) [13:13:43.542] { [13:13:43.542] future <- SequentialFuture(..., envir = envir) [13:13:43.542] if (!future$lazy) [13:13:43.542] future <- run(future) [13:13:43.542] invisible(future) [13:13:43.542] }), .cleanup = FALSE, .init = FALSE) [13:13:43.542] } [13:13:43.542] } [13:13:43.542] } [13:13:43.542] }) [13:13:43.542] if (TRUE) { [13:13:43.542] base::sink(type = "output", split = FALSE) [13:13:43.542] if (TRUE) { [13:13:43.542] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:43.542] } [13:13:43.542] else { [13:13:43.542] ...future.result["stdout"] <- base::list(NULL) [13:13:43.542] } [13:13:43.542] base::close(...future.stdout) [13:13:43.542] ...future.stdout <- NULL [13:13:43.542] } [13:13:43.542] ...future.result$conditions <- ...future.conditions [13:13:43.542] ...future.result$finished <- base::Sys.time() [13:13:43.542] ...future.result [13:13:43.542] } [13:13:43.545] assign_globals() ... [13:13:43.545] List of 5 [13:13:43.545] $ ...future.FUN :function (mode = "logical", length = 0L) [13:13:43.545] $ future.call.arguments :List of 1 [13:13:43.545] ..$ length: int 2 [13:13:43.545] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:43.545] $ ...future.elements_ii :List of 4 [13:13:43.545] ..$ c: chr "list" [13:13:43.545] ..$ c: chr "character" [13:13:43.545] ..$ b: chr "numeric" [13:13:43.545] ..$ a: chr "integer" [13:13:43.545] $ ...future.seeds_ii : NULL [13:13:43.545] $ ...future.globals.maxSize: NULL [13:13:43.545] - attr(*, "where")=List of 5 [13:13:43.545] ..$ ...future.FUN : [13:13:43.545] ..$ future.call.arguments : [13:13:43.545] ..$ ...future.elements_ii : [13:13:43.545] ..$ ...future.seeds_ii : [13:13:43.545] ..$ ...future.globals.maxSize: [13:13:43.545] - attr(*, "resolved")= logi FALSE [13:13:43.545] - attr(*, "total_size")= num 2240 [13:13:43.545] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:43.545] - attr(*, "already-done")= logi TRUE [13:13:43.550] - copied '...future.FUN' to environment [13:13:43.550] - copied 'future.call.arguments' to environment [13:13:43.550] - copied '...future.elements_ii' to environment [13:13:43.550] - copied '...future.seeds_ii' to environment [13:13:43.550] - copied '...future.globals.maxSize' to environment [13:13:43.550] assign_globals() ... done [13:13:43.551] plan(): Setting new future strategy stack: [13:13:43.551] List of future strategies: [13:13:43.551] 1. sequential: [13:13:43.551] - args: function (..., envir = parent.frame(), workers = "") [13:13:43.551] - tweaked: FALSE [13:13:43.551] - call: NULL [13:13:43.551] plan(): nbrOfWorkers() = 1 [13:13:43.552] plan(): Setting new future strategy stack: [13:13:43.552] List of future strategies: [13:13:43.552] 1. sequential: [13:13:43.552] - args: function (..., envir = parent.frame(), workers = "") [13:13:43.552] - tweaked: FALSE [13:13:43.552] - call: plan(strategy) [13:13:43.553] plan(): nbrOfWorkers() = 1 [13:13:43.553] SequentialFuture started (and completed) [13:13:43.553] - Launch lazy future ... done [13:13:43.553] run() for 'SequentialFuture' ... done [13:13:43.553] Created future: [13:13:43.553] SequentialFuture: [13:13:43.553] Label: 'future_lapply-1' [13:13:43.553] Expression: [13:13:43.553] { [13:13:43.553] do.call(function(...) { [13:13:43.553] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:43.553] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:43.553] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:43.553] on.exit(options(oopts), add = TRUE) [13:13:43.553] } [13:13:43.553] { [13:13:43.553] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:43.553] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:43.553] ...future.FUN(...future.X_jj, ...) [13:13:43.553] }) [13:13:43.553] } [13:13:43.553] }, args = future.call.arguments) [13:13:43.553] } [13:13:43.553] Lazy evaluation: FALSE [13:13:43.553] Asynchronous evaluation: FALSE [13:13:43.553] Local evaluation: TRUE [13:13:43.553] Environment: R_GlobalEnv [13:13:43.553] Capture standard output: TRUE [13:13:43.553] Capture condition classes: 'condition' (excluding 'nothing') [13:13:43.553] 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) [13:13:43.553] Packages: [13:13:43.553] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:43.553] Resolved: TRUE [13:13:43.553] Value: 240 bytes of class 'list' [13:13:43.553] Early signaling: FALSE [13:13:43.553] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:43.553] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:43.554] Chunk #1 of 1 ... DONE [13:13:43.554] Launching 1 futures (chunks) ... DONE [13:13:43.555] Resolving 1 futures (chunks) ... [13:13:43.555] resolve() on list ... [13:13:43.555] recursive: 0 [13:13:43.555] length: 1 [13:13:43.555] [13:13:43.555] resolved() for 'SequentialFuture' ... [13:13:43.555] - state: 'finished' [13:13:43.555] - run: TRUE [13:13:43.556] - result: 'FutureResult' [13:13:43.556] resolved() for 'SequentialFuture' ... done [13:13:43.556] Future #1 [13:13:43.556] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:43.556] - nx: 1 [13:13:43.556] - relay: TRUE [13:13:43.556] - stdout: TRUE [13:13:43.556] - signal: TRUE [13:13:43.557] - resignal: FALSE [13:13:43.557] - force: TRUE [13:13:43.557] - relayed: [n=1] FALSE [13:13:43.557] - queued futures: [n=1] FALSE [13:13:43.557] - until=1 [13:13:43.557] - relaying element #1 [13:13:43.557] - relayed: [n=1] TRUE [13:13:43.557] - queued futures: [n=1] TRUE [13:13:43.557] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:43.558] length: 0 (resolved future 1) [13:13:43.558] Relaying remaining futures [13:13:43.558] signalConditionsASAP(NULL, pos=0) ... [13:13:43.558] - nx: 1 [13:13:43.558] - relay: TRUE [13:13:43.558] - stdout: TRUE [13:13:43.558] - signal: TRUE [13:13:43.558] - resignal: FALSE [13:13:43.558] - force: TRUE [13:13:43.559] - relayed: [n=1] TRUE [13:13:43.559] - queued futures: [n=1] TRUE - flush all [13:13:43.559] - relayed: [n=1] TRUE [13:13:43.559] - queued futures: [n=1] TRUE [13:13:43.559] signalConditionsASAP(NULL, pos=0) ... done [13:13:43.559] resolve() on list ... DONE [13:13:43.559] - Number of value chunks collected: 1 [13:13:43.559] Resolving 1 futures (chunks) ... DONE [13:13:43.560] Reducing values from 1 chunks ... [13:13:43.560] - Number of values collected after concatenation: 4 [13:13:43.560] - Number of values expected: 4 [13:13:43.560] Reverse index remapping (attribute 'ordering'): [n = 4] 4, 3, 2, 1 [13:13:43.560] Reducing values from 1 chunks ... DONE [13:13:43.560] 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, ...) ... [13:13:43.562] future_lapply() ... [13:13:43.563] Number of chunks: 1 [13:13:43.563] Index remapping (attribute 'ordering'): [n = 4] 4, 3, 2, 1 [13:13:43.563] getGlobalsAndPackagesXApply() ... [13:13:43.563] - future.globals: TRUE [13:13:43.563] getGlobalsAndPackages() ... [13:13:43.563] Searching for globals... [13:13:43.564] - globals found: [2] 'FUN', '.Internal' [13:13:43.564] Searching for globals ... DONE [13:13:43.564] Resolving globals: FALSE [13:13:43.565] The total size of the 1 globals is 2.13 KiB (2184 bytes) [13:13:43.565] 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') [13:13:43.565] - globals: [1] 'FUN' [13:13:43.565] [13:13:43.565] getGlobalsAndPackages() ... DONE [13:13:43.566] - globals found/used: [n=1] 'FUN' [13:13:43.566] - needed namespaces: [n=0] [13:13:43.566] Finding globals ... DONE [13:13:43.566] - use_args: TRUE [13:13:43.566] - Getting '...' globals ... [13:13:43.566] resolve() on list ... [13:13:43.566] recursive: 0 [13:13:43.566] length: 1 [13:13:43.567] elements: '...' [13:13:43.567] length: 0 (resolved future 1) [13:13:43.567] resolve() on list ... DONE [13:13:43.567] - '...' content: [n=1] 'length' [13:13:43.567] List of 1 [13:13:43.567] $ ...:List of 1 [13:13:43.567] ..$ length: int 2 [13:13:43.567] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:43.567] - attr(*, "where")=List of 1 [13:13:43.567] ..$ ...: [13:13:43.567] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:43.567] - attr(*, "resolved")= logi TRUE [13:13:43.567] - attr(*, "total_size")= num NA [13:13:43.570] - Getting '...' globals ... DONE [13:13:43.570] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:43.570] List of 2 [13:13:43.570] $ ...future.FUN:function (mode = "logical", length = 0L) [13:13:43.570] $ ... :List of 1 [13:13:43.570] ..$ length: int 2 [13:13:43.570] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:43.570] - attr(*, "where")=List of 2 [13:13:43.570] ..$ ...future.FUN: [13:13:43.570] ..$ ... : [13:13:43.570] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:43.570] - attr(*, "resolved")= logi FALSE [13:13:43.570] - attr(*, "total_size")= num 2240 [13:13:43.574] Packages to be attached in all futures: [n=0] [13:13:43.574] getGlobalsAndPackagesXApply() ... DONE [13:13:43.575] Number of futures (= number of chunks): 1 [13:13:43.575] Launching 1 futures (chunks) ... [13:13:43.575] Chunk #1 of 1 ... [13:13:43.575] - Finding globals in 'X' for chunk #1 ... [13:13:43.575] getGlobalsAndPackages() ... [13:13:43.575] Searching for globals... [13:13:43.575] [13:13:43.576] Searching for globals ... DONE [13:13:43.576] - globals: [0] [13:13:43.576] getGlobalsAndPackages() ... DONE [13:13:43.576] + additional globals found: [n=0] [13:13:43.576] + additional namespaces needed: [n=0] [13:13:43.576] - Finding globals in 'X' for chunk #1 ... DONE [13:13:43.576] - seeds: [13:13:43.576] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:43.576] getGlobalsAndPackages() ... [13:13:43.577] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:43.577] Resolving globals: FALSE [13:13:43.577] Tweak future expression to call with '...' arguments ... [13:13:43.577] { [13:13:43.577] do.call(function(...) { [13:13:43.577] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:43.577] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:43.577] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:43.577] on.exit(options(oopts), add = TRUE) [13:13:43.577] } [13:13:43.577] { [13:13:43.577] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:43.577] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:43.577] ...future.FUN(...future.X_jj, ...) [13:13:43.577] }) [13:13:43.577] } [13:13:43.577] }, args = future.call.arguments) [13:13:43.577] } [13:13:43.577] Tweak future expression to call with '...' arguments ... DONE [13:13:43.578] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:43.578] [13:13:43.578] getGlobalsAndPackages() ... DONE [13:13:43.578] run() for 'Future' ... [13:13:43.578] - state: 'created' [13:13:43.578] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:13:43.579] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:43.579] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:43.579] - Field: 'label' [13:13:43.579] - Field: 'local' [13:13:43.579] - Field: 'owner' [13:13:43.579] - Field: 'envir' [13:13:43.579] - Field: 'packages' [13:13:43.580] - Field: 'gc' [13:13:43.580] - Field: 'conditions' [13:13:43.580] - Field: 'expr' [13:13:43.580] - Field: 'uuid' [13:13:43.580] - Field: 'seed' [13:13:43.580] - Field: 'version' [13:13:43.580] - Field: 'result' [13:13:43.580] - Field: 'asynchronous' [13:13:43.580] - Field: 'calls' [13:13:43.581] - Field: 'globals' [13:13:43.581] - Field: 'stdout' [13:13:43.581] - Field: 'earlySignal' [13:13:43.581] - Field: 'lazy' [13:13:43.581] - Field: 'state' [13:13:43.581] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:43.581] - Launch lazy future ... [13:13:43.582] Packages needed by the future expression (n = 0): [13:13:43.582] Packages needed by future strategies (n = 0): [13:13:43.582] { [13:13:43.582] { [13:13:43.582] { [13:13:43.582] ...future.startTime <- base::Sys.time() [13:13:43.582] { [13:13:43.582] { [13:13:43.582] { [13:13:43.582] base::local({ [13:13:43.582] has_future <- base::requireNamespace("future", [13:13:43.582] quietly = TRUE) [13:13:43.582] if (has_future) { [13:13:43.582] ns <- base::getNamespace("future") [13:13:43.582] version <- ns[[".package"]][["version"]] [13:13:43.582] if (is.null(version)) [13:13:43.582] version <- utils::packageVersion("future") [13:13:43.582] } [13:13:43.582] else { [13:13:43.582] version <- NULL [13:13:43.582] } [13:13:43.582] if (!has_future || version < "1.8.0") { [13:13:43.582] info <- base::c(r_version = base::gsub("R version ", [13:13:43.582] "", base::R.version$version.string), [13:13:43.582] platform = base::sprintf("%s (%s-bit)", [13:13:43.582] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:43.582] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:43.582] "release", "version")], collapse = " "), [13:13:43.582] hostname = base::Sys.info()[["nodename"]]) [13:13:43.582] info <- base::sprintf("%s: %s", base::names(info), [13:13:43.582] info) [13:13:43.582] info <- base::paste(info, collapse = "; ") [13:13:43.582] if (!has_future) { [13:13:43.582] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:43.582] info) [13:13:43.582] } [13:13:43.582] else { [13:13:43.582] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:43.582] info, version) [13:13:43.582] } [13:13:43.582] base::stop(msg) [13:13:43.582] } [13:13:43.582] }) [13:13:43.582] } [13:13:43.582] options(future.plan = NULL) [13:13:43.582] Sys.unsetenv("R_FUTURE_PLAN") [13:13:43.582] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:43.582] } [13:13:43.582] ...future.workdir <- getwd() [13:13:43.582] } [13:13:43.582] ...future.oldOptions <- base::as.list(base::.Options) [13:13:43.582] ...future.oldEnvVars <- base::Sys.getenv() [13:13:43.582] } [13:13:43.582] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:43.582] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:43.582] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:43.582] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:43.582] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:43.582] future.stdout.windows.reencode = NULL, width = 80L) [13:13:43.582] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:43.582] base::names(...future.oldOptions)) [13:13:43.582] } [13:13:43.582] if (FALSE) { [13:13:43.582] } [13:13:43.582] else { [13:13:43.582] if (TRUE) { [13:13:43.582] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:43.582] open = "w") [13:13:43.582] } [13:13:43.582] else { [13:13:43.582] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:43.582] windows = "NUL", "/dev/null"), open = "w") [13:13:43.582] } [13:13:43.582] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:43.582] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:43.582] base::sink(type = "output", split = FALSE) [13:13:43.582] base::close(...future.stdout) [13:13:43.582] }, add = TRUE) [13:13:43.582] } [13:13:43.582] ...future.frame <- base::sys.nframe() [13:13:43.582] ...future.conditions <- base::list() [13:13:43.582] ...future.rng <- base::globalenv()$.Random.seed [13:13:43.582] if (FALSE) { [13:13:43.582] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:43.582] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:43.582] } [13:13:43.582] ...future.result <- base::tryCatch({ [13:13:43.582] base::withCallingHandlers({ [13:13:43.582] ...future.value <- base::withVisible(base::local({ [13:13:43.582] do.call(function(...) { [13:13:43.582] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:43.582] if (!identical(...future.globals.maxSize.org, [13:13:43.582] ...future.globals.maxSize)) { [13:13:43.582] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:43.582] on.exit(options(oopts), add = TRUE) [13:13:43.582] } [13:13:43.582] { [13:13:43.582] lapply(seq_along(...future.elements_ii), [13:13:43.582] FUN = function(jj) { [13:13:43.582] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:43.582] ...future.FUN(...future.X_jj, ...) [13:13:43.582] }) [13:13:43.582] } [13:13:43.582] }, args = future.call.arguments) [13:13:43.582] })) [13:13:43.582] future::FutureResult(value = ...future.value$value, [13:13:43.582] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:43.582] ...future.rng), globalenv = if (FALSE) [13:13:43.582] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:43.582] ...future.globalenv.names)) [13:13:43.582] else NULL, started = ...future.startTime, version = "1.8") [13:13:43.582] }, condition = base::local({ [13:13:43.582] c <- base::c [13:13:43.582] inherits <- base::inherits [13:13:43.582] invokeRestart <- base::invokeRestart [13:13:43.582] length <- base::length [13:13:43.582] list <- base::list [13:13:43.582] seq.int <- base::seq.int [13:13:43.582] signalCondition <- base::signalCondition [13:13:43.582] sys.calls <- base::sys.calls [13:13:43.582] `[[` <- base::`[[` [13:13:43.582] `+` <- base::`+` [13:13:43.582] `<<-` <- base::`<<-` [13:13:43.582] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:43.582] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:43.582] 3L)] [13:13:43.582] } [13:13:43.582] function(cond) { [13:13:43.582] is_error <- inherits(cond, "error") [13:13:43.582] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:43.582] NULL) [13:13:43.582] if (is_error) { [13:13:43.582] sessionInformation <- function() { [13:13:43.582] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:43.582] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:43.582] search = base::search(), system = base::Sys.info()) [13:13:43.582] } [13:13:43.582] ...future.conditions[[length(...future.conditions) + [13:13:43.582] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:43.582] cond$call), session = sessionInformation(), [13:13:43.582] timestamp = base::Sys.time(), signaled = 0L) [13:13:43.582] signalCondition(cond) [13:13:43.582] } [13:13:43.582] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:43.582] "immediateCondition"))) { [13:13:43.582] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:43.582] ...future.conditions[[length(...future.conditions) + [13:13:43.582] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:43.582] if (TRUE && !signal) { [13:13:43.582] muffleCondition <- function (cond, pattern = "^muffle") [13:13:43.582] { [13:13:43.582] inherits <- base::inherits [13:13:43.582] invokeRestart <- base::invokeRestart [13:13:43.582] is.null <- base::is.null [13:13:43.582] muffled <- FALSE [13:13:43.582] if (inherits(cond, "message")) { [13:13:43.582] muffled <- grepl(pattern, "muffleMessage") [13:13:43.582] if (muffled) [13:13:43.582] invokeRestart("muffleMessage") [13:13:43.582] } [13:13:43.582] else if (inherits(cond, "warning")) { [13:13:43.582] muffled <- grepl(pattern, "muffleWarning") [13:13:43.582] if (muffled) [13:13:43.582] invokeRestart("muffleWarning") [13:13:43.582] } [13:13:43.582] else if (inherits(cond, "condition")) { [13:13:43.582] if (!is.null(pattern)) { [13:13:43.582] computeRestarts <- base::computeRestarts [13:13:43.582] grepl <- base::grepl [13:13:43.582] restarts <- computeRestarts(cond) [13:13:43.582] for (restart in restarts) { [13:13:43.582] name <- restart$name [13:13:43.582] if (is.null(name)) [13:13:43.582] next [13:13:43.582] if (!grepl(pattern, name)) [13:13:43.582] next [13:13:43.582] invokeRestart(restart) [13:13:43.582] muffled <- TRUE [13:13:43.582] break [13:13:43.582] } [13:13:43.582] } [13:13:43.582] } [13:13:43.582] invisible(muffled) [13:13:43.582] } [13:13:43.582] muffleCondition(cond, pattern = "^muffle") [13:13:43.582] } [13:13:43.582] } [13:13:43.582] else { [13:13:43.582] if (TRUE) { [13:13:43.582] muffleCondition <- function (cond, pattern = "^muffle") [13:13:43.582] { [13:13:43.582] inherits <- base::inherits [13:13:43.582] invokeRestart <- base::invokeRestart [13:13:43.582] is.null <- base::is.null [13:13:43.582] muffled <- FALSE [13:13:43.582] if (inherits(cond, "message")) { [13:13:43.582] muffled <- grepl(pattern, "muffleMessage") [13:13:43.582] if (muffled) [13:13:43.582] invokeRestart("muffleMessage") [13:13:43.582] } [13:13:43.582] else if (inherits(cond, "warning")) { [13:13:43.582] muffled <- grepl(pattern, "muffleWarning") [13:13:43.582] if (muffled) [13:13:43.582] invokeRestart("muffleWarning") [13:13:43.582] } [13:13:43.582] else if (inherits(cond, "condition")) { [13:13:43.582] if (!is.null(pattern)) { [13:13:43.582] computeRestarts <- base::computeRestarts [13:13:43.582] grepl <- base::grepl [13:13:43.582] restarts <- computeRestarts(cond) [13:13:43.582] for (restart in restarts) { [13:13:43.582] name <- restart$name [13:13:43.582] if (is.null(name)) [13:13:43.582] next [13:13:43.582] if (!grepl(pattern, name)) [13:13:43.582] next [13:13:43.582] invokeRestart(restart) [13:13:43.582] muffled <- TRUE [13:13:43.582] break [13:13:43.582] } [13:13:43.582] } [13:13:43.582] } [13:13:43.582] invisible(muffled) [13:13:43.582] } [13:13:43.582] muffleCondition(cond, pattern = "^muffle") [13:13:43.582] } [13:13:43.582] } [13:13:43.582] } [13:13:43.582] })) [13:13:43.582] }, error = function(ex) { [13:13:43.582] base::structure(base::list(value = NULL, visible = NULL, [13:13:43.582] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:43.582] ...future.rng), started = ...future.startTime, [13:13:43.582] finished = Sys.time(), session_uuid = NA_character_, [13:13:43.582] version = "1.8"), class = "FutureResult") [13:13:43.582] }, finally = { [13:13:43.582] if (!identical(...future.workdir, getwd())) [13:13:43.582] setwd(...future.workdir) [13:13:43.582] { [13:13:43.582] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:43.582] ...future.oldOptions$nwarnings <- NULL [13:13:43.582] } [13:13:43.582] base::options(...future.oldOptions) [13:13:43.582] if (.Platform$OS.type == "windows") { [13:13:43.582] old_names <- names(...future.oldEnvVars) [13:13:43.582] envs <- base::Sys.getenv() [13:13:43.582] names <- names(envs) [13:13:43.582] common <- intersect(names, old_names) [13:13:43.582] added <- setdiff(names, old_names) [13:13:43.582] removed <- setdiff(old_names, names) [13:13:43.582] changed <- common[...future.oldEnvVars[common] != [13:13:43.582] envs[common]] [13:13:43.582] NAMES <- toupper(changed) [13:13:43.582] args <- list() [13:13:43.582] for (kk in seq_along(NAMES)) { [13:13:43.582] name <- changed[[kk]] [13:13:43.582] NAME <- NAMES[[kk]] [13:13:43.582] if (name != NAME && is.element(NAME, old_names)) [13:13:43.582] next [13:13:43.582] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:43.582] } [13:13:43.582] NAMES <- toupper(added) [13:13:43.582] for (kk in seq_along(NAMES)) { [13:13:43.582] name <- added[[kk]] [13:13:43.582] NAME <- NAMES[[kk]] [13:13:43.582] if (name != NAME && is.element(NAME, old_names)) [13:13:43.582] next [13:13:43.582] args[[name]] <- "" [13:13:43.582] } [13:13:43.582] NAMES <- toupper(removed) [13:13:43.582] for (kk in seq_along(NAMES)) { [13:13:43.582] name <- removed[[kk]] [13:13:43.582] NAME <- NAMES[[kk]] [13:13:43.582] if (name != NAME && is.element(NAME, old_names)) [13:13:43.582] next [13:13:43.582] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:43.582] } [13:13:43.582] if (length(args) > 0) [13:13:43.582] base::do.call(base::Sys.setenv, args = args) [13:13:43.582] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:43.582] } [13:13:43.582] else { [13:13:43.582] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:43.582] } [13:13:43.582] { [13:13:43.582] if (base::length(...future.futureOptionsAdded) > [13:13:43.582] 0L) { [13:13:43.582] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:43.582] base::names(opts) <- ...future.futureOptionsAdded [13:13:43.582] base::options(opts) [13:13:43.582] } [13:13:43.582] { [13:13:43.582] { [13:13:43.582] NULL [13:13:43.582] RNGkind("Mersenne-Twister") [13:13:43.582] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:43.582] inherits = FALSE) [13:13:43.582] } [13:13:43.582] options(future.plan = NULL) [13:13:43.582] if (is.na(NA_character_)) [13:13:43.582] Sys.unsetenv("R_FUTURE_PLAN") [13:13:43.582] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:43.582] future::plan(list(function (..., envir = parent.frame()) [13:13:43.582] { [13:13:43.582] future <- SequentialFuture(..., envir = envir) [13:13:43.582] if (!future$lazy) [13:13:43.582] future <- run(future) [13:13:43.582] invisible(future) [13:13:43.582] }), .cleanup = FALSE, .init = FALSE) [13:13:43.582] } [13:13:43.582] } [13:13:43.582] } [13:13:43.582] }) [13:13:43.582] if (TRUE) { [13:13:43.582] base::sink(type = "output", split = FALSE) [13:13:43.582] if (TRUE) { [13:13:43.582] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:43.582] } [13:13:43.582] else { [13:13:43.582] ...future.result["stdout"] <- base::list(NULL) [13:13:43.582] } [13:13:43.582] base::close(...future.stdout) [13:13:43.582] ...future.stdout <- NULL [13:13:43.582] } [13:13:43.582] ...future.result$conditions <- ...future.conditions [13:13:43.582] ...future.result$finished <- base::Sys.time() [13:13:43.582] ...future.result [13:13:43.582] } [13:13:43.585] assign_globals() ... [13:13:43.585] List of 5 [13:13:43.585] $ ...future.FUN :function (mode = "logical", length = 0L) [13:13:43.585] $ future.call.arguments :List of 1 [13:13:43.585] ..$ length: int 2 [13:13:43.585] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:43.585] $ ...future.elements_ii :List of 4 [13:13:43.585] ..$ c: chr "list" [13:13:43.585] ..$ c: chr "character" [13:13:43.585] ..$ b: chr "numeric" [13:13:43.585] ..$ a: chr "integer" [13:13:43.585] $ ...future.seeds_ii : NULL [13:13:43.585] $ ...future.globals.maxSize: NULL [13:13:43.585] - attr(*, "where")=List of 5 [13:13:43.585] ..$ ...future.FUN : [13:13:43.585] ..$ future.call.arguments : [13:13:43.585] ..$ ...future.elements_ii : [13:13:43.585] ..$ ...future.seeds_ii : [13:13:43.585] ..$ ...future.globals.maxSize: [13:13:43.585] - attr(*, "resolved")= logi FALSE [13:13:43.585] - attr(*, "total_size")= num 2240 [13:13:43.585] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:43.585] - attr(*, "already-done")= logi TRUE [13:13:43.590] - copied '...future.FUN' to environment [13:13:43.590] - copied 'future.call.arguments' to environment [13:13:43.590] - copied '...future.elements_ii' to environment [13:13:43.590] - copied '...future.seeds_ii' to environment [13:13:43.590] - copied '...future.globals.maxSize' to environment [13:13:43.590] assign_globals() ... done [13:13:43.591] plan(): Setting new future strategy stack: [13:13:43.591] List of future strategies: [13:13:43.591] 1. sequential: [13:13:43.591] - args: function (..., envir = parent.frame(), workers = "") [13:13:43.591] - tweaked: FALSE [13:13:43.591] - call: NULL [13:13:43.591] plan(): nbrOfWorkers() = 1 [13:13:43.592] plan(): Setting new future strategy stack: [13:13:43.592] List of future strategies: [13:13:43.592] 1. sequential: [13:13:43.592] - args: function (..., envir = parent.frame(), workers = "") [13:13:43.592] - tweaked: FALSE [13:13:43.592] - call: plan(strategy) [13:13:43.593] plan(): nbrOfWorkers() = 1 [13:13:43.593] SequentialFuture started (and completed) [13:13:43.593] - Launch lazy future ... done [13:13:43.593] run() for 'SequentialFuture' ... done [13:13:43.593] Created future: [13:13:43.593] SequentialFuture: [13:13:43.593] Label: 'future_lapply-1' [13:13:43.593] Expression: [13:13:43.593] { [13:13:43.593] do.call(function(...) { [13:13:43.593] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:43.593] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:43.593] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:43.593] on.exit(options(oopts), add = TRUE) [13:13:43.593] } [13:13:43.593] { [13:13:43.593] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:43.593] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:43.593] ...future.FUN(...future.X_jj, ...) [13:13:43.593] }) [13:13:43.593] } [13:13:43.593] }, args = future.call.arguments) [13:13:43.593] } [13:13:43.593] Lazy evaluation: FALSE [13:13:43.593] Asynchronous evaluation: FALSE [13:13:43.593] Local evaluation: TRUE [13:13:43.593] Environment: R_GlobalEnv [13:13:43.593] Capture standard output: TRUE [13:13:43.593] Capture condition classes: 'condition' (excluding 'nothing') [13:13:43.593] 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) [13:13:43.593] Packages: [13:13:43.593] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:43.593] Resolved: TRUE [13:13:43.593] Value: 240 bytes of class 'list' [13:13:43.593] Early signaling: FALSE [13:13:43.593] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:43.593] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:43.594] Chunk #1 of 1 ... DONE [13:13:43.594] Launching 1 futures (chunks) ... DONE [13:13:43.594] Resolving 1 futures (chunks) ... [13:13:43.595] resolve() on list ... [13:13:43.595] recursive: 0 [13:13:43.595] length: 1 [13:13:43.595] [13:13:43.595] resolved() for 'SequentialFuture' ... [13:13:43.595] - state: 'finished' [13:13:43.595] - run: TRUE [13:13:43.595] - result: 'FutureResult' [13:13:43.596] resolved() for 'SequentialFuture' ... done [13:13:43.596] Future #1 [13:13:43.596] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:43.596] - nx: 1 [13:13:43.596] - relay: TRUE [13:13:43.596] - stdout: TRUE [13:13:43.596] - signal: TRUE [13:13:43.596] - resignal: FALSE [13:13:43.596] - force: TRUE [13:13:43.597] - relayed: [n=1] FALSE [13:13:43.597] - queued futures: [n=1] FALSE [13:13:43.597] - until=1 [13:13:43.597] - relaying element #1 [13:13:43.597] - relayed: [n=1] TRUE [13:13:43.597] - queued futures: [n=1] TRUE [13:13:43.597] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:43.597] length: 0 (resolved future 1) [13:13:43.598] Relaying remaining futures [13:13:43.598] signalConditionsASAP(NULL, pos=0) ... [13:13:43.598] - nx: 1 [13:13:43.598] - relay: TRUE [13:13:43.598] - stdout: TRUE [13:13:43.598] - signal: TRUE [13:13:43.598] - resignal: FALSE [13:13:43.598] - force: TRUE [13:13:43.598] - relayed: [n=1] TRUE [13:13:43.599] - queued futures: [n=1] TRUE - flush all [13:13:43.599] - relayed: [n=1] TRUE [13:13:43.599] - queued futures: [n=1] TRUE [13:13:43.599] signalConditionsASAP(NULL, pos=0) ... done [13:13:43.599] resolve() on list ... DONE [13:13:43.599] - Number of value chunks collected: 1 [13:13:43.599] Resolving 1 futures (chunks) ... DONE [13:13:43.599] Reducing values from 1 chunks ... [13:13:43.599] - Number of values collected after concatenation: 4 [13:13:43.600] - Number of values expected: 4 [13:13:43.600] Reverse index remapping (attribute 'ordering'): [n = 4] 4, 3, 2, 1 [13:13:43.600] Reducing values from 1 chunks ... DONE [13:13:43.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 = future:::hpaste, ...) ... [13:13:43.602] future_lapply() ... [13:13:43.608] Number of chunks: 1 [13:13:43.608] getGlobalsAndPackagesXApply() ... [13:13:43.608] - future.globals: TRUE [13:13:43.608] getGlobalsAndPackages() ... [13:13:43.608] Searching for globals... [13:13:43.615] - globals found: [22] 'FUN', 'if', 'missing', 'is.finite', '{', 'is.null', '<-', 'paste', 'length', '==', 'return', '>', '+', '[', 'seq_len', 'rev', 'c', '&&', '!', ':', '(', '-' [13:13:43.615] Searching for globals ... DONE [13:13:43.616] Resolving globals: FALSE [13:13:43.616] The total size of the 1 globals is 69.62 KiB (71288 bytes) [13:13:43.617] 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') [13:13:43.617] - globals: [1] 'FUN' [13:13:43.617] - packages: [1] 'future' [13:13:43.617] getGlobalsAndPackages() ... DONE [13:13:43.617] - globals found/used: [n=1] 'FUN' [13:13:43.617] - needed namespaces: [n=1] 'future' [13:13:43.617] Finding globals ... DONE [13:13:43.618] - use_args: TRUE [13:13:43.618] - Getting '...' globals ... [13:13:43.618] resolve() on list ... [13:13:43.618] recursive: 0 [13:13:43.618] length: 1 [13:13:43.618] elements: '...' [13:13:43.618] length: 0 (resolved future 1) [13:13:43.618] resolve() on list ... DONE [13:13:43.619] - '...' content: [n=2] 'collapse', 'maxHead' [13:13:43.619] List of 1 [13:13:43.619] $ ...:List of 2 [13:13:43.619] ..$ collapse: chr "; " [13:13:43.619] ..$ maxHead : int 3 [13:13:43.619] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:43.619] - attr(*, "where")=List of 1 [13:13:43.619] ..$ ...: [13:13:43.619] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:43.619] - attr(*, "resolved")= logi TRUE [13:13:43.619] - attr(*, "total_size")= num NA [13:13:43.621] - Getting '...' globals ... DONE [13:13:43.622] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:43.622] List of 2 [13:13:43.622] $ ...future.FUN:function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [13:13:43.622] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [13:13:43.622] $ ... :List of 2 [13:13:43.622] ..$ collapse: chr "; " [13:13:43.622] ..$ maxHead : int 3 [13:13:43.622] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:43.622] - attr(*, "where")=List of 2 [13:13:43.622] ..$ ...future.FUN: [13:13:43.622] ..$ ... : [13:13:43.622] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:43.622] - attr(*, "resolved")= logi FALSE [13:13:43.622] - attr(*, "total_size")= num 71456 [13:13:43.625] Packages to be attached in all futures: [n=1] 'future' [13:13:43.625] getGlobalsAndPackagesXApply() ... DONE [13:13:43.625] Number of futures (= number of chunks): 1 [13:13:43.625] Launching 1 futures (chunks) ... [13:13:43.625] Chunk #1 of 1 ... [13:13:43.625] - Finding globals in 'X' for chunk #1 ... [13:13:43.625] getGlobalsAndPackages() ... [13:13:43.626] Searching for globals... [13:13:43.626] [13:13:43.626] Searching for globals ... DONE [13:13:43.626] - globals: [0] [13:13:43.626] getGlobalsAndPackages() ... DONE [13:13:43.626] + additional globals found: [n=0] [13:13:43.626] + additional namespaces needed: [n=0] [13:13:43.626] - Finding globals in 'X' for chunk #1 ... DONE [13:13:43.627] - seeds: [13:13:43.627] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:43.627] getGlobalsAndPackages() ... [13:13:43.627] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:43.627] Resolving globals: FALSE [13:13:43.627] Tweak future expression to call with '...' arguments ... [13:13:43.627] { [13:13:43.627] do.call(function(...) { [13:13:43.627] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:43.627] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:43.627] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:43.627] on.exit(options(oopts), add = TRUE) [13:13:43.627] } [13:13:43.627] { [13:13:43.627] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:43.627] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:43.627] ...future.FUN(...future.X_jj, ...) [13:13:43.627] }) [13:13:43.627] } [13:13:43.627] }, args = future.call.arguments) [13:13:43.627] } [13:13:43.628] Tweak future expression to call with '...' arguments ... DONE [13:13:43.628] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:43.628] - packages: [1] 'future' [13:13:43.628] getGlobalsAndPackages() ... DONE [13:13:43.628] run() for 'Future' ... [13:13:43.629] - state: 'created' [13:13:43.629] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:13:43.629] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:43.629] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:43.629] - Field: 'label' [13:13:43.629] - Field: 'local' [13:13:43.630] - Field: 'owner' [13:13:43.630] - Field: 'envir' [13:13:43.630] - Field: 'packages' [13:13:43.630] - Field: 'gc' [13:13:43.630] - Field: 'conditions' [13:13:43.630] - Field: 'expr' [13:13:43.630] - Field: 'uuid' [13:13:43.630] - Field: 'seed' [13:13:43.630] - Field: 'version' [13:13:43.631] - Field: 'result' [13:13:43.631] - Field: 'asynchronous' [13:13:43.631] - Field: 'calls' [13:13:43.631] - Field: 'globals' [13:13:43.631] - Field: 'stdout' [13:13:43.631] - Field: 'earlySignal' [13:13:43.631] - Field: 'lazy' [13:13:43.631] - Field: 'state' [13:13:43.632] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:43.632] - Launch lazy future ... [13:13:43.632] Packages needed by the future expression (n = 1): 'future' [13:13:43.632] Packages needed by future strategies (n = 0): [13:13:43.633] { [13:13:43.633] { [13:13:43.633] { [13:13:43.633] ...future.startTime <- base::Sys.time() [13:13:43.633] { [13:13:43.633] { [13:13:43.633] { [13:13:43.633] { [13:13:43.633] base::local({ [13:13:43.633] has_future <- base::requireNamespace("future", [13:13:43.633] quietly = TRUE) [13:13:43.633] if (has_future) { [13:13:43.633] ns <- base::getNamespace("future") [13:13:43.633] version <- ns[[".package"]][["version"]] [13:13:43.633] if (is.null(version)) [13:13:43.633] version <- utils::packageVersion("future") [13:13:43.633] } [13:13:43.633] else { [13:13:43.633] version <- NULL [13:13:43.633] } [13:13:43.633] if (!has_future || version < "1.8.0") { [13:13:43.633] info <- base::c(r_version = base::gsub("R version ", [13:13:43.633] "", base::R.version$version.string), [13:13:43.633] platform = base::sprintf("%s (%s-bit)", [13:13:43.633] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:43.633] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:43.633] "release", "version")], collapse = " "), [13:13:43.633] hostname = base::Sys.info()[["nodename"]]) [13:13:43.633] info <- base::sprintf("%s: %s", base::names(info), [13:13:43.633] info) [13:13:43.633] info <- base::paste(info, collapse = "; ") [13:13:43.633] if (!has_future) { [13:13:43.633] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:43.633] info) [13:13:43.633] } [13:13:43.633] else { [13:13:43.633] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:43.633] info, version) [13:13:43.633] } [13:13:43.633] base::stop(msg) [13:13:43.633] } [13:13:43.633] }) [13:13:43.633] } [13:13:43.633] base::local({ [13:13:43.633] for (pkg in "future") { [13:13:43.633] base::loadNamespace(pkg) [13:13:43.633] base::library(pkg, character.only = TRUE) [13:13:43.633] } [13:13:43.633] }) [13:13:43.633] } [13:13:43.633] options(future.plan = NULL) [13:13:43.633] Sys.unsetenv("R_FUTURE_PLAN") [13:13:43.633] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:43.633] } [13:13:43.633] ...future.workdir <- getwd() [13:13:43.633] } [13:13:43.633] ...future.oldOptions <- base::as.list(base::.Options) [13:13:43.633] ...future.oldEnvVars <- base::Sys.getenv() [13:13:43.633] } [13:13:43.633] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:43.633] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:43.633] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:43.633] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:43.633] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:43.633] future.stdout.windows.reencode = NULL, width = 80L) [13:13:43.633] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:43.633] base::names(...future.oldOptions)) [13:13:43.633] } [13:13:43.633] if (FALSE) { [13:13:43.633] } [13:13:43.633] else { [13:13:43.633] if (TRUE) { [13:13:43.633] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:43.633] open = "w") [13:13:43.633] } [13:13:43.633] else { [13:13:43.633] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:43.633] windows = "NUL", "/dev/null"), open = "w") [13:13:43.633] } [13:13:43.633] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:43.633] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:43.633] base::sink(type = "output", split = FALSE) [13:13:43.633] base::close(...future.stdout) [13:13:43.633] }, add = TRUE) [13:13:43.633] } [13:13:43.633] ...future.frame <- base::sys.nframe() [13:13:43.633] ...future.conditions <- base::list() [13:13:43.633] ...future.rng <- base::globalenv()$.Random.seed [13:13:43.633] if (FALSE) { [13:13:43.633] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:43.633] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:43.633] } [13:13:43.633] ...future.result <- base::tryCatch({ [13:13:43.633] base::withCallingHandlers({ [13:13:43.633] ...future.value <- base::withVisible(base::local({ [13:13:43.633] do.call(function(...) { [13:13:43.633] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:43.633] if (!identical(...future.globals.maxSize.org, [13:13:43.633] ...future.globals.maxSize)) { [13:13:43.633] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:43.633] on.exit(options(oopts), add = TRUE) [13:13:43.633] } [13:13:43.633] { [13:13:43.633] lapply(seq_along(...future.elements_ii), [13:13:43.633] FUN = function(jj) { [13:13:43.633] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:43.633] ...future.FUN(...future.X_jj, ...) [13:13:43.633] }) [13:13:43.633] } [13:13:43.633] }, args = future.call.arguments) [13:13:43.633] })) [13:13:43.633] future::FutureResult(value = ...future.value$value, [13:13:43.633] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:43.633] ...future.rng), globalenv = if (FALSE) [13:13:43.633] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:43.633] ...future.globalenv.names)) [13:13:43.633] else NULL, started = ...future.startTime, version = "1.8") [13:13:43.633] }, condition = base::local({ [13:13:43.633] c <- base::c [13:13:43.633] inherits <- base::inherits [13:13:43.633] invokeRestart <- base::invokeRestart [13:13:43.633] length <- base::length [13:13:43.633] list <- base::list [13:13:43.633] seq.int <- base::seq.int [13:13:43.633] signalCondition <- base::signalCondition [13:13:43.633] sys.calls <- base::sys.calls [13:13:43.633] `[[` <- base::`[[` [13:13:43.633] `+` <- base::`+` [13:13:43.633] `<<-` <- base::`<<-` [13:13:43.633] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:43.633] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:43.633] 3L)] [13:13:43.633] } [13:13:43.633] function(cond) { [13:13:43.633] is_error <- inherits(cond, "error") [13:13:43.633] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:43.633] NULL) [13:13:43.633] if (is_error) { [13:13:43.633] sessionInformation <- function() { [13:13:43.633] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:43.633] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:43.633] search = base::search(), system = base::Sys.info()) [13:13:43.633] } [13:13:43.633] ...future.conditions[[length(...future.conditions) + [13:13:43.633] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:43.633] cond$call), session = sessionInformation(), [13:13:43.633] timestamp = base::Sys.time(), signaled = 0L) [13:13:43.633] signalCondition(cond) [13:13:43.633] } [13:13:43.633] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:43.633] "immediateCondition"))) { [13:13:43.633] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:43.633] ...future.conditions[[length(...future.conditions) + [13:13:43.633] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:43.633] if (TRUE && !signal) { [13:13:43.633] muffleCondition <- function (cond, pattern = "^muffle") [13:13:43.633] { [13:13:43.633] inherits <- base::inherits [13:13:43.633] invokeRestart <- base::invokeRestart [13:13:43.633] is.null <- base::is.null [13:13:43.633] muffled <- FALSE [13:13:43.633] if (inherits(cond, "message")) { [13:13:43.633] muffled <- grepl(pattern, "muffleMessage") [13:13:43.633] if (muffled) [13:13:43.633] invokeRestart("muffleMessage") [13:13:43.633] } [13:13:43.633] else if (inherits(cond, "warning")) { [13:13:43.633] muffled <- grepl(pattern, "muffleWarning") [13:13:43.633] if (muffled) [13:13:43.633] invokeRestart("muffleWarning") [13:13:43.633] } [13:13:43.633] else if (inherits(cond, "condition")) { [13:13:43.633] if (!is.null(pattern)) { [13:13:43.633] computeRestarts <- base::computeRestarts [13:13:43.633] grepl <- base::grepl [13:13:43.633] restarts <- computeRestarts(cond) [13:13:43.633] for (restart in restarts) { [13:13:43.633] name <- restart$name [13:13:43.633] if (is.null(name)) [13:13:43.633] next [13:13:43.633] if (!grepl(pattern, name)) [13:13:43.633] next [13:13:43.633] invokeRestart(restart) [13:13:43.633] muffled <- TRUE [13:13:43.633] break [13:13:43.633] } [13:13:43.633] } [13:13:43.633] } [13:13:43.633] invisible(muffled) [13:13:43.633] } [13:13:43.633] muffleCondition(cond, pattern = "^muffle") [13:13:43.633] } [13:13:43.633] } [13:13:43.633] else { [13:13:43.633] if (TRUE) { [13:13:43.633] muffleCondition <- function (cond, pattern = "^muffle") [13:13:43.633] { [13:13:43.633] inherits <- base::inherits [13:13:43.633] invokeRestart <- base::invokeRestart [13:13:43.633] is.null <- base::is.null [13:13:43.633] muffled <- FALSE [13:13:43.633] if (inherits(cond, "message")) { [13:13:43.633] muffled <- grepl(pattern, "muffleMessage") [13:13:43.633] if (muffled) [13:13:43.633] invokeRestart("muffleMessage") [13:13:43.633] } [13:13:43.633] else if (inherits(cond, "warning")) { [13:13:43.633] muffled <- grepl(pattern, "muffleWarning") [13:13:43.633] if (muffled) [13:13:43.633] invokeRestart("muffleWarning") [13:13:43.633] } [13:13:43.633] else if (inherits(cond, "condition")) { [13:13:43.633] if (!is.null(pattern)) { [13:13:43.633] computeRestarts <- base::computeRestarts [13:13:43.633] grepl <- base::grepl [13:13:43.633] restarts <- computeRestarts(cond) [13:13:43.633] for (restart in restarts) { [13:13:43.633] name <- restart$name [13:13:43.633] if (is.null(name)) [13:13:43.633] next [13:13:43.633] if (!grepl(pattern, name)) [13:13:43.633] next [13:13:43.633] invokeRestart(restart) [13:13:43.633] muffled <- TRUE [13:13:43.633] break [13:13:43.633] } [13:13:43.633] } [13:13:43.633] } [13:13:43.633] invisible(muffled) [13:13:43.633] } [13:13:43.633] muffleCondition(cond, pattern = "^muffle") [13:13:43.633] } [13:13:43.633] } [13:13:43.633] } [13:13:43.633] })) [13:13:43.633] }, error = function(ex) { [13:13:43.633] base::structure(base::list(value = NULL, visible = NULL, [13:13:43.633] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:43.633] ...future.rng), started = ...future.startTime, [13:13:43.633] finished = Sys.time(), session_uuid = NA_character_, [13:13:43.633] version = "1.8"), class = "FutureResult") [13:13:43.633] }, finally = { [13:13:43.633] if (!identical(...future.workdir, getwd())) [13:13:43.633] setwd(...future.workdir) [13:13:43.633] { [13:13:43.633] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:43.633] ...future.oldOptions$nwarnings <- NULL [13:13:43.633] } [13:13:43.633] base::options(...future.oldOptions) [13:13:43.633] if (.Platform$OS.type == "windows") { [13:13:43.633] old_names <- names(...future.oldEnvVars) [13:13:43.633] envs <- base::Sys.getenv() [13:13:43.633] names <- names(envs) [13:13:43.633] common <- intersect(names, old_names) [13:13:43.633] added <- setdiff(names, old_names) [13:13:43.633] removed <- setdiff(old_names, names) [13:13:43.633] changed <- common[...future.oldEnvVars[common] != [13:13:43.633] envs[common]] [13:13:43.633] NAMES <- toupper(changed) [13:13:43.633] args <- list() [13:13:43.633] for (kk in seq_along(NAMES)) { [13:13:43.633] name <- changed[[kk]] [13:13:43.633] NAME <- NAMES[[kk]] [13:13:43.633] if (name != NAME && is.element(NAME, old_names)) [13:13:43.633] next [13:13:43.633] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:43.633] } [13:13:43.633] NAMES <- toupper(added) [13:13:43.633] for (kk in seq_along(NAMES)) { [13:13:43.633] name <- added[[kk]] [13:13:43.633] NAME <- NAMES[[kk]] [13:13:43.633] if (name != NAME && is.element(NAME, old_names)) [13:13:43.633] next [13:13:43.633] args[[name]] <- "" [13:13:43.633] } [13:13:43.633] NAMES <- toupper(removed) [13:13:43.633] for (kk in seq_along(NAMES)) { [13:13:43.633] name <- removed[[kk]] [13:13:43.633] NAME <- NAMES[[kk]] [13:13:43.633] if (name != NAME && is.element(NAME, old_names)) [13:13:43.633] next [13:13:43.633] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:43.633] } [13:13:43.633] if (length(args) > 0) [13:13:43.633] base::do.call(base::Sys.setenv, args = args) [13:13:43.633] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:43.633] } [13:13:43.633] else { [13:13:43.633] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:43.633] } [13:13:43.633] { [13:13:43.633] if (base::length(...future.futureOptionsAdded) > [13:13:43.633] 0L) { [13:13:43.633] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:43.633] base::names(opts) <- ...future.futureOptionsAdded [13:13:43.633] base::options(opts) [13:13:43.633] } [13:13:43.633] { [13:13:43.633] { [13:13:43.633] NULL [13:13:43.633] RNGkind("Mersenne-Twister") [13:13:43.633] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:43.633] inherits = FALSE) [13:13:43.633] } [13:13:43.633] options(future.plan = NULL) [13:13:43.633] if (is.na(NA_character_)) [13:13:43.633] Sys.unsetenv("R_FUTURE_PLAN") [13:13:43.633] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:43.633] future::plan(list(function (..., envir = parent.frame()) [13:13:43.633] { [13:13:43.633] future <- SequentialFuture(..., envir = envir) [13:13:43.633] if (!future$lazy) [13:13:43.633] future <- run(future) [13:13:43.633] invisible(future) [13:13:43.633] }), .cleanup = FALSE, .init = FALSE) [13:13:43.633] } [13:13:43.633] } [13:13:43.633] } [13:13:43.633] }) [13:13:43.633] if (TRUE) { [13:13:43.633] base::sink(type = "output", split = FALSE) [13:13:43.633] if (TRUE) { [13:13:43.633] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:43.633] } [13:13:43.633] else { [13:13:43.633] ...future.result["stdout"] <- base::list(NULL) [13:13:43.633] } [13:13:43.633] base::close(...future.stdout) [13:13:43.633] ...future.stdout <- NULL [13:13:43.633] } [13:13:43.633] ...future.result$conditions <- ...future.conditions [13:13:43.633] ...future.result$finished <- base::Sys.time() [13:13:43.633] ...future.result [13:13:43.633] } [13:13:43.635] assign_globals() ... [13:13:43.635] List of 5 [13:13:43.635] $ ...future.FUN :function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [13:13:43.635] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [13:13:43.635] $ future.call.arguments :List of 2 [13:13:43.635] ..$ collapse: chr "; " [13:13:43.635] ..$ maxHead : int 3 [13:13:43.635] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:43.635] $ ...future.elements_ii :List of 1 [13:13:43.635] ..$ a: Named chr [1:101] "hello" "1" "2" "3" ... [13:13:43.635] .. ..- attr(*, "names")= chr [1:101] "" "b1" "b2" "b3" ... [13:13:43.635] $ ...future.seeds_ii : NULL [13:13:43.635] $ ...future.globals.maxSize: NULL [13:13:43.635] - attr(*, "where")=List of 5 [13:13:43.635] ..$ ...future.FUN : [13:13:43.635] ..$ future.call.arguments : [13:13:43.635] ..$ ...future.elements_ii : [13:13:43.635] ..$ ...future.seeds_ii : [13:13:43.635] ..$ ...future.globals.maxSize: [13:13:43.635] - attr(*, "resolved")= logi FALSE [13:13:43.635] - attr(*, "total_size")= num 71456 [13:13:43.635] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:43.635] - attr(*, "already-done")= logi TRUE [13:13:43.640] - copied '...future.FUN' to environment [13:13:43.640] - copied 'future.call.arguments' to environment [13:13:43.641] - copied '...future.elements_ii' to environment [13:13:43.641] - copied '...future.seeds_ii' to environment [13:13:43.641] - copied '...future.globals.maxSize' to environment [13:13:43.641] assign_globals() ... done [13:13:43.641] plan(): Setting new future strategy stack: [13:13:43.642] List of future strategies: [13:13:43.642] 1. sequential: [13:13:43.642] - args: function (..., envir = parent.frame(), workers = "") [13:13:43.642] - tweaked: FALSE [13:13:43.642] - call: NULL [13:13:43.642] plan(): nbrOfWorkers() = 1 [13:13:43.643] plan(): Setting new future strategy stack: [13:13:43.643] List of future strategies: [13:13:43.643] 1. sequential: [13:13:43.643] - args: function (..., envir = parent.frame(), workers = "") [13:13:43.643] - tweaked: FALSE [13:13:43.643] - call: plan(strategy) [13:13:43.645] plan(): nbrOfWorkers() = 1 [13:13:43.645] SequentialFuture started (and completed) [13:13:43.645] - Launch lazy future ... done [13:13:43.646] run() for 'SequentialFuture' ... done [13:13:43.646] Created future: [13:13:43.646] SequentialFuture: [13:13:43.646] Label: 'future_lapply-1' [13:13:43.646] Expression: [13:13:43.646] { [13:13:43.646] do.call(function(...) { [13:13:43.646] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:43.646] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:43.646] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:43.646] on.exit(options(oopts), add = TRUE) [13:13:43.646] } [13:13:43.646] { [13:13:43.646] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:43.646] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:43.646] ...future.FUN(...future.X_jj, ...) [13:13:43.646] }) [13:13:43.646] } [13:13:43.646] }, args = future.call.arguments) [13:13:43.646] } [13:13:43.646] Lazy evaluation: FALSE [13:13:43.646] Asynchronous evaluation: FALSE [13:13:43.646] Local evaluation: TRUE [13:13:43.646] Environment: R_GlobalEnv [13:13:43.646] Capture standard output: TRUE [13:13:43.646] Capture condition classes: 'condition' (excluding 'nothing') [13:13:43.646] 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) [13:13:43.646] Packages: 1 packages ('future') [13:13:43.646] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:43.646] Resolved: TRUE [13:13:43.646] Value: 136 bytes of class 'list' [13:13:43.646] Early signaling: FALSE [13:13:43.646] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:43.646] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:43.647] Chunk #1 of 1 ... DONE [13:13:43.647] Launching 1 futures (chunks) ... DONE [13:13:43.647] Resolving 1 futures (chunks) ... [13:13:43.647] resolve() on list ... [13:13:43.647] recursive: 0 [13:13:43.647] length: 1 [13:13:43.647] [13:13:43.648] resolved() for 'SequentialFuture' ... [13:13:43.648] - state: 'finished' [13:13:43.648] - run: TRUE [13:13:43.648] - result: 'FutureResult' [13:13:43.648] resolved() for 'SequentialFuture' ... done [13:13:43.648] Future #1 [13:13:43.648] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:43.648] - nx: 1 [13:13:43.649] - relay: TRUE [13:13:43.649] - stdout: TRUE [13:13:43.649] - signal: TRUE [13:13:43.649] - resignal: FALSE [13:13:43.649] - force: TRUE [13:13:43.649] - relayed: [n=1] FALSE [13:13:43.649] - queued futures: [n=1] FALSE [13:13:43.649] - until=1 [13:13:43.649] - relaying element #1 [13:13:43.650] - relayed: [n=1] TRUE [13:13:43.650] - queued futures: [n=1] TRUE [13:13:43.650] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:43.650] length: 0 (resolved future 1) [13:13:43.650] Relaying remaining futures [13:13:43.650] signalConditionsASAP(NULL, pos=0) ... [13:13:43.650] - nx: 1 [13:13:43.650] - relay: TRUE [13:13:43.651] - stdout: TRUE [13:13:43.651] - signal: TRUE [13:13:43.651] - resignal: FALSE [13:13:43.651] - force: TRUE [13:13:43.651] - relayed: [n=1] TRUE [13:13:43.651] - queued futures: [n=1] TRUE - flush all [13:13:43.651] - relayed: [n=1] TRUE [13:13:43.651] - queued futures: [n=1] TRUE [13:13:43.651] signalConditionsASAP(NULL, pos=0) ... done [13:13:43.652] resolve() on list ... DONE [13:13:43.652] - Number of value chunks collected: 1 [13:13:43.652] Resolving 1 futures (chunks) ... DONE [13:13:43.652] Reducing values from 1 chunks ... [13:13:43.652] - Number of values collected after concatenation: 1 [13:13:43.652] - Number of values expected: 1 [13:13:43.652] Reducing values from 1 chunks ... DONE [13:13:43.652] future_lapply() ... DONE List of 1 $ y:List of 1 ..$ a: chr "hello; 1; 2; ...; 100" - future_lapply(x, FUN = listenv::listenv, ...) ... [13:13:43.653] future_lapply() ... [13:13:43.654] Number of chunks: 1 [13:13:43.654] Index remapping (attribute 'ordering'): [n = 2] 2, 1 [13:13:43.654] getGlobalsAndPackagesXApply() ... [13:13:43.654] - future.globals: TRUE [13:13:43.654] getGlobalsAndPackages() ... [13:13:43.654] Searching for globals... [13:13:43.655] - globals found: [4] 'FUN', '{', 'get', 'parent.env' [13:13:43.655] Searching for globals ... DONE [13:13:43.656] Resolving globals: FALSE [13:13:43.656] The total size of the 1 globals is 4.85 KiB (4968 bytes) [13:13:43.656] 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') [13:13:43.656] - globals: [1] 'FUN' [13:13:43.657] - packages: [1] 'listenv' [13:13:43.657] getGlobalsAndPackages() ... DONE [13:13:43.657] - globals found/used: [n=1] 'FUN' [13:13:43.657] - needed namespaces: [n=1] 'listenv' [13:13:43.657] Finding globals ... DONE [13:13:43.657] - use_args: TRUE [13:13:43.657] - Getting '...' globals ... [13:13:43.658] resolve() on list ... [13:13:43.658] recursive: 0 [13:13:43.658] length: 1 [13:13:43.658] elements: '...' [13:13:43.658] length: 0 (resolved future 1) [13:13:43.658] resolve() on list ... DONE [13:13:43.658] - '...' content: [n=0] [13:13:43.658] List of 1 [13:13:43.658] $ ...: list() [13:13:43.658] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:43.658] - attr(*, "where")=List of 1 [13:13:43.658] ..$ ...: [13:13:43.658] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:43.658] - attr(*, "resolved")= logi TRUE [13:13:43.658] - attr(*, "total_size")= num NA [13:13:43.660] - Getting '...' globals ... DONE [13:13:43.661] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:43.661] List of 2 [13:13:43.661] $ ...future.FUN:function (x, ...) [13:13:43.661] $ ... : list() [13:13:43.661] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:43.661] - attr(*, "where")=List of 2 [13:13:43.661] ..$ ...future.FUN: [13:13:43.661] ..$ ... : [13:13:43.661] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:43.661] - attr(*, "resolved")= logi FALSE [13:13:43.661] - attr(*, "total_size")= num 4968 [13:13:43.663] Packages to be attached in all futures: [n=1] 'listenv' [13:13:43.663] getGlobalsAndPackagesXApply() ... DONE [13:13:43.663] Number of futures (= number of chunks): 1 [13:13:43.663] Launching 1 futures (chunks) ... [13:13:43.664] Chunk #1 of 1 ... [13:13:43.664] - Finding globals in 'X' for chunk #1 ... [13:13:43.664] getGlobalsAndPackages() ... [13:13:43.664] Searching for globals... [13:13:43.664] [13:13:43.665] Searching for globals ... DONE [13:13:43.665] - globals: [0] [13:13:43.665] getGlobalsAndPackages() ... DONE [13:13:43.665] + additional globals found: [n=0] [13:13:43.665] + additional namespaces needed: [n=0] [13:13:43.665] - Finding globals in 'X' for chunk #1 ... DONE [13:13:43.665] - seeds: [13:13:43.665] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:43.665] getGlobalsAndPackages() ... [13:13:43.666] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:43.666] Resolving globals: FALSE [13:13:43.666] Tweak future expression to call with '...' arguments ... [13:13:43.666] { [13:13:43.666] do.call(function(...) { [13:13:43.666] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:43.666] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:43.666] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:43.666] on.exit(options(oopts), add = TRUE) [13:13:43.666] } [13:13:43.666] { [13:13:43.666] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:43.666] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:43.666] ...future.FUN(...future.X_jj, ...) [13:13:43.666] }) [13:13:43.666] } [13:13:43.666] }, args = future.call.arguments) [13:13:43.666] } [13:13:43.666] Tweak future expression to call with '...' arguments ... DONE [13:13:43.667] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:43.667] - packages: [1] 'listenv' [13:13:43.667] getGlobalsAndPackages() ... DONE [13:13:43.667] run() for 'Future' ... [13:13:43.667] - state: 'created' [13:13:43.667] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:13:43.668] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:43.668] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:43.668] - Field: 'label' [13:13:43.668] - Field: 'local' [13:13:43.668] - Field: 'owner' [13:13:43.668] - Field: 'envir' [13:13:43.669] - Field: 'packages' [13:13:43.669] - Field: 'gc' [13:13:43.669] - Field: 'conditions' [13:13:43.669] - Field: 'expr' [13:13:43.669] - Field: 'uuid' [13:13:43.669] - Field: 'seed' [13:13:43.669] - Field: 'version' [13:13:43.669] - Field: 'result' [13:13:43.670] - Field: 'asynchronous' [13:13:43.670] - Field: 'calls' [13:13:43.670] - Field: 'globals' [13:13:43.670] - Field: 'stdout' [13:13:43.670] - Field: 'earlySignal' [13:13:43.670] - Field: 'lazy' [13:13:43.670] - Field: 'state' [13:13:43.670] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:43.671] - Launch lazy future ... [13:13:43.671] Packages needed by the future expression (n = 1): 'listenv' [13:13:43.671] Packages needed by future strategies (n = 0): [13:13:43.671] { [13:13:43.671] { [13:13:43.671] { [13:13:43.671] ...future.startTime <- base::Sys.time() [13:13:43.671] { [13:13:43.671] { [13:13:43.671] { [13:13:43.671] { [13:13:43.671] base::local({ [13:13:43.671] has_future <- base::requireNamespace("future", [13:13:43.671] quietly = TRUE) [13:13:43.671] if (has_future) { [13:13:43.671] ns <- base::getNamespace("future") [13:13:43.671] version <- ns[[".package"]][["version"]] [13:13:43.671] if (is.null(version)) [13:13:43.671] version <- utils::packageVersion("future") [13:13:43.671] } [13:13:43.671] else { [13:13:43.671] version <- NULL [13:13:43.671] } [13:13:43.671] if (!has_future || version < "1.8.0") { [13:13:43.671] info <- base::c(r_version = base::gsub("R version ", [13:13:43.671] "", base::R.version$version.string), [13:13:43.671] platform = base::sprintf("%s (%s-bit)", [13:13:43.671] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:43.671] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:43.671] "release", "version")], collapse = " "), [13:13:43.671] hostname = base::Sys.info()[["nodename"]]) [13:13:43.671] info <- base::sprintf("%s: %s", base::names(info), [13:13:43.671] info) [13:13:43.671] info <- base::paste(info, collapse = "; ") [13:13:43.671] if (!has_future) { [13:13:43.671] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:43.671] info) [13:13:43.671] } [13:13:43.671] else { [13:13:43.671] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:43.671] info, version) [13:13:43.671] } [13:13:43.671] base::stop(msg) [13:13:43.671] } [13:13:43.671] }) [13:13:43.671] } [13:13:43.671] base::local({ [13:13:43.671] for (pkg in "listenv") { [13:13:43.671] base::loadNamespace(pkg) [13:13:43.671] base::library(pkg, character.only = TRUE) [13:13:43.671] } [13:13:43.671] }) [13:13:43.671] } [13:13:43.671] options(future.plan = NULL) [13:13:43.671] Sys.unsetenv("R_FUTURE_PLAN") [13:13:43.671] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:43.671] } [13:13:43.671] ...future.workdir <- getwd() [13:13:43.671] } [13:13:43.671] ...future.oldOptions <- base::as.list(base::.Options) [13:13:43.671] ...future.oldEnvVars <- base::Sys.getenv() [13:13:43.671] } [13:13:43.671] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:43.671] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:43.671] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:43.671] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:43.671] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:43.671] future.stdout.windows.reencode = NULL, width = 80L) [13:13:43.671] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:43.671] base::names(...future.oldOptions)) [13:13:43.671] } [13:13:43.671] if (FALSE) { [13:13:43.671] } [13:13:43.671] else { [13:13:43.671] if (TRUE) { [13:13:43.671] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:43.671] open = "w") [13:13:43.671] } [13:13:43.671] else { [13:13:43.671] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:43.671] windows = "NUL", "/dev/null"), open = "w") [13:13:43.671] } [13:13:43.671] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:43.671] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:43.671] base::sink(type = "output", split = FALSE) [13:13:43.671] base::close(...future.stdout) [13:13:43.671] }, add = TRUE) [13:13:43.671] } [13:13:43.671] ...future.frame <- base::sys.nframe() [13:13:43.671] ...future.conditions <- base::list() [13:13:43.671] ...future.rng <- base::globalenv()$.Random.seed [13:13:43.671] if (FALSE) { [13:13:43.671] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:43.671] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:43.671] } [13:13:43.671] ...future.result <- base::tryCatch({ [13:13:43.671] base::withCallingHandlers({ [13:13:43.671] ...future.value <- base::withVisible(base::local({ [13:13:43.671] do.call(function(...) { [13:13:43.671] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:43.671] if (!identical(...future.globals.maxSize.org, [13:13:43.671] ...future.globals.maxSize)) { [13:13:43.671] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:43.671] on.exit(options(oopts), add = TRUE) [13:13:43.671] } [13:13:43.671] { [13:13:43.671] lapply(seq_along(...future.elements_ii), [13:13:43.671] FUN = function(jj) { [13:13:43.671] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:43.671] ...future.FUN(...future.X_jj, ...) [13:13:43.671] }) [13:13:43.671] } [13:13:43.671] }, args = future.call.arguments) [13:13:43.671] })) [13:13:43.671] future::FutureResult(value = ...future.value$value, [13:13:43.671] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:43.671] ...future.rng), globalenv = if (FALSE) [13:13:43.671] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:43.671] ...future.globalenv.names)) [13:13:43.671] else NULL, started = ...future.startTime, version = "1.8") [13:13:43.671] }, condition = base::local({ [13:13:43.671] c <- base::c [13:13:43.671] inherits <- base::inherits [13:13:43.671] invokeRestart <- base::invokeRestart [13:13:43.671] length <- base::length [13:13:43.671] list <- base::list [13:13:43.671] seq.int <- base::seq.int [13:13:43.671] signalCondition <- base::signalCondition [13:13:43.671] sys.calls <- base::sys.calls [13:13:43.671] `[[` <- base::`[[` [13:13:43.671] `+` <- base::`+` [13:13:43.671] `<<-` <- base::`<<-` [13:13:43.671] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:43.671] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:43.671] 3L)] [13:13:43.671] } [13:13:43.671] function(cond) { [13:13:43.671] is_error <- inherits(cond, "error") [13:13:43.671] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:43.671] NULL) [13:13:43.671] if (is_error) { [13:13:43.671] sessionInformation <- function() { [13:13:43.671] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:43.671] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:43.671] search = base::search(), system = base::Sys.info()) [13:13:43.671] } [13:13:43.671] ...future.conditions[[length(...future.conditions) + [13:13:43.671] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:43.671] cond$call), session = sessionInformation(), [13:13:43.671] timestamp = base::Sys.time(), signaled = 0L) [13:13:43.671] signalCondition(cond) [13:13:43.671] } [13:13:43.671] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:43.671] "immediateCondition"))) { [13:13:43.671] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:43.671] ...future.conditions[[length(...future.conditions) + [13:13:43.671] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:43.671] if (TRUE && !signal) { [13:13:43.671] muffleCondition <- function (cond, pattern = "^muffle") [13:13:43.671] { [13:13:43.671] inherits <- base::inherits [13:13:43.671] invokeRestart <- base::invokeRestart [13:13:43.671] is.null <- base::is.null [13:13:43.671] muffled <- FALSE [13:13:43.671] if (inherits(cond, "message")) { [13:13:43.671] muffled <- grepl(pattern, "muffleMessage") [13:13:43.671] if (muffled) [13:13:43.671] invokeRestart("muffleMessage") [13:13:43.671] } [13:13:43.671] else if (inherits(cond, "warning")) { [13:13:43.671] muffled <- grepl(pattern, "muffleWarning") [13:13:43.671] if (muffled) [13:13:43.671] invokeRestart("muffleWarning") [13:13:43.671] } [13:13:43.671] else if (inherits(cond, "condition")) { [13:13:43.671] if (!is.null(pattern)) { [13:13:43.671] computeRestarts <- base::computeRestarts [13:13:43.671] grepl <- base::grepl [13:13:43.671] restarts <- computeRestarts(cond) [13:13:43.671] for (restart in restarts) { [13:13:43.671] name <- restart$name [13:13:43.671] if (is.null(name)) [13:13:43.671] next [13:13:43.671] if (!grepl(pattern, name)) [13:13:43.671] next [13:13:43.671] invokeRestart(restart) [13:13:43.671] muffled <- TRUE [13:13:43.671] break [13:13:43.671] } [13:13:43.671] } [13:13:43.671] } [13:13:43.671] invisible(muffled) [13:13:43.671] } [13:13:43.671] muffleCondition(cond, pattern = "^muffle") [13:13:43.671] } [13:13:43.671] } [13:13:43.671] else { [13:13:43.671] if (TRUE) { [13:13:43.671] muffleCondition <- function (cond, pattern = "^muffle") [13:13:43.671] { [13:13:43.671] inherits <- base::inherits [13:13:43.671] invokeRestart <- base::invokeRestart [13:13:43.671] is.null <- base::is.null [13:13:43.671] muffled <- FALSE [13:13:43.671] if (inherits(cond, "message")) { [13:13:43.671] muffled <- grepl(pattern, "muffleMessage") [13:13:43.671] if (muffled) [13:13:43.671] invokeRestart("muffleMessage") [13:13:43.671] } [13:13:43.671] else if (inherits(cond, "warning")) { [13:13:43.671] muffled <- grepl(pattern, "muffleWarning") [13:13:43.671] if (muffled) [13:13:43.671] invokeRestart("muffleWarning") [13:13:43.671] } [13:13:43.671] else if (inherits(cond, "condition")) { [13:13:43.671] if (!is.null(pattern)) { [13:13:43.671] computeRestarts <- base::computeRestarts [13:13:43.671] grepl <- base::grepl [13:13:43.671] restarts <- computeRestarts(cond) [13:13:43.671] for (restart in restarts) { [13:13:43.671] name <- restart$name [13:13:43.671] if (is.null(name)) [13:13:43.671] next [13:13:43.671] if (!grepl(pattern, name)) [13:13:43.671] next [13:13:43.671] invokeRestart(restart) [13:13:43.671] muffled <- TRUE [13:13:43.671] break [13:13:43.671] } [13:13:43.671] } [13:13:43.671] } [13:13:43.671] invisible(muffled) [13:13:43.671] } [13:13:43.671] muffleCondition(cond, pattern = "^muffle") [13:13:43.671] } [13:13:43.671] } [13:13:43.671] } [13:13:43.671] })) [13:13:43.671] }, error = function(ex) { [13:13:43.671] base::structure(base::list(value = NULL, visible = NULL, [13:13:43.671] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:43.671] ...future.rng), started = ...future.startTime, [13:13:43.671] finished = Sys.time(), session_uuid = NA_character_, [13:13:43.671] version = "1.8"), class = "FutureResult") [13:13:43.671] }, finally = { [13:13:43.671] if (!identical(...future.workdir, getwd())) [13:13:43.671] setwd(...future.workdir) [13:13:43.671] { [13:13:43.671] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:43.671] ...future.oldOptions$nwarnings <- NULL [13:13:43.671] } [13:13:43.671] base::options(...future.oldOptions) [13:13:43.671] if (.Platform$OS.type == "windows") { [13:13:43.671] old_names <- names(...future.oldEnvVars) [13:13:43.671] envs <- base::Sys.getenv() [13:13:43.671] names <- names(envs) [13:13:43.671] common <- intersect(names, old_names) [13:13:43.671] added <- setdiff(names, old_names) [13:13:43.671] removed <- setdiff(old_names, names) [13:13:43.671] changed <- common[...future.oldEnvVars[common] != [13:13:43.671] envs[common]] [13:13:43.671] NAMES <- toupper(changed) [13:13:43.671] args <- list() [13:13:43.671] for (kk in seq_along(NAMES)) { [13:13:43.671] name <- changed[[kk]] [13:13:43.671] NAME <- NAMES[[kk]] [13:13:43.671] if (name != NAME && is.element(NAME, old_names)) [13:13:43.671] next [13:13:43.671] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:43.671] } [13:13:43.671] NAMES <- toupper(added) [13:13:43.671] for (kk in seq_along(NAMES)) { [13:13:43.671] name <- added[[kk]] [13:13:43.671] NAME <- NAMES[[kk]] [13:13:43.671] if (name != NAME && is.element(NAME, old_names)) [13:13:43.671] next [13:13:43.671] args[[name]] <- "" [13:13:43.671] } [13:13:43.671] NAMES <- toupper(removed) [13:13:43.671] for (kk in seq_along(NAMES)) { [13:13:43.671] name <- removed[[kk]] [13:13:43.671] NAME <- NAMES[[kk]] [13:13:43.671] if (name != NAME && is.element(NAME, old_names)) [13:13:43.671] next [13:13:43.671] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:43.671] } [13:13:43.671] if (length(args) > 0) [13:13:43.671] base::do.call(base::Sys.setenv, args = args) [13:13:43.671] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:43.671] } [13:13:43.671] else { [13:13:43.671] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:43.671] } [13:13:43.671] { [13:13:43.671] if (base::length(...future.futureOptionsAdded) > [13:13:43.671] 0L) { [13:13:43.671] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:43.671] base::names(opts) <- ...future.futureOptionsAdded [13:13:43.671] base::options(opts) [13:13:43.671] } [13:13:43.671] { [13:13:43.671] { [13:13:43.671] NULL [13:13:43.671] RNGkind("Mersenne-Twister") [13:13:43.671] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:43.671] inherits = FALSE) [13:13:43.671] } [13:13:43.671] options(future.plan = NULL) [13:13:43.671] if (is.na(NA_character_)) [13:13:43.671] Sys.unsetenv("R_FUTURE_PLAN") [13:13:43.671] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:43.671] future::plan(list(function (..., envir = parent.frame()) [13:13:43.671] { [13:13:43.671] future <- SequentialFuture(..., envir = envir) [13:13:43.671] if (!future$lazy) [13:13:43.671] future <- run(future) [13:13:43.671] invisible(future) [13:13:43.671] }), .cleanup = FALSE, .init = FALSE) [13:13:43.671] } [13:13:43.671] } [13:13:43.671] } [13:13:43.671] }) [13:13:43.671] if (TRUE) { [13:13:43.671] base::sink(type = "output", split = FALSE) [13:13:43.671] if (TRUE) { [13:13:43.671] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:43.671] } [13:13:43.671] else { [13:13:43.671] ...future.result["stdout"] <- base::list(NULL) [13:13:43.671] } [13:13:43.671] base::close(...future.stdout) [13:13:43.671] ...future.stdout <- NULL [13:13:43.671] } [13:13:43.671] ...future.result$conditions <- ...future.conditions [13:13:43.671] ...future.result$finished <- base::Sys.time() [13:13:43.671] ...future.result [13:13:43.671] } [13:13:43.674] assign_globals() ... [13:13:43.674] List of 5 [13:13:43.674] $ ...future.FUN :function (x, ...) [13:13:43.674] $ future.call.arguments : list() [13:13:43.674] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:43.674] $ ...future.elements_ii :List of 2 [13:13:43.674] ..$ b:Classes 'listenv', 'environment' [13:13:43.674] ..$ a:Classes 'listenv', 'environment' [13:13:43.674] $ ...future.seeds_ii : NULL [13:13:43.674] $ ...future.globals.maxSize: NULL [13:13:43.674] - attr(*, "where")=List of 5 [13:13:43.674] ..$ ...future.FUN : [13:13:43.674] ..$ future.call.arguments : [13:13:43.674] ..$ ...future.elements_ii : [13:13:43.674] ..$ ...future.seeds_ii : [13:13:43.674] ..$ ...future.globals.maxSize: [13:13:43.674] - attr(*, "resolved")= logi FALSE [13:13:43.674] - attr(*, "total_size")= num 4968 [13:13:43.674] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:43.674] - attr(*, "already-done")= logi TRUE [13:13:43.678] - copied '...future.FUN' to environment [13:13:43.678] - copied 'future.call.arguments' to environment [13:13:43.679] - copied '...future.elements_ii' to environment [13:13:43.679] - copied '...future.seeds_ii' to environment [13:13:43.679] - copied '...future.globals.maxSize' to environment [13:13:43.679] assign_globals() ... done [13:13:43.679] plan(): Setting new future strategy stack: [13:13:43.679] List of future strategies: [13:13:43.679] 1. sequential: [13:13:43.679] - args: function (..., envir = parent.frame(), workers = "") [13:13:43.679] - tweaked: FALSE [13:13:43.679] - call: NULL [13:13:43.680] plan(): nbrOfWorkers() = 1 [13:13:43.681] plan(): Setting new future strategy stack: [13:13:43.681] List of future strategies: [13:13:43.681] 1. sequential: [13:13:43.681] - args: function (..., envir = parent.frame(), workers = "") [13:13:43.681] - tweaked: FALSE [13:13:43.681] - call: plan(strategy) [13:13:43.681] plan(): nbrOfWorkers() = 1 [13:13:43.681] SequentialFuture started (and completed) [13:13:43.682] - Launch lazy future ... done [13:13:43.682] run() for 'SequentialFuture' ... done [13:13:43.682] Created future: [13:13:43.682] SequentialFuture: [13:13:43.682] Label: 'future_lapply-1' [13:13:43.682] Expression: [13:13:43.682] { [13:13:43.682] do.call(function(...) { [13:13:43.682] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:43.682] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:43.682] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:43.682] on.exit(options(oopts), add = TRUE) [13:13:43.682] } [13:13:43.682] { [13:13:43.682] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:43.682] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:43.682] ...future.FUN(...future.X_jj, ...) [13:13:43.682] }) [13:13:43.682] } [13:13:43.682] }, args = future.call.arguments) [13:13:43.682] } [13:13:43.682] Lazy evaluation: FALSE [13:13:43.682] Asynchronous evaluation: FALSE [13:13:43.682] Local evaluation: TRUE [13:13:43.682] Environment: R_GlobalEnv [13:13:43.682] Capture standard output: TRUE [13:13:43.682] Capture condition classes: 'condition' (excluding 'nothing') [13:13:43.682] 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) [13:13:43.682] Packages: 1 packages ('listenv') [13:13:43.682] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:43.682] Resolved: TRUE [13:13:43.682] Value: 800 bytes of class 'list' [13:13:43.682] Early signaling: FALSE [13:13:43.682] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:43.682] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:43.683] Chunk #1 of 1 ... DONE [13:13:43.683] Launching 1 futures (chunks) ... DONE [13:13:43.683] Resolving 1 futures (chunks) ... [13:13:43.683] resolve() on list ... [13:13:43.683] recursive: 0 [13:13:43.684] length: 1 [13:13:43.684] [13:13:43.684] resolved() for 'SequentialFuture' ... [13:13:43.684] - state: 'finished' [13:13:43.684] - run: TRUE [13:13:43.684] - result: 'FutureResult' [13:13:43.684] resolved() for 'SequentialFuture' ... done [13:13:43.684] Future #1 [13:13:43.685] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:43.685] - nx: 1 [13:13:43.685] - relay: TRUE [13:13:43.685] - stdout: TRUE [13:13:43.685] - signal: TRUE [13:13:43.685] - resignal: FALSE [13:13:43.685] - force: TRUE [13:13:43.685] - relayed: [n=1] FALSE [13:13:43.685] - queued futures: [n=1] FALSE [13:13:43.686] - until=1 [13:13:43.686] - relaying element #1 [13:13:43.686] - relayed: [n=1] TRUE [13:13:43.686] - queued futures: [n=1] TRUE [13:13:43.686] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:43.686] length: 0 (resolved future 1) [13:13:43.686] Relaying remaining futures [13:13:43.686] signalConditionsASAP(NULL, pos=0) ... [13:13:43.687] - nx: 1 [13:13:43.687] - relay: TRUE [13:13:43.687] - stdout: TRUE [13:13:43.687] - signal: TRUE [13:13:43.687] - resignal: FALSE [13:13:43.687] - force: TRUE [13:13:43.687] - relayed: [n=1] TRUE [13:13:43.687] - queued futures: [n=1] TRUE - flush all [13:13:43.687] - relayed: [n=1] TRUE [13:13:43.688] - queued futures: [n=1] TRUE [13:13:43.688] signalConditionsASAP(NULL, pos=0) ... done [13:13:43.688] resolve() on list ... DONE [13:13:43.688] - Number of value chunks collected: 1 [13:13:43.688] Resolving 1 futures (chunks) ... DONE [13:13:43.688] Reducing values from 1 chunks ... [13:13:43.688] - Number of values collected after concatenation: 2 [13:13:43.688] - Number of values expected: 2 [13:13:43.688] Reverse index remapping (attribute 'ordering'): [n = 2] 2, 1 [13:13:43.689] Reducing values from 1 chunks ... DONE [13:13:43.689] 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) ... [13:13:43.690] future_lapply() ... [13:13:43.691] Number of chunks: 1 [13:13:43.691] getGlobalsAndPackagesXApply() ... [13:13:43.691] - future.globals: TRUE [13:13:43.691] getGlobalsAndPackages() ... [13:13:43.691] Searching for globals... [13:13:43.692] - globals found: [4] 'FUN', 'sqrt', '+', 'a' [13:13:43.692] Searching for globals ... DONE [13:13:43.693] Resolving globals: FALSE [13:13:43.693] The total size of the 2 globals is 1.93 KiB (1976 bytes) [13:13:43.693] 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') [13:13:43.693] - globals: [2] 'FUN', 'a' [13:13:43.693] [13:13:43.694] getGlobalsAndPackages() ... DONE [13:13:43.694] - globals found/used: [n=2] 'FUN', 'a' [13:13:43.694] - needed namespaces: [n=0] [13:13:43.694] Finding globals ... DONE [13:13:43.694] - use_args: TRUE [13:13:43.694] - Getting '...' globals ... [13:13:43.694] resolve() on list ... [13:13:43.695] recursive: 0 [13:13:43.695] length: 1 [13:13:43.695] elements: '...' [13:13:43.695] length: 0 (resolved future 1) [13:13:43.695] resolve() on list ... DONE [13:13:43.695] - '...' content: [n=0] [13:13:43.695] List of 1 [13:13:43.695] $ ...: list() [13:13:43.695] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:43.695] - attr(*, "where")=List of 1 [13:13:43.695] ..$ ...: [13:13:43.695] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:43.695] - attr(*, "resolved")= logi TRUE [13:13:43.695] - attr(*, "total_size")= num NA [13:13:43.697] - Getting '...' globals ... DONE [13:13:43.698] Globals to be used in all futures (chunks): [n=3] '...future.FUN', 'a', '...' [13:13:43.698] List of 3 [13:13:43.698] $ ...future.FUN:function (z) [13:13:43.698] $ a : num 3.14 [13:13:43.698] $ ... : list() [13:13:43.698] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:43.698] - attr(*, "where")=List of 3 [13:13:43.698] ..$ ...future.FUN: [13:13:43.698] ..$ a : [13:13:43.698] ..$ ... : [13:13:43.698] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:43.698] - attr(*, "resolved")= logi FALSE [13:13:43.698] - attr(*, "total_size")= num 1976 [13:13:43.700] Packages to be attached in all futures: [n=0] [13:13:43.701] getGlobalsAndPackagesXApply() ... DONE [13:13:43.701] Number of futures (= number of chunks): 1 [13:13:43.701] Launching 1 futures (chunks) ... [13:13:43.701] Chunk #1 of 1 ... [13:13:43.702] - Finding globals in 'X' for chunk #1 ... [13:13:43.702] getGlobalsAndPackages() ... [13:13:43.702] Searching for globals... [13:13:43.708] [13:13:43.708] Searching for globals ... DONE [13:13:43.708] - globals: [0] [13:13:43.708] getGlobalsAndPackages() ... DONE [13:13:43.708] + additional globals found: [n=0] [13:13:43.708] + additional namespaces needed: [n=0] [13:13:43.709] - Finding globals in 'X' for chunk #1 ... DONE [13:13:43.709] - seeds: [13:13:43.709] - All globals exported: [n=6] '...future.FUN', 'a', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:43.709] getGlobalsAndPackages() ... [13:13:43.709] - globals passed as-is: [6] '...future.FUN', 'a', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:43.709] Resolving globals: FALSE [13:13:43.709] Tweak future expression to call with '...' arguments ... [13:13:43.709] { [13:13:43.709] do.call(function(...) { [13:13:43.709] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:43.709] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:43.709] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:43.709] on.exit(options(oopts), add = TRUE) [13:13:43.709] } [13:13:43.709] { [13:13:43.709] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:43.709] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:43.709] ...future.FUN(...future.X_jj, ...) [13:13:43.709] }) [13:13:43.709] } [13:13:43.709] }, args = future.call.arguments) [13:13:43.709] } [13:13:43.710] Tweak future expression to call with '...' arguments ... DONE [13:13:43.710] - globals: [6] '...future.FUN', 'a', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:43.710] [13:13:43.712] getGlobalsAndPackages() ... DONE [13:13:43.712] run() for 'Future' ... [13:13:43.713] - state: 'created' [13:13:43.713] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:13:43.713] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:43.713] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:43.713] - Field: 'label' [13:13:43.713] - Field: 'local' [13:13:43.713] - Field: 'owner' [13:13:43.714] - Field: 'envir' [13:13:43.714] - Field: 'packages' [13:13:43.714] - Field: 'gc' [13:13:43.714] - Field: 'conditions' [13:13:43.714] - Field: 'expr' [13:13:43.714] - Field: 'uuid' [13:13:43.714] - Field: 'seed' [13:13:43.714] - Field: 'version' [13:13:43.715] - Field: 'result' [13:13:43.715] - Field: 'asynchronous' [13:13:43.715] - Field: 'calls' [13:13:43.715] - Field: 'globals' [13:13:43.715] - Field: 'stdout' [13:13:43.715] - Field: 'earlySignal' [13:13:43.715] - Field: 'lazy' [13:13:43.715] - Field: 'state' [13:13:43.716] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:43.716] - Launch lazy future ... [13:13:43.716] Packages needed by the future expression (n = 0): [13:13:43.716] Packages needed by future strategies (n = 0): [13:13:43.716] { [13:13:43.716] { [13:13:43.716] { [13:13:43.716] ...future.startTime <- base::Sys.time() [13:13:43.716] { [13:13:43.716] { [13:13:43.716] { [13:13:43.716] base::local({ [13:13:43.716] has_future <- base::requireNamespace("future", [13:13:43.716] quietly = TRUE) [13:13:43.716] if (has_future) { [13:13:43.716] ns <- base::getNamespace("future") [13:13:43.716] version <- ns[[".package"]][["version"]] [13:13:43.716] if (is.null(version)) [13:13:43.716] version <- utils::packageVersion("future") [13:13:43.716] } [13:13:43.716] else { [13:13:43.716] version <- NULL [13:13:43.716] } [13:13:43.716] if (!has_future || version < "1.8.0") { [13:13:43.716] info <- base::c(r_version = base::gsub("R version ", [13:13:43.716] "", base::R.version$version.string), [13:13:43.716] platform = base::sprintf("%s (%s-bit)", [13:13:43.716] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:43.716] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:43.716] "release", "version")], collapse = " "), [13:13:43.716] hostname = base::Sys.info()[["nodename"]]) [13:13:43.716] info <- base::sprintf("%s: %s", base::names(info), [13:13:43.716] info) [13:13:43.716] info <- base::paste(info, collapse = "; ") [13:13:43.716] if (!has_future) { [13:13:43.716] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:43.716] info) [13:13:43.716] } [13:13:43.716] else { [13:13:43.716] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:43.716] info, version) [13:13:43.716] } [13:13:43.716] base::stop(msg) [13:13:43.716] } [13:13:43.716] }) [13:13:43.716] } [13:13:43.716] options(future.plan = NULL) [13:13:43.716] Sys.unsetenv("R_FUTURE_PLAN") [13:13:43.716] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:43.716] } [13:13:43.716] ...future.workdir <- getwd() [13:13:43.716] } [13:13:43.716] ...future.oldOptions <- base::as.list(base::.Options) [13:13:43.716] ...future.oldEnvVars <- base::Sys.getenv() [13:13:43.716] } [13:13:43.716] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:43.716] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:43.716] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:43.716] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:43.716] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:43.716] future.stdout.windows.reencode = NULL, width = 80L) [13:13:43.716] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:43.716] base::names(...future.oldOptions)) [13:13:43.716] } [13:13:43.716] if (FALSE) { [13:13:43.716] } [13:13:43.716] else { [13:13:43.716] if (TRUE) { [13:13:43.716] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:43.716] open = "w") [13:13:43.716] } [13:13:43.716] else { [13:13:43.716] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:43.716] windows = "NUL", "/dev/null"), open = "w") [13:13:43.716] } [13:13:43.716] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:43.716] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:43.716] base::sink(type = "output", split = FALSE) [13:13:43.716] base::close(...future.stdout) [13:13:43.716] }, add = TRUE) [13:13:43.716] } [13:13:43.716] ...future.frame <- base::sys.nframe() [13:13:43.716] ...future.conditions <- base::list() [13:13:43.716] ...future.rng <- base::globalenv()$.Random.seed [13:13:43.716] if (FALSE) { [13:13:43.716] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:43.716] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:43.716] } [13:13:43.716] ...future.result <- base::tryCatch({ [13:13:43.716] base::withCallingHandlers({ [13:13:43.716] ...future.value <- base::withVisible(base::local({ [13:13:43.716] do.call(function(...) { [13:13:43.716] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:43.716] if (!identical(...future.globals.maxSize.org, [13:13:43.716] ...future.globals.maxSize)) { [13:13:43.716] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:43.716] on.exit(options(oopts), add = TRUE) [13:13:43.716] } [13:13:43.716] { [13:13:43.716] lapply(seq_along(...future.elements_ii), [13:13:43.716] FUN = function(jj) { [13:13:43.716] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:43.716] ...future.FUN(...future.X_jj, ...) [13:13:43.716] }) [13:13:43.716] } [13:13:43.716] }, args = future.call.arguments) [13:13:43.716] })) [13:13:43.716] future::FutureResult(value = ...future.value$value, [13:13:43.716] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:43.716] ...future.rng), globalenv = if (FALSE) [13:13:43.716] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:43.716] ...future.globalenv.names)) [13:13:43.716] else NULL, started = ...future.startTime, version = "1.8") [13:13:43.716] }, condition = base::local({ [13:13:43.716] c <- base::c [13:13:43.716] inherits <- base::inherits [13:13:43.716] invokeRestart <- base::invokeRestart [13:13:43.716] length <- base::length [13:13:43.716] list <- base::list [13:13:43.716] seq.int <- base::seq.int [13:13:43.716] signalCondition <- base::signalCondition [13:13:43.716] sys.calls <- base::sys.calls [13:13:43.716] `[[` <- base::`[[` [13:13:43.716] `+` <- base::`+` [13:13:43.716] `<<-` <- base::`<<-` [13:13:43.716] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:43.716] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:43.716] 3L)] [13:13:43.716] } [13:13:43.716] function(cond) { [13:13:43.716] is_error <- inherits(cond, "error") [13:13:43.716] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:43.716] NULL) [13:13:43.716] if (is_error) { [13:13:43.716] sessionInformation <- function() { [13:13:43.716] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:43.716] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:43.716] search = base::search(), system = base::Sys.info()) [13:13:43.716] } [13:13:43.716] ...future.conditions[[length(...future.conditions) + [13:13:43.716] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:43.716] cond$call), session = sessionInformation(), [13:13:43.716] timestamp = base::Sys.time(), signaled = 0L) [13:13:43.716] signalCondition(cond) [13:13:43.716] } [13:13:43.716] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:43.716] "immediateCondition"))) { [13:13:43.716] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:43.716] ...future.conditions[[length(...future.conditions) + [13:13:43.716] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:43.716] if (TRUE && !signal) { [13:13:43.716] muffleCondition <- function (cond, pattern = "^muffle") [13:13:43.716] { [13:13:43.716] inherits <- base::inherits [13:13:43.716] invokeRestart <- base::invokeRestart [13:13:43.716] is.null <- base::is.null [13:13:43.716] muffled <- FALSE [13:13:43.716] if (inherits(cond, "message")) { [13:13:43.716] muffled <- grepl(pattern, "muffleMessage") [13:13:43.716] if (muffled) [13:13:43.716] invokeRestart("muffleMessage") [13:13:43.716] } [13:13:43.716] else if (inherits(cond, "warning")) { [13:13:43.716] muffled <- grepl(pattern, "muffleWarning") [13:13:43.716] if (muffled) [13:13:43.716] invokeRestart("muffleWarning") [13:13:43.716] } [13:13:43.716] else if (inherits(cond, "condition")) { [13:13:43.716] if (!is.null(pattern)) { [13:13:43.716] computeRestarts <- base::computeRestarts [13:13:43.716] grepl <- base::grepl [13:13:43.716] restarts <- computeRestarts(cond) [13:13:43.716] for (restart in restarts) { [13:13:43.716] name <- restart$name [13:13:43.716] if (is.null(name)) [13:13:43.716] next [13:13:43.716] if (!grepl(pattern, name)) [13:13:43.716] next [13:13:43.716] invokeRestart(restart) [13:13:43.716] muffled <- TRUE [13:13:43.716] break [13:13:43.716] } [13:13:43.716] } [13:13:43.716] } [13:13:43.716] invisible(muffled) [13:13:43.716] } [13:13:43.716] muffleCondition(cond, pattern = "^muffle") [13:13:43.716] } [13:13:43.716] } [13:13:43.716] else { [13:13:43.716] if (TRUE) { [13:13:43.716] muffleCondition <- function (cond, pattern = "^muffle") [13:13:43.716] { [13:13:43.716] inherits <- base::inherits [13:13:43.716] invokeRestart <- base::invokeRestart [13:13:43.716] is.null <- base::is.null [13:13:43.716] muffled <- FALSE [13:13:43.716] if (inherits(cond, "message")) { [13:13:43.716] muffled <- grepl(pattern, "muffleMessage") [13:13:43.716] if (muffled) [13:13:43.716] invokeRestart("muffleMessage") [13:13:43.716] } [13:13:43.716] else if (inherits(cond, "warning")) { [13:13:43.716] muffled <- grepl(pattern, "muffleWarning") [13:13:43.716] if (muffled) [13:13:43.716] invokeRestart("muffleWarning") [13:13:43.716] } [13:13:43.716] else if (inherits(cond, "condition")) { [13:13:43.716] if (!is.null(pattern)) { [13:13:43.716] computeRestarts <- base::computeRestarts [13:13:43.716] grepl <- base::grepl [13:13:43.716] restarts <- computeRestarts(cond) [13:13:43.716] for (restart in restarts) { [13:13:43.716] name <- restart$name [13:13:43.716] if (is.null(name)) [13:13:43.716] next [13:13:43.716] if (!grepl(pattern, name)) [13:13:43.716] next [13:13:43.716] invokeRestart(restart) [13:13:43.716] muffled <- TRUE [13:13:43.716] break [13:13:43.716] } [13:13:43.716] } [13:13:43.716] } [13:13:43.716] invisible(muffled) [13:13:43.716] } [13:13:43.716] muffleCondition(cond, pattern = "^muffle") [13:13:43.716] } [13:13:43.716] } [13:13:43.716] } [13:13:43.716] })) [13:13:43.716] }, error = function(ex) { [13:13:43.716] base::structure(base::list(value = NULL, visible = NULL, [13:13:43.716] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:43.716] ...future.rng), started = ...future.startTime, [13:13:43.716] finished = Sys.time(), session_uuid = NA_character_, [13:13:43.716] version = "1.8"), class = "FutureResult") [13:13:43.716] }, finally = { [13:13:43.716] if (!identical(...future.workdir, getwd())) [13:13:43.716] setwd(...future.workdir) [13:13:43.716] { [13:13:43.716] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:43.716] ...future.oldOptions$nwarnings <- NULL [13:13:43.716] } [13:13:43.716] base::options(...future.oldOptions) [13:13:43.716] if (.Platform$OS.type == "windows") { [13:13:43.716] old_names <- names(...future.oldEnvVars) [13:13:43.716] envs <- base::Sys.getenv() [13:13:43.716] names <- names(envs) [13:13:43.716] common <- intersect(names, old_names) [13:13:43.716] added <- setdiff(names, old_names) [13:13:43.716] removed <- setdiff(old_names, names) [13:13:43.716] changed <- common[...future.oldEnvVars[common] != [13:13:43.716] envs[common]] [13:13:43.716] NAMES <- toupper(changed) [13:13:43.716] args <- list() [13:13:43.716] for (kk in seq_along(NAMES)) { [13:13:43.716] name <- changed[[kk]] [13:13:43.716] NAME <- NAMES[[kk]] [13:13:43.716] if (name != NAME && is.element(NAME, old_names)) [13:13:43.716] next [13:13:43.716] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:43.716] } [13:13:43.716] NAMES <- toupper(added) [13:13:43.716] for (kk in seq_along(NAMES)) { [13:13:43.716] name <- added[[kk]] [13:13:43.716] NAME <- NAMES[[kk]] [13:13:43.716] if (name != NAME && is.element(NAME, old_names)) [13:13:43.716] next [13:13:43.716] args[[name]] <- "" [13:13:43.716] } [13:13:43.716] NAMES <- toupper(removed) [13:13:43.716] for (kk in seq_along(NAMES)) { [13:13:43.716] name <- removed[[kk]] [13:13:43.716] NAME <- NAMES[[kk]] [13:13:43.716] if (name != NAME && is.element(NAME, old_names)) [13:13:43.716] next [13:13:43.716] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:43.716] } [13:13:43.716] if (length(args) > 0) [13:13:43.716] base::do.call(base::Sys.setenv, args = args) [13:13:43.716] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:43.716] } [13:13:43.716] else { [13:13:43.716] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:43.716] } [13:13:43.716] { [13:13:43.716] if (base::length(...future.futureOptionsAdded) > [13:13:43.716] 0L) { [13:13:43.716] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:43.716] base::names(opts) <- ...future.futureOptionsAdded [13:13:43.716] base::options(opts) [13:13:43.716] } [13:13:43.716] { [13:13:43.716] { [13:13:43.716] NULL [13:13:43.716] RNGkind("Mersenne-Twister") [13:13:43.716] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:43.716] inherits = FALSE) [13:13:43.716] } [13:13:43.716] options(future.plan = NULL) [13:13:43.716] if (is.na(NA_character_)) [13:13:43.716] Sys.unsetenv("R_FUTURE_PLAN") [13:13:43.716] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:43.716] future::plan(list(function (..., envir = parent.frame()) [13:13:43.716] { [13:13:43.716] future <- SequentialFuture(..., envir = envir) [13:13:43.716] if (!future$lazy) [13:13:43.716] future <- run(future) [13:13:43.716] invisible(future) [13:13:43.716] }), .cleanup = FALSE, .init = FALSE) [13:13:43.716] } [13:13:43.716] } [13:13:43.716] } [13:13:43.716] }) [13:13:43.716] if (TRUE) { [13:13:43.716] base::sink(type = "output", split = FALSE) [13:13:43.716] if (TRUE) { [13:13:43.716] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:43.716] } [13:13:43.716] else { [13:13:43.716] ...future.result["stdout"] <- base::list(NULL) [13:13:43.716] } [13:13:43.716] base::close(...future.stdout) [13:13:43.716] ...future.stdout <- NULL [13:13:43.716] } [13:13:43.716] ...future.result$conditions <- ...future.conditions [13:13:43.716] ...future.result$finished <- base::Sys.time() [13:13:43.716] ...future.result [13:13:43.716] } [13:13:43.719] assign_globals() ... [13:13:43.719] List of 6 [13:13:43.719] $ ...future.FUN :function (z) [13:13:43.719] $ a : num 3.14 [13:13:43.719] $ future.call.arguments : list() [13:13:43.719] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:43.719] $ ...future.elements_ii :List of 10000 [13:13:43.719] ..$ : int 1 [13:13:43.719] ..$ : int 2 [13:13:43.719] ..$ : int 3 [13:13:43.719] ..$ : int 4 [13:13:43.719] ..$ : int 5 [13:13:43.719] ..$ : int 6 [13:13:43.719] ..$ : int 7 [13:13:43.719] ..$ : int 8 [13:13:43.719] ..$ : int 9 [13:13:43.719] ..$ : int 10 [13:13:43.719] ..$ : int 11 [13:13:43.719] ..$ : int 12 [13:13:43.719] ..$ : int 13 [13:13:43.719] ..$ : int 14 [13:13:43.719] ..$ : int 15 [13:13:43.719] ..$ : int 16 [13:13:43.719] ..$ : int 17 [13:13:43.719] ..$ : int 18 [13:13:43.719] ..$ : int 19 [13:13:43.719] ..$ : int 20 [13:13:43.719] ..$ : int 21 [13:13:43.719] ..$ : int 22 [13:13:43.719] ..$ : int 23 [13:13:43.719] ..$ : int 24 [13:13:43.719] ..$ : int 25 [13:13:43.719] ..$ : int 26 [13:13:43.719] ..$ : int 27 [13:13:43.719] ..$ : int 28 [13:13:43.719] ..$ : int 29 [13:13:43.719] ..$ : int 30 [13:13:43.719] ..$ : int 31 [13:13:43.719] ..$ : int 32 [13:13:43.719] ..$ : int 33 [13:13:43.719] ..$ : int 34 [13:13:43.719] ..$ : int 35 [13:13:43.719] ..$ : int 36 [13:13:43.719] ..$ : int 37 [13:13:43.719] ..$ : int 38 [13:13:43.719] ..$ : int 39 [13:13:43.719] ..$ : int 40 [13:13:43.719] ..$ : int 41 [13:13:43.719] ..$ : int 42 [13:13:43.719] ..$ : int 43 [13:13:43.719] ..$ : int 44 [13:13:43.719] ..$ : int 45 [13:13:43.719] ..$ : int 46 [13:13:43.719] ..$ : int 47 [13:13:43.719] ..$ : int 48 [13:13:43.719] ..$ : int 49 [13:13:43.719] ..$ : int 50 [13:13:43.719] ..$ : int 51 [13:13:43.719] ..$ : int 52 [13:13:43.719] ..$ : int 53 [13:13:43.719] ..$ : int 54 [13:13:43.719] ..$ : int 55 [13:13:43.719] ..$ : int 56 [13:13:43.719] ..$ : int 57 [13:13:43.719] ..$ : int 58 [13:13:43.719] ..$ : int 59 [13:13:43.719] ..$ : int 60 [13:13:43.719] ..$ : int 61 [13:13:43.719] ..$ : int 62 [13:13:43.719] ..$ : int 63 [13:13:43.719] ..$ : int 64 [13:13:43.719] ..$ : int 65 [13:13:43.719] ..$ : int 66 [13:13:43.719] ..$ : int 67 [13:13:43.719] ..$ : int 68 [13:13:43.719] ..$ : int 69 [13:13:43.719] ..$ : int 70 [13:13:43.719] ..$ : int 71 [13:13:43.719] ..$ : int 72 [13:13:43.719] ..$ : int 73 [13:13:43.719] ..$ : int 74 [13:13:43.719] ..$ : int 75 [13:13:43.719] ..$ : int 76 [13:13:43.719] ..$ : int 77 [13:13:43.719] ..$ : int 78 [13:13:43.719] ..$ : int 79 [13:13:43.719] ..$ : int 80 [13:13:43.719] ..$ : int 81 [13:13:43.719] ..$ : int 82 [13:13:43.719] ..$ : int 83 [13:13:43.719] ..$ : int 84 [13:13:43.719] ..$ : int 85 [13:13:43.719] ..$ : int 86 [13:13:43.719] ..$ : int 87 [13:13:43.719] ..$ : int 88 [13:13:43.719] ..$ : int 89 [13:13:43.719] ..$ : int 90 [13:13:43.719] ..$ : int 91 [13:13:43.719] ..$ : int 92 [13:13:43.719] ..$ : int 93 [13:13:43.719] ..$ : int 94 [13:13:43.719] ..$ : int 95 [13:13:43.719] ..$ : int 96 [13:13:43.719] ..$ : int 97 [13:13:43.719] ..$ : int 98 [13:13:43.719] ..$ : int 99 [13:13:43.719] .. [list output truncated] [13:13:43.719] $ ...future.seeds_ii : NULL [13:13:43.719] $ ...future.globals.maxSize: NULL [13:13:43.719] - attr(*, "where")=List of 6 [13:13:43.719] ..$ ...future.FUN : [13:13:43.719] ..$ a : [13:13:43.719] ..$ future.call.arguments : [13:13:43.719] ..$ ...future.elements_ii : [13:13:43.719] ..$ ...future.seeds_ii : [13:13:43.719] ..$ ...future.globals.maxSize: [13:13:43.719] - attr(*, "resolved")= logi FALSE [13:13:43.719] - attr(*, "total_size")= num 1976 [13:13:43.719] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:43.719] - attr(*, "already-done")= logi TRUE [13:13:43.752] - reassign environment for '...future.FUN' [13:13:43.752] - copied '...future.FUN' to environment [13:13:43.752] - copied 'a' to environment [13:13:43.753] - copied 'future.call.arguments' to environment [13:13:43.753] - copied '...future.elements_ii' to environment [13:13:43.753] - copied '...future.seeds_ii' to environment [13:13:43.753] - copied '...future.globals.maxSize' to environment [13:13:43.753] assign_globals() ... done [13:13:43.753] plan(): Setting new future strategy stack: [13:13:43.753] List of future strategies: [13:13:43.753] 1. sequential: [13:13:43.753] - args: function (..., envir = parent.frame(), workers = "") [13:13:43.753] - tweaked: FALSE [13:13:43.753] - call: NULL [13:13:43.754] plan(): nbrOfWorkers() = 1 [13:13:43.769] plan(): Setting new future strategy stack: [13:13:43.770] List of future strategies: [13:13:43.770] 1. sequential: [13:13:43.770] - args: function (..., envir = parent.frame(), workers = "") [13:13:43.770] - tweaked: FALSE [13:13:43.770] - call: plan(strategy) [13:13:43.770] plan(): nbrOfWorkers() = 1 [13:13:43.770] SequentialFuture started (and completed) [13:13:43.770] - Launch lazy future ... done [13:13:43.771] run() for 'SequentialFuture' ... done [13:13:43.771] Created future: [13:13:43.771] SequentialFuture: [13:13:43.771] Label: 'future_lapply-1' [13:13:43.771] Expression: [13:13:43.771] { [13:13:43.771] do.call(function(...) { [13:13:43.771] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:43.771] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:43.771] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:43.771] on.exit(options(oopts), add = TRUE) [13:13:43.771] } [13:13:43.771] { [13:13:43.771] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:43.771] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:43.771] ...future.FUN(...future.X_jj, ...) [13:13:43.771] }) [13:13:43.771] } [13:13:43.771] }, args = future.call.arguments) [13:13:43.771] } [13:13:43.771] Lazy evaluation: FALSE [13:13:43.771] Asynchronous evaluation: FALSE [13:13:43.771] Local evaluation: TRUE [13:13:43.771] Environment: R_GlobalEnv [13:13:43.771] Capture standard output: TRUE [13:13:43.771] Capture condition classes: 'condition' (excluding 'nothing') [13:13:43.771] 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, ...) [13:13:43.771] Packages: [13:13:43.771] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:43.771] Resolved: TRUE [13:13:43.771] Value: 546.88 KiB of class 'list' [13:13:43.771] Early signaling: FALSE [13:13:43.771] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:43.771] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:43.844] Chunk #1 of 1 ... DONE [13:13:43.844] Launching 1 futures (chunks) ... DONE [13:13:43.844] Resolving 1 futures (chunks) ... [13:13:43.844] resolve() on list ... [13:13:43.844] recursive: 0 [13:13:43.844] length: 1 [13:13:43.845] [13:13:43.845] resolved() for 'SequentialFuture' ... [13:13:43.845] - state: 'finished' [13:13:43.845] - run: TRUE [13:13:43.845] - result: 'FutureResult' [13:13:43.845] resolved() for 'SequentialFuture' ... done [13:13:43.845] Future #1 [13:13:43.846] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:43.846] - nx: 1 [13:13:43.846] - relay: TRUE [13:13:43.846] - stdout: TRUE [13:13:43.846] - signal: TRUE [13:13:43.846] - resignal: FALSE [13:13:43.846] - force: TRUE [13:13:43.846] - relayed: [n=1] FALSE [13:13:43.846] - queued futures: [n=1] FALSE [13:13:43.847] - until=1 [13:13:43.847] - relaying element #1 [13:13:43.847] - relayed: [n=1] TRUE [13:13:43.847] - queued futures: [n=1] TRUE [13:13:43.847] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:43.847] length: 0 (resolved future 1) [13:13:43.847] Relaying remaining futures [13:13:43.847] signalConditionsASAP(NULL, pos=0) ... [13:13:43.848] - nx: 1 [13:13:43.848] - relay: TRUE [13:13:43.848] - stdout: TRUE [13:13:43.848] - signal: TRUE [13:13:43.848] - resignal: FALSE [13:13:43.848] - force: TRUE [13:13:43.848] - relayed: [n=1] TRUE [13:13:43.848] - queued futures: [n=1] TRUE - flush all [13:13:43.849] - relayed: [n=1] TRUE [13:13:43.849] - queued futures: [n=1] TRUE [13:13:43.849] signalConditionsASAP(NULL, pos=0) ... done [13:13:43.849] resolve() on list ... DONE [13:13:43.849] - Number of value chunks collected: 1 [13:13:43.849] Resolving 1 futures (chunks) ... DONE [13:13:43.849] Reducing values from 1 chunks ... [13:13:43.850] - Number of values collected after concatenation: 10000 [13:13:43.850] - Number of values expected: 10000 [13:13:43.850] Reducing values from 1 chunks ... DONE [13:13:43.850] future_lapply() ... DONE - future_lapply(x, FUN = table, ...) ... [13:13:43.851] future_lapply() ... [13:13:43.884] Number of chunks: 1 [13:13:43.885] getGlobalsAndPackagesXApply() ... [13:13:43.885] - future.globals: TRUE [13:13:43.885] getGlobalsAndPackages() ... [13:13:43.885] Searching for globals... [13:13:43.918] - 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<-' [13:13:43.918] Searching for globals ... DONE [13:13:43.919] Resolving globals: FALSE [13:13:43.920] The total size of the 1 globals is 345.92 KiB (354224 bytes) [13:13:43.920] 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') [13:13:43.921] - globals: [1] 'FUN' [13:13:43.921] [13:13:43.921] getGlobalsAndPackages() ... DONE [13:13:43.921] - globals found/used: [n=1] 'FUN' [13:13:43.921] - needed namespaces: [n=0] [13:13:43.921] Finding globals ... DONE [13:13:43.921] - use_args: TRUE [13:13:43.921] - Getting '...' globals ... [13:13:43.922] resolve() on list ... [13:13:43.922] recursive: 0 [13:13:43.922] length: 1 [13:13:43.922] elements: '...' [13:13:43.922] length: 0 (resolved future 1) [13:13:43.922] resolve() on list ... DONE [13:13:43.923] - '...' content: [n=0] [13:13:43.923] List of 1 [13:13:43.923] $ ...: list() [13:13:43.923] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:43.923] - attr(*, "where")=List of 1 [13:13:43.923] ..$ ...: [13:13:43.923] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:43.923] - attr(*, "resolved")= logi TRUE [13:13:43.923] - attr(*, "total_size")= num NA [13:13:43.925] - Getting '...' globals ... DONE [13:13:43.927] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:43.927] List of 2 [13:13:43.927] $ ...future.FUN:function (..., exclude = if (useNA == "no") c(NA, NaN), useNA = c("no", [13:13:43.927] "ifany", "always"), dnn = list.names(...), deparse.level = 1) [13:13:43.927] $ ... : list() [13:13:43.927] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:43.927] - attr(*, "where")=List of 2 [13:13:43.927] ..$ ...future.FUN: [13:13:43.927] ..$ ... : [13:13:43.927] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:43.927] - attr(*, "resolved")= logi FALSE [13:13:43.927] - attr(*, "total_size")= num 354224 [13:13:43.930] Packages to be attached in all futures: [n=0] [13:13:43.930] getGlobalsAndPackagesXApply() ... DONE [13:13:43.930] Number of futures (= number of chunks): 1 [13:13:43.930] Launching 1 futures (chunks) ... [13:13:43.930] Chunk #1 of 1 ... [13:13:43.931] - Finding globals in 'X' for chunk #1 ... [13:13:43.931] getGlobalsAndPackages() ... [13:13:43.931] Searching for globals... [13:13:43.931] [13:13:43.931] Searching for globals ... DONE [13:13:43.931] - globals: [0] [13:13:43.931] getGlobalsAndPackages() ... DONE [13:13:43.931] + additional globals found: [n=0] [13:13:43.932] + additional namespaces needed: [n=0] [13:13:43.932] - Finding globals in 'X' for chunk #1 ... DONE [13:13:43.932] - seeds: [13:13:43.932] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:43.932] getGlobalsAndPackages() ... [13:13:43.932] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:43.932] Resolving globals: FALSE [13:13:43.932] Tweak future expression to call with '...' arguments ... [13:13:43.933] { [13:13:43.933] do.call(function(...) { [13:13:43.933] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:43.933] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:43.933] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:43.933] on.exit(options(oopts), add = TRUE) [13:13:43.933] } [13:13:43.933] { [13:13:43.933] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:43.933] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:43.933] ...future.FUN(...future.X_jj, ...) [13:13:43.933] }) [13:13:43.933] } [13:13:43.933] }, args = future.call.arguments) [13:13:43.933] } [13:13:43.933] Tweak future expression to call with '...' arguments ... DONE [13:13:43.933] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:43.933] [13:13:43.933] getGlobalsAndPackages() ... DONE [13:13:43.934] run() for 'Future' ... [13:13:43.934] - state: 'created' [13:13:43.934] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:13:43.934] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:43.935] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:43.935] - Field: 'label' [13:13:43.935] - Field: 'local' [13:13:43.935] - Field: 'owner' [13:13:43.935] - Field: 'envir' [13:13:43.935] - Field: 'packages' [13:13:43.935] - Field: 'gc' [13:13:43.935] - Field: 'conditions' [13:13:43.936] - Field: 'expr' [13:13:43.936] - Field: 'uuid' [13:13:43.936] - Field: 'seed' [13:13:43.936] - Field: 'version' [13:13:43.936] - Field: 'result' [13:13:43.936] - Field: 'asynchronous' [13:13:43.936] - Field: 'calls' [13:13:43.936] - Field: 'globals' [13:13:43.936] - Field: 'stdout' [13:13:43.937] - Field: 'earlySignal' [13:13:43.937] - Field: 'lazy' [13:13:43.937] - Field: 'state' [13:13:43.937] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:43.937] - Launch lazy future ... [13:13:43.937] Packages needed by the future expression (n = 0): [13:13:43.937] Packages needed by future strategies (n = 0): [13:13:43.938] { [13:13:43.938] { [13:13:43.938] { [13:13:43.938] ...future.startTime <- base::Sys.time() [13:13:43.938] { [13:13:43.938] { [13:13:43.938] { [13:13:43.938] base::local({ [13:13:43.938] has_future <- base::requireNamespace("future", [13:13:43.938] quietly = TRUE) [13:13:43.938] if (has_future) { [13:13:43.938] ns <- base::getNamespace("future") [13:13:43.938] version <- ns[[".package"]][["version"]] [13:13:43.938] if (is.null(version)) [13:13:43.938] version <- utils::packageVersion("future") [13:13:43.938] } [13:13:43.938] else { [13:13:43.938] version <- NULL [13:13:43.938] } [13:13:43.938] if (!has_future || version < "1.8.0") { [13:13:43.938] info <- base::c(r_version = base::gsub("R version ", [13:13:43.938] "", base::R.version$version.string), [13:13:43.938] platform = base::sprintf("%s (%s-bit)", [13:13:43.938] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:43.938] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:43.938] "release", "version")], collapse = " "), [13:13:43.938] hostname = base::Sys.info()[["nodename"]]) [13:13:43.938] info <- base::sprintf("%s: %s", base::names(info), [13:13:43.938] info) [13:13:43.938] info <- base::paste(info, collapse = "; ") [13:13:43.938] if (!has_future) { [13:13:43.938] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:43.938] info) [13:13:43.938] } [13:13:43.938] else { [13:13:43.938] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:43.938] info, version) [13:13:43.938] } [13:13:43.938] base::stop(msg) [13:13:43.938] } [13:13:43.938] }) [13:13:43.938] } [13:13:43.938] options(future.plan = NULL) [13:13:43.938] Sys.unsetenv("R_FUTURE_PLAN") [13:13:43.938] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:43.938] } [13:13:43.938] ...future.workdir <- getwd() [13:13:43.938] } [13:13:43.938] ...future.oldOptions <- base::as.list(base::.Options) [13:13:43.938] ...future.oldEnvVars <- base::Sys.getenv() [13:13:43.938] } [13:13:43.938] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:43.938] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:43.938] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:43.938] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:43.938] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:43.938] future.stdout.windows.reencode = NULL, width = 80L) [13:13:43.938] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:43.938] base::names(...future.oldOptions)) [13:13:43.938] } [13:13:43.938] if (FALSE) { [13:13:43.938] } [13:13:43.938] else { [13:13:43.938] if (TRUE) { [13:13:43.938] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:43.938] open = "w") [13:13:43.938] } [13:13:43.938] else { [13:13:43.938] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:43.938] windows = "NUL", "/dev/null"), open = "w") [13:13:43.938] } [13:13:43.938] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:43.938] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:43.938] base::sink(type = "output", split = FALSE) [13:13:43.938] base::close(...future.stdout) [13:13:43.938] }, add = TRUE) [13:13:43.938] } [13:13:43.938] ...future.frame <- base::sys.nframe() [13:13:43.938] ...future.conditions <- base::list() [13:13:43.938] ...future.rng <- base::globalenv()$.Random.seed [13:13:43.938] if (FALSE) { [13:13:43.938] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:43.938] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:43.938] } [13:13:43.938] ...future.result <- base::tryCatch({ [13:13:43.938] base::withCallingHandlers({ [13:13:43.938] ...future.value <- base::withVisible(base::local({ [13:13:43.938] do.call(function(...) { [13:13:43.938] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:43.938] if (!identical(...future.globals.maxSize.org, [13:13:43.938] ...future.globals.maxSize)) { [13:13:43.938] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:43.938] on.exit(options(oopts), add = TRUE) [13:13:43.938] } [13:13:43.938] { [13:13:43.938] lapply(seq_along(...future.elements_ii), [13:13:43.938] FUN = function(jj) { [13:13:43.938] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:43.938] ...future.FUN(...future.X_jj, ...) [13:13:43.938] }) [13:13:43.938] } [13:13:43.938] }, args = future.call.arguments) [13:13:43.938] })) [13:13:43.938] future::FutureResult(value = ...future.value$value, [13:13:43.938] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:43.938] ...future.rng), globalenv = if (FALSE) [13:13:43.938] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:43.938] ...future.globalenv.names)) [13:13:43.938] else NULL, started = ...future.startTime, version = "1.8") [13:13:43.938] }, condition = base::local({ [13:13:43.938] c <- base::c [13:13:43.938] inherits <- base::inherits [13:13:43.938] invokeRestart <- base::invokeRestart [13:13:43.938] length <- base::length [13:13:43.938] list <- base::list [13:13:43.938] seq.int <- base::seq.int [13:13:43.938] signalCondition <- base::signalCondition [13:13:43.938] sys.calls <- base::sys.calls [13:13:43.938] `[[` <- base::`[[` [13:13:43.938] `+` <- base::`+` [13:13:43.938] `<<-` <- base::`<<-` [13:13:43.938] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:43.938] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:43.938] 3L)] [13:13:43.938] } [13:13:43.938] function(cond) { [13:13:43.938] is_error <- inherits(cond, "error") [13:13:43.938] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:43.938] NULL) [13:13:43.938] if (is_error) { [13:13:43.938] sessionInformation <- function() { [13:13:43.938] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:43.938] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:43.938] search = base::search(), system = base::Sys.info()) [13:13:43.938] } [13:13:43.938] ...future.conditions[[length(...future.conditions) + [13:13:43.938] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:43.938] cond$call), session = sessionInformation(), [13:13:43.938] timestamp = base::Sys.time(), signaled = 0L) [13:13:43.938] signalCondition(cond) [13:13:43.938] } [13:13:43.938] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:43.938] "immediateCondition"))) { [13:13:43.938] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:43.938] ...future.conditions[[length(...future.conditions) + [13:13:43.938] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:43.938] if (TRUE && !signal) { [13:13:43.938] muffleCondition <- function (cond, pattern = "^muffle") [13:13:43.938] { [13:13:43.938] inherits <- base::inherits [13:13:43.938] invokeRestart <- base::invokeRestart [13:13:43.938] is.null <- base::is.null [13:13:43.938] muffled <- FALSE [13:13:43.938] if (inherits(cond, "message")) { [13:13:43.938] muffled <- grepl(pattern, "muffleMessage") [13:13:43.938] if (muffled) [13:13:43.938] invokeRestart("muffleMessage") [13:13:43.938] } [13:13:43.938] else if (inherits(cond, "warning")) { [13:13:43.938] muffled <- grepl(pattern, "muffleWarning") [13:13:43.938] if (muffled) [13:13:43.938] invokeRestart("muffleWarning") [13:13:43.938] } [13:13:43.938] else if (inherits(cond, "condition")) { [13:13:43.938] if (!is.null(pattern)) { [13:13:43.938] computeRestarts <- base::computeRestarts [13:13:43.938] grepl <- base::grepl [13:13:43.938] restarts <- computeRestarts(cond) [13:13:43.938] for (restart in restarts) { [13:13:43.938] name <- restart$name [13:13:43.938] if (is.null(name)) [13:13:43.938] next [13:13:43.938] if (!grepl(pattern, name)) [13:13:43.938] next [13:13:43.938] invokeRestart(restart) [13:13:43.938] muffled <- TRUE [13:13:43.938] break [13:13:43.938] } [13:13:43.938] } [13:13:43.938] } [13:13:43.938] invisible(muffled) [13:13:43.938] } [13:13:43.938] muffleCondition(cond, pattern = "^muffle") [13:13:43.938] } [13:13:43.938] } [13:13:43.938] else { [13:13:43.938] if (TRUE) { [13:13:43.938] muffleCondition <- function (cond, pattern = "^muffle") [13:13:43.938] { [13:13:43.938] inherits <- base::inherits [13:13:43.938] invokeRestart <- base::invokeRestart [13:13:43.938] is.null <- base::is.null [13:13:43.938] muffled <- FALSE [13:13:43.938] if (inherits(cond, "message")) { [13:13:43.938] muffled <- grepl(pattern, "muffleMessage") [13:13:43.938] if (muffled) [13:13:43.938] invokeRestart("muffleMessage") [13:13:43.938] } [13:13:43.938] else if (inherits(cond, "warning")) { [13:13:43.938] muffled <- grepl(pattern, "muffleWarning") [13:13:43.938] if (muffled) [13:13:43.938] invokeRestart("muffleWarning") [13:13:43.938] } [13:13:43.938] else if (inherits(cond, "condition")) { [13:13:43.938] if (!is.null(pattern)) { [13:13:43.938] computeRestarts <- base::computeRestarts [13:13:43.938] grepl <- base::grepl [13:13:43.938] restarts <- computeRestarts(cond) [13:13:43.938] for (restart in restarts) { [13:13:43.938] name <- restart$name [13:13:43.938] if (is.null(name)) [13:13:43.938] next [13:13:43.938] if (!grepl(pattern, name)) [13:13:43.938] next [13:13:43.938] invokeRestart(restart) [13:13:43.938] muffled <- TRUE [13:13:43.938] break [13:13:43.938] } [13:13:43.938] } [13:13:43.938] } [13:13:43.938] invisible(muffled) [13:13:43.938] } [13:13:43.938] muffleCondition(cond, pattern = "^muffle") [13:13:43.938] } [13:13:43.938] } [13:13:43.938] } [13:13:43.938] })) [13:13:43.938] }, error = function(ex) { [13:13:43.938] base::structure(base::list(value = NULL, visible = NULL, [13:13:43.938] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:43.938] ...future.rng), started = ...future.startTime, [13:13:43.938] finished = Sys.time(), session_uuid = NA_character_, [13:13:43.938] version = "1.8"), class = "FutureResult") [13:13:43.938] }, finally = { [13:13:43.938] if (!identical(...future.workdir, getwd())) [13:13:43.938] setwd(...future.workdir) [13:13:43.938] { [13:13:43.938] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:43.938] ...future.oldOptions$nwarnings <- NULL [13:13:43.938] } [13:13:43.938] base::options(...future.oldOptions) [13:13:43.938] if (.Platform$OS.type == "windows") { [13:13:43.938] old_names <- names(...future.oldEnvVars) [13:13:43.938] envs <- base::Sys.getenv() [13:13:43.938] names <- names(envs) [13:13:43.938] common <- intersect(names, old_names) [13:13:43.938] added <- setdiff(names, old_names) [13:13:43.938] removed <- setdiff(old_names, names) [13:13:43.938] changed <- common[...future.oldEnvVars[common] != [13:13:43.938] envs[common]] [13:13:43.938] NAMES <- toupper(changed) [13:13:43.938] args <- list() [13:13:43.938] for (kk in seq_along(NAMES)) { [13:13:43.938] name <- changed[[kk]] [13:13:43.938] NAME <- NAMES[[kk]] [13:13:43.938] if (name != NAME && is.element(NAME, old_names)) [13:13:43.938] next [13:13:43.938] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:43.938] } [13:13:43.938] NAMES <- toupper(added) [13:13:43.938] for (kk in seq_along(NAMES)) { [13:13:43.938] name <- added[[kk]] [13:13:43.938] NAME <- NAMES[[kk]] [13:13:43.938] if (name != NAME && is.element(NAME, old_names)) [13:13:43.938] next [13:13:43.938] args[[name]] <- "" [13:13:43.938] } [13:13:43.938] NAMES <- toupper(removed) [13:13:43.938] for (kk in seq_along(NAMES)) { [13:13:43.938] name <- removed[[kk]] [13:13:43.938] NAME <- NAMES[[kk]] [13:13:43.938] if (name != NAME && is.element(NAME, old_names)) [13:13:43.938] next [13:13:43.938] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:43.938] } [13:13:43.938] if (length(args) > 0) [13:13:43.938] base::do.call(base::Sys.setenv, args = args) [13:13:43.938] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:43.938] } [13:13:43.938] else { [13:13:43.938] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:43.938] } [13:13:43.938] { [13:13:43.938] if (base::length(...future.futureOptionsAdded) > [13:13:43.938] 0L) { [13:13:43.938] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:43.938] base::names(opts) <- ...future.futureOptionsAdded [13:13:43.938] base::options(opts) [13:13:43.938] } [13:13:43.938] { [13:13:43.938] { [13:13:43.938] NULL [13:13:43.938] RNGkind("Mersenne-Twister") [13:13:43.938] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:43.938] inherits = FALSE) [13:13:43.938] } [13:13:43.938] options(future.plan = NULL) [13:13:43.938] if (is.na(NA_character_)) [13:13:43.938] Sys.unsetenv("R_FUTURE_PLAN") [13:13:43.938] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:43.938] future::plan(list(function (..., envir = parent.frame()) [13:13:43.938] { [13:13:43.938] future <- SequentialFuture(..., envir = envir) [13:13:43.938] if (!future$lazy) [13:13:43.938] future <- run(future) [13:13:43.938] invisible(future) [13:13:43.938] }), .cleanup = FALSE, .init = FALSE) [13:13:43.938] } [13:13:43.938] } [13:13:43.938] } [13:13:43.938] }) [13:13:43.938] if (TRUE) { [13:13:43.938] base::sink(type = "output", split = FALSE) [13:13:43.938] if (TRUE) { [13:13:43.938] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:43.938] } [13:13:43.938] else { [13:13:43.938] ...future.result["stdout"] <- base::list(NULL) [13:13:43.938] } [13:13:43.938] base::close(...future.stdout) [13:13:43.938] ...future.stdout <- NULL [13:13:43.938] } [13:13:43.938] ...future.result$conditions <- ...future.conditions [13:13:43.938] ...future.result$finished <- base::Sys.time() [13:13:43.938] ...future.result [13:13:43.938] } [13:13:43.941] assign_globals() ... [13:13:43.941] List of 5 [13:13:43.941] $ ...future.FUN :function (..., exclude = if (useNA == "no") c(NA, NaN), useNA = c("no", [13:13:43.941] "ifany", "always"), dnn = list.names(...), deparse.level = 1) [13:13:43.941] $ future.call.arguments : list() [13:13:43.941] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:43.941] $ ...future.elements_ii :List of 2 [13:13:43.941] ..$ a: int [1:4] 1 2 3 4 [13:13:43.941] ..$ b: int [1:4] 5 6 7 8 [13:13:43.941] $ ...future.seeds_ii : NULL [13:13:43.941] $ ...future.globals.maxSize: NULL [13:13:43.941] - attr(*, "where")=List of 5 [13:13:43.941] ..$ ...future.FUN : [13:13:43.941] ..$ future.call.arguments : [13:13:43.941] ..$ ...future.elements_ii : [13:13:43.941] ..$ ...future.seeds_ii : [13:13:43.941] ..$ ...future.globals.maxSize: [13:13:43.941] - attr(*, "resolved")= logi FALSE [13:13:43.941] - attr(*, "total_size")= num 354224 [13:13:43.941] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:43.941] - attr(*, "already-done")= logi TRUE [13:13:43.945] - copied '...future.FUN' to environment [13:13:43.945] - copied 'future.call.arguments' to environment [13:13:43.945] - copied '...future.elements_ii' to environment [13:13:43.945] - copied '...future.seeds_ii' to environment [13:13:43.946] - copied '...future.globals.maxSize' to environment [13:13:43.946] assign_globals() ... done [13:13:43.946] plan(): Setting new future strategy stack: [13:13:43.946] List of future strategies: [13:13:43.946] 1. sequential: [13:13:43.946] - args: function (..., envir = parent.frame(), workers = "") [13:13:43.946] - tweaked: FALSE [13:13:43.946] - call: NULL [13:13:43.947] plan(): nbrOfWorkers() = 1 [13:13:43.948] plan(): Setting new future strategy stack: [13:13:43.948] List of future strategies: [13:13:43.948] 1. sequential: [13:13:43.948] - args: function (..., envir = parent.frame(), workers = "") [13:13:43.948] - tweaked: FALSE [13:13:43.948] - call: plan(strategy) [13:13:43.948] plan(): nbrOfWorkers() = 1 [13:13:43.948] SequentialFuture started (and completed) [13:13:43.948] - Launch lazy future ... done [13:13:43.949] run() for 'SequentialFuture' ... done [13:13:43.949] Created future: [13:13:43.949] SequentialFuture: [13:13:43.949] Label: 'future_lapply-1' [13:13:43.949] Expression: [13:13:43.949] { [13:13:43.949] do.call(function(...) { [13:13:43.949] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:43.949] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:43.949] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:43.949] on.exit(options(oopts), add = TRUE) [13:13:43.949] } [13:13:43.949] { [13:13:43.949] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:43.949] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:43.949] ...future.FUN(...future.X_jj, ...) [13:13:43.949] }) [13:13:43.949] } [13:13:43.949] }, args = future.call.arguments) [13:13:43.949] } [13:13:43.949] Lazy evaluation: FALSE [13:13:43.949] Asynchronous evaluation: FALSE [13:13:43.949] Local evaluation: TRUE [13:13:43.949] Environment: R_GlobalEnv [13:13:43.949] Capture standard output: TRUE [13:13:43.949] Capture condition classes: 'condition' (excluding 'nothing') [13:13:43.949] 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) [13:13:43.949] Packages: [13:13:43.949] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:43.949] Resolved: TRUE [13:13:43.949] Value: 2.27 KiB of class 'list' [13:13:43.949] Early signaling: FALSE [13:13:43.949] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:43.949] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:43.950] Chunk #1 of 1 ... DONE [13:13:43.950] Launching 1 futures (chunks) ... DONE [13:13:43.950] Resolving 1 futures (chunks) ... [13:13:43.950] resolve() on list ... [13:13:43.950] recursive: 0 [13:13:43.951] length: 1 [13:13:43.951] [13:13:43.951] resolved() for 'SequentialFuture' ... [13:13:43.951] - state: 'finished' [13:13:43.951] - run: TRUE [13:13:43.951] - result: 'FutureResult' [13:13:43.951] resolved() for 'SequentialFuture' ... done [13:13:43.951] Future #1 [13:13:43.952] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:43.952] - nx: 1 [13:13:43.952] - relay: TRUE [13:13:43.952] - stdout: TRUE [13:13:43.952] - signal: TRUE [13:13:43.952] - resignal: FALSE [13:13:43.952] - force: TRUE [13:13:43.952] - relayed: [n=1] FALSE [13:13:43.952] - queued futures: [n=1] FALSE [13:13:43.953] - until=1 [13:13:43.953] - relaying element #1 [13:13:43.953] - relayed: [n=1] TRUE [13:13:43.953] - queued futures: [n=1] TRUE [13:13:43.953] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:43.953] length: 0 (resolved future 1) [13:13:43.953] Relaying remaining futures [13:13:43.953] signalConditionsASAP(NULL, pos=0) ... [13:13:43.954] - nx: 1 [13:13:43.954] - relay: TRUE [13:13:43.954] - stdout: TRUE [13:13:43.954] - signal: TRUE [13:13:43.954] - resignal: FALSE [13:13:43.954] - force: TRUE [13:13:43.954] - relayed: [n=1] TRUE [13:13:43.954] - queued futures: [n=1] TRUE - flush all [13:13:43.954] - relayed: [n=1] TRUE [13:13:43.955] - queued futures: [n=1] TRUE [13:13:43.955] signalConditionsASAP(NULL, pos=0) ... done [13:13:43.955] resolve() on list ... DONE [13:13:43.955] - Number of value chunks collected: 1 [13:13:43.955] Resolving 1 futures (chunks) ... DONE [13:13:43.955] Reducing values from 1 chunks ... [13:13:43.955] - Number of values collected after concatenation: 2 [13:13:43.955] - Number of values expected: 2 [13:13:43.956] Reducing values from 1 chunks ... DONE [13:13:43.956] future_lapply() ... DONE - future_lapply(x, ...) where length(x) != length(as.list(x)) ... [13:13:43.956] future_lapply() ... [13:13:43.956] Number of chunks: 1 [13:13:43.956] getGlobalsAndPackagesXApply() ... [13:13:43.956] - future.globals: TRUE [13:13:43.957] getGlobalsAndPackages() ... [13:13:43.957] Searching for globals... [13:13:43.957] - globals found: [1] 'FUN' [13:13:43.957] Searching for globals ... DONE [13:13:43.957] Resolving globals: FALSE [13:13:43.958] The total size of the 1 globals is 56 bytes (56 bytes) [13:13:43.958] 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') [13:13:43.958] - globals: [1] 'FUN' [13:13:43.958] [13:13:43.958] getGlobalsAndPackages() ... DONE [13:13:43.958] - globals found/used: [n=1] 'FUN' [13:13:43.959] - needed namespaces: [n=0] [13:13:43.959] Finding globals ... DONE [13:13:43.959] - use_args: TRUE [13:13:43.959] - Getting '...' globals ... [13:13:43.959] resolve() on list ... [13:13:43.959] recursive: 0 [13:13:43.959] length: 1 [13:13:43.960] elements: '...' [13:13:43.960] length: 0 (resolved future 1) [13:13:43.960] resolve() on list ... DONE [13:13:43.960] - '...' content: [n=0] [13:13:43.960] List of 1 [13:13:43.960] $ ...: list() [13:13:43.960] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:43.960] - attr(*, "where")=List of 1 [13:13:43.960] ..$ ...: [13:13:43.960] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:43.960] - attr(*, "resolved")= logi TRUE [13:13:43.960] - attr(*, "total_size")= num NA [13:13:43.962] - Getting '...' globals ... DONE [13:13:43.962] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:43.963] List of 2 [13:13:43.963] $ ...future.FUN:function (x) [13:13:43.963] $ ... : list() [13:13:43.963] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:43.963] - attr(*, "where")=List of 2 [13:13:43.963] ..$ ...future.FUN: [13:13:43.963] ..$ ... : [13:13:43.963] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:43.963] - attr(*, "resolved")= logi FALSE [13:13:43.963] - attr(*, "total_size")= num 56 [13:13:43.965] Packages to be attached in all futures: [n=0] [13:13:43.965] getGlobalsAndPackagesXApply() ... DONE [13:13:43.965] Number of futures (= number of chunks): 1 [13:13:43.965] Launching 1 futures (chunks) ... [13:13:43.965] Chunk #1 of 1 ... [13:13:43.966] - Finding globals in 'X' for chunk #1 ... [13:13:43.966] getGlobalsAndPackages() ... [13:13:43.966] Searching for globals... [13:13:43.966] [13:13:43.966] Searching for globals ... DONE [13:13:43.966] - globals: [0] [13:13:43.966] getGlobalsAndPackages() ... DONE [13:13:43.967] + additional globals found: [n=0] [13:13:43.967] + additional namespaces needed: [n=0] [13:13:43.967] - Finding globals in 'X' for chunk #1 ... DONE [13:13:43.967] - seeds: [13:13:43.967] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:43.967] getGlobalsAndPackages() ... [13:13:43.967] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:43.967] Resolving globals: FALSE [13:13:43.967] Tweak future expression to call with '...' arguments ... [13:13:43.968] { [13:13:43.968] do.call(function(...) { [13:13:43.968] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:43.968] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:43.968] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:43.968] on.exit(options(oopts), add = TRUE) [13:13:43.968] } [13:13:43.968] { [13:13:43.968] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:43.968] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:43.968] ...future.FUN(...future.X_jj, ...) [13:13:43.968] }) [13:13:43.968] } [13:13:43.968] }, args = future.call.arguments) [13:13:43.968] } [13:13:43.968] Tweak future expression to call with '...' arguments ... DONE [13:13:43.968] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:43.968] [13:13:43.968] getGlobalsAndPackages() ... DONE [13:13:43.969] run() for 'Future' ... [13:13:43.969] - state: 'created' [13:13:43.969] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:13:43.969] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:43.969] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:43.970] - Field: 'label' [13:13:43.970] - Field: 'local' [13:13:43.970] - Field: 'owner' [13:13:43.970] - Field: 'envir' [13:13:43.970] - Field: 'packages' [13:13:43.970] - Field: 'gc' [13:13:43.970] - Field: 'conditions' [13:13:43.970] - Field: 'expr' [13:13:43.971] - Field: 'uuid' [13:13:43.971] - Field: 'seed' [13:13:43.971] - Field: 'version' [13:13:43.971] - Field: 'result' [13:13:43.971] - Field: 'asynchronous' [13:13:43.971] - Field: 'calls' [13:13:43.971] - Field: 'globals' [13:13:43.971] - Field: 'stdout' [13:13:43.972] - Field: 'earlySignal' [13:13:43.972] - Field: 'lazy' [13:13:43.972] - Field: 'state' [13:13:43.972] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:43.972] - Launch lazy future ... [13:13:43.972] Packages needed by the future expression (n = 0): [13:13:43.972] Packages needed by future strategies (n = 0): [13:13:43.973] { [13:13:43.973] { [13:13:43.973] { [13:13:43.973] ...future.startTime <- base::Sys.time() [13:13:43.973] { [13:13:43.973] { [13:13:43.973] { [13:13:43.973] base::local({ [13:13:43.973] has_future <- base::requireNamespace("future", [13:13:43.973] quietly = TRUE) [13:13:43.973] if (has_future) { [13:13:43.973] ns <- base::getNamespace("future") [13:13:43.973] version <- ns[[".package"]][["version"]] [13:13:43.973] if (is.null(version)) [13:13:43.973] version <- utils::packageVersion("future") [13:13:43.973] } [13:13:43.973] else { [13:13:43.973] version <- NULL [13:13:43.973] } [13:13:43.973] if (!has_future || version < "1.8.0") { [13:13:43.973] info <- base::c(r_version = base::gsub("R version ", [13:13:43.973] "", base::R.version$version.string), [13:13:43.973] platform = base::sprintf("%s (%s-bit)", [13:13:43.973] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:43.973] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:43.973] "release", "version")], collapse = " "), [13:13:43.973] hostname = base::Sys.info()[["nodename"]]) [13:13:43.973] info <- base::sprintf("%s: %s", base::names(info), [13:13:43.973] info) [13:13:43.973] info <- base::paste(info, collapse = "; ") [13:13:43.973] if (!has_future) { [13:13:43.973] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:43.973] info) [13:13:43.973] } [13:13:43.973] else { [13:13:43.973] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:43.973] info, version) [13:13:43.973] } [13:13:43.973] base::stop(msg) [13:13:43.973] } [13:13:43.973] }) [13:13:43.973] } [13:13:43.973] options(future.plan = NULL) [13:13:43.973] Sys.unsetenv("R_FUTURE_PLAN") [13:13:43.973] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:43.973] } [13:13:43.973] ...future.workdir <- getwd() [13:13:43.973] } [13:13:43.973] ...future.oldOptions <- base::as.list(base::.Options) [13:13:43.973] ...future.oldEnvVars <- base::Sys.getenv() [13:13:43.973] } [13:13:43.973] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:43.973] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:43.973] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:43.973] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:43.973] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:43.973] future.stdout.windows.reencode = NULL, width = 80L) [13:13:43.973] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:43.973] base::names(...future.oldOptions)) [13:13:43.973] } [13:13:43.973] if (FALSE) { [13:13:43.973] } [13:13:43.973] else { [13:13:43.973] if (TRUE) { [13:13:43.973] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:43.973] open = "w") [13:13:43.973] } [13:13:43.973] else { [13:13:43.973] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:43.973] windows = "NUL", "/dev/null"), open = "w") [13:13:43.973] } [13:13:43.973] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:43.973] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:43.973] base::sink(type = "output", split = FALSE) [13:13:43.973] base::close(...future.stdout) [13:13:43.973] }, add = TRUE) [13:13:43.973] } [13:13:43.973] ...future.frame <- base::sys.nframe() [13:13:43.973] ...future.conditions <- base::list() [13:13:43.973] ...future.rng <- base::globalenv()$.Random.seed [13:13:43.973] if (FALSE) { [13:13:43.973] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:43.973] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:43.973] } [13:13:43.973] ...future.result <- base::tryCatch({ [13:13:43.973] base::withCallingHandlers({ [13:13:43.973] ...future.value <- base::withVisible(base::local({ [13:13:43.973] do.call(function(...) { [13:13:43.973] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:43.973] if (!identical(...future.globals.maxSize.org, [13:13:43.973] ...future.globals.maxSize)) { [13:13:43.973] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:43.973] on.exit(options(oopts), add = TRUE) [13:13:43.973] } [13:13:43.973] { [13:13:43.973] lapply(seq_along(...future.elements_ii), [13:13:43.973] FUN = function(jj) { [13:13:43.973] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:43.973] ...future.FUN(...future.X_jj, ...) [13:13:43.973] }) [13:13:43.973] } [13:13:43.973] }, args = future.call.arguments) [13:13:43.973] })) [13:13:43.973] future::FutureResult(value = ...future.value$value, [13:13:43.973] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:43.973] ...future.rng), globalenv = if (FALSE) [13:13:43.973] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:43.973] ...future.globalenv.names)) [13:13:43.973] else NULL, started = ...future.startTime, version = "1.8") [13:13:43.973] }, condition = base::local({ [13:13:43.973] c <- base::c [13:13:43.973] inherits <- base::inherits [13:13:43.973] invokeRestart <- base::invokeRestart [13:13:43.973] length <- base::length [13:13:43.973] list <- base::list [13:13:43.973] seq.int <- base::seq.int [13:13:43.973] signalCondition <- base::signalCondition [13:13:43.973] sys.calls <- base::sys.calls [13:13:43.973] `[[` <- base::`[[` [13:13:43.973] `+` <- base::`+` [13:13:43.973] `<<-` <- base::`<<-` [13:13:43.973] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:43.973] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:43.973] 3L)] [13:13:43.973] } [13:13:43.973] function(cond) { [13:13:43.973] is_error <- inherits(cond, "error") [13:13:43.973] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:43.973] NULL) [13:13:43.973] if (is_error) { [13:13:43.973] sessionInformation <- function() { [13:13:43.973] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:43.973] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:43.973] search = base::search(), system = base::Sys.info()) [13:13:43.973] } [13:13:43.973] ...future.conditions[[length(...future.conditions) + [13:13:43.973] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:43.973] cond$call), session = sessionInformation(), [13:13:43.973] timestamp = base::Sys.time(), signaled = 0L) [13:13:43.973] signalCondition(cond) [13:13:43.973] } [13:13:43.973] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:43.973] "immediateCondition"))) { [13:13:43.973] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:43.973] ...future.conditions[[length(...future.conditions) + [13:13:43.973] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:43.973] if (TRUE && !signal) { [13:13:43.973] muffleCondition <- function (cond, pattern = "^muffle") [13:13:43.973] { [13:13:43.973] inherits <- base::inherits [13:13:43.973] invokeRestart <- base::invokeRestart [13:13:43.973] is.null <- base::is.null [13:13:43.973] muffled <- FALSE [13:13:43.973] if (inherits(cond, "message")) { [13:13:43.973] muffled <- grepl(pattern, "muffleMessage") [13:13:43.973] if (muffled) [13:13:43.973] invokeRestart("muffleMessage") [13:13:43.973] } [13:13:43.973] else if (inherits(cond, "warning")) { [13:13:43.973] muffled <- grepl(pattern, "muffleWarning") [13:13:43.973] if (muffled) [13:13:43.973] invokeRestart("muffleWarning") [13:13:43.973] } [13:13:43.973] else if (inherits(cond, "condition")) { [13:13:43.973] if (!is.null(pattern)) { [13:13:43.973] computeRestarts <- base::computeRestarts [13:13:43.973] grepl <- base::grepl [13:13:43.973] restarts <- computeRestarts(cond) [13:13:43.973] for (restart in restarts) { [13:13:43.973] name <- restart$name [13:13:43.973] if (is.null(name)) [13:13:43.973] next [13:13:43.973] if (!grepl(pattern, name)) [13:13:43.973] next [13:13:43.973] invokeRestart(restart) [13:13:43.973] muffled <- TRUE [13:13:43.973] break [13:13:43.973] } [13:13:43.973] } [13:13:43.973] } [13:13:43.973] invisible(muffled) [13:13:43.973] } [13:13:43.973] muffleCondition(cond, pattern = "^muffle") [13:13:43.973] } [13:13:43.973] } [13:13:43.973] else { [13:13:43.973] if (TRUE) { [13:13:43.973] muffleCondition <- function (cond, pattern = "^muffle") [13:13:43.973] { [13:13:43.973] inherits <- base::inherits [13:13:43.973] invokeRestart <- base::invokeRestart [13:13:43.973] is.null <- base::is.null [13:13:43.973] muffled <- FALSE [13:13:43.973] if (inherits(cond, "message")) { [13:13:43.973] muffled <- grepl(pattern, "muffleMessage") [13:13:43.973] if (muffled) [13:13:43.973] invokeRestart("muffleMessage") [13:13:43.973] } [13:13:43.973] else if (inherits(cond, "warning")) { [13:13:43.973] muffled <- grepl(pattern, "muffleWarning") [13:13:43.973] if (muffled) [13:13:43.973] invokeRestart("muffleWarning") [13:13:43.973] } [13:13:43.973] else if (inherits(cond, "condition")) { [13:13:43.973] if (!is.null(pattern)) { [13:13:43.973] computeRestarts <- base::computeRestarts [13:13:43.973] grepl <- base::grepl [13:13:43.973] restarts <- computeRestarts(cond) [13:13:43.973] for (restart in restarts) { [13:13:43.973] name <- restart$name [13:13:43.973] if (is.null(name)) [13:13:43.973] next [13:13:43.973] if (!grepl(pattern, name)) [13:13:43.973] next [13:13:43.973] invokeRestart(restart) [13:13:43.973] muffled <- TRUE [13:13:43.973] break [13:13:43.973] } [13:13:43.973] } [13:13:43.973] } [13:13:43.973] invisible(muffled) [13:13:43.973] } [13:13:43.973] muffleCondition(cond, pattern = "^muffle") [13:13:43.973] } [13:13:43.973] } [13:13:43.973] } [13:13:43.973] })) [13:13:43.973] }, error = function(ex) { [13:13:43.973] base::structure(base::list(value = NULL, visible = NULL, [13:13:43.973] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:43.973] ...future.rng), started = ...future.startTime, [13:13:43.973] finished = Sys.time(), session_uuid = NA_character_, [13:13:43.973] version = "1.8"), class = "FutureResult") [13:13:43.973] }, finally = { [13:13:43.973] if (!identical(...future.workdir, getwd())) [13:13:43.973] setwd(...future.workdir) [13:13:43.973] { [13:13:43.973] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:43.973] ...future.oldOptions$nwarnings <- NULL [13:13:43.973] } [13:13:43.973] base::options(...future.oldOptions) [13:13:43.973] if (.Platform$OS.type == "windows") { [13:13:43.973] old_names <- names(...future.oldEnvVars) [13:13:43.973] envs <- base::Sys.getenv() [13:13:43.973] names <- names(envs) [13:13:43.973] common <- intersect(names, old_names) [13:13:43.973] added <- setdiff(names, old_names) [13:13:43.973] removed <- setdiff(old_names, names) [13:13:43.973] changed <- common[...future.oldEnvVars[common] != [13:13:43.973] envs[common]] [13:13:43.973] NAMES <- toupper(changed) [13:13:43.973] args <- list() [13:13:43.973] for (kk in seq_along(NAMES)) { [13:13:43.973] name <- changed[[kk]] [13:13:43.973] NAME <- NAMES[[kk]] [13:13:43.973] if (name != NAME && is.element(NAME, old_names)) [13:13:43.973] next [13:13:43.973] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:43.973] } [13:13:43.973] NAMES <- toupper(added) [13:13:43.973] for (kk in seq_along(NAMES)) { [13:13:43.973] name <- added[[kk]] [13:13:43.973] NAME <- NAMES[[kk]] [13:13:43.973] if (name != NAME && is.element(NAME, old_names)) [13:13:43.973] next [13:13:43.973] args[[name]] <- "" [13:13:43.973] } [13:13:43.973] NAMES <- toupper(removed) [13:13:43.973] for (kk in seq_along(NAMES)) { [13:13:43.973] name <- removed[[kk]] [13:13:43.973] NAME <- NAMES[[kk]] [13:13:43.973] if (name != NAME && is.element(NAME, old_names)) [13:13:43.973] next [13:13:43.973] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:43.973] } [13:13:43.973] if (length(args) > 0) [13:13:43.973] base::do.call(base::Sys.setenv, args = args) [13:13:43.973] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:43.973] } [13:13:43.973] else { [13:13:43.973] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:43.973] } [13:13:43.973] { [13:13:43.973] if (base::length(...future.futureOptionsAdded) > [13:13:43.973] 0L) { [13:13:43.973] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:43.973] base::names(opts) <- ...future.futureOptionsAdded [13:13:43.973] base::options(opts) [13:13:43.973] } [13:13:43.973] { [13:13:43.973] { [13:13:43.973] NULL [13:13:43.973] RNGkind("Mersenne-Twister") [13:13:43.973] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:43.973] inherits = FALSE) [13:13:43.973] } [13:13:43.973] options(future.plan = NULL) [13:13:43.973] if (is.na(NA_character_)) [13:13:43.973] Sys.unsetenv("R_FUTURE_PLAN") [13:13:43.973] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:43.973] future::plan(list(function (..., envir = parent.frame()) [13:13:43.973] { [13:13:43.973] future <- SequentialFuture(..., envir = envir) [13:13:43.973] if (!future$lazy) [13:13:43.973] future <- run(future) [13:13:43.973] invisible(future) [13:13:43.973] }), .cleanup = FALSE, .init = FALSE) [13:13:43.973] } [13:13:43.973] } [13:13:43.973] } [13:13:43.973] }) [13:13:43.973] if (TRUE) { [13:13:43.973] base::sink(type = "output", split = FALSE) [13:13:43.973] if (TRUE) { [13:13:43.973] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:43.973] } [13:13:43.973] else { [13:13:43.973] ...future.result["stdout"] <- base::list(NULL) [13:13:43.973] } [13:13:43.973] base::close(...future.stdout) [13:13:43.973] ...future.stdout <- NULL [13:13:43.973] } [13:13:43.973] ...future.result$conditions <- ...future.conditions [13:13:43.973] ...future.result$finished <- base::Sys.time() [13:13:43.973] ...future.result [13:13:43.973] } [13:13:43.976] assign_globals() ... [13:13:43.976] List of 5 [13:13:43.976] $ ...future.FUN :function (x) [13:13:43.976] $ future.call.arguments : list() [13:13:43.976] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:43.976] $ ...future.elements_ii :List of 3 [13:13:43.976] ..$ a: num 1 [13:13:43.976] ..$ b: num 2 [13:13:43.976] ..$ c: num 3 [13:13:43.976] $ ...future.seeds_ii : NULL [13:13:43.976] $ ...future.globals.maxSize: NULL [13:13:43.976] - attr(*, "where")=List of 5 [13:13:43.976] ..$ ...future.FUN : [13:13:43.976] ..$ future.call.arguments : [13:13:43.976] ..$ ...future.elements_ii : [13:13:43.976] ..$ ...future.seeds_ii : [13:13:43.976] ..$ ...future.globals.maxSize: [13:13:43.976] - attr(*, "resolved")= logi FALSE [13:13:43.976] - attr(*, "total_size")= num 56 [13:13:43.976] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:43.976] - attr(*, "already-done")= logi TRUE [13:13:43.980] - copied '...future.FUN' to environment [13:13:43.980] - copied 'future.call.arguments' to environment [13:13:43.980] - copied '...future.elements_ii' to environment [13:13:43.981] - copied '...future.seeds_ii' to environment [13:13:43.981] - copied '...future.globals.maxSize' to environment [13:13:43.981] assign_globals() ... done [13:13:43.981] plan(): Setting new future strategy stack: [13:13:43.981] List of future strategies: [13:13:43.981] 1. sequential: [13:13:43.981] - args: function (..., envir = parent.frame(), workers = "") [13:13:43.981] - tweaked: FALSE [13:13:43.981] - call: NULL [13:13:43.982] plan(): nbrOfWorkers() = 1 [13:13:43.983] plan(): Setting new future strategy stack: [13:13:43.983] List of future strategies: [13:13:43.983] 1. sequential: [13:13:43.983] - args: function (..., envir = parent.frame(), workers = "") [13:13:43.983] - tweaked: FALSE [13:13:43.983] - call: plan(strategy) [13:13:43.983] plan(): nbrOfWorkers() = 1 [13:13:43.983] SequentialFuture started (and completed) [13:13:43.983] - Launch lazy future ... done [13:13:43.984] run() for 'SequentialFuture' ... done [13:13:43.984] Created future: [13:13:43.984] SequentialFuture: [13:13:43.984] Label: 'future_lapply-1' [13:13:43.984] Expression: [13:13:43.984] { [13:13:43.984] do.call(function(...) { [13:13:43.984] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:43.984] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:43.984] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:43.984] on.exit(options(oopts), add = TRUE) [13:13:43.984] } [13:13:43.984] { [13:13:43.984] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:43.984] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:43.984] ...future.FUN(...future.X_jj, ...) [13:13:43.984] }) [13:13:43.984] } [13:13:43.984] }, args = future.call.arguments) [13:13:43.984] } [13:13:43.984] Lazy evaluation: FALSE [13:13:43.984] Asynchronous evaluation: FALSE [13:13:43.984] Local evaluation: TRUE [13:13:43.984] Environment: R_GlobalEnv [13:13:43.984] Capture standard output: TRUE [13:13:43.984] Capture condition classes: 'condition' (excluding 'nothing') [13:13:43.984] 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) [13:13:43.984] Packages: [13:13:43.984] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:43.984] Resolved: TRUE [13:13:43.984] Value: 168 bytes of class 'list' [13:13:43.984] Early signaling: FALSE [13:13:43.984] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:43.984] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:43.985] Chunk #1 of 1 ... DONE [13:13:43.985] Launching 1 futures (chunks) ... DONE [13:13:43.985] Resolving 1 futures (chunks) ... [13:13:43.985] resolve() on list ... [13:13:43.985] recursive: 0 [13:13:43.985] length: 1 [13:13:43.985] [13:13:43.986] resolved() for 'SequentialFuture' ... [13:13:43.986] - state: 'finished' [13:13:43.986] - run: TRUE [13:13:43.986] - result: 'FutureResult' [13:13:43.986] resolved() for 'SequentialFuture' ... done [13:13:43.986] Future #1 [13:13:43.986] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:43.987] - nx: 1 [13:13:43.987] - relay: TRUE [13:13:43.987] - stdout: TRUE [13:13:43.987] - signal: TRUE [13:13:43.987] - resignal: FALSE [13:13:43.987] - force: TRUE [13:13:43.987] - relayed: [n=1] FALSE [13:13:43.987] - queued futures: [n=1] FALSE [13:13:43.987] - until=1 [13:13:43.987] - relaying element #1 [13:13:43.988] - relayed: [n=1] TRUE [13:13:43.988] - queued futures: [n=1] TRUE [13:13:43.988] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:43.988] length: 0 (resolved future 1) [13:13:43.988] Relaying remaining futures [13:13:43.988] signalConditionsASAP(NULL, pos=0) ... [13:13:43.988] - nx: 1 [13:13:43.989] - relay: TRUE [13:13:43.989] - stdout: TRUE [13:13:43.989] - signal: TRUE [13:13:43.989] - resignal: FALSE [13:13:43.989] - force: TRUE [13:13:43.989] - relayed: [n=1] TRUE [13:13:43.989] - queued futures: [n=1] TRUE - flush all [13:13:43.989] - relayed: [n=1] TRUE [13:13:43.989] - queued futures: [n=1] TRUE [13:13:43.990] signalConditionsASAP(NULL, pos=0) ... done [13:13:43.990] resolve() on list ... DONE [13:13:43.990] - Number of value chunks collected: 1 [13:13:43.990] Resolving 1 futures (chunks) ... DONE [13:13:43.990] Reducing values from 1 chunks ... [13:13:43.990] - Number of values collected after concatenation: 3 [13:13:43.990] - Number of values expected: 3 [13:13:43.990] Reducing values from 1 chunks ... DONE [13:13:43.991] future_lapply() ... DONE - future_lapply(x, ...) where x[[i]] subsets via S3 method ... [13:13:43.991] future_lapply() ... [13:13:43.991] Number of chunks: 1 [13:13:43.991] getGlobalsAndPackagesXApply() ... [13:13:43.991] - future.globals: TRUE [13:13:43.992] getGlobalsAndPackages() ... [13:13:43.992] Searching for globals... [13:13:43.993] - globals found: [1] 'FUN' [13:13:43.993] Searching for globals ... DONE [13:13:43.993] Resolving globals: FALSE [13:13:43.993] The total size of the 1 globals is 848 bytes (848 bytes) [13:13:43.993] 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') [13:13:43.993] - globals: [1] 'FUN' [13:13:43.994] [13:13:43.994] getGlobalsAndPackages() ... DONE [13:13:43.994] - globals found/used: [n=1] 'FUN' [13:13:43.994] - needed namespaces: [n=0] [13:13:43.994] Finding globals ... DONE [13:13:43.994] - use_args: TRUE [13:13:43.994] - Getting '...' globals ... [13:13:43.995] resolve() on list ... [13:13:43.995] recursive: 0 [13:13:43.995] length: 1 [13:13:43.995] elements: '...' [13:13:43.995] length: 0 (resolved future 1) [13:13:43.995] resolve() on list ... DONE [13:13:43.995] - '...' content: [n=0] [13:13:43.995] List of 1 [13:13:43.995] $ ...: list() [13:13:43.995] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:43.995] - attr(*, "where")=List of 1 [13:13:43.995] ..$ ...: [13:13:43.995] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:43.995] - attr(*, "resolved")= logi TRUE [13:13:43.995] - attr(*, "total_size")= num NA [13:13:43.998] - Getting '...' globals ... DONE [13:13:43.998] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:43.998] List of 2 [13:13:43.998] $ ...future.FUN:function (x) [13:13:43.998] $ ... : list() [13:13:43.998] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:43.998] - attr(*, "where")=List of 2 [13:13:43.998] ..$ ...future.FUN: [13:13:43.998] ..$ ... : [13:13:43.998] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:43.998] - attr(*, "resolved")= logi FALSE [13:13:43.998] - attr(*, "total_size")= num 848 [13:13:44.000] Packages to be attached in all futures: [n=0] [13:13:44.001] getGlobalsAndPackagesXApply() ... DONE [13:13:44.001] Number of futures (= number of chunks): 1 [13:13:44.001] Launching 1 futures (chunks) ... [13:13:44.001] Chunk #1 of 1 ... [13:13:44.001] - Finding globals in 'X' for chunk #1 ... [13:13:44.001] getGlobalsAndPackages() ... [13:13:44.001] Searching for globals... [13:13:44.002] [13:13:44.002] Searching for globals ... DONE [13:13:44.002] - globals: [0] [13:13:44.002] getGlobalsAndPackages() ... DONE [13:13:44.002] + additional globals found: [n=0] [13:13:44.002] + additional namespaces needed: [n=0] [13:13:44.002] - Finding globals in 'X' for chunk #1 ... DONE [13:13:44.002] - seeds: [13:13:44.003] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:44.003] getGlobalsAndPackages() ... [13:13:44.003] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:44.003] Resolving globals: FALSE [13:13:44.003] Tweak future expression to call with '...' arguments ... [13:13:44.003] { [13:13:44.003] do.call(function(...) { [13:13:44.003] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:44.003] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:44.003] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:44.003] on.exit(options(oopts), add = TRUE) [13:13:44.003] } [13:13:44.003] { [13:13:44.003] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:44.003] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:44.003] ...future.FUN(...future.X_jj, ...) [13:13:44.003] }) [13:13:44.003] } [13:13:44.003] }, args = future.call.arguments) [13:13:44.003] } [13:13:44.004] Tweak future expression to call with '...' arguments ... DONE [13:13:44.006] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:44.006] [13:13:44.006] getGlobalsAndPackages() ... DONE [13:13:44.006] run() for 'Future' ... [13:13:44.006] - state: 'created' [13:13:44.007] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:13:44.007] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:44.007] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:44.007] - Field: 'label' [13:13:44.007] - Field: 'local' [13:13:44.007] - Field: 'owner' [13:13:44.008] - Field: 'envir' [13:13:44.008] - Field: 'packages' [13:13:44.008] - Field: 'gc' [13:13:44.008] - Field: 'conditions' [13:13:44.008] - Field: 'expr' [13:13:44.008] - Field: 'uuid' [13:13:44.008] - Field: 'seed' [13:13:44.009] - Field: 'version' [13:13:44.009] - Field: 'result' [13:13:44.009] - Field: 'asynchronous' [13:13:44.009] - Field: 'calls' [13:13:44.009] - Field: 'globals' [13:13:44.009] - Field: 'stdout' [13:13:44.009] - Field: 'earlySignal' [13:13:44.009] - Field: 'lazy' [13:13:44.010] - Field: 'state' [13:13:44.010] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:44.010] - Launch lazy future ... [13:13:44.010] Packages needed by the future expression (n = 0): [13:13:44.010] Packages needed by future strategies (n = 0): [13:13:44.011] { [13:13:44.011] { [13:13:44.011] { [13:13:44.011] ...future.startTime <- base::Sys.time() [13:13:44.011] { [13:13:44.011] { [13:13:44.011] { [13:13:44.011] base::local({ [13:13:44.011] has_future <- base::requireNamespace("future", [13:13:44.011] quietly = TRUE) [13:13:44.011] if (has_future) { [13:13:44.011] ns <- base::getNamespace("future") [13:13:44.011] version <- ns[[".package"]][["version"]] [13:13:44.011] if (is.null(version)) [13:13:44.011] version <- utils::packageVersion("future") [13:13:44.011] } [13:13:44.011] else { [13:13:44.011] version <- NULL [13:13:44.011] } [13:13:44.011] if (!has_future || version < "1.8.0") { [13:13:44.011] info <- base::c(r_version = base::gsub("R version ", [13:13:44.011] "", base::R.version$version.string), [13:13:44.011] platform = base::sprintf("%s (%s-bit)", [13:13:44.011] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:44.011] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:44.011] "release", "version")], collapse = " "), [13:13:44.011] hostname = base::Sys.info()[["nodename"]]) [13:13:44.011] info <- base::sprintf("%s: %s", base::names(info), [13:13:44.011] info) [13:13:44.011] info <- base::paste(info, collapse = "; ") [13:13:44.011] if (!has_future) { [13:13:44.011] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:44.011] info) [13:13:44.011] } [13:13:44.011] else { [13:13:44.011] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:44.011] info, version) [13:13:44.011] } [13:13:44.011] base::stop(msg) [13:13:44.011] } [13:13:44.011] }) [13:13:44.011] } [13:13:44.011] options(future.plan = NULL) [13:13:44.011] Sys.unsetenv("R_FUTURE_PLAN") [13:13:44.011] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:44.011] } [13:13:44.011] ...future.workdir <- getwd() [13:13:44.011] } [13:13:44.011] ...future.oldOptions <- base::as.list(base::.Options) [13:13:44.011] ...future.oldEnvVars <- base::Sys.getenv() [13:13:44.011] } [13:13:44.011] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:44.011] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:44.011] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:44.011] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:44.011] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:44.011] future.stdout.windows.reencode = NULL, width = 80L) [13:13:44.011] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:44.011] base::names(...future.oldOptions)) [13:13:44.011] } [13:13:44.011] if (FALSE) { [13:13:44.011] } [13:13:44.011] else { [13:13:44.011] if (TRUE) { [13:13:44.011] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:44.011] open = "w") [13:13:44.011] } [13:13:44.011] else { [13:13:44.011] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:44.011] windows = "NUL", "/dev/null"), open = "w") [13:13:44.011] } [13:13:44.011] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:44.011] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:44.011] base::sink(type = "output", split = FALSE) [13:13:44.011] base::close(...future.stdout) [13:13:44.011] }, add = TRUE) [13:13:44.011] } [13:13:44.011] ...future.frame <- base::sys.nframe() [13:13:44.011] ...future.conditions <- base::list() [13:13:44.011] ...future.rng <- base::globalenv()$.Random.seed [13:13:44.011] if (FALSE) { [13:13:44.011] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:44.011] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:44.011] } [13:13:44.011] ...future.result <- base::tryCatch({ [13:13:44.011] base::withCallingHandlers({ [13:13:44.011] ...future.value <- base::withVisible(base::local({ [13:13:44.011] do.call(function(...) { [13:13:44.011] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:44.011] if (!identical(...future.globals.maxSize.org, [13:13:44.011] ...future.globals.maxSize)) { [13:13:44.011] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:44.011] on.exit(options(oopts), add = TRUE) [13:13:44.011] } [13:13:44.011] { [13:13:44.011] lapply(seq_along(...future.elements_ii), [13:13:44.011] FUN = function(jj) { [13:13:44.011] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:44.011] ...future.FUN(...future.X_jj, ...) [13:13:44.011] }) [13:13:44.011] } [13:13:44.011] }, args = future.call.arguments) [13:13:44.011] })) [13:13:44.011] future::FutureResult(value = ...future.value$value, [13:13:44.011] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:44.011] ...future.rng), globalenv = if (FALSE) [13:13:44.011] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:44.011] ...future.globalenv.names)) [13:13:44.011] else NULL, started = ...future.startTime, version = "1.8") [13:13:44.011] }, condition = base::local({ [13:13:44.011] c <- base::c [13:13:44.011] inherits <- base::inherits [13:13:44.011] invokeRestart <- base::invokeRestart [13:13:44.011] length <- base::length [13:13:44.011] list <- base::list [13:13:44.011] seq.int <- base::seq.int [13:13:44.011] signalCondition <- base::signalCondition [13:13:44.011] sys.calls <- base::sys.calls [13:13:44.011] `[[` <- base::`[[` [13:13:44.011] `+` <- base::`+` [13:13:44.011] `<<-` <- base::`<<-` [13:13:44.011] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:44.011] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:44.011] 3L)] [13:13:44.011] } [13:13:44.011] function(cond) { [13:13:44.011] is_error <- inherits(cond, "error") [13:13:44.011] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:44.011] NULL) [13:13:44.011] if (is_error) { [13:13:44.011] sessionInformation <- function() { [13:13:44.011] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:44.011] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:44.011] search = base::search(), system = base::Sys.info()) [13:13:44.011] } [13:13:44.011] ...future.conditions[[length(...future.conditions) + [13:13:44.011] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:44.011] cond$call), session = sessionInformation(), [13:13:44.011] timestamp = base::Sys.time(), signaled = 0L) [13:13:44.011] signalCondition(cond) [13:13:44.011] } [13:13:44.011] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:44.011] "immediateCondition"))) { [13:13:44.011] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:44.011] ...future.conditions[[length(...future.conditions) + [13:13:44.011] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:44.011] if (TRUE && !signal) { [13:13:44.011] muffleCondition <- function (cond, pattern = "^muffle") [13:13:44.011] { [13:13:44.011] inherits <- base::inherits [13:13:44.011] invokeRestart <- base::invokeRestart [13:13:44.011] is.null <- base::is.null [13:13:44.011] muffled <- FALSE [13:13:44.011] if (inherits(cond, "message")) { [13:13:44.011] muffled <- grepl(pattern, "muffleMessage") [13:13:44.011] if (muffled) [13:13:44.011] invokeRestart("muffleMessage") [13:13:44.011] } [13:13:44.011] else if (inherits(cond, "warning")) { [13:13:44.011] muffled <- grepl(pattern, "muffleWarning") [13:13:44.011] if (muffled) [13:13:44.011] invokeRestart("muffleWarning") [13:13:44.011] } [13:13:44.011] else if (inherits(cond, "condition")) { [13:13:44.011] if (!is.null(pattern)) { [13:13:44.011] computeRestarts <- base::computeRestarts [13:13:44.011] grepl <- base::grepl [13:13:44.011] restarts <- computeRestarts(cond) [13:13:44.011] for (restart in restarts) { [13:13:44.011] name <- restart$name [13:13:44.011] if (is.null(name)) [13:13:44.011] next [13:13:44.011] if (!grepl(pattern, name)) [13:13:44.011] next [13:13:44.011] invokeRestart(restart) [13:13:44.011] muffled <- TRUE [13:13:44.011] break [13:13:44.011] } [13:13:44.011] } [13:13:44.011] } [13:13:44.011] invisible(muffled) [13:13:44.011] } [13:13:44.011] muffleCondition(cond, pattern = "^muffle") [13:13:44.011] } [13:13:44.011] } [13:13:44.011] else { [13:13:44.011] if (TRUE) { [13:13:44.011] muffleCondition <- function (cond, pattern = "^muffle") [13:13:44.011] { [13:13:44.011] inherits <- base::inherits [13:13:44.011] invokeRestart <- base::invokeRestart [13:13:44.011] is.null <- base::is.null [13:13:44.011] muffled <- FALSE [13:13:44.011] if (inherits(cond, "message")) { [13:13:44.011] muffled <- grepl(pattern, "muffleMessage") [13:13:44.011] if (muffled) [13:13:44.011] invokeRestart("muffleMessage") [13:13:44.011] } [13:13:44.011] else if (inherits(cond, "warning")) { [13:13:44.011] muffled <- grepl(pattern, "muffleWarning") [13:13:44.011] if (muffled) [13:13:44.011] invokeRestart("muffleWarning") [13:13:44.011] } [13:13:44.011] else if (inherits(cond, "condition")) { [13:13:44.011] if (!is.null(pattern)) { [13:13:44.011] computeRestarts <- base::computeRestarts [13:13:44.011] grepl <- base::grepl [13:13:44.011] restarts <- computeRestarts(cond) [13:13:44.011] for (restart in restarts) { [13:13:44.011] name <- restart$name [13:13:44.011] if (is.null(name)) [13:13:44.011] next [13:13:44.011] if (!grepl(pattern, name)) [13:13:44.011] next [13:13:44.011] invokeRestart(restart) [13:13:44.011] muffled <- TRUE [13:13:44.011] break [13:13:44.011] } [13:13:44.011] } [13:13:44.011] } [13:13:44.011] invisible(muffled) [13:13:44.011] } [13:13:44.011] muffleCondition(cond, pattern = "^muffle") [13:13:44.011] } [13:13:44.011] } [13:13:44.011] } [13:13:44.011] })) [13:13:44.011] }, error = function(ex) { [13:13:44.011] base::structure(base::list(value = NULL, visible = NULL, [13:13:44.011] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:44.011] ...future.rng), started = ...future.startTime, [13:13:44.011] finished = Sys.time(), session_uuid = NA_character_, [13:13:44.011] version = "1.8"), class = "FutureResult") [13:13:44.011] }, finally = { [13:13:44.011] if (!identical(...future.workdir, getwd())) [13:13:44.011] setwd(...future.workdir) [13:13:44.011] { [13:13:44.011] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:44.011] ...future.oldOptions$nwarnings <- NULL [13:13:44.011] } [13:13:44.011] base::options(...future.oldOptions) [13:13:44.011] if (.Platform$OS.type == "windows") { [13:13:44.011] old_names <- names(...future.oldEnvVars) [13:13:44.011] envs <- base::Sys.getenv() [13:13:44.011] names <- names(envs) [13:13:44.011] common <- intersect(names, old_names) [13:13:44.011] added <- setdiff(names, old_names) [13:13:44.011] removed <- setdiff(old_names, names) [13:13:44.011] changed <- common[...future.oldEnvVars[common] != [13:13:44.011] envs[common]] [13:13:44.011] NAMES <- toupper(changed) [13:13:44.011] args <- list() [13:13:44.011] for (kk in seq_along(NAMES)) { [13:13:44.011] name <- changed[[kk]] [13:13:44.011] NAME <- NAMES[[kk]] [13:13:44.011] if (name != NAME && is.element(NAME, old_names)) [13:13:44.011] next [13:13:44.011] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:44.011] } [13:13:44.011] NAMES <- toupper(added) [13:13:44.011] for (kk in seq_along(NAMES)) { [13:13:44.011] name <- added[[kk]] [13:13:44.011] NAME <- NAMES[[kk]] [13:13:44.011] if (name != NAME && is.element(NAME, old_names)) [13:13:44.011] next [13:13:44.011] args[[name]] <- "" [13:13:44.011] } [13:13:44.011] NAMES <- toupper(removed) [13:13:44.011] for (kk in seq_along(NAMES)) { [13:13:44.011] name <- removed[[kk]] [13:13:44.011] NAME <- NAMES[[kk]] [13:13:44.011] if (name != NAME && is.element(NAME, old_names)) [13:13:44.011] next [13:13:44.011] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:44.011] } [13:13:44.011] if (length(args) > 0) [13:13:44.011] base::do.call(base::Sys.setenv, args = args) [13:13:44.011] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:44.011] } [13:13:44.011] else { [13:13:44.011] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:44.011] } [13:13:44.011] { [13:13:44.011] if (base::length(...future.futureOptionsAdded) > [13:13:44.011] 0L) { [13:13:44.011] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:44.011] base::names(opts) <- ...future.futureOptionsAdded [13:13:44.011] base::options(opts) [13:13:44.011] } [13:13:44.011] { [13:13:44.011] { [13:13:44.011] NULL [13:13:44.011] RNGkind("Mersenne-Twister") [13:13:44.011] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:44.011] inherits = FALSE) [13:13:44.011] } [13:13:44.011] options(future.plan = NULL) [13:13:44.011] if (is.na(NA_character_)) [13:13:44.011] Sys.unsetenv("R_FUTURE_PLAN") [13:13:44.011] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:44.011] future::plan(list(function (..., envir = parent.frame()) [13:13:44.011] { [13:13:44.011] future <- SequentialFuture(..., envir = envir) [13:13:44.011] if (!future$lazy) [13:13:44.011] future <- run(future) [13:13:44.011] invisible(future) [13:13:44.011] }), .cleanup = FALSE, .init = FALSE) [13:13:44.011] } [13:13:44.011] } [13:13:44.011] } [13:13:44.011] }) [13:13:44.011] if (TRUE) { [13:13:44.011] base::sink(type = "output", split = FALSE) [13:13:44.011] if (TRUE) { [13:13:44.011] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:44.011] } [13:13:44.011] else { [13:13:44.011] ...future.result["stdout"] <- base::list(NULL) [13:13:44.011] } [13:13:44.011] base::close(...future.stdout) [13:13:44.011] ...future.stdout <- NULL [13:13:44.011] } [13:13:44.011] ...future.result$conditions <- ...future.conditions [13:13:44.011] ...future.result$finished <- base::Sys.time() [13:13:44.011] ...future.result [13:13:44.011] } [13:13:44.013] assign_globals() ... [13:13:44.013] List of 5 [13:13:44.013] $ ...future.FUN :function (x) [13:13:44.013] $ future.call.arguments : list() [13:13:44.013] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:44.013] $ ...future.elements_ii :List of 2 [13:13:44.013] ..$ a: num 0 [13:13:44.013] ..$ b: num 0 [13:13:44.013] $ ...future.seeds_ii : NULL [13:13:44.013] $ ...future.globals.maxSize: NULL [13:13:44.013] - attr(*, "where")=List of 5 [13:13:44.013] ..$ ...future.FUN : [13:13:44.013] ..$ future.call.arguments : [13:13:44.013] ..$ ...future.elements_ii : [13:13:44.013] ..$ ...future.seeds_ii : [13:13:44.013] ..$ ...future.globals.maxSize: [13:13:44.013] - attr(*, "resolved")= logi FALSE [13:13:44.013] - attr(*, "total_size")= num 848 [13:13:44.013] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:44.013] - attr(*, "already-done")= logi TRUE [13:13:44.018] - copied '...future.FUN' to environment [13:13:44.018] - copied 'future.call.arguments' to environment [13:13:44.018] - copied '...future.elements_ii' to environment [13:13:44.018] - copied '...future.seeds_ii' to environment [13:13:44.018] - copied '...future.globals.maxSize' to environment [13:13:44.018] assign_globals() ... done [13:13:44.019] plan(): Setting new future strategy stack: [13:13:44.019] List of future strategies: [13:13:44.019] 1. sequential: [13:13:44.019] - args: function (..., envir = parent.frame(), workers = "") [13:13:44.019] - tweaked: FALSE [13:13:44.019] - call: NULL [13:13:44.019] plan(): nbrOfWorkers() = 1 [13:13:44.020] plan(): Setting new future strategy stack: [13:13:44.020] List of future strategies: [13:13:44.020] 1. sequential: [13:13:44.020] - args: function (..., envir = parent.frame(), workers = "") [13:13:44.020] - tweaked: FALSE [13:13:44.020] - call: plan(strategy) [13:13:44.020] plan(): nbrOfWorkers() = 1 [13:13:44.021] SequentialFuture started (and completed) [13:13:44.021] - Launch lazy future ... done [13:13:44.021] run() for 'SequentialFuture' ... done [13:13:44.021] Created future: [13:13:44.021] SequentialFuture: [13:13:44.021] Label: 'future_lapply-1' [13:13:44.021] Expression: [13:13:44.021] { [13:13:44.021] do.call(function(...) { [13:13:44.021] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:44.021] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:44.021] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:44.021] on.exit(options(oopts), add = TRUE) [13:13:44.021] } [13:13:44.021] { [13:13:44.021] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:44.021] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:44.021] ...future.FUN(...future.X_jj, ...) [13:13:44.021] }) [13:13:44.021] } [13:13:44.021] }, args = future.call.arguments) [13:13:44.021] } [13:13:44.021] Lazy evaluation: FALSE [13:13:44.021] Asynchronous evaluation: FALSE [13:13:44.021] Local evaluation: TRUE [13:13:44.021] Environment: R_GlobalEnv [13:13:44.021] Capture standard output: TRUE [13:13:44.021] Capture condition classes: 'condition' (excluding 'nothing') [13:13:44.021] 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) [13:13:44.021] Packages: [13:13:44.021] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:44.021] Resolved: TRUE [13:13:44.021] Value: 112 bytes of class 'list' [13:13:44.021] Early signaling: FALSE [13:13:44.021] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:44.021] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:44.022] Chunk #1 of 1 ... DONE [13:13:44.022] Launching 1 futures (chunks) ... DONE [13:13:44.022] Resolving 1 futures (chunks) ... [13:13:44.022] resolve() on list ... [13:13:44.023] recursive: 0 [13:13:44.023] length: 1 [13:13:44.023] [13:13:44.023] resolved() for 'SequentialFuture' ... [13:13:44.023] - state: 'finished' [13:13:44.023] - run: TRUE [13:13:44.023] - result: 'FutureResult' [13:13:44.024] resolved() for 'SequentialFuture' ... done [13:13:44.024] Future #1 [13:13:44.024] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:44.024] - nx: 1 [13:13:44.024] - relay: TRUE [13:13:44.024] - stdout: TRUE [13:13:44.024] - signal: TRUE [13:13:44.024] - resignal: FALSE [13:13:44.025] - force: TRUE [13:13:44.025] - relayed: [n=1] FALSE [13:13:44.025] - queued futures: [n=1] FALSE [13:13:44.025] - until=1 [13:13:44.025] - relaying element #1 [13:13:44.025] - relayed: [n=1] TRUE [13:13:44.025] - queued futures: [n=1] TRUE [13:13:44.025] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:44.026] length: 0 (resolved future 1) [13:13:44.026] Relaying remaining futures [13:13:44.026] signalConditionsASAP(NULL, pos=0) ... [13:13:44.026] - nx: 1 [13:13:44.026] - relay: TRUE [13:13:44.026] - stdout: TRUE [13:13:44.026] - signal: TRUE [13:13:44.026] - resignal: FALSE [13:13:44.026] - force: TRUE [13:13:44.026] - relayed: [n=1] TRUE [13:13:44.027] - queued futures: [n=1] TRUE - flush all [13:13:44.027] - relayed: [n=1] TRUE [13:13:44.027] - queued futures: [n=1] TRUE [13:13:44.027] signalConditionsASAP(NULL, pos=0) ... done [13:13:44.027] resolve() on list ... DONE [13:13:44.027] - Number of value chunks collected: 1 [13:13:44.027] Resolving 1 futures (chunks) ... DONE [13:13:44.027] Reducing values from 1 chunks ... [13:13:44.028] - Number of values collected after concatenation: 2 [13:13:44.028] - Number of values expected: 2 [13:13:44.028] Reducing values from 1 chunks ... DONE [13:13:44.028] future_lapply() ... DONE - plan('multisession') ... [13:13:44.028] plan(): Setting new future strategy stack: [13:13:44.028] List of future strategies: [13:13:44.028] 1. multisession: [13:13:44.028] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [13:13:44.028] - tweaked: FALSE [13:13:44.028] - call: plan(strategy) [13:13:44.029] plan(): plan_init() of 'multisession', 'cluster', 'multiprocess', 'future', 'function' ... [13:13:44.029] multisession: [13:13:44.029] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [13:13:44.029] - tweaked: FALSE [13:13:44.029] - call: plan(strategy) [13:13:44.032] getGlobalsAndPackages() ... [13:13:44.032] Not searching for globals [13:13:44.032] - globals: [0] [13:13:44.032] getGlobalsAndPackages() ... DONE [13:13:44.033] [local output] makeClusterPSOCK() ... [13:13:44.063] [local output] Workers: [n = 2] 'localhost', 'localhost' [13:13:44.068] [local output] Base port: 34135 [13:13:44.068] [local output] Getting setup options for 2 cluster nodes ... [13:13:44.069] [local output] - Node 1 of 2 ... [13:13:44.069] [local output] localMachine=TRUE => revtunnel=FALSE [13:13:44.070] Testing if worker's PID can be inferred: '"D:/RCompile/recent/R/bin/x64/Rscript" -e "try(suppressWarnings(cat(Sys.getpid(),file=\"D:/temp/Rtmpe2ANUl/worker.rank=1.parallelly.parent=1864.7486cb957de.pid\")), silent = TRUE)" -e "file.exists(\"D:/temp/Rtmpe2ANUl/worker.rank=1.parallelly.parent=1864.7486cb957de.pid\")"' [13:13:44.507] - Possible to infer worker's PID: TRUE [13:13:44.508] [local output] Rscript port: 34135 [13:13:44.508] [local output] - Node 2 of 2 ... [13:13:44.509] [local output] localMachine=TRUE => revtunnel=FALSE [13:13:44.510] [local output] Rscript port: 34135 [13:13:44.511] [local output] Getting setup options for 2 cluster nodes ... done [13:13:44.511] [local output] - Parallel setup requested for some PSOCK nodes [13:13:44.512] [local output] Setting up PSOCK nodes in parallel [13:13:44.512] List of 36 [13:13:44.512] $ worker : chr "localhost" [13:13:44.512] ..- attr(*, "localhost")= logi TRUE [13:13:44.512] $ master : chr "localhost" [13:13:44.512] $ port : int 34135 [13:13:44.512] $ connectTimeout : num 120 [13:13:44.512] $ timeout : num 120 [13:13:44.512] $ rscript : chr "\"D:/RCompile/recent/R/bin/x64/Rscript\"" [13:13:44.512] $ homogeneous : logi TRUE [13:13:44.512] $ rscript_args : chr "--default-packages=datasets,utils,grDevices,graphics,stats,methods -e \"#label=future_lapply.R:1864:CRANWIN3:CR"| __truncated__ [13:13:44.512] $ rscript_envs : NULL [13:13:44.512] $ rscript_libs : chr [1:2] "D:/temp/RtmpKkFYYg/RLIBS_20dc214b714b" "D:/RCompile/recent/R/library" [13:13:44.512] $ rscript_startup : NULL [13:13:44.512] $ rscript_sh : chr "cmd" [13:13:44.512] $ default_packages: chr [1:6] "datasets" "utils" "grDevices" "graphics" ... [13:13:44.512] $ methods : logi TRUE [13:13:44.512] $ socketOptions : chr "no-delay" [13:13:44.512] $ useXDR : logi FALSE [13:13:44.512] $ outfile : chr "/dev/null" [13:13:44.512] $ renice : int NA [13:13:44.512] $ rshcmd : NULL [13:13:44.512] $ user : chr(0) [13:13:44.512] $ revtunnel : logi FALSE [13:13:44.512] $ rshlogfile : NULL [13:13:44.512] $ rshopts : chr(0) [13:13:44.512] $ rank : int 1 [13:13:44.512] $ manual : logi FALSE [13:13:44.512] $ dryrun : logi FALSE [13:13:44.512] $ quiet : logi FALSE [13:13:44.512] $ setup_strategy : chr "parallel" [13:13:44.512] $ local_cmd : chr "\"D:/RCompile/recent/R/bin/x64/Rscript\" --default-packages=datasets,utils,grDevices,graphics,stats,methods -e "| __truncated__ [13:13:44.512] $ pidfile : chr "D:/temp/Rtmpe2ANUl/worker.rank=1.parallelly.parent=1864.7486cb957de.pid" [13:13:44.512] $ rshcmd_label : NULL [13:13:44.512] $ rsh_call : NULL [13:13:44.512] $ cmd : chr "\"D:/RCompile/recent/R/bin/x64/Rscript\" --default-packages=datasets,utils,grDevices,graphics,stats,methods -e "| __truncated__ [13:13:44.512] $ localMachine : logi TRUE [13:13:44.512] $ make_fcn :function (worker = getOption2("parallelly.localhost.hostname", "localhost"), [13:13:44.512] master = NULL, port, connectTimeout = getOption2("parallelly.makeNodePSOCK.connectTimeout", [13:13:44.512] 2 * 60), timeout = getOption2("parallelly.makeNodePSOCK.timeout", [13:13:44.512] 30 * 24 * 60 * 60), rscript = NULL, homogeneous = NULL, rscript_args = NULL, [13:13:44.512] rscript_envs = NULL, rscript_libs = NULL, rscript_startup = NULL, rscript_sh = c("auto", [13:13:44.512] "cmd", "sh"), default_packages = c("datasets", "utils", "grDevices", [13:13:44.512] "graphics", "stats", if (methods) "methods"), methods = TRUE, socketOptions = getOption2("parallelly.makeNodePSOCK.socketOptions", [13:13:44.512] "no-delay"), useXDR = getOption2("parallelly.makeNodePSOCK.useXDR", [13:13:44.512] FALSE), outfile = "/dev/null", renice = NA_integer_, rshcmd = getOption2("parallelly.makeNodePSOCK.rshcmd", [13:13:44.512] NULL), user = NULL, revtunnel = NA, rshlogfile = NULL, rshopts = getOption2("parallelly.makeNodePSOCK.rshopts", [13:13:44.512] NULL), rank = 1L, manual = FALSE, dryrun = FALSE, quiet = FALSE, [13:13:44.512] setup_strategy = getOption2("parallelly.makeNodePSOCK.setup_strategy", [13:13:44.512] "parallel"), action = c("launch", "options"), verbose = FALSE) [13:13:44.512] $ arguments :List of 28 [13:13:44.512] ..$ worker : chr "localhost" [13:13:44.512] ..$ master : NULL [13:13:44.512] ..$ port : int 34135 [13:13:44.512] ..$ connectTimeout : num 120 [13:13:44.512] ..$ timeout : num 120 [13:13:44.512] ..$ rscript : NULL [13:13:44.512] ..$ homogeneous : NULL [13:13:44.512] ..$ rscript_args : NULL [13:13:44.512] ..$ rscript_envs : NULL [13:13:44.512] ..$ rscript_libs : chr [1:2] "D:/temp/RtmpKkFYYg/RLIBS_20dc214b714b" "D:/RCompile/recent/R/library" [13:13:44.512] ..$ rscript_startup : NULL [13:13:44.512] ..$ rscript_sh : chr [1:3] "auto" "cmd" "sh" [13:13:44.512] ..$ default_packages: chr [1:6] "datasets" "utils" "grDevices" "graphics" ... [13:13:44.512] ..$ methods : logi TRUE [13:13:44.512] ..$ socketOptions : chr "no-delay" [13:13:44.512] ..$ useXDR : logi FALSE [13:13:44.512] ..$ outfile : chr "/dev/null" [13:13:44.512] ..$ renice : int NA [13:13:44.512] ..$ rshcmd : NULL [13:13:44.512] ..$ user : NULL [13:13:44.512] ..$ revtunnel : logi NA [13:13:44.512] ..$ rshlogfile : NULL [13:13:44.512] ..$ rshopts : NULL [13:13:44.512] ..$ rank : int 1 [13:13:44.512] ..$ manual : logi FALSE [13:13:44.512] ..$ dryrun : logi FALSE [13:13:44.512] ..$ quiet : logi FALSE [13:13:44.512] ..$ setup_strategy : chr "parallel" [13:13:44.512] - attr(*, "class")= chr [1:2] "makeNodePSOCKOptions" "makeNodeOptions" [13:13:44.533] [local output] System call to launch all workers: [13:13:44.533] [local output] "D:/RCompile/recent/R/bin/x64/Rscript" --default-packages=datasets,utils,grDevices,graphics,stats,methods -e "#label=future_lapply.R:1864:CRANWIN3:CRAN" -e "try(suppressWarnings(cat(Sys.getpid(),file=\"D:/temp/Rtmpe2ANUl/worker.rank=1.parallelly.parent=1864.7486cb957de.pid\")), silent = TRUE)" -e "options(socketOptions = \"no-delay\")" -e ".libPaths(c(\"D:/temp/RtmpKkFYYg/RLIBS_20dc214b714b\",\"D:/RCompile/recent/R/library\"))" -e "workRSOCK <- tryCatch(parallel:::.workRSOCK, error=function(e) parallel:::.slaveRSOCK); workRSOCK()" MASTER=localhost PORT=34135 OUT=/dev/null TIMEOUT=120 XDR=FALSE SETUPTIMEOUT=120 SETUPSTRATEGY=parallel [13:13:44.533] [local output] Starting PSOCK main server [13:13:44.538] [local output] Workers launched [13:13:44.538] [local output] Waiting for workers to connect back [13:13:44.538] - [local output] 0 workers out of 2 ready [13:13:44.712] - [local output] 0 workers out of 2 ready [13:13:44.713] - [local output] 1 workers out of 2 ready [13:13:44.714] - [local output] 2 workers out of 2 ready [13:13:44.714] [local output] Launching of workers completed [13:13:44.714] [local output] Collecting session information from workers [13:13:44.715] [local output] - Worker #1 of 2 [13:13:44.716] [local output] - Worker #2 of 2 [13:13:44.716] [local output] makeClusterPSOCK() ... done [13:13:44.728] Packages needed by the future expression (n = 0): [13:13:44.728] Packages needed by future strategies (n = 0): [13:13:44.729] { [13:13:44.729] { [13:13:44.729] { [13:13:44.729] ...future.startTime <- base::Sys.time() [13:13:44.729] { [13:13:44.729] { [13:13:44.729] { [13:13:44.729] { [13:13:44.729] base::local({ [13:13:44.729] has_future <- base::requireNamespace("future", [13:13:44.729] quietly = TRUE) [13:13:44.729] if (has_future) { [13:13:44.729] ns <- base::getNamespace("future") [13:13:44.729] version <- ns[[".package"]][["version"]] [13:13:44.729] if (is.null(version)) [13:13:44.729] version <- utils::packageVersion("future") [13:13:44.729] } [13:13:44.729] else { [13:13:44.729] version <- NULL [13:13:44.729] } [13:13:44.729] if (!has_future || version < "1.8.0") { [13:13:44.729] info <- base::c(r_version = base::gsub("R version ", [13:13:44.729] "", base::R.version$version.string), [13:13:44.729] platform = base::sprintf("%s (%s-bit)", [13:13:44.729] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:44.729] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:44.729] "release", "version")], collapse = " "), [13:13:44.729] hostname = base::Sys.info()[["nodename"]]) [13:13:44.729] info <- base::sprintf("%s: %s", base::names(info), [13:13:44.729] info) [13:13:44.729] info <- base::paste(info, collapse = "; ") [13:13:44.729] if (!has_future) { [13:13:44.729] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:44.729] info) [13:13:44.729] } [13:13:44.729] else { [13:13:44.729] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:44.729] info, version) [13:13:44.729] } [13:13:44.729] base::stop(msg) [13:13:44.729] } [13:13:44.729] }) [13:13:44.729] } [13:13:44.729] ...future.mc.cores.old <- base::getOption("mc.cores") [13:13:44.729] base::options(mc.cores = 1L) [13:13:44.729] } [13:13:44.729] options(future.plan = NULL) [13:13:44.729] Sys.unsetenv("R_FUTURE_PLAN") [13:13:44.729] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:44.729] } [13:13:44.729] ...future.workdir <- getwd() [13:13:44.729] } [13:13:44.729] ...future.oldOptions <- base::as.list(base::.Options) [13:13:44.729] ...future.oldEnvVars <- base::Sys.getenv() [13:13:44.729] } [13:13:44.729] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:44.729] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:44.729] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:44.729] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:44.729] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:44.729] future.stdout.windows.reencode = NULL, width = 80L) [13:13:44.729] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:44.729] base::names(...future.oldOptions)) [13:13:44.729] } [13:13:44.729] if (FALSE) { [13:13:44.729] } [13:13:44.729] else { [13:13:44.729] if (TRUE) { [13:13:44.729] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:44.729] open = "w") [13:13:44.729] } [13:13:44.729] else { [13:13:44.729] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:44.729] windows = "NUL", "/dev/null"), open = "w") [13:13:44.729] } [13:13:44.729] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:44.729] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:44.729] base::sink(type = "output", split = FALSE) [13:13:44.729] base::close(...future.stdout) [13:13:44.729] }, add = TRUE) [13:13:44.729] } [13:13:44.729] ...future.frame <- base::sys.nframe() [13:13:44.729] ...future.conditions <- base::list() [13:13:44.729] ...future.rng <- base::globalenv()$.Random.seed [13:13:44.729] if (FALSE) { [13:13:44.729] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:44.729] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:44.729] } [13:13:44.729] ...future.result <- base::tryCatch({ [13:13:44.729] base::withCallingHandlers({ [13:13:44.729] ...future.value <- base::withVisible(base::local({ [13:13:44.729] ...future.makeSendCondition <- local({ [13:13:44.729] sendCondition <- NULL [13:13:44.729] function(frame = 1L) { [13:13:44.729] if (is.function(sendCondition)) [13:13:44.729] return(sendCondition) [13:13:44.729] ns <- getNamespace("parallel") [13:13:44.729] if (exists("sendData", mode = "function", [13:13:44.729] envir = ns)) { [13:13:44.729] parallel_sendData <- get("sendData", mode = "function", [13:13:44.729] envir = ns) [13:13:44.729] envir <- sys.frame(frame) [13:13:44.729] master <- NULL [13:13:44.729] while (!identical(envir, .GlobalEnv) && [13:13:44.729] !identical(envir, emptyenv())) { [13:13:44.729] if (exists("master", mode = "list", envir = envir, [13:13:44.729] inherits = FALSE)) { [13:13:44.729] master <- get("master", mode = "list", [13:13:44.729] envir = envir, inherits = FALSE) [13:13:44.729] if (inherits(master, c("SOCKnode", [13:13:44.729] "SOCK0node"))) { [13:13:44.729] sendCondition <<- function(cond) { [13:13:44.729] data <- list(type = "VALUE", value = cond, [13:13:44.729] success = TRUE) [13:13:44.729] parallel_sendData(master, data) [13:13:44.729] } [13:13:44.729] return(sendCondition) [13:13:44.729] } [13:13:44.729] } [13:13:44.729] frame <- frame + 1L [13:13:44.729] envir <- sys.frame(frame) [13:13:44.729] } [13:13:44.729] } [13:13:44.729] sendCondition <<- function(cond) NULL [13:13:44.729] } [13:13:44.729] }) [13:13:44.729] withCallingHandlers({ [13:13:44.729] NA [13:13:44.729] }, immediateCondition = function(cond) { [13:13:44.729] sendCondition <- ...future.makeSendCondition() [13:13:44.729] sendCondition(cond) [13:13:44.729] muffleCondition <- function (cond, pattern = "^muffle") [13:13:44.729] { [13:13:44.729] inherits <- base::inherits [13:13:44.729] invokeRestart <- base::invokeRestart [13:13:44.729] is.null <- base::is.null [13:13:44.729] muffled <- FALSE [13:13:44.729] if (inherits(cond, "message")) { [13:13:44.729] muffled <- grepl(pattern, "muffleMessage") [13:13:44.729] if (muffled) [13:13:44.729] invokeRestart("muffleMessage") [13:13:44.729] } [13:13:44.729] else if (inherits(cond, "warning")) { [13:13:44.729] muffled <- grepl(pattern, "muffleWarning") [13:13:44.729] if (muffled) [13:13:44.729] invokeRestart("muffleWarning") [13:13:44.729] } [13:13:44.729] else if (inherits(cond, "condition")) { [13:13:44.729] if (!is.null(pattern)) { [13:13:44.729] computeRestarts <- base::computeRestarts [13:13:44.729] grepl <- base::grepl [13:13:44.729] restarts <- computeRestarts(cond) [13:13:44.729] for (restart in restarts) { [13:13:44.729] name <- restart$name [13:13:44.729] if (is.null(name)) [13:13:44.729] next [13:13:44.729] if (!grepl(pattern, name)) [13:13:44.729] next [13:13:44.729] invokeRestart(restart) [13:13:44.729] muffled <- TRUE [13:13:44.729] break [13:13:44.729] } [13:13:44.729] } [13:13:44.729] } [13:13:44.729] invisible(muffled) [13:13:44.729] } [13:13:44.729] muffleCondition(cond) [13:13:44.729] }) [13:13:44.729] })) [13:13:44.729] future::FutureResult(value = ...future.value$value, [13:13:44.729] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:44.729] ...future.rng), globalenv = if (FALSE) [13:13:44.729] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:44.729] ...future.globalenv.names)) [13:13:44.729] else NULL, started = ...future.startTime, version = "1.8") [13:13:44.729] }, condition = base::local({ [13:13:44.729] c <- base::c [13:13:44.729] inherits <- base::inherits [13:13:44.729] invokeRestart <- base::invokeRestart [13:13:44.729] length <- base::length [13:13:44.729] list <- base::list [13:13:44.729] seq.int <- base::seq.int [13:13:44.729] signalCondition <- base::signalCondition [13:13:44.729] sys.calls <- base::sys.calls [13:13:44.729] `[[` <- base::`[[` [13:13:44.729] `+` <- base::`+` [13:13:44.729] `<<-` <- base::`<<-` [13:13:44.729] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:44.729] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:44.729] 3L)] [13:13:44.729] } [13:13:44.729] function(cond) { [13:13:44.729] is_error <- inherits(cond, "error") [13:13:44.729] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:44.729] NULL) [13:13:44.729] if (is_error) { [13:13:44.729] sessionInformation <- function() { [13:13:44.729] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:44.729] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:44.729] search = base::search(), system = base::Sys.info()) [13:13:44.729] } [13:13:44.729] ...future.conditions[[length(...future.conditions) + [13:13:44.729] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:44.729] cond$call), session = sessionInformation(), [13:13:44.729] timestamp = base::Sys.time(), signaled = 0L) [13:13:44.729] signalCondition(cond) [13:13:44.729] } [13:13:44.729] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:44.729] "immediateCondition"))) { [13:13:44.729] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:44.729] ...future.conditions[[length(...future.conditions) + [13:13:44.729] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:44.729] if (TRUE && !signal) { [13:13:44.729] muffleCondition <- function (cond, pattern = "^muffle") [13:13:44.729] { [13:13:44.729] inherits <- base::inherits [13:13:44.729] invokeRestart <- base::invokeRestart [13:13:44.729] is.null <- base::is.null [13:13:44.729] muffled <- FALSE [13:13:44.729] if (inherits(cond, "message")) { [13:13:44.729] muffled <- grepl(pattern, "muffleMessage") [13:13:44.729] if (muffled) [13:13:44.729] invokeRestart("muffleMessage") [13:13:44.729] } [13:13:44.729] else if (inherits(cond, "warning")) { [13:13:44.729] muffled <- grepl(pattern, "muffleWarning") [13:13:44.729] if (muffled) [13:13:44.729] invokeRestart("muffleWarning") [13:13:44.729] } [13:13:44.729] else if (inherits(cond, "condition")) { [13:13:44.729] if (!is.null(pattern)) { [13:13:44.729] computeRestarts <- base::computeRestarts [13:13:44.729] grepl <- base::grepl [13:13:44.729] restarts <- computeRestarts(cond) [13:13:44.729] for (restart in restarts) { [13:13:44.729] name <- restart$name [13:13:44.729] if (is.null(name)) [13:13:44.729] next [13:13:44.729] if (!grepl(pattern, name)) [13:13:44.729] next [13:13:44.729] invokeRestart(restart) [13:13:44.729] muffled <- TRUE [13:13:44.729] break [13:13:44.729] } [13:13:44.729] } [13:13:44.729] } [13:13:44.729] invisible(muffled) [13:13:44.729] } [13:13:44.729] muffleCondition(cond, pattern = "^muffle") [13:13:44.729] } [13:13:44.729] } [13:13:44.729] else { [13:13:44.729] if (TRUE) { [13:13:44.729] muffleCondition <- function (cond, pattern = "^muffle") [13:13:44.729] { [13:13:44.729] inherits <- base::inherits [13:13:44.729] invokeRestart <- base::invokeRestart [13:13:44.729] is.null <- base::is.null [13:13:44.729] muffled <- FALSE [13:13:44.729] if (inherits(cond, "message")) { [13:13:44.729] muffled <- grepl(pattern, "muffleMessage") [13:13:44.729] if (muffled) [13:13:44.729] invokeRestart("muffleMessage") [13:13:44.729] } [13:13:44.729] else if (inherits(cond, "warning")) { [13:13:44.729] muffled <- grepl(pattern, "muffleWarning") [13:13:44.729] if (muffled) [13:13:44.729] invokeRestart("muffleWarning") [13:13:44.729] } [13:13:44.729] else if (inherits(cond, "condition")) { [13:13:44.729] if (!is.null(pattern)) { [13:13:44.729] computeRestarts <- base::computeRestarts [13:13:44.729] grepl <- base::grepl [13:13:44.729] restarts <- computeRestarts(cond) [13:13:44.729] for (restart in restarts) { [13:13:44.729] name <- restart$name [13:13:44.729] if (is.null(name)) [13:13:44.729] next [13:13:44.729] if (!grepl(pattern, name)) [13:13:44.729] next [13:13:44.729] invokeRestart(restart) [13:13:44.729] muffled <- TRUE [13:13:44.729] break [13:13:44.729] } [13:13:44.729] } [13:13:44.729] } [13:13:44.729] invisible(muffled) [13:13:44.729] } [13:13:44.729] muffleCondition(cond, pattern = "^muffle") [13:13:44.729] } [13:13:44.729] } [13:13:44.729] } [13:13:44.729] })) [13:13:44.729] }, error = function(ex) { [13:13:44.729] base::structure(base::list(value = NULL, visible = NULL, [13:13:44.729] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:44.729] ...future.rng), started = ...future.startTime, [13:13:44.729] finished = Sys.time(), session_uuid = NA_character_, [13:13:44.729] version = "1.8"), class = "FutureResult") [13:13:44.729] }, finally = { [13:13:44.729] if (!identical(...future.workdir, getwd())) [13:13:44.729] setwd(...future.workdir) [13:13:44.729] { [13:13:44.729] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:44.729] ...future.oldOptions$nwarnings <- NULL [13:13:44.729] } [13:13:44.729] base::options(...future.oldOptions) [13:13:44.729] if (.Platform$OS.type == "windows") { [13:13:44.729] old_names <- names(...future.oldEnvVars) [13:13:44.729] envs <- base::Sys.getenv() [13:13:44.729] names <- names(envs) [13:13:44.729] common <- intersect(names, old_names) [13:13:44.729] added <- setdiff(names, old_names) [13:13:44.729] removed <- setdiff(old_names, names) [13:13:44.729] changed <- common[...future.oldEnvVars[common] != [13:13:44.729] envs[common]] [13:13:44.729] NAMES <- toupper(changed) [13:13:44.729] args <- list() [13:13:44.729] for (kk in seq_along(NAMES)) { [13:13:44.729] name <- changed[[kk]] [13:13:44.729] NAME <- NAMES[[kk]] [13:13:44.729] if (name != NAME && is.element(NAME, old_names)) [13:13:44.729] next [13:13:44.729] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:44.729] } [13:13:44.729] NAMES <- toupper(added) [13:13:44.729] for (kk in seq_along(NAMES)) { [13:13:44.729] name <- added[[kk]] [13:13:44.729] NAME <- NAMES[[kk]] [13:13:44.729] if (name != NAME && is.element(NAME, old_names)) [13:13:44.729] next [13:13:44.729] args[[name]] <- "" [13:13:44.729] } [13:13:44.729] NAMES <- toupper(removed) [13:13:44.729] for (kk in seq_along(NAMES)) { [13:13:44.729] name <- removed[[kk]] [13:13:44.729] NAME <- NAMES[[kk]] [13:13:44.729] if (name != NAME && is.element(NAME, old_names)) [13:13:44.729] next [13:13:44.729] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:44.729] } [13:13:44.729] if (length(args) > 0) [13:13:44.729] base::do.call(base::Sys.setenv, args = args) [13:13:44.729] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:44.729] } [13:13:44.729] else { [13:13:44.729] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:44.729] } [13:13:44.729] { [13:13:44.729] if (base::length(...future.futureOptionsAdded) > [13:13:44.729] 0L) { [13:13:44.729] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:44.729] base::names(opts) <- ...future.futureOptionsAdded [13:13:44.729] base::options(opts) [13:13:44.729] } [13:13:44.729] { [13:13:44.729] { [13:13:44.729] base::options(mc.cores = ...future.mc.cores.old) [13:13:44.729] NULL [13:13:44.729] } [13:13:44.729] options(future.plan = NULL) [13:13:44.729] if (is.na(NA_character_)) [13:13:44.729] Sys.unsetenv("R_FUTURE_PLAN") [13:13:44.729] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:44.729] future::plan(list(function (..., workers = availableCores(), [13:13:44.729] lazy = FALSE, rscript_libs = .libPaths(), [13:13:44.729] envir = parent.frame()) [13:13:44.729] { [13:13:44.729] if (is.function(workers)) [13:13:44.729] workers <- workers() [13:13:44.729] workers <- structure(as.integer(workers), [13:13:44.729] class = class(workers)) [13:13:44.729] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:44.729] workers >= 1) [13:13:44.729] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:44.729] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:44.729] } [13:13:44.729] future <- MultisessionFuture(..., workers = workers, [13:13:44.729] lazy = lazy, rscript_libs = rscript_libs, [13:13:44.729] envir = envir) [13:13:44.729] if (!future$lazy) [13:13:44.729] future <- run(future) [13:13:44.729] invisible(future) [13:13:44.729] }), .cleanup = FALSE, .init = FALSE) [13:13:44.729] } [13:13:44.729] } [13:13:44.729] } [13:13:44.729] }) [13:13:44.729] if (TRUE) { [13:13:44.729] base::sink(type = "output", split = FALSE) [13:13:44.729] if (TRUE) { [13:13:44.729] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:44.729] } [13:13:44.729] else { [13:13:44.729] ...future.result["stdout"] <- base::list(NULL) [13:13:44.729] } [13:13:44.729] base::close(...future.stdout) [13:13:44.729] ...future.stdout <- NULL [13:13:44.729] } [13:13:44.729] ...future.result$conditions <- ...future.conditions [13:13:44.729] ...future.result$finished <- base::Sys.time() [13:13:44.729] ...future.result [13:13:44.729] } [13:13:44.805] MultisessionFuture started [13:13:44.805] result() for ClusterFuture ... [13:13:44.806] receiveMessageFromWorker() for ClusterFuture ... [13:13:44.806] - Validating connection of MultisessionFuture [13:13:44.863] - received message: FutureResult [13:13:44.863] - Received FutureResult [13:13:44.866] - Erased future from FutureRegistry [13:13:44.866] result() for ClusterFuture ... [13:13:44.866] - result already collected: FutureResult [13:13:44.866] result() for ClusterFuture ... done [13:13:44.866] receiveMessageFromWorker() for ClusterFuture ... done [13:13:44.867] result() for ClusterFuture ... done [13:13:44.867] result() for ClusterFuture ... [13:13:44.867] - result already collected: FutureResult [13:13:44.867] result() for ClusterFuture ... done [13:13:44.867] plan(): plan_init() of 'multisession', 'cluster', 'multiprocess', 'future', 'function' ... DONE [13:13:44.869] plan(): nbrOfWorkers() = 2 - future_lapply(x, FUN = vector, ...) ... [13:13:44.870] future_lapply() ... [13:13:44.873] Number of chunks: 4 [13:13:44.873] getGlobalsAndPackagesXApply() ... [13:13:44.873] - future.globals: TRUE [13:13:44.873] getGlobalsAndPackages() ... [13:13:44.873] Searching for globals... [13:13:44.875] - globals found: [2] 'FUN', '.Internal' [13:13:44.875] Searching for globals ... DONE [13:13:44.875] Resolving globals: FALSE [13:13:44.876] The total size of the 1 globals is 2.13 KiB (2184 bytes) [13:13:44.876] 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') [13:13:44.876] - globals: [1] 'FUN' [13:13:44.877] [13:13:44.877] getGlobalsAndPackages() ... DONE [13:13:44.877] - globals found/used: [n=1] 'FUN' [13:13:44.877] - needed namespaces: [n=0] [13:13:44.877] Finding globals ... DONE [13:13:44.877] - use_args: TRUE [13:13:44.878] - Getting '...' globals ... [13:13:44.878] resolve() on list ... [13:13:44.878] recursive: 0 [13:13:44.878] length: 1 [13:13:44.878] elements: '...' [13:13:44.879] length: 0 (resolved future 1) [13:13:44.879] resolve() on list ... DONE [13:13:44.879] - '...' content: [n=1] 'length' [13:13:44.879] List of 1 [13:13:44.879] $ ...:List of 1 [13:13:44.879] ..$ length: int 2 [13:13:44.879] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:44.879] - attr(*, "where")=List of 1 [13:13:44.879] ..$ ...: [13:13:44.879] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:44.879] - attr(*, "resolved")= logi TRUE [13:13:44.879] - attr(*, "total_size")= num NA [13:13:44.883] - Getting '...' globals ... DONE [13:13:44.883] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:44.883] List of 2 [13:13:44.883] $ ...future.FUN:function (mode = "logical", length = 0L) [13:13:44.883] $ ... :List of 1 [13:13:44.883] ..$ length: int 2 [13:13:44.883] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:44.883] - attr(*, "where")=List of 2 [13:13:44.883] ..$ ...future.FUN: [13:13:44.883] ..$ ... : [13:13:44.883] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:44.883] - attr(*, "resolved")= logi FALSE [13:13:44.883] - attr(*, "total_size")= num 2240 [13:13:44.887] Packages to be attached in all futures: [n=0] [13:13:44.887] getGlobalsAndPackagesXApply() ... DONE [13:13:44.888] Number of futures (= number of chunks): 4 [13:13:44.888] Launching 4 futures (chunks) ... [13:13:44.888] Chunk #1 of 4 ... [13:13:44.888] - Finding globals in 'X' for chunk #1 ... [13:13:44.888] getGlobalsAndPackages() ... [13:13:44.888] Searching for globals... [13:13:44.889] [13:13:44.889] Searching for globals ... DONE [13:13:44.889] - globals: [0] [13:13:44.889] getGlobalsAndPackages() ... DONE [13:13:44.889] + additional globals found: [n=0] [13:13:44.889] + additional namespaces needed: [n=0] [13:13:44.890] - Finding globals in 'X' for chunk #1 ... DONE [13:13:44.890] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [13:13:44.890] - seeds: [13:13:44.890] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:44.890] getGlobalsAndPackages() ... [13:13:44.890] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:44.891] Resolving globals: FALSE [13:13:44.891] Tweak future expression to call with '...' arguments ... [13:13:44.891] { [13:13:44.891] do.call(function(...) { [13:13:44.891] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:44.891] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:44.891] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:44.891] on.exit(options(oopts), add = TRUE) [13:13:44.891] } [13:13:44.891] { [13:13:44.891] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:44.891] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:44.891] ...future.FUN(...future.X_jj, ...) [13:13:44.891] }) [13:13:44.891] } [13:13:44.891] }, args = future.call.arguments) [13:13:44.891] } [13:13:44.891] Tweak future expression to call with '...' arguments ... DONE [13:13:44.892] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:44.892] [13:13:44.892] getGlobalsAndPackages() ... DONE [13:13:44.893] run() for 'Future' ... [13:13:44.893] - state: 'created' [13:13:44.893] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:44.907] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:44.907] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:13:44.908] - Field: 'node' [13:13:44.908] - Field: 'label' [13:13:44.908] - Field: 'local' [13:13:44.908] - Field: 'owner' [13:13:44.908] - Field: 'envir' [13:13:44.909] - Field: 'workers' [13:13:44.909] - Field: 'packages' [13:13:44.909] - Field: 'gc' [13:13:44.909] - Field: 'conditions' [13:13:44.909] - Field: 'persistent' [13:13:44.909] - Field: 'expr' [13:13:44.910] - Field: 'uuid' [13:13:44.910] - Field: 'seed' [13:13:44.910] - Field: 'version' [13:13:44.910] - Field: 'result' [13:13:44.910] - Field: 'asynchronous' [13:13:44.910] - Field: 'calls' [13:13:44.911] - Field: 'globals' [13:13:44.911] - Field: 'stdout' [13:13:44.911] - Field: 'earlySignal' [13:13:44.911] - Field: 'lazy' [13:13:44.911] - Field: 'state' [13:13:44.911] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:13:44.912] - Launch lazy future ... [13:13:44.912] Packages needed by the future expression (n = 0): [13:13:44.912] Packages needed by future strategies (n = 0): [13:13:44.913] { [13:13:44.913] { [13:13:44.913] { [13:13:44.913] ...future.startTime <- base::Sys.time() [13:13:44.913] { [13:13:44.913] { [13:13:44.913] { [13:13:44.913] { [13:13:44.913] base::local({ [13:13:44.913] has_future <- base::requireNamespace("future", [13:13:44.913] quietly = TRUE) [13:13:44.913] if (has_future) { [13:13:44.913] ns <- base::getNamespace("future") [13:13:44.913] version <- ns[[".package"]][["version"]] [13:13:44.913] if (is.null(version)) [13:13:44.913] version <- utils::packageVersion("future") [13:13:44.913] } [13:13:44.913] else { [13:13:44.913] version <- NULL [13:13:44.913] } [13:13:44.913] if (!has_future || version < "1.8.0") { [13:13:44.913] info <- base::c(r_version = base::gsub("R version ", [13:13:44.913] "", base::R.version$version.string), [13:13:44.913] platform = base::sprintf("%s (%s-bit)", [13:13:44.913] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:44.913] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:44.913] "release", "version")], collapse = " "), [13:13:44.913] hostname = base::Sys.info()[["nodename"]]) [13:13:44.913] info <- base::sprintf("%s: %s", base::names(info), [13:13:44.913] info) [13:13:44.913] info <- base::paste(info, collapse = "; ") [13:13:44.913] if (!has_future) { [13:13:44.913] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:44.913] info) [13:13:44.913] } [13:13:44.913] else { [13:13:44.913] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:44.913] info, version) [13:13:44.913] } [13:13:44.913] base::stop(msg) [13:13:44.913] } [13:13:44.913] }) [13:13:44.913] } [13:13:44.913] ...future.mc.cores.old <- base::getOption("mc.cores") [13:13:44.913] base::options(mc.cores = 1L) [13:13:44.913] } [13:13:44.913] options(future.plan = NULL) [13:13:44.913] Sys.unsetenv("R_FUTURE_PLAN") [13:13:44.913] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:44.913] } [13:13:44.913] ...future.workdir <- getwd() [13:13:44.913] } [13:13:44.913] ...future.oldOptions <- base::as.list(base::.Options) [13:13:44.913] ...future.oldEnvVars <- base::Sys.getenv() [13:13:44.913] } [13:13:44.913] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:44.913] future.globals.maxSize = 2097152000, future.globals.method = NULL, [13:13:44.913] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:44.913] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:44.913] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:44.913] future.stdout.windows.reencode = NULL, width = 80L) [13:13:44.913] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:44.913] base::names(...future.oldOptions)) [13:13:44.913] } [13:13:44.913] if (FALSE) { [13:13:44.913] } [13:13:44.913] else { [13:13:44.913] if (TRUE) { [13:13:44.913] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:44.913] open = "w") [13:13:44.913] } [13:13:44.913] else { [13:13:44.913] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:44.913] windows = "NUL", "/dev/null"), open = "w") [13:13:44.913] } [13:13:44.913] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:44.913] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:44.913] base::sink(type = "output", split = FALSE) [13:13:44.913] base::close(...future.stdout) [13:13:44.913] }, add = TRUE) [13:13:44.913] } [13:13:44.913] ...future.frame <- base::sys.nframe() [13:13:44.913] ...future.conditions <- base::list() [13:13:44.913] ...future.rng <- base::globalenv()$.Random.seed [13:13:44.913] if (FALSE) { [13:13:44.913] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:44.913] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:44.913] } [13:13:44.913] ...future.result <- base::tryCatch({ [13:13:44.913] base::withCallingHandlers({ [13:13:44.913] ...future.value <- base::withVisible(base::local({ [13:13:44.913] ...future.makeSendCondition <- local({ [13:13:44.913] sendCondition <- NULL [13:13:44.913] function(frame = 1L) { [13:13:44.913] if (is.function(sendCondition)) [13:13:44.913] return(sendCondition) [13:13:44.913] ns <- getNamespace("parallel") [13:13:44.913] if (exists("sendData", mode = "function", [13:13:44.913] envir = ns)) { [13:13:44.913] parallel_sendData <- get("sendData", mode = "function", [13:13:44.913] envir = ns) [13:13:44.913] envir <- sys.frame(frame) [13:13:44.913] master <- NULL [13:13:44.913] while (!identical(envir, .GlobalEnv) && [13:13:44.913] !identical(envir, emptyenv())) { [13:13:44.913] if (exists("master", mode = "list", envir = envir, [13:13:44.913] inherits = FALSE)) { [13:13:44.913] master <- get("master", mode = "list", [13:13:44.913] envir = envir, inherits = FALSE) [13:13:44.913] if (inherits(master, c("SOCKnode", [13:13:44.913] "SOCK0node"))) { [13:13:44.913] sendCondition <<- function(cond) { [13:13:44.913] data <- list(type = "VALUE", value = cond, [13:13:44.913] success = TRUE) [13:13:44.913] parallel_sendData(master, data) [13:13:44.913] } [13:13:44.913] return(sendCondition) [13:13:44.913] } [13:13:44.913] } [13:13:44.913] frame <- frame + 1L [13:13:44.913] envir <- sys.frame(frame) [13:13:44.913] } [13:13:44.913] } [13:13:44.913] sendCondition <<- function(cond) NULL [13:13:44.913] } [13:13:44.913] }) [13:13:44.913] withCallingHandlers({ [13:13:44.913] { [13:13:44.913] do.call(function(...) { [13:13:44.913] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:44.913] if (!identical(...future.globals.maxSize.org, [13:13:44.913] ...future.globals.maxSize)) { [13:13:44.913] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:44.913] on.exit(options(oopts), add = TRUE) [13:13:44.913] } [13:13:44.913] { [13:13:44.913] lapply(seq_along(...future.elements_ii), [13:13:44.913] FUN = function(jj) { [13:13:44.913] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:44.913] ...future.FUN(...future.X_jj, ...) [13:13:44.913] }) [13:13:44.913] } [13:13:44.913] }, args = future.call.arguments) [13:13:44.913] } [13:13:44.913] }, immediateCondition = function(cond) { [13:13:44.913] sendCondition <- ...future.makeSendCondition() [13:13:44.913] sendCondition(cond) [13:13:44.913] muffleCondition <- function (cond, pattern = "^muffle") [13:13:44.913] { [13:13:44.913] inherits <- base::inherits [13:13:44.913] invokeRestart <- base::invokeRestart [13:13:44.913] is.null <- base::is.null [13:13:44.913] muffled <- FALSE [13:13:44.913] if (inherits(cond, "message")) { [13:13:44.913] muffled <- grepl(pattern, "muffleMessage") [13:13:44.913] if (muffled) [13:13:44.913] invokeRestart("muffleMessage") [13:13:44.913] } [13:13:44.913] else if (inherits(cond, "warning")) { [13:13:44.913] muffled <- grepl(pattern, "muffleWarning") [13:13:44.913] if (muffled) [13:13:44.913] invokeRestart("muffleWarning") [13:13:44.913] } [13:13:44.913] else if (inherits(cond, "condition")) { [13:13:44.913] if (!is.null(pattern)) { [13:13:44.913] computeRestarts <- base::computeRestarts [13:13:44.913] grepl <- base::grepl [13:13:44.913] restarts <- computeRestarts(cond) [13:13:44.913] for (restart in restarts) { [13:13:44.913] name <- restart$name [13:13:44.913] if (is.null(name)) [13:13:44.913] next [13:13:44.913] if (!grepl(pattern, name)) [13:13:44.913] next [13:13:44.913] invokeRestart(restart) [13:13:44.913] muffled <- TRUE [13:13:44.913] break [13:13:44.913] } [13:13:44.913] } [13:13:44.913] } [13:13:44.913] invisible(muffled) [13:13:44.913] } [13:13:44.913] muffleCondition(cond) [13:13:44.913] }) [13:13:44.913] })) [13:13:44.913] future::FutureResult(value = ...future.value$value, [13:13:44.913] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:44.913] ...future.rng), globalenv = if (FALSE) [13:13:44.913] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:44.913] ...future.globalenv.names)) [13:13:44.913] else NULL, started = ...future.startTime, version = "1.8") [13:13:44.913] }, condition = base::local({ [13:13:44.913] c <- base::c [13:13:44.913] inherits <- base::inherits [13:13:44.913] invokeRestart <- base::invokeRestart [13:13:44.913] length <- base::length [13:13:44.913] list <- base::list [13:13:44.913] seq.int <- base::seq.int [13:13:44.913] signalCondition <- base::signalCondition [13:13:44.913] sys.calls <- base::sys.calls [13:13:44.913] `[[` <- base::`[[` [13:13:44.913] `+` <- base::`+` [13:13:44.913] `<<-` <- base::`<<-` [13:13:44.913] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:44.913] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:44.913] 3L)] [13:13:44.913] } [13:13:44.913] function(cond) { [13:13:44.913] is_error <- inherits(cond, "error") [13:13:44.913] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:44.913] NULL) [13:13:44.913] if (is_error) { [13:13:44.913] sessionInformation <- function() { [13:13:44.913] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:44.913] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:44.913] search = base::search(), system = base::Sys.info()) [13:13:44.913] } [13:13:44.913] ...future.conditions[[length(...future.conditions) + [13:13:44.913] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:44.913] cond$call), session = sessionInformation(), [13:13:44.913] timestamp = base::Sys.time(), signaled = 0L) [13:13:44.913] signalCondition(cond) [13:13:44.913] } [13:13:44.913] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:44.913] "immediateCondition"))) { [13:13:44.913] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:44.913] ...future.conditions[[length(...future.conditions) + [13:13:44.913] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:44.913] if (TRUE && !signal) { [13:13:44.913] muffleCondition <- function (cond, pattern = "^muffle") [13:13:44.913] { [13:13:44.913] inherits <- base::inherits [13:13:44.913] invokeRestart <- base::invokeRestart [13:13:44.913] is.null <- base::is.null [13:13:44.913] muffled <- FALSE [13:13:44.913] if (inherits(cond, "message")) { [13:13:44.913] muffled <- grepl(pattern, "muffleMessage") [13:13:44.913] if (muffled) [13:13:44.913] invokeRestart("muffleMessage") [13:13:44.913] } [13:13:44.913] else if (inherits(cond, "warning")) { [13:13:44.913] muffled <- grepl(pattern, "muffleWarning") [13:13:44.913] if (muffled) [13:13:44.913] invokeRestart("muffleWarning") [13:13:44.913] } [13:13:44.913] else if (inherits(cond, "condition")) { [13:13:44.913] if (!is.null(pattern)) { [13:13:44.913] computeRestarts <- base::computeRestarts [13:13:44.913] grepl <- base::grepl [13:13:44.913] restarts <- computeRestarts(cond) [13:13:44.913] for (restart in restarts) { [13:13:44.913] name <- restart$name [13:13:44.913] if (is.null(name)) [13:13:44.913] next [13:13:44.913] if (!grepl(pattern, name)) [13:13:44.913] next [13:13:44.913] invokeRestart(restart) [13:13:44.913] muffled <- TRUE [13:13:44.913] break [13:13:44.913] } [13:13:44.913] } [13:13:44.913] } [13:13:44.913] invisible(muffled) [13:13:44.913] } [13:13:44.913] muffleCondition(cond, pattern = "^muffle") [13:13:44.913] } [13:13:44.913] } [13:13:44.913] else { [13:13:44.913] if (TRUE) { [13:13:44.913] muffleCondition <- function (cond, pattern = "^muffle") [13:13:44.913] { [13:13:44.913] inherits <- base::inherits [13:13:44.913] invokeRestart <- base::invokeRestart [13:13:44.913] is.null <- base::is.null [13:13:44.913] muffled <- FALSE [13:13:44.913] if (inherits(cond, "message")) { [13:13:44.913] muffled <- grepl(pattern, "muffleMessage") [13:13:44.913] if (muffled) [13:13:44.913] invokeRestart("muffleMessage") [13:13:44.913] } [13:13:44.913] else if (inherits(cond, "warning")) { [13:13:44.913] muffled <- grepl(pattern, "muffleWarning") [13:13:44.913] if (muffled) [13:13:44.913] invokeRestart("muffleWarning") [13:13:44.913] } [13:13:44.913] else if (inherits(cond, "condition")) { [13:13:44.913] if (!is.null(pattern)) { [13:13:44.913] computeRestarts <- base::computeRestarts [13:13:44.913] grepl <- base::grepl [13:13:44.913] restarts <- computeRestarts(cond) [13:13:44.913] for (restart in restarts) { [13:13:44.913] name <- restart$name [13:13:44.913] if (is.null(name)) [13:13:44.913] next [13:13:44.913] if (!grepl(pattern, name)) [13:13:44.913] next [13:13:44.913] invokeRestart(restart) [13:13:44.913] muffled <- TRUE [13:13:44.913] break [13:13:44.913] } [13:13:44.913] } [13:13:44.913] } [13:13:44.913] invisible(muffled) [13:13:44.913] } [13:13:44.913] muffleCondition(cond, pattern = "^muffle") [13:13:44.913] } [13:13:44.913] } [13:13:44.913] } [13:13:44.913] })) [13:13:44.913] }, error = function(ex) { [13:13:44.913] base::structure(base::list(value = NULL, visible = NULL, [13:13:44.913] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:44.913] ...future.rng), started = ...future.startTime, [13:13:44.913] finished = Sys.time(), session_uuid = NA_character_, [13:13:44.913] version = "1.8"), class = "FutureResult") [13:13:44.913] }, finally = { [13:13:44.913] if (!identical(...future.workdir, getwd())) [13:13:44.913] setwd(...future.workdir) [13:13:44.913] { [13:13:44.913] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:44.913] ...future.oldOptions$nwarnings <- NULL [13:13:44.913] } [13:13:44.913] base::options(...future.oldOptions) [13:13:44.913] if (.Platform$OS.type == "windows") { [13:13:44.913] old_names <- names(...future.oldEnvVars) [13:13:44.913] envs <- base::Sys.getenv() [13:13:44.913] names <- names(envs) [13:13:44.913] common <- intersect(names, old_names) [13:13:44.913] added <- setdiff(names, old_names) [13:13:44.913] removed <- setdiff(old_names, names) [13:13:44.913] changed <- common[...future.oldEnvVars[common] != [13:13:44.913] envs[common]] [13:13:44.913] NAMES <- toupper(changed) [13:13:44.913] args <- list() [13:13:44.913] for (kk in seq_along(NAMES)) { [13:13:44.913] name <- changed[[kk]] [13:13:44.913] NAME <- NAMES[[kk]] [13:13:44.913] if (name != NAME && is.element(NAME, old_names)) [13:13:44.913] next [13:13:44.913] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:44.913] } [13:13:44.913] NAMES <- toupper(added) [13:13:44.913] for (kk in seq_along(NAMES)) { [13:13:44.913] name <- added[[kk]] [13:13:44.913] NAME <- NAMES[[kk]] [13:13:44.913] if (name != NAME && is.element(NAME, old_names)) [13:13:44.913] next [13:13:44.913] args[[name]] <- "" [13:13:44.913] } [13:13:44.913] NAMES <- toupper(removed) [13:13:44.913] for (kk in seq_along(NAMES)) { [13:13:44.913] name <- removed[[kk]] [13:13:44.913] NAME <- NAMES[[kk]] [13:13:44.913] if (name != NAME && is.element(NAME, old_names)) [13:13:44.913] next [13:13:44.913] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:44.913] } [13:13:44.913] if (length(args) > 0) [13:13:44.913] base::do.call(base::Sys.setenv, args = args) [13:13:44.913] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:44.913] } [13:13:44.913] else { [13:13:44.913] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:44.913] } [13:13:44.913] { [13:13:44.913] if (base::length(...future.futureOptionsAdded) > [13:13:44.913] 0L) { [13:13:44.913] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:44.913] base::names(opts) <- ...future.futureOptionsAdded [13:13:44.913] base::options(opts) [13:13:44.913] } [13:13:44.913] { [13:13:44.913] { [13:13:44.913] base::options(mc.cores = ...future.mc.cores.old) [13:13:44.913] NULL [13:13:44.913] } [13:13:44.913] options(future.plan = NULL) [13:13:44.913] if (is.na(NA_character_)) [13:13:44.913] Sys.unsetenv("R_FUTURE_PLAN") [13:13:44.913] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:44.913] future::plan(list(function (..., workers = availableCores(), [13:13:44.913] lazy = FALSE, rscript_libs = .libPaths(), [13:13:44.913] envir = parent.frame()) [13:13:44.913] { [13:13:44.913] if (is.function(workers)) [13:13:44.913] workers <- workers() [13:13:44.913] workers <- structure(as.integer(workers), [13:13:44.913] class = class(workers)) [13:13:44.913] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:44.913] workers >= 1) [13:13:44.913] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:44.913] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:44.913] } [13:13:44.913] future <- MultisessionFuture(..., workers = workers, [13:13:44.913] lazy = lazy, rscript_libs = rscript_libs, [13:13:44.913] envir = envir) [13:13:44.913] if (!future$lazy) [13:13:44.913] future <- run(future) [13:13:44.913] invisible(future) [13:13:44.913] }), .cleanup = FALSE, .init = FALSE) [13:13:44.913] } [13:13:44.913] } [13:13:44.913] } [13:13:44.913] }) [13:13:44.913] if (TRUE) { [13:13:44.913] base::sink(type = "output", split = FALSE) [13:13:44.913] if (TRUE) { [13:13:44.913] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:44.913] } [13:13:44.913] else { [13:13:44.913] ...future.result["stdout"] <- base::list(NULL) [13:13:44.913] } [13:13:44.913] base::close(...future.stdout) [13:13:44.913] ...future.stdout <- NULL [13:13:44.913] } [13:13:44.913] ...future.result$conditions <- ...future.conditions [13:13:44.913] ...future.result$finished <- base::Sys.time() [13:13:44.913] ...future.result [13:13:44.913] } [13:13:44.918] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... [13:13:44.918] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... [13:13:44.919] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... DONE [13:13:44.919] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... [13:13:44.920] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... DONE [13:13:44.920] Exporting '...future.elements_ii' (112 bytes) to cluster node #1 ... [13:13:44.920] Exporting '...future.elements_ii' (112 bytes) to cluster node #1 ... DONE [13:13:44.921] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:13:44.921] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:13:44.921] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:13:44.922] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:13:44.922] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... DONE [13:13:44.922] MultisessionFuture started [13:13:44.923] - Launch lazy future ... done [13:13:44.923] run() for 'MultisessionFuture' ... done [13:13:44.923] Created future: [13:13:44.940] receiveMessageFromWorker() for ClusterFuture ... [13:13:44.940] - Validating connection of MultisessionFuture [13:13:44.940] - received message: FutureResult [13:13:44.940] - Received FutureResult [13:13:44.941] - Erased future from FutureRegistry [13:13:44.941] result() for ClusterFuture ... [13:13:44.941] - result already collected: FutureResult [13:13:44.941] result() for ClusterFuture ... done [13:13:44.941] receiveMessageFromWorker() for ClusterFuture ... done [13:13:44.923] MultisessionFuture: [13:13:44.923] Label: 'future_lapply-1' [13:13:44.923] Expression: [13:13:44.923] { [13:13:44.923] do.call(function(...) { [13:13:44.923] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:44.923] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:44.923] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:44.923] on.exit(options(oopts), add = TRUE) [13:13:44.923] } [13:13:44.923] { [13:13:44.923] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:44.923] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:44.923] ...future.FUN(...future.X_jj, ...) [13:13:44.923] }) [13:13:44.923] } [13:13:44.923] }, args = future.call.arguments) [13:13:44.923] } [13:13:44.923] Lazy evaluation: FALSE [13:13:44.923] Asynchronous evaluation: TRUE [13:13:44.923] Local evaluation: TRUE [13:13:44.923] Environment: R_GlobalEnv [13:13:44.923] Capture standard output: TRUE [13:13:44.923] Capture condition classes: 'condition' (excluding 'nothing') [13:13:44.923] 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) [13:13:44.923] Packages: [13:13:44.923] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:44.923] Resolved: TRUE [13:13:44.923] Value: [13:13:44.923] Conditions captured: [13:13:44.923] Early signaling: FALSE [13:13:44.923] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:44.923] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:44.942] Chunk #1 of 4 ... DONE [13:13:44.942] Chunk #2 of 4 ... [13:13:44.942] - Finding globals in 'X' for chunk #2 ... [13:13:44.942] getGlobalsAndPackages() ... [13:13:44.942] Searching for globals... [13:13:44.943] [13:13:44.943] Searching for globals ... DONE [13:13:44.943] - globals: [0] [13:13:44.943] getGlobalsAndPackages() ... DONE [13:13:44.943] + additional globals found: [n=0] [13:13:44.943] + additional namespaces needed: [n=0] [13:13:44.944] - Finding globals in 'X' for chunk #2 ... DONE [13:13:44.944] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [13:13:44.944] - seeds: [13:13:44.944] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:44.944] getGlobalsAndPackages() ... [13:13:44.944] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:44.945] Resolving globals: FALSE [13:13:44.945] Tweak future expression to call with '...' arguments ... [13:13:44.945] { [13:13:44.945] do.call(function(...) { [13:13:44.945] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:44.945] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:44.945] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:44.945] on.exit(options(oopts), add = TRUE) [13:13:44.945] } [13:13:44.945] { [13:13:44.945] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:44.945] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:44.945] ...future.FUN(...future.X_jj, ...) [13:13:44.945] }) [13:13:44.945] } [13:13:44.945] }, args = future.call.arguments) [13:13:44.945] } [13:13:44.945] Tweak future expression to call with '...' arguments ... DONE [13:13:44.946] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:44.946] [13:13:44.946] getGlobalsAndPackages() ... DONE [13:13:44.947] run() for 'Future' ... [13:13:44.947] - state: 'created' [13:13:44.947] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:44.963] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:44.963] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:13:44.963] - Field: 'node' [13:13:44.963] - Field: 'label' [13:13:44.963] - Field: 'local' [13:13:44.964] - Field: 'owner' [13:13:44.964] - Field: 'envir' [13:13:44.964] - Field: 'workers' [13:13:44.964] - Field: 'packages' [13:13:44.964] - Field: 'gc' [13:13:44.964] - Field: 'conditions' [13:13:44.965] - Field: 'persistent' [13:13:44.965] - Field: 'expr' [13:13:44.965] - Field: 'uuid' [13:13:44.965] - Field: 'seed' [13:13:44.965] - Field: 'version' [13:13:44.966] - Field: 'result' [13:13:44.966] - Field: 'asynchronous' [13:13:44.966] - Field: 'calls' [13:13:44.966] - Field: 'globals' [13:13:44.966] - Field: 'stdout' [13:13:44.966] - Field: 'earlySignal' [13:13:44.967] - Field: 'lazy' [13:13:44.967] - Field: 'state' [13:13:44.967] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:13:44.967] - Launch lazy future ... [13:13:44.968] Packages needed by the future expression (n = 0): [13:13:44.968] Packages needed by future strategies (n = 0): [13:13:44.968] { [13:13:44.968] { [13:13:44.968] { [13:13:44.968] ...future.startTime <- base::Sys.time() [13:13:44.968] { [13:13:44.968] { [13:13:44.968] { [13:13:44.968] { [13:13:44.968] base::local({ [13:13:44.968] has_future <- base::requireNamespace("future", [13:13:44.968] quietly = TRUE) [13:13:44.968] if (has_future) { [13:13:44.968] ns <- base::getNamespace("future") [13:13:44.968] version <- ns[[".package"]][["version"]] [13:13:44.968] if (is.null(version)) [13:13:44.968] version <- utils::packageVersion("future") [13:13:44.968] } [13:13:44.968] else { [13:13:44.968] version <- NULL [13:13:44.968] } [13:13:44.968] if (!has_future || version < "1.8.0") { [13:13:44.968] info <- base::c(r_version = base::gsub("R version ", [13:13:44.968] "", base::R.version$version.string), [13:13:44.968] platform = base::sprintf("%s (%s-bit)", [13:13:44.968] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:44.968] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:44.968] "release", "version")], collapse = " "), [13:13:44.968] hostname = base::Sys.info()[["nodename"]]) [13:13:44.968] info <- base::sprintf("%s: %s", base::names(info), [13:13:44.968] info) [13:13:44.968] info <- base::paste(info, collapse = "; ") [13:13:44.968] if (!has_future) { [13:13:44.968] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:44.968] info) [13:13:44.968] } [13:13:44.968] else { [13:13:44.968] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:44.968] info, version) [13:13:44.968] } [13:13:44.968] base::stop(msg) [13:13:44.968] } [13:13:44.968] }) [13:13:44.968] } [13:13:44.968] ...future.mc.cores.old <- base::getOption("mc.cores") [13:13:44.968] base::options(mc.cores = 1L) [13:13:44.968] } [13:13:44.968] options(future.plan = NULL) [13:13:44.968] Sys.unsetenv("R_FUTURE_PLAN") [13:13:44.968] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:44.968] } [13:13:44.968] ...future.workdir <- getwd() [13:13:44.968] } [13:13:44.968] ...future.oldOptions <- base::as.list(base::.Options) [13:13:44.968] ...future.oldEnvVars <- base::Sys.getenv() [13:13:44.968] } [13:13:44.968] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:44.968] future.globals.maxSize = 2097152000, future.globals.method = NULL, [13:13:44.968] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:44.968] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:44.968] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:44.968] future.stdout.windows.reencode = NULL, width = 80L) [13:13:44.968] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:44.968] base::names(...future.oldOptions)) [13:13:44.968] } [13:13:44.968] if (FALSE) { [13:13:44.968] } [13:13:44.968] else { [13:13:44.968] if (TRUE) { [13:13:44.968] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:44.968] open = "w") [13:13:44.968] } [13:13:44.968] else { [13:13:44.968] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:44.968] windows = "NUL", "/dev/null"), open = "w") [13:13:44.968] } [13:13:44.968] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:44.968] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:44.968] base::sink(type = "output", split = FALSE) [13:13:44.968] base::close(...future.stdout) [13:13:44.968] }, add = TRUE) [13:13:44.968] } [13:13:44.968] ...future.frame <- base::sys.nframe() [13:13:44.968] ...future.conditions <- base::list() [13:13:44.968] ...future.rng <- base::globalenv()$.Random.seed [13:13:44.968] if (FALSE) { [13:13:44.968] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:44.968] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:44.968] } [13:13:44.968] ...future.result <- base::tryCatch({ [13:13:44.968] base::withCallingHandlers({ [13:13:44.968] ...future.value <- base::withVisible(base::local({ [13:13:44.968] ...future.makeSendCondition <- local({ [13:13:44.968] sendCondition <- NULL [13:13:44.968] function(frame = 1L) { [13:13:44.968] if (is.function(sendCondition)) [13:13:44.968] return(sendCondition) [13:13:44.968] ns <- getNamespace("parallel") [13:13:44.968] if (exists("sendData", mode = "function", [13:13:44.968] envir = ns)) { [13:13:44.968] parallel_sendData <- get("sendData", mode = "function", [13:13:44.968] envir = ns) [13:13:44.968] envir <- sys.frame(frame) [13:13:44.968] master <- NULL [13:13:44.968] while (!identical(envir, .GlobalEnv) && [13:13:44.968] !identical(envir, emptyenv())) { [13:13:44.968] if (exists("master", mode = "list", envir = envir, [13:13:44.968] inherits = FALSE)) { [13:13:44.968] master <- get("master", mode = "list", [13:13:44.968] envir = envir, inherits = FALSE) [13:13:44.968] if (inherits(master, c("SOCKnode", [13:13:44.968] "SOCK0node"))) { [13:13:44.968] sendCondition <<- function(cond) { [13:13:44.968] data <- list(type = "VALUE", value = cond, [13:13:44.968] success = TRUE) [13:13:44.968] parallel_sendData(master, data) [13:13:44.968] } [13:13:44.968] return(sendCondition) [13:13:44.968] } [13:13:44.968] } [13:13:44.968] frame <- frame + 1L [13:13:44.968] envir <- sys.frame(frame) [13:13:44.968] } [13:13:44.968] } [13:13:44.968] sendCondition <<- function(cond) NULL [13:13:44.968] } [13:13:44.968] }) [13:13:44.968] withCallingHandlers({ [13:13:44.968] { [13:13:44.968] do.call(function(...) { [13:13:44.968] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:44.968] if (!identical(...future.globals.maxSize.org, [13:13:44.968] ...future.globals.maxSize)) { [13:13:44.968] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:44.968] on.exit(options(oopts), add = TRUE) [13:13:44.968] } [13:13:44.968] { [13:13:44.968] lapply(seq_along(...future.elements_ii), [13:13:44.968] FUN = function(jj) { [13:13:44.968] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:44.968] ...future.FUN(...future.X_jj, ...) [13:13:44.968] }) [13:13:44.968] } [13:13:44.968] }, args = future.call.arguments) [13:13:44.968] } [13:13:44.968] }, immediateCondition = function(cond) { [13:13:44.968] sendCondition <- ...future.makeSendCondition() [13:13:44.968] sendCondition(cond) [13:13:44.968] muffleCondition <- function (cond, pattern = "^muffle") [13:13:44.968] { [13:13:44.968] inherits <- base::inherits [13:13:44.968] invokeRestart <- base::invokeRestart [13:13:44.968] is.null <- base::is.null [13:13:44.968] muffled <- FALSE [13:13:44.968] if (inherits(cond, "message")) { [13:13:44.968] muffled <- grepl(pattern, "muffleMessage") [13:13:44.968] if (muffled) [13:13:44.968] invokeRestart("muffleMessage") [13:13:44.968] } [13:13:44.968] else if (inherits(cond, "warning")) { [13:13:44.968] muffled <- grepl(pattern, "muffleWarning") [13:13:44.968] if (muffled) [13:13:44.968] invokeRestart("muffleWarning") [13:13:44.968] } [13:13:44.968] else if (inherits(cond, "condition")) { [13:13:44.968] if (!is.null(pattern)) { [13:13:44.968] computeRestarts <- base::computeRestarts [13:13:44.968] grepl <- base::grepl [13:13:44.968] restarts <- computeRestarts(cond) [13:13:44.968] for (restart in restarts) { [13:13:44.968] name <- restart$name [13:13:44.968] if (is.null(name)) [13:13:44.968] next [13:13:44.968] if (!grepl(pattern, name)) [13:13:44.968] next [13:13:44.968] invokeRestart(restart) [13:13:44.968] muffled <- TRUE [13:13:44.968] break [13:13:44.968] } [13:13:44.968] } [13:13:44.968] } [13:13:44.968] invisible(muffled) [13:13:44.968] } [13:13:44.968] muffleCondition(cond) [13:13:44.968] }) [13:13:44.968] })) [13:13:44.968] future::FutureResult(value = ...future.value$value, [13:13:44.968] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:44.968] ...future.rng), globalenv = if (FALSE) [13:13:44.968] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:44.968] ...future.globalenv.names)) [13:13:44.968] else NULL, started = ...future.startTime, version = "1.8") [13:13:44.968] }, condition = base::local({ [13:13:44.968] c <- base::c [13:13:44.968] inherits <- base::inherits [13:13:44.968] invokeRestart <- base::invokeRestart [13:13:44.968] length <- base::length [13:13:44.968] list <- base::list [13:13:44.968] seq.int <- base::seq.int [13:13:44.968] signalCondition <- base::signalCondition [13:13:44.968] sys.calls <- base::sys.calls [13:13:44.968] `[[` <- base::`[[` [13:13:44.968] `+` <- base::`+` [13:13:44.968] `<<-` <- base::`<<-` [13:13:44.968] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:44.968] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:44.968] 3L)] [13:13:44.968] } [13:13:44.968] function(cond) { [13:13:44.968] is_error <- inherits(cond, "error") [13:13:44.968] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:44.968] NULL) [13:13:44.968] if (is_error) { [13:13:44.968] sessionInformation <- function() { [13:13:44.968] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:44.968] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:44.968] search = base::search(), system = base::Sys.info()) [13:13:44.968] } [13:13:44.968] ...future.conditions[[length(...future.conditions) + [13:13:44.968] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:44.968] cond$call), session = sessionInformation(), [13:13:44.968] timestamp = base::Sys.time(), signaled = 0L) [13:13:44.968] signalCondition(cond) [13:13:44.968] } [13:13:44.968] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:44.968] "immediateCondition"))) { [13:13:44.968] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:44.968] ...future.conditions[[length(...future.conditions) + [13:13:44.968] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:44.968] if (TRUE && !signal) { [13:13:44.968] muffleCondition <- function (cond, pattern = "^muffle") [13:13:44.968] { [13:13:44.968] inherits <- base::inherits [13:13:44.968] invokeRestart <- base::invokeRestart [13:13:44.968] is.null <- base::is.null [13:13:44.968] muffled <- FALSE [13:13:44.968] if (inherits(cond, "message")) { [13:13:44.968] muffled <- grepl(pattern, "muffleMessage") [13:13:44.968] if (muffled) [13:13:44.968] invokeRestart("muffleMessage") [13:13:44.968] } [13:13:44.968] else if (inherits(cond, "warning")) { [13:13:44.968] muffled <- grepl(pattern, "muffleWarning") [13:13:44.968] if (muffled) [13:13:44.968] invokeRestart("muffleWarning") [13:13:44.968] } [13:13:44.968] else if (inherits(cond, "condition")) { [13:13:44.968] if (!is.null(pattern)) { [13:13:44.968] computeRestarts <- base::computeRestarts [13:13:44.968] grepl <- base::grepl [13:13:44.968] restarts <- computeRestarts(cond) [13:13:44.968] for (restart in restarts) { [13:13:44.968] name <- restart$name [13:13:44.968] if (is.null(name)) [13:13:44.968] next [13:13:44.968] if (!grepl(pattern, name)) [13:13:44.968] next [13:13:44.968] invokeRestart(restart) [13:13:44.968] muffled <- TRUE [13:13:44.968] break [13:13:44.968] } [13:13:44.968] } [13:13:44.968] } [13:13:44.968] invisible(muffled) [13:13:44.968] } [13:13:44.968] muffleCondition(cond, pattern = "^muffle") [13:13:44.968] } [13:13:44.968] } [13:13:44.968] else { [13:13:44.968] if (TRUE) { [13:13:44.968] muffleCondition <- function (cond, pattern = "^muffle") [13:13:44.968] { [13:13:44.968] inherits <- base::inherits [13:13:44.968] invokeRestart <- base::invokeRestart [13:13:44.968] is.null <- base::is.null [13:13:44.968] muffled <- FALSE [13:13:44.968] if (inherits(cond, "message")) { [13:13:44.968] muffled <- grepl(pattern, "muffleMessage") [13:13:44.968] if (muffled) [13:13:44.968] invokeRestart("muffleMessage") [13:13:44.968] } [13:13:44.968] else if (inherits(cond, "warning")) { [13:13:44.968] muffled <- grepl(pattern, "muffleWarning") [13:13:44.968] if (muffled) [13:13:44.968] invokeRestart("muffleWarning") [13:13:44.968] } [13:13:44.968] else if (inherits(cond, "condition")) { [13:13:44.968] if (!is.null(pattern)) { [13:13:44.968] computeRestarts <- base::computeRestarts [13:13:44.968] grepl <- base::grepl [13:13:44.968] restarts <- computeRestarts(cond) [13:13:44.968] for (restart in restarts) { [13:13:44.968] name <- restart$name [13:13:44.968] if (is.null(name)) [13:13:44.968] next [13:13:44.968] if (!grepl(pattern, name)) [13:13:44.968] next [13:13:44.968] invokeRestart(restart) [13:13:44.968] muffled <- TRUE [13:13:44.968] break [13:13:44.968] } [13:13:44.968] } [13:13:44.968] } [13:13:44.968] invisible(muffled) [13:13:44.968] } [13:13:44.968] muffleCondition(cond, pattern = "^muffle") [13:13:44.968] } [13:13:44.968] } [13:13:44.968] } [13:13:44.968] })) [13:13:44.968] }, error = function(ex) { [13:13:44.968] base::structure(base::list(value = NULL, visible = NULL, [13:13:44.968] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:44.968] ...future.rng), started = ...future.startTime, [13:13:44.968] finished = Sys.time(), session_uuid = NA_character_, [13:13:44.968] version = "1.8"), class = "FutureResult") [13:13:44.968] }, finally = { [13:13:44.968] if (!identical(...future.workdir, getwd())) [13:13:44.968] setwd(...future.workdir) [13:13:44.968] { [13:13:44.968] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:44.968] ...future.oldOptions$nwarnings <- NULL [13:13:44.968] } [13:13:44.968] base::options(...future.oldOptions) [13:13:44.968] if (.Platform$OS.type == "windows") { [13:13:44.968] old_names <- names(...future.oldEnvVars) [13:13:44.968] envs <- base::Sys.getenv() [13:13:44.968] names <- names(envs) [13:13:44.968] common <- intersect(names, old_names) [13:13:44.968] added <- setdiff(names, old_names) [13:13:44.968] removed <- setdiff(old_names, names) [13:13:44.968] changed <- common[...future.oldEnvVars[common] != [13:13:44.968] envs[common]] [13:13:44.968] NAMES <- toupper(changed) [13:13:44.968] args <- list() [13:13:44.968] for (kk in seq_along(NAMES)) { [13:13:44.968] name <- changed[[kk]] [13:13:44.968] NAME <- NAMES[[kk]] [13:13:44.968] if (name != NAME && is.element(NAME, old_names)) [13:13:44.968] next [13:13:44.968] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:44.968] } [13:13:44.968] NAMES <- toupper(added) [13:13:44.968] for (kk in seq_along(NAMES)) { [13:13:44.968] name <- added[[kk]] [13:13:44.968] NAME <- NAMES[[kk]] [13:13:44.968] if (name != NAME && is.element(NAME, old_names)) [13:13:44.968] next [13:13:44.968] args[[name]] <- "" [13:13:44.968] } [13:13:44.968] NAMES <- toupper(removed) [13:13:44.968] for (kk in seq_along(NAMES)) { [13:13:44.968] name <- removed[[kk]] [13:13:44.968] NAME <- NAMES[[kk]] [13:13:44.968] if (name != NAME && is.element(NAME, old_names)) [13:13:44.968] next [13:13:44.968] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:44.968] } [13:13:44.968] if (length(args) > 0) [13:13:44.968] base::do.call(base::Sys.setenv, args = args) [13:13:44.968] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:44.968] } [13:13:44.968] else { [13:13:44.968] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:44.968] } [13:13:44.968] { [13:13:44.968] if (base::length(...future.futureOptionsAdded) > [13:13:44.968] 0L) { [13:13:44.968] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:44.968] base::names(opts) <- ...future.futureOptionsAdded [13:13:44.968] base::options(opts) [13:13:44.968] } [13:13:44.968] { [13:13:44.968] { [13:13:44.968] base::options(mc.cores = ...future.mc.cores.old) [13:13:44.968] NULL [13:13:44.968] } [13:13:44.968] options(future.plan = NULL) [13:13:44.968] if (is.na(NA_character_)) [13:13:44.968] Sys.unsetenv("R_FUTURE_PLAN") [13:13:44.968] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:44.968] future::plan(list(function (..., workers = availableCores(), [13:13:44.968] lazy = FALSE, rscript_libs = .libPaths(), [13:13:44.968] envir = parent.frame()) [13:13:44.968] { [13:13:44.968] if (is.function(workers)) [13:13:44.968] workers <- workers() [13:13:44.968] workers <- structure(as.integer(workers), [13:13:44.968] class = class(workers)) [13:13:44.968] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:44.968] workers >= 1) [13:13:44.968] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:44.968] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:44.968] } [13:13:44.968] future <- MultisessionFuture(..., workers = workers, [13:13:44.968] lazy = lazy, rscript_libs = rscript_libs, [13:13:44.968] envir = envir) [13:13:44.968] if (!future$lazy) [13:13:44.968] future <- run(future) [13:13:44.968] invisible(future) [13:13:44.968] }), .cleanup = FALSE, .init = FALSE) [13:13:44.968] } [13:13:44.968] } [13:13:44.968] } [13:13:44.968] }) [13:13:44.968] if (TRUE) { [13:13:44.968] base::sink(type = "output", split = FALSE) [13:13:44.968] if (TRUE) { [13:13:44.968] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:44.968] } [13:13:44.968] else { [13:13:44.968] ...future.result["stdout"] <- base::list(NULL) [13:13:44.968] } [13:13:44.968] base::close(...future.stdout) [13:13:44.968] ...future.stdout <- NULL [13:13:44.968] } [13:13:44.968] ...future.result$conditions <- ...future.conditions [13:13:44.968] ...future.result$finished <- base::Sys.time() [13:13:44.968] ...future.result [13:13:44.968] } [13:13:44.974] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... [13:13:44.974] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... [13:13:44.974] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... DONE [13:13:44.975] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... [13:13:44.975] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... DONE [13:13:44.975] Exporting '...future.elements_ii' (112 bytes) to cluster node #1 ... [13:13:44.976] Exporting '...future.elements_ii' (112 bytes) to cluster node #1 ... DONE [13:13:44.976] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:13:44.976] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:13:44.977] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:13:44.979] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:13:44.979] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... DONE [13:13:44.980] MultisessionFuture started [13:13:44.980] - Launch lazy future ... done [13:13:44.981] run() for 'MultisessionFuture' ... done [13:13:44.981] Created future: [13:13:44.997] receiveMessageFromWorker() for ClusterFuture ... [13:13:44.997] - Validating connection of MultisessionFuture [13:13:44.997] - received message: FutureResult [13:13:44.997] - Received FutureResult [13:13:44.997] - Erased future from FutureRegistry [13:13:44.998] result() for ClusterFuture ... [13:13:44.998] - result already collected: FutureResult [13:13:44.998] result() for ClusterFuture ... done [13:13:44.998] receiveMessageFromWorker() for ClusterFuture ... done [13:13:44.981] MultisessionFuture: [13:13:44.981] Label: 'future_lapply-2' [13:13:44.981] Expression: [13:13:44.981] { [13:13:44.981] do.call(function(...) { [13:13:44.981] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:44.981] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:44.981] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:44.981] on.exit(options(oopts), add = TRUE) [13:13:44.981] } [13:13:44.981] { [13:13:44.981] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:44.981] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:44.981] ...future.FUN(...future.X_jj, ...) [13:13:44.981] }) [13:13:44.981] } [13:13:44.981] }, args = future.call.arguments) [13:13:44.981] } [13:13:44.981] Lazy evaluation: FALSE [13:13:44.981] Asynchronous evaluation: TRUE [13:13:44.981] Local evaluation: TRUE [13:13:44.981] Environment: R_GlobalEnv [13:13:44.981] Capture standard output: TRUE [13:13:44.981] Capture condition classes: 'condition' (excluding 'nothing') [13:13:44.981] 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) [13:13:44.981] Packages: [13:13:44.981] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:44.981] Resolved: TRUE [13:13:44.981] Value: [13:13:44.981] Conditions captured: [13:13:44.981] Early signaling: FALSE [13:13:44.981] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:44.981] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:44.998] Chunk #2 of 4 ... DONE [13:13:44.999] Chunk #3 of 4 ... [13:13:44.999] - Finding globals in 'X' for chunk #3 ... [13:13:44.999] getGlobalsAndPackages() ... [13:13:44.999] Searching for globals... [13:13:44.999] [13:13:45.000] Searching for globals ... DONE [13:13:45.000] - globals: [0] [13:13:45.000] getGlobalsAndPackages() ... DONE [13:13:45.000] + additional globals found: [n=0] [13:13:45.000] + additional namespaces needed: [n=0] [13:13:45.000] - Finding globals in 'X' for chunk #3 ... DONE [13:13:45.001] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [13:13:45.001] - seeds: [13:13:45.001] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:45.001] getGlobalsAndPackages() ... [13:13:45.001] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:45.001] Resolving globals: FALSE [13:13:45.002] Tweak future expression to call with '...' arguments ... [13:13:45.002] { [13:13:45.002] do.call(function(...) { [13:13:45.002] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:45.002] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:45.002] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:45.002] on.exit(options(oopts), add = TRUE) [13:13:45.002] } [13:13:45.002] { [13:13:45.002] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:45.002] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:45.002] ...future.FUN(...future.X_jj, ...) [13:13:45.002] }) [13:13:45.002] } [13:13:45.002] }, args = future.call.arguments) [13:13:45.002] } [13:13:45.002] Tweak future expression to call with '...' arguments ... DONE [13:13:45.003] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:45.003] [13:13:45.003] getGlobalsAndPackages() ... DONE [13:13:45.003] run() for 'Future' ... [13:13:45.003] - state: 'created' [13:13:45.004] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:45.017] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:45.017] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:13:45.018] - Field: 'node' [13:13:45.018] - Field: 'label' [13:13:45.018] - Field: 'local' [13:13:45.018] - Field: 'owner' [13:13:45.018] - Field: 'envir' [13:13:45.018] - Field: 'workers' [13:13:45.019] - Field: 'packages' [13:13:45.019] - Field: 'gc' [13:13:45.019] - Field: 'conditions' [13:13:45.019] - Field: 'persistent' [13:13:45.019] - Field: 'expr' [13:13:45.019] - Field: 'uuid' [13:13:45.020] - Field: 'seed' [13:13:45.020] - Field: 'version' [13:13:45.020] - Field: 'result' [13:13:45.020] - Field: 'asynchronous' [13:13:45.020] - Field: 'calls' [13:13:45.020] - Field: 'globals' [13:13:45.021] - Field: 'stdout' [13:13:45.021] - Field: 'earlySignal' [13:13:45.021] - Field: 'lazy' [13:13:45.021] - Field: 'state' [13:13:45.021] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:13:45.022] - Launch lazy future ... [13:13:45.022] Packages needed by the future expression (n = 0): [13:13:45.022] Packages needed by future strategies (n = 0): [13:13:45.023] { [13:13:45.023] { [13:13:45.023] { [13:13:45.023] ...future.startTime <- base::Sys.time() [13:13:45.023] { [13:13:45.023] { [13:13:45.023] { [13:13:45.023] { [13:13:45.023] base::local({ [13:13:45.023] has_future <- base::requireNamespace("future", [13:13:45.023] quietly = TRUE) [13:13:45.023] if (has_future) { [13:13:45.023] ns <- base::getNamespace("future") [13:13:45.023] version <- ns[[".package"]][["version"]] [13:13:45.023] if (is.null(version)) [13:13:45.023] version <- utils::packageVersion("future") [13:13:45.023] } [13:13:45.023] else { [13:13:45.023] version <- NULL [13:13:45.023] } [13:13:45.023] if (!has_future || version < "1.8.0") { [13:13:45.023] info <- base::c(r_version = base::gsub("R version ", [13:13:45.023] "", base::R.version$version.string), [13:13:45.023] platform = base::sprintf("%s (%s-bit)", [13:13:45.023] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:45.023] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:45.023] "release", "version")], collapse = " "), [13:13:45.023] hostname = base::Sys.info()[["nodename"]]) [13:13:45.023] info <- base::sprintf("%s: %s", base::names(info), [13:13:45.023] info) [13:13:45.023] info <- base::paste(info, collapse = "; ") [13:13:45.023] if (!has_future) { [13:13:45.023] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:45.023] info) [13:13:45.023] } [13:13:45.023] else { [13:13:45.023] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:45.023] info, version) [13:13:45.023] } [13:13:45.023] base::stop(msg) [13:13:45.023] } [13:13:45.023] }) [13:13:45.023] } [13:13:45.023] ...future.mc.cores.old <- base::getOption("mc.cores") [13:13:45.023] base::options(mc.cores = 1L) [13:13:45.023] } [13:13:45.023] options(future.plan = NULL) [13:13:45.023] Sys.unsetenv("R_FUTURE_PLAN") [13:13:45.023] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:45.023] } [13:13:45.023] ...future.workdir <- getwd() [13:13:45.023] } [13:13:45.023] ...future.oldOptions <- base::as.list(base::.Options) [13:13:45.023] ...future.oldEnvVars <- base::Sys.getenv() [13:13:45.023] } [13:13:45.023] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:45.023] future.globals.maxSize = 2097152000, future.globals.method = NULL, [13:13:45.023] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:45.023] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:45.023] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:45.023] future.stdout.windows.reencode = NULL, width = 80L) [13:13:45.023] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:45.023] base::names(...future.oldOptions)) [13:13:45.023] } [13:13:45.023] if (FALSE) { [13:13:45.023] } [13:13:45.023] else { [13:13:45.023] if (TRUE) { [13:13:45.023] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:45.023] open = "w") [13:13:45.023] } [13:13:45.023] else { [13:13:45.023] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:45.023] windows = "NUL", "/dev/null"), open = "w") [13:13:45.023] } [13:13:45.023] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:45.023] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:45.023] base::sink(type = "output", split = FALSE) [13:13:45.023] base::close(...future.stdout) [13:13:45.023] }, add = TRUE) [13:13:45.023] } [13:13:45.023] ...future.frame <- base::sys.nframe() [13:13:45.023] ...future.conditions <- base::list() [13:13:45.023] ...future.rng <- base::globalenv()$.Random.seed [13:13:45.023] if (FALSE) { [13:13:45.023] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:45.023] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:45.023] } [13:13:45.023] ...future.result <- base::tryCatch({ [13:13:45.023] base::withCallingHandlers({ [13:13:45.023] ...future.value <- base::withVisible(base::local({ [13:13:45.023] ...future.makeSendCondition <- local({ [13:13:45.023] sendCondition <- NULL [13:13:45.023] function(frame = 1L) { [13:13:45.023] if (is.function(sendCondition)) [13:13:45.023] return(sendCondition) [13:13:45.023] ns <- getNamespace("parallel") [13:13:45.023] if (exists("sendData", mode = "function", [13:13:45.023] envir = ns)) { [13:13:45.023] parallel_sendData <- get("sendData", mode = "function", [13:13:45.023] envir = ns) [13:13:45.023] envir <- sys.frame(frame) [13:13:45.023] master <- NULL [13:13:45.023] while (!identical(envir, .GlobalEnv) && [13:13:45.023] !identical(envir, emptyenv())) { [13:13:45.023] if (exists("master", mode = "list", envir = envir, [13:13:45.023] inherits = FALSE)) { [13:13:45.023] master <- get("master", mode = "list", [13:13:45.023] envir = envir, inherits = FALSE) [13:13:45.023] if (inherits(master, c("SOCKnode", [13:13:45.023] "SOCK0node"))) { [13:13:45.023] sendCondition <<- function(cond) { [13:13:45.023] data <- list(type = "VALUE", value = cond, [13:13:45.023] success = TRUE) [13:13:45.023] parallel_sendData(master, data) [13:13:45.023] } [13:13:45.023] return(sendCondition) [13:13:45.023] } [13:13:45.023] } [13:13:45.023] frame <- frame + 1L [13:13:45.023] envir <- sys.frame(frame) [13:13:45.023] } [13:13:45.023] } [13:13:45.023] sendCondition <<- function(cond) NULL [13:13:45.023] } [13:13:45.023] }) [13:13:45.023] withCallingHandlers({ [13:13:45.023] { [13:13:45.023] do.call(function(...) { [13:13:45.023] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:45.023] if (!identical(...future.globals.maxSize.org, [13:13:45.023] ...future.globals.maxSize)) { [13:13:45.023] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:45.023] on.exit(options(oopts), add = TRUE) [13:13:45.023] } [13:13:45.023] { [13:13:45.023] lapply(seq_along(...future.elements_ii), [13:13:45.023] FUN = function(jj) { [13:13:45.023] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:45.023] ...future.FUN(...future.X_jj, ...) [13:13:45.023] }) [13:13:45.023] } [13:13:45.023] }, args = future.call.arguments) [13:13:45.023] } [13:13:45.023] }, immediateCondition = function(cond) { [13:13:45.023] sendCondition <- ...future.makeSendCondition() [13:13:45.023] sendCondition(cond) [13:13:45.023] muffleCondition <- function (cond, pattern = "^muffle") [13:13:45.023] { [13:13:45.023] inherits <- base::inherits [13:13:45.023] invokeRestart <- base::invokeRestart [13:13:45.023] is.null <- base::is.null [13:13:45.023] muffled <- FALSE [13:13:45.023] if (inherits(cond, "message")) { [13:13:45.023] muffled <- grepl(pattern, "muffleMessage") [13:13:45.023] if (muffled) [13:13:45.023] invokeRestart("muffleMessage") [13:13:45.023] } [13:13:45.023] else if (inherits(cond, "warning")) { [13:13:45.023] muffled <- grepl(pattern, "muffleWarning") [13:13:45.023] if (muffled) [13:13:45.023] invokeRestart("muffleWarning") [13:13:45.023] } [13:13:45.023] else if (inherits(cond, "condition")) { [13:13:45.023] if (!is.null(pattern)) { [13:13:45.023] computeRestarts <- base::computeRestarts [13:13:45.023] grepl <- base::grepl [13:13:45.023] restarts <- computeRestarts(cond) [13:13:45.023] for (restart in restarts) { [13:13:45.023] name <- restart$name [13:13:45.023] if (is.null(name)) [13:13:45.023] next [13:13:45.023] if (!grepl(pattern, name)) [13:13:45.023] next [13:13:45.023] invokeRestart(restart) [13:13:45.023] muffled <- TRUE [13:13:45.023] break [13:13:45.023] } [13:13:45.023] } [13:13:45.023] } [13:13:45.023] invisible(muffled) [13:13:45.023] } [13:13:45.023] muffleCondition(cond) [13:13:45.023] }) [13:13:45.023] })) [13:13:45.023] future::FutureResult(value = ...future.value$value, [13:13:45.023] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:45.023] ...future.rng), globalenv = if (FALSE) [13:13:45.023] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:45.023] ...future.globalenv.names)) [13:13:45.023] else NULL, started = ...future.startTime, version = "1.8") [13:13:45.023] }, condition = base::local({ [13:13:45.023] c <- base::c [13:13:45.023] inherits <- base::inherits [13:13:45.023] invokeRestart <- base::invokeRestart [13:13:45.023] length <- base::length [13:13:45.023] list <- base::list [13:13:45.023] seq.int <- base::seq.int [13:13:45.023] signalCondition <- base::signalCondition [13:13:45.023] sys.calls <- base::sys.calls [13:13:45.023] `[[` <- base::`[[` [13:13:45.023] `+` <- base::`+` [13:13:45.023] `<<-` <- base::`<<-` [13:13:45.023] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:45.023] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:45.023] 3L)] [13:13:45.023] } [13:13:45.023] function(cond) { [13:13:45.023] is_error <- inherits(cond, "error") [13:13:45.023] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:45.023] NULL) [13:13:45.023] if (is_error) { [13:13:45.023] sessionInformation <- function() { [13:13:45.023] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:45.023] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:45.023] search = base::search(), system = base::Sys.info()) [13:13:45.023] } [13:13:45.023] ...future.conditions[[length(...future.conditions) + [13:13:45.023] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:45.023] cond$call), session = sessionInformation(), [13:13:45.023] timestamp = base::Sys.time(), signaled = 0L) [13:13:45.023] signalCondition(cond) [13:13:45.023] } [13:13:45.023] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:45.023] "immediateCondition"))) { [13:13:45.023] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:45.023] ...future.conditions[[length(...future.conditions) + [13:13:45.023] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:45.023] if (TRUE && !signal) { [13:13:45.023] muffleCondition <- function (cond, pattern = "^muffle") [13:13:45.023] { [13:13:45.023] inherits <- base::inherits [13:13:45.023] invokeRestart <- base::invokeRestart [13:13:45.023] is.null <- base::is.null [13:13:45.023] muffled <- FALSE [13:13:45.023] if (inherits(cond, "message")) { [13:13:45.023] muffled <- grepl(pattern, "muffleMessage") [13:13:45.023] if (muffled) [13:13:45.023] invokeRestart("muffleMessage") [13:13:45.023] } [13:13:45.023] else if (inherits(cond, "warning")) { [13:13:45.023] muffled <- grepl(pattern, "muffleWarning") [13:13:45.023] if (muffled) [13:13:45.023] invokeRestart("muffleWarning") [13:13:45.023] } [13:13:45.023] else if (inherits(cond, "condition")) { [13:13:45.023] if (!is.null(pattern)) { [13:13:45.023] computeRestarts <- base::computeRestarts [13:13:45.023] grepl <- base::grepl [13:13:45.023] restarts <- computeRestarts(cond) [13:13:45.023] for (restart in restarts) { [13:13:45.023] name <- restart$name [13:13:45.023] if (is.null(name)) [13:13:45.023] next [13:13:45.023] if (!grepl(pattern, name)) [13:13:45.023] next [13:13:45.023] invokeRestart(restart) [13:13:45.023] muffled <- TRUE [13:13:45.023] break [13:13:45.023] } [13:13:45.023] } [13:13:45.023] } [13:13:45.023] invisible(muffled) [13:13:45.023] } [13:13:45.023] muffleCondition(cond, pattern = "^muffle") [13:13:45.023] } [13:13:45.023] } [13:13:45.023] else { [13:13:45.023] if (TRUE) { [13:13:45.023] muffleCondition <- function (cond, pattern = "^muffle") [13:13:45.023] { [13:13:45.023] inherits <- base::inherits [13:13:45.023] invokeRestart <- base::invokeRestart [13:13:45.023] is.null <- base::is.null [13:13:45.023] muffled <- FALSE [13:13:45.023] if (inherits(cond, "message")) { [13:13:45.023] muffled <- grepl(pattern, "muffleMessage") [13:13:45.023] if (muffled) [13:13:45.023] invokeRestart("muffleMessage") [13:13:45.023] } [13:13:45.023] else if (inherits(cond, "warning")) { [13:13:45.023] muffled <- grepl(pattern, "muffleWarning") [13:13:45.023] if (muffled) [13:13:45.023] invokeRestart("muffleWarning") [13:13:45.023] } [13:13:45.023] else if (inherits(cond, "condition")) { [13:13:45.023] if (!is.null(pattern)) { [13:13:45.023] computeRestarts <- base::computeRestarts [13:13:45.023] grepl <- base::grepl [13:13:45.023] restarts <- computeRestarts(cond) [13:13:45.023] for (restart in restarts) { [13:13:45.023] name <- restart$name [13:13:45.023] if (is.null(name)) [13:13:45.023] next [13:13:45.023] if (!grepl(pattern, name)) [13:13:45.023] next [13:13:45.023] invokeRestart(restart) [13:13:45.023] muffled <- TRUE [13:13:45.023] break [13:13:45.023] } [13:13:45.023] } [13:13:45.023] } [13:13:45.023] invisible(muffled) [13:13:45.023] } [13:13:45.023] muffleCondition(cond, pattern = "^muffle") [13:13:45.023] } [13:13:45.023] } [13:13:45.023] } [13:13:45.023] })) [13:13:45.023] }, error = function(ex) { [13:13:45.023] base::structure(base::list(value = NULL, visible = NULL, [13:13:45.023] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:45.023] ...future.rng), started = ...future.startTime, [13:13:45.023] finished = Sys.time(), session_uuid = NA_character_, [13:13:45.023] version = "1.8"), class = "FutureResult") [13:13:45.023] }, finally = { [13:13:45.023] if (!identical(...future.workdir, getwd())) [13:13:45.023] setwd(...future.workdir) [13:13:45.023] { [13:13:45.023] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:45.023] ...future.oldOptions$nwarnings <- NULL [13:13:45.023] } [13:13:45.023] base::options(...future.oldOptions) [13:13:45.023] if (.Platform$OS.type == "windows") { [13:13:45.023] old_names <- names(...future.oldEnvVars) [13:13:45.023] envs <- base::Sys.getenv() [13:13:45.023] names <- names(envs) [13:13:45.023] common <- intersect(names, old_names) [13:13:45.023] added <- setdiff(names, old_names) [13:13:45.023] removed <- setdiff(old_names, names) [13:13:45.023] changed <- common[...future.oldEnvVars[common] != [13:13:45.023] envs[common]] [13:13:45.023] NAMES <- toupper(changed) [13:13:45.023] args <- list() [13:13:45.023] for (kk in seq_along(NAMES)) { [13:13:45.023] name <- changed[[kk]] [13:13:45.023] NAME <- NAMES[[kk]] [13:13:45.023] if (name != NAME && is.element(NAME, old_names)) [13:13:45.023] next [13:13:45.023] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:45.023] } [13:13:45.023] NAMES <- toupper(added) [13:13:45.023] for (kk in seq_along(NAMES)) { [13:13:45.023] name <- added[[kk]] [13:13:45.023] NAME <- NAMES[[kk]] [13:13:45.023] if (name != NAME && is.element(NAME, old_names)) [13:13:45.023] next [13:13:45.023] args[[name]] <- "" [13:13:45.023] } [13:13:45.023] NAMES <- toupper(removed) [13:13:45.023] for (kk in seq_along(NAMES)) { [13:13:45.023] name <- removed[[kk]] [13:13:45.023] NAME <- NAMES[[kk]] [13:13:45.023] if (name != NAME && is.element(NAME, old_names)) [13:13:45.023] next [13:13:45.023] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:45.023] } [13:13:45.023] if (length(args) > 0) [13:13:45.023] base::do.call(base::Sys.setenv, args = args) [13:13:45.023] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:45.023] } [13:13:45.023] else { [13:13:45.023] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:45.023] } [13:13:45.023] { [13:13:45.023] if (base::length(...future.futureOptionsAdded) > [13:13:45.023] 0L) { [13:13:45.023] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:45.023] base::names(opts) <- ...future.futureOptionsAdded [13:13:45.023] base::options(opts) [13:13:45.023] } [13:13:45.023] { [13:13:45.023] { [13:13:45.023] base::options(mc.cores = ...future.mc.cores.old) [13:13:45.023] NULL [13:13:45.023] } [13:13:45.023] options(future.plan = NULL) [13:13:45.023] if (is.na(NA_character_)) [13:13:45.023] Sys.unsetenv("R_FUTURE_PLAN") [13:13:45.023] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:45.023] future::plan(list(function (..., workers = availableCores(), [13:13:45.023] lazy = FALSE, rscript_libs = .libPaths(), [13:13:45.023] envir = parent.frame()) [13:13:45.023] { [13:13:45.023] if (is.function(workers)) [13:13:45.023] workers <- workers() [13:13:45.023] workers <- structure(as.integer(workers), [13:13:45.023] class = class(workers)) [13:13:45.023] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:45.023] workers >= 1) [13:13:45.023] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:45.023] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:45.023] } [13:13:45.023] future <- MultisessionFuture(..., workers = workers, [13:13:45.023] lazy = lazy, rscript_libs = rscript_libs, [13:13:45.023] envir = envir) [13:13:45.023] if (!future$lazy) [13:13:45.023] future <- run(future) [13:13:45.023] invisible(future) [13:13:45.023] }), .cleanup = FALSE, .init = FALSE) [13:13:45.023] } [13:13:45.023] } [13:13:45.023] } [13:13:45.023] }) [13:13:45.023] if (TRUE) { [13:13:45.023] base::sink(type = "output", split = FALSE) [13:13:45.023] if (TRUE) { [13:13:45.023] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:45.023] } [13:13:45.023] else { [13:13:45.023] ...future.result["stdout"] <- base::list(NULL) [13:13:45.023] } [13:13:45.023] base::close(...future.stdout) [13:13:45.023] ...future.stdout <- NULL [13:13:45.023] } [13:13:45.023] ...future.result$conditions <- ...future.conditions [13:13:45.023] ...future.result$finished <- base::Sys.time() [13:13:45.023] ...future.result [13:13:45.023] } [13:13:45.028] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... [13:13:45.028] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... [13:13:45.029] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... DONE [13:13:45.029] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... [13:13:45.029] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... DONE [13:13:45.030] Exporting '...future.elements_ii' (120 bytes) to cluster node #1 ... [13:13:45.030] Exporting '...future.elements_ii' (120 bytes) to cluster node #1 ... DONE [13:13:45.030] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:13:45.031] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:13:45.031] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:13:45.031] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:13:45.031] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... DONE [13:13:45.032] MultisessionFuture started [13:13:45.032] - Launch lazy future ... done [13:13:45.033] run() for 'MultisessionFuture' ... done [13:13:45.033] Created future: [13:13:45.048] receiveMessageFromWorker() for ClusterFuture ... [13:13:45.048] - Validating connection of MultisessionFuture [13:13:45.048] - received message: FutureResult [13:13:45.048] - Received FutureResult [13:13:45.048] - Erased future from FutureRegistry [13:13:45.049] result() for ClusterFuture ... [13:13:45.049] - result already collected: FutureResult [13:13:45.049] result() for ClusterFuture ... done [13:13:45.049] receiveMessageFromWorker() for ClusterFuture ... done [13:13:45.033] MultisessionFuture: [13:13:45.033] Label: 'future_lapply-3' [13:13:45.033] Expression: [13:13:45.033] { [13:13:45.033] do.call(function(...) { [13:13:45.033] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:45.033] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:45.033] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:45.033] on.exit(options(oopts), add = TRUE) [13:13:45.033] } [13:13:45.033] { [13:13:45.033] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:45.033] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:45.033] ...future.FUN(...future.X_jj, ...) [13:13:45.033] }) [13:13:45.033] } [13:13:45.033] }, args = future.call.arguments) [13:13:45.033] } [13:13:45.033] Lazy evaluation: FALSE [13:13:45.033] Asynchronous evaluation: TRUE [13:13:45.033] Local evaluation: TRUE [13:13:45.033] Environment: R_GlobalEnv [13:13:45.033] Capture standard output: TRUE [13:13:45.033] Capture condition classes: 'condition' (excluding 'nothing') [13:13:45.033] 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) [13:13:45.033] Packages: [13:13:45.033] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:45.033] Resolved: TRUE [13:13:45.033] Value: [13:13:45.033] Conditions captured: [13:13:45.033] Early signaling: FALSE [13:13:45.033] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:45.033] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:45.050] Chunk #3 of 4 ... DONE [13:13:45.050] Chunk #4 of 4 ... [13:13:45.050] - Finding globals in 'X' for chunk #4 ... [13:13:45.050] getGlobalsAndPackages() ... [13:13:45.050] Searching for globals... [13:13:45.050] [13:13:45.051] Searching for globals ... DONE [13:13:45.051] - globals: [0] [13:13:45.051] getGlobalsAndPackages() ... DONE [13:13:45.051] + additional globals found: [n=0] [13:13:45.051] + additional namespaces needed: [n=0] [13:13:45.051] - Finding globals in 'X' for chunk #4 ... DONE [13:13:45.052] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [13:13:45.052] - seeds: [13:13:45.052] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:45.052] getGlobalsAndPackages() ... [13:13:45.052] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:45.052] Resolving globals: FALSE [13:13:45.053] Tweak future expression to call with '...' arguments ... [13:13:45.053] { [13:13:45.053] do.call(function(...) { [13:13:45.053] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:45.053] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:45.053] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:45.053] on.exit(options(oopts), add = TRUE) [13:13:45.053] } [13:13:45.053] { [13:13:45.053] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:45.053] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:45.053] ...future.FUN(...future.X_jj, ...) [13:13:45.053] }) [13:13:45.053] } [13:13:45.053] }, args = future.call.arguments) [13:13:45.053] } [13:13:45.053] Tweak future expression to call with '...' arguments ... DONE [13:13:45.054] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:45.054] [13:13:45.054] getGlobalsAndPackages() ... DONE [13:13:45.054] run() for 'Future' ... [13:13:45.055] - state: 'created' [13:13:45.055] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:45.068] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:45.069] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:13:45.069] - Field: 'node' [13:13:45.069] - Field: 'label' [13:13:45.069] - Field: 'local' [13:13:45.069] - Field: 'owner' [13:13:45.069] - Field: 'envir' [13:13:45.070] - Field: 'workers' [13:13:45.070] - Field: 'packages' [13:13:45.070] - Field: 'gc' [13:13:45.070] - Field: 'conditions' [13:13:45.070] - Field: 'persistent' [13:13:45.071] - Field: 'expr' [13:13:45.071] - Field: 'uuid' [13:13:45.071] - Field: 'seed' [13:13:45.071] - Field: 'version' [13:13:45.071] - Field: 'result' [13:13:45.071] - Field: 'asynchronous' [13:13:45.072] - Field: 'calls' [13:13:45.072] - Field: 'globals' [13:13:45.072] - Field: 'stdout' [13:13:45.072] - Field: 'earlySignal' [13:13:45.072] - Field: 'lazy' [13:13:45.072] - Field: 'state' [13:13:45.073] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:13:45.073] - Launch lazy future ... [13:13:45.073] Packages needed by the future expression (n = 0): [13:13:45.073] Packages needed by future strategies (n = 0): [13:13:45.074] { [13:13:45.074] { [13:13:45.074] { [13:13:45.074] ...future.startTime <- base::Sys.time() [13:13:45.074] { [13:13:45.074] { [13:13:45.074] { [13:13:45.074] { [13:13:45.074] base::local({ [13:13:45.074] has_future <- base::requireNamespace("future", [13:13:45.074] quietly = TRUE) [13:13:45.074] if (has_future) { [13:13:45.074] ns <- base::getNamespace("future") [13:13:45.074] version <- ns[[".package"]][["version"]] [13:13:45.074] if (is.null(version)) [13:13:45.074] version <- utils::packageVersion("future") [13:13:45.074] } [13:13:45.074] else { [13:13:45.074] version <- NULL [13:13:45.074] } [13:13:45.074] if (!has_future || version < "1.8.0") { [13:13:45.074] info <- base::c(r_version = base::gsub("R version ", [13:13:45.074] "", base::R.version$version.string), [13:13:45.074] platform = base::sprintf("%s (%s-bit)", [13:13:45.074] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:45.074] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:45.074] "release", "version")], collapse = " "), [13:13:45.074] hostname = base::Sys.info()[["nodename"]]) [13:13:45.074] info <- base::sprintf("%s: %s", base::names(info), [13:13:45.074] info) [13:13:45.074] info <- base::paste(info, collapse = "; ") [13:13:45.074] if (!has_future) { [13:13:45.074] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:45.074] info) [13:13:45.074] } [13:13:45.074] else { [13:13:45.074] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:45.074] info, version) [13:13:45.074] } [13:13:45.074] base::stop(msg) [13:13:45.074] } [13:13:45.074] }) [13:13:45.074] } [13:13:45.074] ...future.mc.cores.old <- base::getOption("mc.cores") [13:13:45.074] base::options(mc.cores = 1L) [13:13:45.074] } [13:13:45.074] options(future.plan = NULL) [13:13:45.074] Sys.unsetenv("R_FUTURE_PLAN") [13:13:45.074] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:45.074] } [13:13:45.074] ...future.workdir <- getwd() [13:13:45.074] } [13:13:45.074] ...future.oldOptions <- base::as.list(base::.Options) [13:13:45.074] ...future.oldEnvVars <- base::Sys.getenv() [13:13:45.074] } [13:13:45.074] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:45.074] future.globals.maxSize = 2097152000, future.globals.method = NULL, [13:13:45.074] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:45.074] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:45.074] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:45.074] future.stdout.windows.reencode = NULL, width = 80L) [13:13:45.074] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:45.074] base::names(...future.oldOptions)) [13:13:45.074] } [13:13:45.074] if (FALSE) { [13:13:45.074] } [13:13:45.074] else { [13:13:45.074] if (TRUE) { [13:13:45.074] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:45.074] open = "w") [13:13:45.074] } [13:13:45.074] else { [13:13:45.074] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:45.074] windows = "NUL", "/dev/null"), open = "w") [13:13:45.074] } [13:13:45.074] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:45.074] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:45.074] base::sink(type = "output", split = FALSE) [13:13:45.074] base::close(...future.stdout) [13:13:45.074] }, add = TRUE) [13:13:45.074] } [13:13:45.074] ...future.frame <- base::sys.nframe() [13:13:45.074] ...future.conditions <- base::list() [13:13:45.074] ...future.rng <- base::globalenv()$.Random.seed [13:13:45.074] if (FALSE) { [13:13:45.074] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:45.074] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:45.074] } [13:13:45.074] ...future.result <- base::tryCatch({ [13:13:45.074] base::withCallingHandlers({ [13:13:45.074] ...future.value <- base::withVisible(base::local({ [13:13:45.074] ...future.makeSendCondition <- local({ [13:13:45.074] sendCondition <- NULL [13:13:45.074] function(frame = 1L) { [13:13:45.074] if (is.function(sendCondition)) [13:13:45.074] return(sendCondition) [13:13:45.074] ns <- getNamespace("parallel") [13:13:45.074] if (exists("sendData", mode = "function", [13:13:45.074] envir = ns)) { [13:13:45.074] parallel_sendData <- get("sendData", mode = "function", [13:13:45.074] envir = ns) [13:13:45.074] envir <- sys.frame(frame) [13:13:45.074] master <- NULL [13:13:45.074] while (!identical(envir, .GlobalEnv) && [13:13:45.074] !identical(envir, emptyenv())) { [13:13:45.074] if (exists("master", mode = "list", envir = envir, [13:13:45.074] inherits = FALSE)) { [13:13:45.074] master <- get("master", mode = "list", [13:13:45.074] envir = envir, inherits = FALSE) [13:13:45.074] if (inherits(master, c("SOCKnode", [13:13:45.074] "SOCK0node"))) { [13:13:45.074] sendCondition <<- function(cond) { [13:13:45.074] data <- list(type = "VALUE", value = cond, [13:13:45.074] success = TRUE) [13:13:45.074] parallel_sendData(master, data) [13:13:45.074] } [13:13:45.074] return(sendCondition) [13:13:45.074] } [13:13:45.074] } [13:13:45.074] frame <- frame + 1L [13:13:45.074] envir <- sys.frame(frame) [13:13:45.074] } [13:13:45.074] } [13:13:45.074] sendCondition <<- function(cond) NULL [13:13:45.074] } [13:13:45.074] }) [13:13:45.074] withCallingHandlers({ [13:13:45.074] { [13:13:45.074] do.call(function(...) { [13:13:45.074] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:45.074] if (!identical(...future.globals.maxSize.org, [13:13:45.074] ...future.globals.maxSize)) { [13:13:45.074] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:45.074] on.exit(options(oopts), add = TRUE) [13:13:45.074] } [13:13:45.074] { [13:13:45.074] lapply(seq_along(...future.elements_ii), [13:13:45.074] FUN = function(jj) { [13:13:45.074] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:45.074] ...future.FUN(...future.X_jj, ...) [13:13:45.074] }) [13:13:45.074] } [13:13:45.074] }, args = future.call.arguments) [13:13:45.074] } [13:13:45.074] }, immediateCondition = function(cond) { [13:13:45.074] sendCondition <- ...future.makeSendCondition() [13:13:45.074] sendCondition(cond) [13:13:45.074] muffleCondition <- function (cond, pattern = "^muffle") [13:13:45.074] { [13:13:45.074] inherits <- base::inherits [13:13:45.074] invokeRestart <- base::invokeRestart [13:13:45.074] is.null <- base::is.null [13:13:45.074] muffled <- FALSE [13:13:45.074] if (inherits(cond, "message")) { [13:13:45.074] muffled <- grepl(pattern, "muffleMessage") [13:13:45.074] if (muffled) [13:13:45.074] invokeRestart("muffleMessage") [13:13:45.074] } [13:13:45.074] else if (inherits(cond, "warning")) { [13:13:45.074] muffled <- grepl(pattern, "muffleWarning") [13:13:45.074] if (muffled) [13:13:45.074] invokeRestart("muffleWarning") [13:13:45.074] } [13:13:45.074] else if (inherits(cond, "condition")) { [13:13:45.074] if (!is.null(pattern)) { [13:13:45.074] computeRestarts <- base::computeRestarts [13:13:45.074] grepl <- base::grepl [13:13:45.074] restarts <- computeRestarts(cond) [13:13:45.074] for (restart in restarts) { [13:13:45.074] name <- restart$name [13:13:45.074] if (is.null(name)) [13:13:45.074] next [13:13:45.074] if (!grepl(pattern, name)) [13:13:45.074] next [13:13:45.074] invokeRestart(restart) [13:13:45.074] muffled <- TRUE [13:13:45.074] break [13:13:45.074] } [13:13:45.074] } [13:13:45.074] } [13:13:45.074] invisible(muffled) [13:13:45.074] } [13:13:45.074] muffleCondition(cond) [13:13:45.074] }) [13:13:45.074] })) [13:13:45.074] future::FutureResult(value = ...future.value$value, [13:13:45.074] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:45.074] ...future.rng), globalenv = if (FALSE) [13:13:45.074] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:45.074] ...future.globalenv.names)) [13:13:45.074] else NULL, started = ...future.startTime, version = "1.8") [13:13:45.074] }, condition = base::local({ [13:13:45.074] c <- base::c [13:13:45.074] inherits <- base::inherits [13:13:45.074] invokeRestart <- base::invokeRestart [13:13:45.074] length <- base::length [13:13:45.074] list <- base::list [13:13:45.074] seq.int <- base::seq.int [13:13:45.074] signalCondition <- base::signalCondition [13:13:45.074] sys.calls <- base::sys.calls [13:13:45.074] `[[` <- base::`[[` [13:13:45.074] `+` <- base::`+` [13:13:45.074] `<<-` <- base::`<<-` [13:13:45.074] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:45.074] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:45.074] 3L)] [13:13:45.074] } [13:13:45.074] function(cond) { [13:13:45.074] is_error <- inherits(cond, "error") [13:13:45.074] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:45.074] NULL) [13:13:45.074] if (is_error) { [13:13:45.074] sessionInformation <- function() { [13:13:45.074] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:45.074] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:45.074] search = base::search(), system = base::Sys.info()) [13:13:45.074] } [13:13:45.074] ...future.conditions[[length(...future.conditions) + [13:13:45.074] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:45.074] cond$call), session = sessionInformation(), [13:13:45.074] timestamp = base::Sys.time(), signaled = 0L) [13:13:45.074] signalCondition(cond) [13:13:45.074] } [13:13:45.074] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:45.074] "immediateCondition"))) { [13:13:45.074] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:45.074] ...future.conditions[[length(...future.conditions) + [13:13:45.074] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:45.074] if (TRUE && !signal) { [13:13:45.074] muffleCondition <- function (cond, pattern = "^muffle") [13:13:45.074] { [13:13:45.074] inherits <- base::inherits [13:13:45.074] invokeRestart <- base::invokeRestart [13:13:45.074] is.null <- base::is.null [13:13:45.074] muffled <- FALSE [13:13:45.074] if (inherits(cond, "message")) { [13:13:45.074] muffled <- grepl(pattern, "muffleMessage") [13:13:45.074] if (muffled) [13:13:45.074] invokeRestart("muffleMessage") [13:13:45.074] } [13:13:45.074] else if (inherits(cond, "warning")) { [13:13:45.074] muffled <- grepl(pattern, "muffleWarning") [13:13:45.074] if (muffled) [13:13:45.074] invokeRestart("muffleWarning") [13:13:45.074] } [13:13:45.074] else if (inherits(cond, "condition")) { [13:13:45.074] if (!is.null(pattern)) { [13:13:45.074] computeRestarts <- base::computeRestarts [13:13:45.074] grepl <- base::grepl [13:13:45.074] restarts <- computeRestarts(cond) [13:13:45.074] for (restart in restarts) { [13:13:45.074] name <- restart$name [13:13:45.074] if (is.null(name)) [13:13:45.074] next [13:13:45.074] if (!grepl(pattern, name)) [13:13:45.074] next [13:13:45.074] invokeRestart(restart) [13:13:45.074] muffled <- TRUE [13:13:45.074] break [13:13:45.074] } [13:13:45.074] } [13:13:45.074] } [13:13:45.074] invisible(muffled) [13:13:45.074] } [13:13:45.074] muffleCondition(cond, pattern = "^muffle") [13:13:45.074] } [13:13:45.074] } [13:13:45.074] else { [13:13:45.074] if (TRUE) { [13:13:45.074] muffleCondition <- function (cond, pattern = "^muffle") [13:13:45.074] { [13:13:45.074] inherits <- base::inherits [13:13:45.074] invokeRestart <- base::invokeRestart [13:13:45.074] is.null <- base::is.null [13:13:45.074] muffled <- FALSE [13:13:45.074] if (inherits(cond, "message")) { [13:13:45.074] muffled <- grepl(pattern, "muffleMessage") [13:13:45.074] if (muffled) [13:13:45.074] invokeRestart("muffleMessage") [13:13:45.074] } [13:13:45.074] else if (inherits(cond, "warning")) { [13:13:45.074] muffled <- grepl(pattern, "muffleWarning") [13:13:45.074] if (muffled) [13:13:45.074] invokeRestart("muffleWarning") [13:13:45.074] } [13:13:45.074] else if (inherits(cond, "condition")) { [13:13:45.074] if (!is.null(pattern)) { [13:13:45.074] computeRestarts <- base::computeRestarts [13:13:45.074] grepl <- base::grepl [13:13:45.074] restarts <- computeRestarts(cond) [13:13:45.074] for (restart in restarts) { [13:13:45.074] name <- restart$name [13:13:45.074] if (is.null(name)) [13:13:45.074] next [13:13:45.074] if (!grepl(pattern, name)) [13:13:45.074] next [13:13:45.074] invokeRestart(restart) [13:13:45.074] muffled <- TRUE [13:13:45.074] break [13:13:45.074] } [13:13:45.074] } [13:13:45.074] } [13:13:45.074] invisible(muffled) [13:13:45.074] } [13:13:45.074] muffleCondition(cond, pattern = "^muffle") [13:13:45.074] } [13:13:45.074] } [13:13:45.074] } [13:13:45.074] })) [13:13:45.074] }, error = function(ex) { [13:13:45.074] base::structure(base::list(value = NULL, visible = NULL, [13:13:45.074] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:45.074] ...future.rng), started = ...future.startTime, [13:13:45.074] finished = Sys.time(), session_uuid = NA_character_, [13:13:45.074] version = "1.8"), class = "FutureResult") [13:13:45.074] }, finally = { [13:13:45.074] if (!identical(...future.workdir, getwd())) [13:13:45.074] setwd(...future.workdir) [13:13:45.074] { [13:13:45.074] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:45.074] ...future.oldOptions$nwarnings <- NULL [13:13:45.074] } [13:13:45.074] base::options(...future.oldOptions) [13:13:45.074] if (.Platform$OS.type == "windows") { [13:13:45.074] old_names <- names(...future.oldEnvVars) [13:13:45.074] envs <- base::Sys.getenv() [13:13:45.074] names <- names(envs) [13:13:45.074] common <- intersect(names, old_names) [13:13:45.074] added <- setdiff(names, old_names) [13:13:45.074] removed <- setdiff(old_names, names) [13:13:45.074] changed <- common[...future.oldEnvVars[common] != [13:13:45.074] envs[common]] [13:13:45.074] NAMES <- toupper(changed) [13:13:45.074] args <- list() [13:13:45.074] for (kk in seq_along(NAMES)) { [13:13:45.074] name <- changed[[kk]] [13:13:45.074] NAME <- NAMES[[kk]] [13:13:45.074] if (name != NAME && is.element(NAME, old_names)) [13:13:45.074] next [13:13:45.074] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:45.074] } [13:13:45.074] NAMES <- toupper(added) [13:13:45.074] for (kk in seq_along(NAMES)) { [13:13:45.074] name <- added[[kk]] [13:13:45.074] NAME <- NAMES[[kk]] [13:13:45.074] if (name != NAME && is.element(NAME, old_names)) [13:13:45.074] next [13:13:45.074] args[[name]] <- "" [13:13:45.074] } [13:13:45.074] NAMES <- toupper(removed) [13:13:45.074] for (kk in seq_along(NAMES)) { [13:13:45.074] name <- removed[[kk]] [13:13:45.074] NAME <- NAMES[[kk]] [13:13:45.074] if (name != NAME && is.element(NAME, old_names)) [13:13:45.074] next [13:13:45.074] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:45.074] } [13:13:45.074] if (length(args) > 0) [13:13:45.074] base::do.call(base::Sys.setenv, args = args) [13:13:45.074] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:45.074] } [13:13:45.074] else { [13:13:45.074] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:45.074] } [13:13:45.074] { [13:13:45.074] if (base::length(...future.futureOptionsAdded) > [13:13:45.074] 0L) { [13:13:45.074] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:45.074] base::names(opts) <- ...future.futureOptionsAdded [13:13:45.074] base::options(opts) [13:13:45.074] } [13:13:45.074] { [13:13:45.074] { [13:13:45.074] base::options(mc.cores = ...future.mc.cores.old) [13:13:45.074] NULL [13:13:45.074] } [13:13:45.074] options(future.plan = NULL) [13:13:45.074] if (is.na(NA_character_)) [13:13:45.074] Sys.unsetenv("R_FUTURE_PLAN") [13:13:45.074] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:45.074] future::plan(list(function (..., workers = availableCores(), [13:13:45.074] lazy = FALSE, rscript_libs = .libPaths(), [13:13:45.074] envir = parent.frame()) [13:13:45.074] { [13:13:45.074] if (is.function(workers)) [13:13:45.074] workers <- workers() [13:13:45.074] workers <- structure(as.integer(workers), [13:13:45.074] class = class(workers)) [13:13:45.074] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:45.074] workers >= 1) [13:13:45.074] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:45.074] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:45.074] } [13:13:45.074] future <- MultisessionFuture(..., workers = workers, [13:13:45.074] lazy = lazy, rscript_libs = rscript_libs, [13:13:45.074] envir = envir) [13:13:45.074] if (!future$lazy) [13:13:45.074] future <- run(future) [13:13:45.074] invisible(future) [13:13:45.074] }), .cleanup = FALSE, .init = FALSE) [13:13:45.074] } [13:13:45.074] } [13:13:45.074] } [13:13:45.074] }) [13:13:45.074] if (TRUE) { [13:13:45.074] base::sink(type = "output", split = FALSE) [13:13:45.074] if (TRUE) { [13:13:45.074] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:45.074] } [13:13:45.074] else { [13:13:45.074] ...future.result["stdout"] <- base::list(NULL) [13:13:45.074] } [13:13:45.074] base::close(...future.stdout) [13:13:45.074] ...future.stdout <- NULL [13:13:45.074] } [13:13:45.074] ...future.result$conditions <- ...future.conditions [13:13:45.074] ...future.result$finished <- base::Sys.time() [13:13:45.074] ...future.result [13:13:45.074] } [13:13:45.079] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... [13:13:45.079] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... [13:13:45.080] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... DONE [13:13:45.080] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... [13:13:45.081] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... DONE [13:13:45.081] Exporting '...future.elements_ii' (112 bytes) to cluster node #1 ... [13:13:45.081] Exporting '...future.elements_ii' (112 bytes) to cluster node #1 ... DONE [13:13:45.081] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:13:45.082] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:13:45.082] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:13:45.082] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:13:45.083] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... DONE [13:13:45.083] MultisessionFuture started [13:13:45.083] - Launch lazy future ... done [13:13:45.084] run() for 'MultisessionFuture' ... done [13:13:45.084] Created future: [13:13:45.100] receiveMessageFromWorker() for ClusterFuture ... [13:13:45.100] - Validating connection of MultisessionFuture [13:13:45.100] - received message: FutureResult [13:13:45.101] - Received FutureResult [13:13:45.101] - Erased future from FutureRegistry [13:13:45.101] result() for ClusterFuture ... [13:13:45.101] - result already collected: FutureResult [13:13:45.101] result() for ClusterFuture ... done [13:13:45.101] receiveMessageFromWorker() for ClusterFuture ... done [13:13:45.084] MultisessionFuture: [13:13:45.084] Label: 'future_lapply-4' [13:13:45.084] Expression: [13:13:45.084] { [13:13:45.084] do.call(function(...) { [13:13:45.084] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:45.084] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:45.084] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:45.084] on.exit(options(oopts), add = TRUE) [13:13:45.084] } [13:13:45.084] { [13:13:45.084] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:45.084] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:45.084] ...future.FUN(...future.X_jj, ...) [13:13:45.084] }) [13:13:45.084] } [13:13:45.084] }, args = future.call.arguments) [13:13:45.084] } [13:13:45.084] Lazy evaluation: FALSE [13:13:45.084] Asynchronous evaluation: TRUE [13:13:45.084] Local evaluation: TRUE [13:13:45.084] Environment: R_GlobalEnv [13:13:45.084] Capture standard output: TRUE [13:13:45.084] Capture condition classes: 'condition' (excluding 'nothing') [13:13:45.084] 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) [13:13:45.084] Packages: [13:13:45.084] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:45.084] Resolved: TRUE [13:13:45.084] Value: [13:13:45.084] Conditions captured: [13:13:45.084] Early signaling: FALSE [13:13:45.084] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:45.084] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:45.102] Chunk #4 of 4 ... DONE [13:13:45.102] Launching 4 futures (chunks) ... DONE [13:13:45.102] Resolving 4 futures (chunks) ... [13:13:45.102] resolve() on list ... [13:13:45.102] recursive: 0 [13:13:45.103] length: 4 [13:13:45.103] [13:13:45.103] Future #1 [13:13:45.103] result() for ClusterFuture ... [13:13:45.103] - result already collected: FutureResult [13:13:45.103] result() for ClusterFuture ... done [13:13:45.104] result() for ClusterFuture ... [13:13:45.104] - result already collected: FutureResult [13:13:45.104] result() for ClusterFuture ... done [13:13:45.104] signalConditionsASAP(MultisessionFuture, pos=1) ... [13:13:45.104] - nx: 4 [13:13:45.104] - relay: TRUE [13:13:45.105] - stdout: TRUE [13:13:45.105] - signal: TRUE [13:13:45.105] - resignal: FALSE [13:13:45.105] - force: TRUE [13:13:45.105] - relayed: [n=4] FALSE, FALSE, FALSE, FALSE [13:13:45.105] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [13:13:45.105] - until=1 [13:13:45.106] - relaying element #1 [13:13:45.106] result() for ClusterFuture ... [13:13:45.106] - result already collected: FutureResult [13:13:45.106] result() for ClusterFuture ... done [13:13:45.106] result() for ClusterFuture ... [13:13:45.106] - result already collected: FutureResult [13:13:45.107] result() for ClusterFuture ... done [13:13:45.107] result() for ClusterFuture ... [13:13:45.107] - result already collected: FutureResult [13:13:45.107] result() for ClusterFuture ... done [13:13:45.107] result() for ClusterFuture ... [13:13:45.107] - result already collected: FutureResult [13:13:45.108] result() for ClusterFuture ... done [13:13:45.108] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [13:13:45.108] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [13:13:45.108] signalConditionsASAP(MultisessionFuture, pos=1) ... done [13:13:45.108] length: 3 (resolved future 1) [13:13:45.108] Future #2 [13:13:45.109] result() for ClusterFuture ... [13:13:45.109] - result already collected: FutureResult [13:13:45.109] result() for ClusterFuture ... done [13:13:45.109] result() for ClusterFuture ... [13:13:45.109] - result already collected: FutureResult [13:13:45.109] result() for ClusterFuture ... done [13:13:45.109] signalConditionsASAP(MultisessionFuture, pos=2) ... [13:13:45.110] - nx: 4 [13:13:45.110] - relay: TRUE [13:13:45.110] - stdout: TRUE [13:13:45.110] - signal: TRUE [13:13:45.110] - resignal: FALSE [13:13:45.110] - force: TRUE [13:13:45.110] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [13:13:45.111] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [13:13:45.111] - until=2 [13:13:45.111] - relaying element #2 [13:13:45.111] result() for ClusterFuture ... [13:13:45.111] - result already collected: FutureResult [13:13:45.111] result() for ClusterFuture ... done [13:13:45.112] result() for ClusterFuture ... [13:13:45.112] - result already collected: FutureResult [13:13:45.112] result() for ClusterFuture ... done [13:13:45.112] result() for ClusterFuture ... [13:13:45.112] - result already collected: FutureResult [13:13:45.112] result() for ClusterFuture ... done [13:13:45.113] result() for ClusterFuture ... [13:13:45.113] - result already collected: FutureResult [13:13:45.113] result() for ClusterFuture ... done [13:13:45.113] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [13:13:45.113] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [13:13:45.113] signalConditionsASAP(MultisessionFuture, pos=2) ... done [13:13:45.113] length: 2 (resolved future 2) [13:13:45.114] Future #3 [13:13:45.114] result() for ClusterFuture ... [13:13:45.114] - result already collected: FutureResult [13:13:45.114] result() for ClusterFuture ... done [13:13:45.114] result() for ClusterFuture ... [13:13:45.114] - result already collected: FutureResult [13:13:45.115] result() for ClusterFuture ... done [13:13:45.115] signalConditionsASAP(MultisessionFuture, pos=3) ... [13:13:45.115] - nx: 4 [13:13:45.115] - relay: TRUE [13:13:45.115] - stdout: TRUE [13:13:45.115] - signal: TRUE [13:13:45.115] - resignal: FALSE [13:13:45.116] - force: TRUE [13:13:45.116] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [13:13:45.116] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [13:13:45.116] - until=3 [13:13:45.116] - relaying element #3 [13:13:45.116] result() for ClusterFuture ... [13:13:45.117] - result already collected: FutureResult [13:13:45.117] result() for ClusterFuture ... done [13:13:45.117] result() for ClusterFuture ... [13:13:45.117] - result already collected: FutureResult [13:13:45.117] result() for ClusterFuture ... done [13:13:45.117] result() for ClusterFuture ... [13:13:45.118] - result already collected: FutureResult [13:13:45.118] result() for ClusterFuture ... done [13:13:45.118] result() for ClusterFuture ... [13:13:45.118] - result already collected: FutureResult [13:13:45.118] result() for ClusterFuture ... done [13:13:45.118] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [13:13:45.118] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [13:13:45.119] signalConditionsASAP(MultisessionFuture, pos=3) ... done [13:13:45.119] length: 1 (resolved future 3) [13:13:45.119] Future #4 [13:13:45.119] result() for ClusterFuture ... [13:13:45.119] - result already collected: FutureResult [13:13:45.119] result() for ClusterFuture ... done [13:13:45.120] result() for ClusterFuture ... [13:13:45.120] - result already collected: FutureResult [13:13:45.120] result() for ClusterFuture ... done [13:13:45.120] signalConditionsASAP(MultisessionFuture, pos=4) ... [13:13:45.120] - nx: 4 [13:13:45.120] - relay: TRUE [13:13:45.121] - stdout: TRUE [13:13:45.121] - signal: TRUE [13:13:45.121] - resignal: FALSE [13:13:45.121] - force: TRUE [13:13:45.121] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [13:13:45.121] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [13:13:45.121] - until=4 [13:13:45.122] - relaying element #4 [13:13:45.122] result() for ClusterFuture ... [13:13:45.122] - result already collected: FutureResult [13:13:45.122] result() for ClusterFuture ... done [13:13:45.122] result() for ClusterFuture ... [13:13:45.122] - result already collected: FutureResult [13:13:45.122] result() for ClusterFuture ... done [13:13:45.123] result() for ClusterFuture ... [13:13:45.123] - result already collected: FutureResult [13:13:45.123] result() for ClusterFuture ... done [13:13:45.123] result() for ClusterFuture ... [13:13:45.123] - result already collected: FutureResult [13:13:45.123] result() for ClusterFuture ... done [13:13:45.124] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [13:13:45.124] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [13:13:45.124] signalConditionsASAP(MultisessionFuture, pos=4) ... done [13:13:45.124] length: 0 (resolved future 4) [13:13:45.124] Relaying remaining futures [13:13:45.124] signalConditionsASAP(NULL, pos=0) ... [13:13:45.125] - nx: 4 [13:13:45.125] - relay: TRUE [13:13:45.125] - stdout: TRUE [13:13:45.125] - signal: TRUE [13:13:45.125] - resignal: FALSE [13:13:45.125] - force: TRUE [13:13:45.125] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [13:13:45.126] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE - flush all [13:13:45.126] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [13:13:45.126] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [13:13:45.126] signalConditionsASAP(NULL, pos=0) ... done [13:13:45.126] resolve() on list ... DONE [13:13:45.126] result() for ClusterFuture ... [13:13:45.127] - result already collected: FutureResult [13:13:45.127] result() for ClusterFuture ... done [13:13:45.127] result() for ClusterFuture ... [13:13:45.127] - result already collected: FutureResult [13:13:45.127] result() for ClusterFuture ... done [13:13:45.127] result() for ClusterFuture ... [13:13:45.128] - result already collected: FutureResult [13:13:45.128] result() for ClusterFuture ... done [13:13:45.128] result() for ClusterFuture ... [13:13:45.128] - result already collected: FutureResult [13:13:45.128] result() for ClusterFuture ... done [13:13:45.128] result() for ClusterFuture ... [13:13:45.128] - result already collected: FutureResult [13:13:45.129] result() for ClusterFuture ... done [13:13:45.129] result() for ClusterFuture ... [13:13:45.129] - result already collected: FutureResult [13:13:45.129] result() for ClusterFuture ... done [13:13:45.129] result() for ClusterFuture ... [13:13:45.129] - result already collected: FutureResult [13:13:45.130] result() for ClusterFuture ... done [13:13:45.130] result() for ClusterFuture ... [13:13:45.130] - result already collected: FutureResult [13:13:45.130] result() for ClusterFuture ... done [13:13:45.130] - Number of value chunks collected: 4 [13:13:45.130] Resolving 4 futures (chunks) ... DONE [13:13:45.131] Reducing values from 4 chunks ... [13:13:45.131] - Number of values collected after concatenation: 4 [13:13:45.131] - Number of values expected: 4 [13:13:45.131] Reducing values from 4 chunks ... DONE [13:13:45.131] 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 [13:13:45.134] future_lapply() ... [13:13:45.137] Number of chunks: 4 [13:13:45.137] getGlobalsAndPackagesXApply() ... [13:13:45.137] - future.globals: TRUE [13:13:45.137] getGlobalsAndPackages() ... [13:13:45.138] Searching for globals... [13:13:45.139] - globals found: [2] 'FUN', '.Internal' [13:13:45.139] Searching for globals ... DONE [13:13:45.139] Resolving globals: FALSE [13:13:45.140] The total size of the 1 globals is 2.13 KiB (2184 bytes) [13:13:45.140] 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') [13:13:45.140] - globals: [1] 'FUN' [13:13:45.141] [13:13:45.141] getGlobalsAndPackages() ... DONE [13:13:45.141] - globals found/used: [n=1] 'FUN' [13:13:45.141] - needed namespaces: [n=0] [13:13:45.141] Finding globals ... DONE [13:13:45.141] - use_args: TRUE [13:13:45.142] - Getting '...' globals ... [13:13:45.142] resolve() on list ... [13:13:45.142] recursive: 0 [13:13:45.142] length: 1 [13:13:45.142] elements: '...' [13:13:45.143] length: 0 (resolved future 1) [13:13:45.143] resolve() on list ... DONE [13:13:45.143] - '...' content: [n=1] 'length' [13:13:45.143] List of 1 [13:13:45.143] $ ...:List of 1 [13:13:45.143] ..$ length: int 2 [13:13:45.143] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:45.143] - attr(*, "where")=List of 1 [13:13:45.143] ..$ ...: [13:13:45.143] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:45.143] - attr(*, "resolved")= logi TRUE [13:13:45.143] - attr(*, "total_size")= num NA [13:13:45.147] - Getting '...' globals ... DONE [13:13:45.147] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:45.147] List of 2 [13:13:45.147] $ ...future.FUN:function (mode = "logical", length = 0L) [13:13:45.147] $ ... :List of 1 [13:13:45.147] ..$ length: int 2 [13:13:45.147] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:45.147] - attr(*, "where")=List of 2 [13:13:45.147] ..$ ...future.FUN: [13:13:45.147] ..$ ... : [13:13:45.147] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:45.147] - attr(*, "resolved")= logi FALSE [13:13:45.147] - attr(*, "total_size")= num 2240 [13:13:45.151] Packages to be attached in all futures: [n=0] [13:13:45.151] getGlobalsAndPackagesXApply() ... DONE [13:13:45.151] Number of futures (= number of chunks): 4 [13:13:45.152] Launching 4 futures (chunks) ... [13:13:45.152] Chunk #1 of 4 ... [13:13:45.152] - Finding globals in 'X' for chunk #1 ... [13:13:45.152] getGlobalsAndPackages() ... [13:13:45.152] Searching for globals... [13:13:45.153] [13:13:45.153] Searching for globals ... DONE [13:13:45.153] - globals: [0] [13:13:45.153] getGlobalsAndPackages() ... DONE [13:13:45.153] + additional globals found: [n=0] [13:13:45.153] + additional namespaces needed: [n=0] [13:13:45.153] - Finding globals in 'X' for chunk #1 ... DONE [13:13:45.154] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [13:13:45.154] - seeds: [13:13:45.154] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:45.154] getGlobalsAndPackages() ... [13:13:45.154] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:45.154] Resolving globals: FALSE [13:13:45.155] Tweak future expression to call with '...' arguments ... [13:13:45.155] { [13:13:45.155] do.call(function(...) { [13:13:45.155] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:45.155] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:45.155] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:45.155] on.exit(options(oopts), add = TRUE) [13:13:45.155] } [13:13:45.155] { [13:13:45.155] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:45.155] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:45.155] ...future.FUN(...future.X_jj, ...) [13:13:45.155] }) [13:13:45.155] } [13:13:45.155] }, args = future.call.arguments) [13:13:45.155] } [13:13:45.155] Tweak future expression to call with '...' arguments ... DONE [13:13:45.156] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:45.156] [13:13:45.156] getGlobalsAndPackages() ... DONE [13:13:45.156] run() for 'Future' ... [13:13:45.157] - state: 'created' [13:13:45.157] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:45.172] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:45.172] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:13:45.172] - Field: 'node' [13:13:45.172] - Field: 'label' [13:13:45.172] - Field: 'local' [13:13:45.173] - Field: 'owner' [13:13:45.173] - Field: 'envir' [13:13:45.173] - Field: 'workers' [13:13:45.173] - Field: 'packages' [13:13:45.173] - Field: 'gc' [13:13:45.173] - Field: 'conditions' [13:13:45.174] - Field: 'persistent' [13:13:45.174] - Field: 'expr' [13:13:45.174] - Field: 'uuid' [13:13:45.174] - Field: 'seed' [13:13:45.174] - Field: 'version' [13:13:45.174] - Field: 'result' [13:13:45.175] - Field: 'asynchronous' [13:13:45.175] - Field: 'calls' [13:13:45.175] - Field: 'globals' [13:13:45.175] - Field: 'stdout' [13:13:45.175] - Field: 'earlySignal' [13:13:45.175] - Field: 'lazy' [13:13:45.176] - Field: 'state' [13:13:45.176] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:13:45.176] - Launch lazy future ... [13:13:45.176] Packages needed by the future expression (n = 0): [13:13:45.177] Packages needed by future strategies (n = 0): [13:13:45.177] { [13:13:45.177] { [13:13:45.177] { [13:13:45.177] ...future.startTime <- base::Sys.time() [13:13:45.177] { [13:13:45.177] { [13:13:45.177] { [13:13:45.177] { [13:13:45.177] base::local({ [13:13:45.177] has_future <- base::requireNamespace("future", [13:13:45.177] quietly = TRUE) [13:13:45.177] if (has_future) { [13:13:45.177] ns <- base::getNamespace("future") [13:13:45.177] version <- ns[[".package"]][["version"]] [13:13:45.177] if (is.null(version)) [13:13:45.177] version <- utils::packageVersion("future") [13:13:45.177] } [13:13:45.177] else { [13:13:45.177] version <- NULL [13:13:45.177] } [13:13:45.177] if (!has_future || version < "1.8.0") { [13:13:45.177] info <- base::c(r_version = base::gsub("R version ", [13:13:45.177] "", base::R.version$version.string), [13:13:45.177] platform = base::sprintf("%s (%s-bit)", [13:13:45.177] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:45.177] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:45.177] "release", "version")], collapse = " "), [13:13:45.177] hostname = base::Sys.info()[["nodename"]]) [13:13:45.177] info <- base::sprintf("%s: %s", base::names(info), [13:13:45.177] info) [13:13:45.177] info <- base::paste(info, collapse = "; ") [13:13:45.177] if (!has_future) { [13:13:45.177] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:45.177] info) [13:13:45.177] } [13:13:45.177] else { [13:13:45.177] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:45.177] info, version) [13:13:45.177] } [13:13:45.177] base::stop(msg) [13:13:45.177] } [13:13:45.177] }) [13:13:45.177] } [13:13:45.177] ...future.mc.cores.old <- base::getOption("mc.cores") [13:13:45.177] base::options(mc.cores = 1L) [13:13:45.177] } [13:13:45.177] options(future.plan = NULL) [13:13:45.177] Sys.unsetenv("R_FUTURE_PLAN") [13:13:45.177] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:45.177] } [13:13:45.177] ...future.workdir <- getwd() [13:13:45.177] } [13:13:45.177] ...future.oldOptions <- base::as.list(base::.Options) [13:13:45.177] ...future.oldEnvVars <- base::Sys.getenv() [13:13:45.177] } [13:13:45.177] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:45.177] future.globals.maxSize = 2097152000, future.globals.method = NULL, [13:13:45.177] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:45.177] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:45.177] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:45.177] future.stdout.windows.reencode = NULL, width = 80L) [13:13:45.177] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:45.177] base::names(...future.oldOptions)) [13:13:45.177] } [13:13:45.177] if (FALSE) { [13:13:45.177] } [13:13:45.177] else { [13:13:45.177] if (TRUE) { [13:13:45.177] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:45.177] open = "w") [13:13:45.177] } [13:13:45.177] else { [13:13:45.177] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:45.177] windows = "NUL", "/dev/null"), open = "w") [13:13:45.177] } [13:13:45.177] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:45.177] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:45.177] base::sink(type = "output", split = FALSE) [13:13:45.177] base::close(...future.stdout) [13:13:45.177] }, add = TRUE) [13:13:45.177] } [13:13:45.177] ...future.frame <- base::sys.nframe() [13:13:45.177] ...future.conditions <- base::list() [13:13:45.177] ...future.rng <- base::globalenv()$.Random.seed [13:13:45.177] if (FALSE) { [13:13:45.177] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:45.177] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:45.177] } [13:13:45.177] ...future.result <- base::tryCatch({ [13:13:45.177] base::withCallingHandlers({ [13:13:45.177] ...future.value <- base::withVisible(base::local({ [13:13:45.177] ...future.makeSendCondition <- local({ [13:13:45.177] sendCondition <- NULL [13:13:45.177] function(frame = 1L) { [13:13:45.177] if (is.function(sendCondition)) [13:13:45.177] return(sendCondition) [13:13:45.177] ns <- getNamespace("parallel") [13:13:45.177] if (exists("sendData", mode = "function", [13:13:45.177] envir = ns)) { [13:13:45.177] parallel_sendData <- get("sendData", mode = "function", [13:13:45.177] envir = ns) [13:13:45.177] envir <- sys.frame(frame) [13:13:45.177] master <- NULL [13:13:45.177] while (!identical(envir, .GlobalEnv) && [13:13:45.177] !identical(envir, emptyenv())) { [13:13:45.177] if (exists("master", mode = "list", envir = envir, [13:13:45.177] inherits = FALSE)) { [13:13:45.177] master <- get("master", mode = "list", [13:13:45.177] envir = envir, inherits = FALSE) [13:13:45.177] if (inherits(master, c("SOCKnode", [13:13:45.177] "SOCK0node"))) { [13:13:45.177] sendCondition <<- function(cond) { [13:13:45.177] data <- list(type = "VALUE", value = cond, [13:13:45.177] success = TRUE) [13:13:45.177] parallel_sendData(master, data) [13:13:45.177] } [13:13:45.177] return(sendCondition) [13:13:45.177] } [13:13:45.177] } [13:13:45.177] frame <- frame + 1L [13:13:45.177] envir <- sys.frame(frame) [13:13:45.177] } [13:13:45.177] } [13:13:45.177] sendCondition <<- function(cond) NULL [13:13:45.177] } [13:13:45.177] }) [13:13:45.177] withCallingHandlers({ [13:13:45.177] { [13:13:45.177] do.call(function(...) { [13:13:45.177] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:45.177] if (!identical(...future.globals.maxSize.org, [13:13:45.177] ...future.globals.maxSize)) { [13:13:45.177] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:45.177] on.exit(options(oopts), add = TRUE) [13:13:45.177] } [13:13:45.177] { [13:13:45.177] lapply(seq_along(...future.elements_ii), [13:13:45.177] FUN = function(jj) { [13:13:45.177] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:45.177] ...future.FUN(...future.X_jj, ...) [13:13:45.177] }) [13:13:45.177] } [13:13:45.177] }, args = future.call.arguments) [13:13:45.177] } [13:13:45.177] }, immediateCondition = function(cond) { [13:13:45.177] sendCondition <- ...future.makeSendCondition() [13:13:45.177] sendCondition(cond) [13:13:45.177] muffleCondition <- function (cond, pattern = "^muffle") [13:13:45.177] { [13:13:45.177] inherits <- base::inherits [13:13:45.177] invokeRestart <- base::invokeRestart [13:13:45.177] is.null <- base::is.null [13:13:45.177] muffled <- FALSE [13:13:45.177] if (inherits(cond, "message")) { [13:13:45.177] muffled <- grepl(pattern, "muffleMessage") [13:13:45.177] if (muffled) [13:13:45.177] invokeRestart("muffleMessage") [13:13:45.177] } [13:13:45.177] else if (inherits(cond, "warning")) { [13:13:45.177] muffled <- grepl(pattern, "muffleWarning") [13:13:45.177] if (muffled) [13:13:45.177] invokeRestart("muffleWarning") [13:13:45.177] } [13:13:45.177] else if (inherits(cond, "condition")) { [13:13:45.177] if (!is.null(pattern)) { [13:13:45.177] computeRestarts <- base::computeRestarts [13:13:45.177] grepl <- base::grepl [13:13:45.177] restarts <- computeRestarts(cond) [13:13:45.177] for (restart in restarts) { [13:13:45.177] name <- restart$name [13:13:45.177] if (is.null(name)) [13:13:45.177] next [13:13:45.177] if (!grepl(pattern, name)) [13:13:45.177] next [13:13:45.177] invokeRestart(restart) [13:13:45.177] muffled <- TRUE [13:13:45.177] break [13:13:45.177] } [13:13:45.177] } [13:13:45.177] } [13:13:45.177] invisible(muffled) [13:13:45.177] } [13:13:45.177] muffleCondition(cond) [13:13:45.177] }) [13:13:45.177] })) [13:13:45.177] future::FutureResult(value = ...future.value$value, [13:13:45.177] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:45.177] ...future.rng), globalenv = if (FALSE) [13:13:45.177] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:45.177] ...future.globalenv.names)) [13:13:45.177] else NULL, started = ...future.startTime, version = "1.8") [13:13:45.177] }, condition = base::local({ [13:13:45.177] c <- base::c [13:13:45.177] inherits <- base::inherits [13:13:45.177] invokeRestart <- base::invokeRestart [13:13:45.177] length <- base::length [13:13:45.177] list <- base::list [13:13:45.177] seq.int <- base::seq.int [13:13:45.177] signalCondition <- base::signalCondition [13:13:45.177] sys.calls <- base::sys.calls [13:13:45.177] `[[` <- base::`[[` [13:13:45.177] `+` <- base::`+` [13:13:45.177] `<<-` <- base::`<<-` [13:13:45.177] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:45.177] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:45.177] 3L)] [13:13:45.177] } [13:13:45.177] function(cond) { [13:13:45.177] is_error <- inherits(cond, "error") [13:13:45.177] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:45.177] NULL) [13:13:45.177] if (is_error) { [13:13:45.177] sessionInformation <- function() { [13:13:45.177] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:45.177] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:45.177] search = base::search(), system = base::Sys.info()) [13:13:45.177] } [13:13:45.177] ...future.conditions[[length(...future.conditions) + [13:13:45.177] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:45.177] cond$call), session = sessionInformation(), [13:13:45.177] timestamp = base::Sys.time(), signaled = 0L) [13:13:45.177] signalCondition(cond) [13:13:45.177] } [13:13:45.177] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:45.177] "immediateCondition"))) { [13:13:45.177] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:45.177] ...future.conditions[[length(...future.conditions) + [13:13:45.177] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:45.177] if (TRUE && !signal) { [13:13:45.177] muffleCondition <- function (cond, pattern = "^muffle") [13:13:45.177] { [13:13:45.177] inherits <- base::inherits [13:13:45.177] invokeRestart <- base::invokeRestart [13:13:45.177] is.null <- base::is.null [13:13:45.177] muffled <- FALSE [13:13:45.177] if (inherits(cond, "message")) { [13:13:45.177] muffled <- grepl(pattern, "muffleMessage") [13:13:45.177] if (muffled) [13:13:45.177] invokeRestart("muffleMessage") [13:13:45.177] } [13:13:45.177] else if (inherits(cond, "warning")) { [13:13:45.177] muffled <- grepl(pattern, "muffleWarning") [13:13:45.177] if (muffled) [13:13:45.177] invokeRestart("muffleWarning") [13:13:45.177] } [13:13:45.177] else if (inherits(cond, "condition")) { [13:13:45.177] if (!is.null(pattern)) { [13:13:45.177] computeRestarts <- base::computeRestarts [13:13:45.177] grepl <- base::grepl [13:13:45.177] restarts <- computeRestarts(cond) [13:13:45.177] for (restart in restarts) { [13:13:45.177] name <- restart$name [13:13:45.177] if (is.null(name)) [13:13:45.177] next [13:13:45.177] if (!grepl(pattern, name)) [13:13:45.177] next [13:13:45.177] invokeRestart(restart) [13:13:45.177] muffled <- TRUE [13:13:45.177] break [13:13:45.177] } [13:13:45.177] } [13:13:45.177] } [13:13:45.177] invisible(muffled) [13:13:45.177] } [13:13:45.177] muffleCondition(cond, pattern = "^muffle") [13:13:45.177] } [13:13:45.177] } [13:13:45.177] else { [13:13:45.177] if (TRUE) { [13:13:45.177] muffleCondition <- function (cond, pattern = "^muffle") [13:13:45.177] { [13:13:45.177] inherits <- base::inherits [13:13:45.177] invokeRestart <- base::invokeRestart [13:13:45.177] is.null <- base::is.null [13:13:45.177] muffled <- FALSE [13:13:45.177] if (inherits(cond, "message")) { [13:13:45.177] muffled <- grepl(pattern, "muffleMessage") [13:13:45.177] if (muffled) [13:13:45.177] invokeRestart("muffleMessage") [13:13:45.177] } [13:13:45.177] else if (inherits(cond, "warning")) { [13:13:45.177] muffled <- grepl(pattern, "muffleWarning") [13:13:45.177] if (muffled) [13:13:45.177] invokeRestart("muffleWarning") [13:13:45.177] } [13:13:45.177] else if (inherits(cond, "condition")) { [13:13:45.177] if (!is.null(pattern)) { [13:13:45.177] computeRestarts <- base::computeRestarts [13:13:45.177] grepl <- base::grepl [13:13:45.177] restarts <- computeRestarts(cond) [13:13:45.177] for (restart in restarts) { [13:13:45.177] name <- restart$name [13:13:45.177] if (is.null(name)) [13:13:45.177] next [13:13:45.177] if (!grepl(pattern, name)) [13:13:45.177] next [13:13:45.177] invokeRestart(restart) [13:13:45.177] muffled <- TRUE [13:13:45.177] break [13:13:45.177] } [13:13:45.177] } [13:13:45.177] } [13:13:45.177] invisible(muffled) [13:13:45.177] } [13:13:45.177] muffleCondition(cond, pattern = "^muffle") [13:13:45.177] } [13:13:45.177] } [13:13:45.177] } [13:13:45.177] })) [13:13:45.177] }, error = function(ex) { [13:13:45.177] base::structure(base::list(value = NULL, visible = NULL, [13:13:45.177] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:45.177] ...future.rng), started = ...future.startTime, [13:13:45.177] finished = Sys.time(), session_uuid = NA_character_, [13:13:45.177] version = "1.8"), class = "FutureResult") [13:13:45.177] }, finally = { [13:13:45.177] if (!identical(...future.workdir, getwd())) [13:13:45.177] setwd(...future.workdir) [13:13:45.177] { [13:13:45.177] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:45.177] ...future.oldOptions$nwarnings <- NULL [13:13:45.177] } [13:13:45.177] base::options(...future.oldOptions) [13:13:45.177] if (.Platform$OS.type == "windows") { [13:13:45.177] old_names <- names(...future.oldEnvVars) [13:13:45.177] envs <- base::Sys.getenv() [13:13:45.177] names <- names(envs) [13:13:45.177] common <- intersect(names, old_names) [13:13:45.177] added <- setdiff(names, old_names) [13:13:45.177] removed <- setdiff(old_names, names) [13:13:45.177] changed <- common[...future.oldEnvVars[common] != [13:13:45.177] envs[common]] [13:13:45.177] NAMES <- toupper(changed) [13:13:45.177] args <- list() [13:13:45.177] for (kk in seq_along(NAMES)) { [13:13:45.177] name <- changed[[kk]] [13:13:45.177] NAME <- NAMES[[kk]] [13:13:45.177] if (name != NAME && is.element(NAME, old_names)) [13:13:45.177] next [13:13:45.177] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:45.177] } [13:13:45.177] NAMES <- toupper(added) [13:13:45.177] for (kk in seq_along(NAMES)) { [13:13:45.177] name <- added[[kk]] [13:13:45.177] NAME <- NAMES[[kk]] [13:13:45.177] if (name != NAME && is.element(NAME, old_names)) [13:13:45.177] next [13:13:45.177] args[[name]] <- "" [13:13:45.177] } [13:13:45.177] NAMES <- toupper(removed) [13:13:45.177] for (kk in seq_along(NAMES)) { [13:13:45.177] name <- removed[[kk]] [13:13:45.177] NAME <- NAMES[[kk]] [13:13:45.177] if (name != NAME && is.element(NAME, old_names)) [13:13:45.177] next [13:13:45.177] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:45.177] } [13:13:45.177] if (length(args) > 0) [13:13:45.177] base::do.call(base::Sys.setenv, args = args) [13:13:45.177] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:45.177] } [13:13:45.177] else { [13:13:45.177] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:45.177] } [13:13:45.177] { [13:13:45.177] if (base::length(...future.futureOptionsAdded) > [13:13:45.177] 0L) { [13:13:45.177] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:45.177] base::names(opts) <- ...future.futureOptionsAdded [13:13:45.177] base::options(opts) [13:13:45.177] } [13:13:45.177] { [13:13:45.177] { [13:13:45.177] base::options(mc.cores = ...future.mc.cores.old) [13:13:45.177] NULL [13:13:45.177] } [13:13:45.177] options(future.plan = NULL) [13:13:45.177] if (is.na(NA_character_)) [13:13:45.177] Sys.unsetenv("R_FUTURE_PLAN") [13:13:45.177] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:45.177] future::plan(list(function (..., workers = availableCores(), [13:13:45.177] lazy = FALSE, rscript_libs = .libPaths(), [13:13:45.177] envir = parent.frame()) [13:13:45.177] { [13:13:45.177] if (is.function(workers)) [13:13:45.177] workers <- workers() [13:13:45.177] workers <- structure(as.integer(workers), [13:13:45.177] class = class(workers)) [13:13:45.177] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:45.177] workers >= 1) [13:13:45.177] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:45.177] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:45.177] } [13:13:45.177] future <- MultisessionFuture(..., workers = workers, [13:13:45.177] lazy = lazy, rscript_libs = rscript_libs, [13:13:45.177] envir = envir) [13:13:45.177] if (!future$lazy) [13:13:45.177] future <- run(future) [13:13:45.177] invisible(future) [13:13:45.177] }), .cleanup = FALSE, .init = FALSE) [13:13:45.177] } [13:13:45.177] } [13:13:45.177] } [13:13:45.177] }) [13:13:45.177] if (TRUE) { [13:13:45.177] base::sink(type = "output", split = FALSE) [13:13:45.177] if (TRUE) { [13:13:45.177] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:45.177] } [13:13:45.177] else { [13:13:45.177] ...future.result["stdout"] <- base::list(NULL) [13:13:45.177] } [13:13:45.177] base::close(...future.stdout) [13:13:45.177] ...future.stdout <- NULL [13:13:45.177] } [13:13:45.177] ...future.result$conditions <- ...future.conditions [13:13:45.177] ...future.result$finished <- base::Sys.time() [13:13:45.177] ...future.result [13:13:45.177] } [13:13:45.184] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... [13:13:45.184] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... [13:13:45.185] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... DONE [13:13:45.185] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... [13:13:45.185] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... DONE [13:13:45.186] Exporting '...future.elements_ii' (112 bytes) to cluster node #1 ... [13:13:45.186] Exporting '...future.elements_ii' (112 bytes) to cluster node #1 ... DONE [13:13:45.186] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:13:45.187] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:13:45.187] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:13:45.187] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:13:45.187] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... DONE [13:13:45.188] MultisessionFuture started [13:13:45.188] - Launch lazy future ... done [13:13:45.188] run() for 'MultisessionFuture' ... done [13:13:45.189] Created future: [13:13:45.204] receiveMessageFromWorker() for ClusterFuture ... [13:13:45.205] - Validating connection of MultisessionFuture [13:13:45.205] - received message: FutureResult [13:13:45.205] - Received FutureResult [13:13:45.205] - Erased future from FutureRegistry [13:13:45.205] result() for ClusterFuture ... [13:13:45.206] - result already collected: FutureResult [13:13:45.206] result() for ClusterFuture ... done [13:13:45.206] receiveMessageFromWorker() for ClusterFuture ... done [13:13:45.189] MultisessionFuture: [13:13:45.189] Label: 'future_lapply-1' [13:13:45.189] Expression: [13:13:45.189] { [13:13:45.189] do.call(function(...) { [13:13:45.189] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:45.189] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:45.189] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:45.189] on.exit(options(oopts), add = TRUE) [13:13:45.189] } [13:13:45.189] { [13:13:45.189] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:45.189] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:45.189] ...future.FUN(...future.X_jj, ...) [13:13:45.189] }) [13:13:45.189] } [13:13:45.189] }, args = future.call.arguments) [13:13:45.189] } [13:13:45.189] Lazy evaluation: FALSE [13:13:45.189] Asynchronous evaluation: TRUE [13:13:45.189] Local evaluation: TRUE [13:13:45.189] Environment: R_GlobalEnv [13:13:45.189] Capture standard output: TRUE [13:13:45.189] Capture condition classes: 'condition' (excluding 'nothing') [13:13:45.189] 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) [13:13:45.189] Packages: [13:13:45.189] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:45.189] Resolved: TRUE [13:13:45.189] Value: [13:13:45.189] Conditions captured: [13:13:45.189] Early signaling: FALSE [13:13:45.189] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:45.189] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:45.206] Chunk #1 of 4 ... DONE [13:13:45.206] Chunk #2 of 4 ... [13:13:45.207] - Finding globals in 'X' for chunk #2 ... [13:13:45.207] getGlobalsAndPackages() ... [13:13:45.207] Searching for globals... [13:13:45.207] [13:13:45.207] Searching for globals ... DONE [13:13:45.208] - globals: [0] [13:13:45.208] getGlobalsAndPackages() ... DONE [13:13:45.208] + additional globals found: [n=0] [13:13:45.208] + additional namespaces needed: [n=0] [13:13:45.208] - Finding globals in 'X' for chunk #2 ... DONE [13:13:45.208] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [13:13:45.209] - seeds: [13:13:45.209] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:45.209] getGlobalsAndPackages() ... [13:13:45.209] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:45.209] Resolving globals: FALSE [13:13:45.209] Tweak future expression to call with '...' arguments ... [13:13:45.210] { [13:13:45.210] do.call(function(...) { [13:13:45.210] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:45.210] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:45.210] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:45.210] on.exit(options(oopts), add = TRUE) [13:13:45.210] } [13:13:45.210] { [13:13:45.210] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:45.210] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:45.210] ...future.FUN(...future.X_jj, ...) [13:13:45.210] }) [13:13:45.210] } [13:13:45.210] }, args = future.call.arguments) [13:13:45.210] } [13:13:45.210] Tweak future expression to call with '...' arguments ... DONE [13:13:45.210] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:45.211] [13:13:45.211] getGlobalsAndPackages() ... DONE [13:13:45.211] run() for 'Future' ... [13:13:45.211] - state: 'created' [13:13:45.212] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:45.225] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:45.225] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:13:45.225] - Field: 'node' [13:13:45.226] - Field: 'label' [13:13:45.226] - Field: 'local' [13:13:45.226] - Field: 'owner' [13:13:45.226] - Field: 'envir' [13:13:45.226] - Field: 'workers' [13:13:45.227] - Field: 'packages' [13:13:45.227] - Field: 'gc' [13:13:45.227] - Field: 'conditions' [13:13:45.227] - Field: 'persistent' [13:13:45.227] - Field: 'expr' [13:13:45.227] - Field: 'uuid' [13:13:45.228] - Field: 'seed' [13:13:45.228] - Field: 'version' [13:13:45.228] - Field: 'result' [13:13:45.228] - Field: 'asynchronous' [13:13:45.228] - Field: 'calls' [13:13:45.228] - Field: 'globals' [13:13:45.229] - Field: 'stdout' [13:13:45.229] - Field: 'earlySignal' [13:13:45.229] - Field: 'lazy' [13:13:45.229] - Field: 'state' [13:13:45.229] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:13:45.230] - Launch lazy future ... [13:13:45.230] Packages needed by the future expression (n = 0): [13:13:45.230] Packages needed by future strategies (n = 0): [13:13:45.231] { [13:13:45.231] { [13:13:45.231] { [13:13:45.231] ...future.startTime <- base::Sys.time() [13:13:45.231] { [13:13:45.231] { [13:13:45.231] { [13:13:45.231] { [13:13:45.231] base::local({ [13:13:45.231] has_future <- base::requireNamespace("future", [13:13:45.231] quietly = TRUE) [13:13:45.231] if (has_future) { [13:13:45.231] ns <- base::getNamespace("future") [13:13:45.231] version <- ns[[".package"]][["version"]] [13:13:45.231] if (is.null(version)) [13:13:45.231] version <- utils::packageVersion("future") [13:13:45.231] } [13:13:45.231] else { [13:13:45.231] version <- NULL [13:13:45.231] } [13:13:45.231] if (!has_future || version < "1.8.0") { [13:13:45.231] info <- base::c(r_version = base::gsub("R version ", [13:13:45.231] "", base::R.version$version.string), [13:13:45.231] platform = base::sprintf("%s (%s-bit)", [13:13:45.231] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:45.231] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:45.231] "release", "version")], collapse = " "), [13:13:45.231] hostname = base::Sys.info()[["nodename"]]) [13:13:45.231] info <- base::sprintf("%s: %s", base::names(info), [13:13:45.231] info) [13:13:45.231] info <- base::paste(info, collapse = "; ") [13:13:45.231] if (!has_future) { [13:13:45.231] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:45.231] info) [13:13:45.231] } [13:13:45.231] else { [13:13:45.231] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:45.231] info, version) [13:13:45.231] } [13:13:45.231] base::stop(msg) [13:13:45.231] } [13:13:45.231] }) [13:13:45.231] } [13:13:45.231] ...future.mc.cores.old <- base::getOption("mc.cores") [13:13:45.231] base::options(mc.cores = 1L) [13:13:45.231] } [13:13:45.231] options(future.plan = NULL) [13:13:45.231] Sys.unsetenv("R_FUTURE_PLAN") [13:13:45.231] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:45.231] } [13:13:45.231] ...future.workdir <- getwd() [13:13:45.231] } [13:13:45.231] ...future.oldOptions <- base::as.list(base::.Options) [13:13:45.231] ...future.oldEnvVars <- base::Sys.getenv() [13:13:45.231] } [13:13:45.231] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:45.231] future.globals.maxSize = 2097152000, future.globals.method = NULL, [13:13:45.231] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:45.231] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:45.231] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:45.231] future.stdout.windows.reencode = NULL, width = 80L) [13:13:45.231] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:45.231] base::names(...future.oldOptions)) [13:13:45.231] } [13:13:45.231] if (FALSE) { [13:13:45.231] } [13:13:45.231] else { [13:13:45.231] if (TRUE) { [13:13:45.231] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:45.231] open = "w") [13:13:45.231] } [13:13:45.231] else { [13:13:45.231] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:45.231] windows = "NUL", "/dev/null"), open = "w") [13:13:45.231] } [13:13:45.231] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:45.231] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:45.231] base::sink(type = "output", split = FALSE) [13:13:45.231] base::close(...future.stdout) [13:13:45.231] }, add = TRUE) [13:13:45.231] } [13:13:45.231] ...future.frame <- base::sys.nframe() [13:13:45.231] ...future.conditions <- base::list() [13:13:45.231] ...future.rng <- base::globalenv()$.Random.seed [13:13:45.231] if (FALSE) { [13:13:45.231] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:45.231] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:45.231] } [13:13:45.231] ...future.result <- base::tryCatch({ [13:13:45.231] base::withCallingHandlers({ [13:13:45.231] ...future.value <- base::withVisible(base::local({ [13:13:45.231] ...future.makeSendCondition <- local({ [13:13:45.231] sendCondition <- NULL [13:13:45.231] function(frame = 1L) { [13:13:45.231] if (is.function(sendCondition)) [13:13:45.231] return(sendCondition) [13:13:45.231] ns <- getNamespace("parallel") [13:13:45.231] if (exists("sendData", mode = "function", [13:13:45.231] envir = ns)) { [13:13:45.231] parallel_sendData <- get("sendData", mode = "function", [13:13:45.231] envir = ns) [13:13:45.231] envir <- sys.frame(frame) [13:13:45.231] master <- NULL [13:13:45.231] while (!identical(envir, .GlobalEnv) && [13:13:45.231] !identical(envir, emptyenv())) { [13:13:45.231] if (exists("master", mode = "list", envir = envir, [13:13:45.231] inherits = FALSE)) { [13:13:45.231] master <- get("master", mode = "list", [13:13:45.231] envir = envir, inherits = FALSE) [13:13:45.231] if (inherits(master, c("SOCKnode", [13:13:45.231] "SOCK0node"))) { [13:13:45.231] sendCondition <<- function(cond) { [13:13:45.231] data <- list(type = "VALUE", value = cond, [13:13:45.231] success = TRUE) [13:13:45.231] parallel_sendData(master, data) [13:13:45.231] } [13:13:45.231] return(sendCondition) [13:13:45.231] } [13:13:45.231] } [13:13:45.231] frame <- frame + 1L [13:13:45.231] envir <- sys.frame(frame) [13:13:45.231] } [13:13:45.231] } [13:13:45.231] sendCondition <<- function(cond) NULL [13:13:45.231] } [13:13:45.231] }) [13:13:45.231] withCallingHandlers({ [13:13:45.231] { [13:13:45.231] do.call(function(...) { [13:13:45.231] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:45.231] if (!identical(...future.globals.maxSize.org, [13:13:45.231] ...future.globals.maxSize)) { [13:13:45.231] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:45.231] on.exit(options(oopts), add = TRUE) [13:13:45.231] } [13:13:45.231] { [13:13:45.231] lapply(seq_along(...future.elements_ii), [13:13:45.231] FUN = function(jj) { [13:13:45.231] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:45.231] ...future.FUN(...future.X_jj, ...) [13:13:45.231] }) [13:13:45.231] } [13:13:45.231] }, args = future.call.arguments) [13:13:45.231] } [13:13:45.231] }, immediateCondition = function(cond) { [13:13:45.231] sendCondition <- ...future.makeSendCondition() [13:13:45.231] sendCondition(cond) [13:13:45.231] muffleCondition <- function (cond, pattern = "^muffle") [13:13:45.231] { [13:13:45.231] inherits <- base::inherits [13:13:45.231] invokeRestart <- base::invokeRestart [13:13:45.231] is.null <- base::is.null [13:13:45.231] muffled <- FALSE [13:13:45.231] if (inherits(cond, "message")) { [13:13:45.231] muffled <- grepl(pattern, "muffleMessage") [13:13:45.231] if (muffled) [13:13:45.231] invokeRestart("muffleMessage") [13:13:45.231] } [13:13:45.231] else if (inherits(cond, "warning")) { [13:13:45.231] muffled <- grepl(pattern, "muffleWarning") [13:13:45.231] if (muffled) [13:13:45.231] invokeRestart("muffleWarning") [13:13:45.231] } [13:13:45.231] else if (inherits(cond, "condition")) { [13:13:45.231] if (!is.null(pattern)) { [13:13:45.231] computeRestarts <- base::computeRestarts [13:13:45.231] grepl <- base::grepl [13:13:45.231] restarts <- computeRestarts(cond) [13:13:45.231] for (restart in restarts) { [13:13:45.231] name <- restart$name [13:13:45.231] if (is.null(name)) [13:13:45.231] next [13:13:45.231] if (!grepl(pattern, name)) [13:13:45.231] next [13:13:45.231] invokeRestart(restart) [13:13:45.231] muffled <- TRUE [13:13:45.231] break [13:13:45.231] } [13:13:45.231] } [13:13:45.231] } [13:13:45.231] invisible(muffled) [13:13:45.231] } [13:13:45.231] muffleCondition(cond) [13:13:45.231] }) [13:13:45.231] })) [13:13:45.231] future::FutureResult(value = ...future.value$value, [13:13:45.231] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:45.231] ...future.rng), globalenv = if (FALSE) [13:13:45.231] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:45.231] ...future.globalenv.names)) [13:13:45.231] else NULL, started = ...future.startTime, version = "1.8") [13:13:45.231] }, condition = base::local({ [13:13:45.231] c <- base::c [13:13:45.231] inherits <- base::inherits [13:13:45.231] invokeRestart <- base::invokeRestart [13:13:45.231] length <- base::length [13:13:45.231] list <- base::list [13:13:45.231] seq.int <- base::seq.int [13:13:45.231] signalCondition <- base::signalCondition [13:13:45.231] sys.calls <- base::sys.calls [13:13:45.231] `[[` <- base::`[[` [13:13:45.231] `+` <- base::`+` [13:13:45.231] `<<-` <- base::`<<-` [13:13:45.231] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:45.231] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:45.231] 3L)] [13:13:45.231] } [13:13:45.231] function(cond) { [13:13:45.231] is_error <- inherits(cond, "error") [13:13:45.231] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:45.231] NULL) [13:13:45.231] if (is_error) { [13:13:45.231] sessionInformation <- function() { [13:13:45.231] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:45.231] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:45.231] search = base::search(), system = base::Sys.info()) [13:13:45.231] } [13:13:45.231] ...future.conditions[[length(...future.conditions) + [13:13:45.231] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:45.231] cond$call), session = sessionInformation(), [13:13:45.231] timestamp = base::Sys.time(), signaled = 0L) [13:13:45.231] signalCondition(cond) [13:13:45.231] } [13:13:45.231] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:45.231] "immediateCondition"))) { [13:13:45.231] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:45.231] ...future.conditions[[length(...future.conditions) + [13:13:45.231] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:45.231] if (TRUE && !signal) { [13:13:45.231] muffleCondition <- function (cond, pattern = "^muffle") [13:13:45.231] { [13:13:45.231] inherits <- base::inherits [13:13:45.231] invokeRestart <- base::invokeRestart [13:13:45.231] is.null <- base::is.null [13:13:45.231] muffled <- FALSE [13:13:45.231] if (inherits(cond, "message")) { [13:13:45.231] muffled <- grepl(pattern, "muffleMessage") [13:13:45.231] if (muffled) [13:13:45.231] invokeRestart("muffleMessage") [13:13:45.231] } [13:13:45.231] else if (inherits(cond, "warning")) { [13:13:45.231] muffled <- grepl(pattern, "muffleWarning") [13:13:45.231] if (muffled) [13:13:45.231] invokeRestart("muffleWarning") [13:13:45.231] } [13:13:45.231] else if (inherits(cond, "condition")) { [13:13:45.231] if (!is.null(pattern)) { [13:13:45.231] computeRestarts <- base::computeRestarts [13:13:45.231] grepl <- base::grepl [13:13:45.231] restarts <- computeRestarts(cond) [13:13:45.231] for (restart in restarts) { [13:13:45.231] name <- restart$name [13:13:45.231] if (is.null(name)) [13:13:45.231] next [13:13:45.231] if (!grepl(pattern, name)) [13:13:45.231] next [13:13:45.231] invokeRestart(restart) [13:13:45.231] muffled <- TRUE [13:13:45.231] break [13:13:45.231] } [13:13:45.231] } [13:13:45.231] } [13:13:45.231] invisible(muffled) [13:13:45.231] } [13:13:45.231] muffleCondition(cond, pattern = "^muffle") [13:13:45.231] } [13:13:45.231] } [13:13:45.231] else { [13:13:45.231] if (TRUE) { [13:13:45.231] muffleCondition <- function (cond, pattern = "^muffle") [13:13:45.231] { [13:13:45.231] inherits <- base::inherits [13:13:45.231] invokeRestart <- base::invokeRestart [13:13:45.231] is.null <- base::is.null [13:13:45.231] muffled <- FALSE [13:13:45.231] if (inherits(cond, "message")) { [13:13:45.231] muffled <- grepl(pattern, "muffleMessage") [13:13:45.231] if (muffled) [13:13:45.231] invokeRestart("muffleMessage") [13:13:45.231] } [13:13:45.231] else if (inherits(cond, "warning")) { [13:13:45.231] muffled <- grepl(pattern, "muffleWarning") [13:13:45.231] if (muffled) [13:13:45.231] invokeRestart("muffleWarning") [13:13:45.231] } [13:13:45.231] else if (inherits(cond, "condition")) { [13:13:45.231] if (!is.null(pattern)) { [13:13:45.231] computeRestarts <- base::computeRestarts [13:13:45.231] grepl <- base::grepl [13:13:45.231] restarts <- computeRestarts(cond) [13:13:45.231] for (restart in restarts) { [13:13:45.231] name <- restart$name [13:13:45.231] if (is.null(name)) [13:13:45.231] next [13:13:45.231] if (!grepl(pattern, name)) [13:13:45.231] next [13:13:45.231] invokeRestart(restart) [13:13:45.231] muffled <- TRUE [13:13:45.231] break [13:13:45.231] } [13:13:45.231] } [13:13:45.231] } [13:13:45.231] invisible(muffled) [13:13:45.231] } [13:13:45.231] muffleCondition(cond, pattern = "^muffle") [13:13:45.231] } [13:13:45.231] } [13:13:45.231] } [13:13:45.231] })) [13:13:45.231] }, error = function(ex) { [13:13:45.231] base::structure(base::list(value = NULL, visible = NULL, [13:13:45.231] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:45.231] ...future.rng), started = ...future.startTime, [13:13:45.231] finished = Sys.time(), session_uuid = NA_character_, [13:13:45.231] version = "1.8"), class = "FutureResult") [13:13:45.231] }, finally = { [13:13:45.231] if (!identical(...future.workdir, getwd())) [13:13:45.231] setwd(...future.workdir) [13:13:45.231] { [13:13:45.231] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:45.231] ...future.oldOptions$nwarnings <- NULL [13:13:45.231] } [13:13:45.231] base::options(...future.oldOptions) [13:13:45.231] if (.Platform$OS.type == "windows") { [13:13:45.231] old_names <- names(...future.oldEnvVars) [13:13:45.231] envs <- base::Sys.getenv() [13:13:45.231] names <- names(envs) [13:13:45.231] common <- intersect(names, old_names) [13:13:45.231] added <- setdiff(names, old_names) [13:13:45.231] removed <- setdiff(old_names, names) [13:13:45.231] changed <- common[...future.oldEnvVars[common] != [13:13:45.231] envs[common]] [13:13:45.231] NAMES <- toupper(changed) [13:13:45.231] args <- list() [13:13:45.231] for (kk in seq_along(NAMES)) { [13:13:45.231] name <- changed[[kk]] [13:13:45.231] NAME <- NAMES[[kk]] [13:13:45.231] if (name != NAME && is.element(NAME, old_names)) [13:13:45.231] next [13:13:45.231] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:45.231] } [13:13:45.231] NAMES <- toupper(added) [13:13:45.231] for (kk in seq_along(NAMES)) { [13:13:45.231] name <- added[[kk]] [13:13:45.231] NAME <- NAMES[[kk]] [13:13:45.231] if (name != NAME && is.element(NAME, old_names)) [13:13:45.231] next [13:13:45.231] args[[name]] <- "" [13:13:45.231] } [13:13:45.231] NAMES <- toupper(removed) [13:13:45.231] for (kk in seq_along(NAMES)) { [13:13:45.231] name <- removed[[kk]] [13:13:45.231] NAME <- NAMES[[kk]] [13:13:45.231] if (name != NAME && is.element(NAME, old_names)) [13:13:45.231] next [13:13:45.231] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:45.231] } [13:13:45.231] if (length(args) > 0) [13:13:45.231] base::do.call(base::Sys.setenv, args = args) [13:13:45.231] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:45.231] } [13:13:45.231] else { [13:13:45.231] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:45.231] } [13:13:45.231] { [13:13:45.231] if (base::length(...future.futureOptionsAdded) > [13:13:45.231] 0L) { [13:13:45.231] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:45.231] base::names(opts) <- ...future.futureOptionsAdded [13:13:45.231] base::options(opts) [13:13:45.231] } [13:13:45.231] { [13:13:45.231] { [13:13:45.231] base::options(mc.cores = ...future.mc.cores.old) [13:13:45.231] NULL [13:13:45.231] } [13:13:45.231] options(future.plan = NULL) [13:13:45.231] if (is.na(NA_character_)) [13:13:45.231] Sys.unsetenv("R_FUTURE_PLAN") [13:13:45.231] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:45.231] future::plan(list(function (..., workers = availableCores(), [13:13:45.231] lazy = FALSE, rscript_libs = .libPaths(), [13:13:45.231] envir = parent.frame()) [13:13:45.231] { [13:13:45.231] if (is.function(workers)) [13:13:45.231] workers <- workers() [13:13:45.231] workers <- structure(as.integer(workers), [13:13:45.231] class = class(workers)) [13:13:45.231] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:45.231] workers >= 1) [13:13:45.231] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:45.231] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:45.231] } [13:13:45.231] future <- MultisessionFuture(..., workers = workers, [13:13:45.231] lazy = lazy, rscript_libs = rscript_libs, [13:13:45.231] envir = envir) [13:13:45.231] if (!future$lazy) [13:13:45.231] future <- run(future) [13:13:45.231] invisible(future) [13:13:45.231] }), .cleanup = FALSE, .init = FALSE) [13:13:45.231] } [13:13:45.231] } [13:13:45.231] } [13:13:45.231] }) [13:13:45.231] if (TRUE) { [13:13:45.231] base::sink(type = "output", split = FALSE) [13:13:45.231] if (TRUE) { [13:13:45.231] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:45.231] } [13:13:45.231] else { [13:13:45.231] ...future.result["stdout"] <- base::list(NULL) [13:13:45.231] } [13:13:45.231] base::close(...future.stdout) [13:13:45.231] ...future.stdout <- NULL [13:13:45.231] } [13:13:45.231] ...future.result$conditions <- ...future.conditions [13:13:45.231] ...future.result$finished <- base::Sys.time() [13:13:45.231] ...future.result [13:13:45.231] } [13:13:45.236] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... [13:13:45.236] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... [13:13:45.237] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... DONE [13:13:45.237] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... [13:13:45.237] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... DONE [13:13:45.238] Exporting '...future.elements_ii' (112 bytes) to cluster node #1 ... [13:13:45.238] Exporting '...future.elements_ii' (112 bytes) to cluster node #1 ... DONE [13:13:45.238] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:13:45.239] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:13:45.239] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:13:45.239] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:13:45.239] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... DONE [13:13:45.240] MultisessionFuture started [13:13:45.240] - Launch lazy future ... done [13:13:45.240] run() for 'MultisessionFuture' ... done [13:13:45.241] Created future: [13:13:45.255] receiveMessageFromWorker() for ClusterFuture ... [13:13:45.256] - Validating connection of MultisessionFuture [13:13:45.256] - received message: FutureResult [13:13:45.256] - Received FutureResult [13:13:45.256] - Erased future from FutureRegistry [13:13:45.256] result() for ClusterFuture ... [13:13:45.256] - result already collected: FutureResult [13:13:45.257] result() for ClusterFuture ... done [13:13:45.257] receiveMessageFromWorker() for ClusterFuture ... done [13:13:45.241] MultisessionFuture: [13:13:45.241] Label: 'future_lapply-2' [13:13:45.241] Expression: [13:13:45.241] { [13:13:45.241] do.call(function(...) { [13:13:45.241] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:45.241] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:45.241] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:45.241] on.exit(options(oopts), add = TRUE) [13:13:45.241] } [13:13:45.241] { [13:13:45.241] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:45.241] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:45.241] ...future.FUN(...future.X_jj, ...) [13:13:45.241] }) [13:13:45.241] } [13:13:45.241] }, args = future.call.arguments) [13:13:45.241] } [13:13:45.241] Lazy evaluation: FALSE [13:13:45.241] Asynchronous evaluation: TRUE [13:13:45.241] Local evaluation: TRUE [13:13:45.241] Environment: R_GlobalEnv [13:13:45.241] Capture standard output: TRUE [13:13:45.241] Capture condition classes: 'condition' (excluding 'nothing') [13:13:45.241] 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) [13:13:45.241] Packages: [13:13:45.241] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:45.241] Resolved: TRUE [13:13:45.241] Value: [13:13:45.241] Conditions captured: [13:13:45.241] Early signaling: FALSE [13:13:45.241] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:45.241] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:45.257] Chunk #2 of 4 ... DONE [13:13:45.257] Chunk #3 of 4 ... [13:13:45.258] - Finding globals in 'X' for chunk #3 ... [13:13:45.258] getGlobalsAndPackages() ... [13:13:45.258] Searching for globals... [13:13:45.258] [13:13:45.258] Searching for globals ... DONE [13:13:45.259] - globals: [0] [13:13:45.259] getGlobalsAndPackages() ... DONE [13:13:45.259] + additional globals found: [n=0] [13:13:45.259] + additional namespaces needed: [n=0] [13:13:45.259] - Finding globals in 'X' for chunk #3 ... DONE [13:13:45.259] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [13:13:45.259] - seeds: [13:13:45.260] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:45.260] getGlobalsAndPackages() ... [13:13:45.260] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:45.260] Resolving globals: FALSE [13:13:45.260] Tweak future expression to call with '...' arguments ... [13:13:45.260] { [13:13:45.260] do.call(function(...) { [13:13:45.260] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:45.260] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:45.260] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:45.260] on.exit(options(oopts), add = TRUE) [13:13:45.260] } [13:13:45.260] { [13:13:45.260] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:45.260] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:45.260] ...future.FUN(...future.X_jj, ...) [13:13:45.260] }) [13:13:45.260] } [13:13:45.260] }, args = future.call.arguments) [13:13:45.260] } [13:13:45.261] Tweak future expression to call with '...' arguments ... DONE [13:13:45.261] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:45.262] [13:13:45.262] getGlobalsAndPackages() ... DONE [13:13:45.262] run() for 'Future' ... [13:13:45.262] - state: 'created' [13:13:45.262] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:45.276] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:45.276] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:13:45.276] - Field: 'node' [13:13:45.276] - Field: 'label' [13:13:45.277] - Field: 'local' [13:13:45.277] - Field: 'owner' [13:13:45.277] - Field: 'envir' [13:13:45.277] - Field: 'workers' [13:13:45.277] - Field: 'packages' [13:13:45.277] - Field: 'gc' [13:13:45.278] - Field: 'conditions' [13:13:45.278] - Field: 'persistent' [13:13:45.278] - Field: 'expr' [13:13:45.278] - Field: 'uuid' [13:13:45.278] - Field: 'seed' [13:13:45.278] - Field: 'version' [13:13:45.279] - Field: 'result' [13:13:45.279] - Field: 'asynchronous' [13:13:45.279] - Field: 'calls' [13:13:45.279] - Field: 'globals' [13:13:45.279] - Field: 'stdout' [13:13:45.280] - Field: 'earlySignal' [13:13:45.280] - Field: 'lazy' [13:13:45.280] - Field: 'state' [13:13:45.280] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:13:45.280] - Launch lazy future ... [13:13:45.281] Packages needed by the future expression (n = 0): [13:13:45.281] Packages needed by future strategies (n = 0): [13:13:45.281] { [13:13:45.281] { [13:13:45.281] { [13:13:45.281] ...future.startTime <- base::Sys.time() [13:13:45.281] { [13:13:45.281] { [13:13:45.281] { [13:13:45.281] { [13:13:45.281] base::local({ [13:13:45.281] has_future <- base::requireNamespace("future", [13:13:45.281] quietly = TRUE) [13:13:45.281] if (has_future) { [13:13:45.281] ns <- base::getNamespace("future") [13:13:45.281] version <- ns[[".package"]][["version"]] [13:13:45.281] if (is.null(version)) [13:13:45.281] version <- utils::packageVersion("future") [13:13:45.281] } [13:13:45.281] else { [13:13:45.281] version <- NULL [13:13:45.281] } [13:13:45.281] if (!has_future || version < "1.8.0") { [13:13:45.281] info <- base::c(r_version = base::gsub("R version ", [13:13:45.281] "", base::R.version$version.string), [13:13:45.281] platform = base::sprintf("%s (%s-bit)", [13:13:45.281] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:45.281] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:45.281] "release", "version")], collapse = " "), [13:13:45.281] hostname = base::Sys.info()[["nodename"]]) [13:13:45.281] info <- base::sprintf("%s: %s", base::names(info), [13:13:45.281] info) [13:13:45.281] info <- base::paste(info, collapse = "; ") [13:13:45.281] if (!has_future) { [13:13:45.281] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:45.281] info) [13:13:45.281] } [13:13:45.281] else { [13:13:45.281] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:45.281] info, version) [13:13:45.281] } [13:13:45.281] base::stop(msg) [13:13:45.281] } [13:13:45.281] }) [13:13:45.281] } [13:13:45.281] ...future.mc.cores.old <- base::getOption("mc.cores") [13:13:45.281] base::options(mc.cores = 1L) [13:13:45.281] } [13:13:45.281] options(future.plan = NULL) [13:13:45.281] Sys.unsetenv("R_FUTURE_PLAN") [13:13:45.281] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:45.281] } [13:13:45.281] ...future.workdir <- getwd() [13:13:45.281] } [13:13:45.281] ...future.oldOptions <- base::as.list(base::.Options) [13:13:45.281] ...future.oldEnvVars <- base::Sys.getenv() [13:13:45.281] } [13:13:45.281] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:45.281] future.globals.maxSize = 2097152000, future.globals.method = NULL, [13:13:45.281] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:45.281] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:45.281] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:45.281] future.stdout.windows.reencode = NULL, width = 80L) [13:13:45.281] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:45.281] base::names(...future.oldOptions)) [13:13:45.281] } [13:13:45.281] if (FALSE) { [13:13:45.281] } [13:13:45.281] else { [13:13:45.281] if (TRUE) { [13:13:45.281] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:45.281] open = "w") [13:13:45.281] } [13:13:45.281] else { [13:13:45.281] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:45.281] windows = "NUL", "/dev/null"), open = "w") [13:13:45.281] } [13:13:45.281] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:45.281] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:45.281] base::sink(type = "output", split = FALSE) [13:13:45.281] base::close(...future.stdout) [13:13:45.281] }, add = TRUE) [13:13:45.281] } [13:13:45.281] ...future.frame <- base::sys.nframe() [13:13:45.281] ...future.conditions <- base::list() [13:13:45.281] ...future.rng <- base::globalenv()$.Random.seed [13:13:45.281] if (FALSE) { [13:13:45.281] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:45.281] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:45.281] } [13:13:45.281] ...future.result <- base::tryCatch({ [13:13:45.281] base::withCallingHandlers({ [13:13:45.281] ...future.value <- base::withVisible(base::local({ [13:13:45.281] ...future.makeSendCondition <- local({ [13:13:45.281] sendCondition <- NULL [13:13:45.281] function(frame = 1L) { [13:13:45.281] if (is.function(sendCondition)) [13:13:45.281] return(sendCondition) [13:13:45.281] ns <- getNamespace("parallel") [13:13:45.281] if (exists("sendData", mode = "function", [13:13:45.281] envir = ns)) { [13:13:45.281] parallel_sendData <- get("sendData", mode = "function", [13:13:45.281] envir = ns) [13:13:45.281] envir <- sys.frame(frame) [13:13:45.281] master <- NULL [13:13:45.281] while (!identical(envir, .GlobalEnv) && [13:13:45.281] !identical(envir, emptyenv())) { [13:13:45.281] if (exists("master", mode = "list", envir = envir, [13:13:45.281] inherits = FALSE)) { [13:13:45.281] master <- get("master", mode = "list", [13:13:45.281] envir = envir, inherits = FALSE) [13:13:45.281] if (inherits(master, c("SOCKnode", [13:13:45.281] "SOCK0node"))) { [13:13:45.281] sendCondition <<- function(cond) { [13:13:45.281] data <- list(type = "VALUE", value = cond, [13:13:45.281] success = TRUE) [13:13:45.281] parallel_sendData(master, data) [13:13:45.281] } [13:13:45.281] return(sendCondition) [13:13:45.281] } [13:13:45.281] } [13:13:45.281] frame <- frame + 1L [13:13:45.281] envir <- sys.frame(frame) [13:13:45.281] } [13:13:45.281] } [13:13:45.281] sendCondition <<- function(cond) NULL [13:13:45.281] } [13:13:45.281] }) [13:13:45.281] withCallingHandlers({ [13:13:45.281] { [13:13:45.281] do.call(function(...) { [13:13:45.281] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:45.281] if (!identical(...future.globals.maxSize.org, [13:13:45.281] ...future.globals.maxSize)) { [13:13:45.281] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:45.281] on.exit(options(oopts), add = TRUE) [13:13:45.281] } [13:13:45.281] { [13:13:45.281] lapply(seq_along(...future.elements_ii), [13:13:45.281] FUN = function(jj) { [13:13:45.281] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:45.281] ...future.FUN(...future.X_jj, ...) [13:13:45.281] }) [13:13:45.281] } [13:13:45.281] }, args = future.call.arguments) [13:13:45.281] } [13:13:45.281] }, immediateCondition = function(cond) { [13:13:45.281] sendCondition <- ...future.makeSendCondition() [13:13:45.281] sendCondition(cond) [13:13:45.281] muffleCondition <- function (cond, pattern = "^muffle") [13:13:45.281] { [13:13:45.281] inherits <- base::inherits [13:13:45.281] invokeRestart <- base::invokeRestart [13:13:45.281] is.null <- base::is.null [13:13:45.281] muffled <- FALSE [13:13:45.281] if (inherits(cond, "message")) { [13:13:45.281] muffled <- grepl(pattern, "muffleMessage") [13:13:45.281] if (muffled) [13:13:45.281] invokeRestart("muffleMessage") [13:13:45.281] } [13:13:45.281] else if (inherits(cond, "warning")) { [13:13:45.281] muffled <- grepl(pattern, "muffleWarning") [13:13:45.281] if (muffled) [13:13:45.281] invokeRestart("muffleWarning") [13:13:45.281] } [13:13:45.281] else if (inherits(cond, "condition")) { [13:13:45.281] if (!is.null(pattern)) { [13:13:45.281] computeRestarts <- base::computeRestarts [13:13:45.281] grepl <- base::grepl [13:13:45.281] restarts <- computeRestarts(cond) [13:13:45.281] for (restart in restarts) { [13:13:45.281] name <- restart$name [13:13:45.281] if (is.null(name)) [13:13:45.281] next [13:13:45.281] if (!grepl(pattern, name)) [13:13:45.281] next [13:13:45.281] invokeRestart(restart) [13:13:45.281] muffled <- TRUE [13:13:45.281] break [13:13:45.281] } [13:13:45.281] } [13:13:45.281] } [13:13:45.281] invisible(muffled) [13:13:45.281] } [13:13:45.281] muffleCondition(cond) [13:13:45.281] }) [13:13:45.281] })) [13:13:45.281] future::FutureResult(value = ...future.value$value, [13:13:45.281] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:45.281] ...future.rng), globalenv = if (FALSE) [13:13:45.281] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:45.281] ...future.globalenv.names)) [13:13:45.281] else NULL, started = ...future.startTime, version = "1.8") [13:13:45.281] }, condition = base::local({ [13:13:45.281] c <- base::c [13:13:45.281] inherits <- base::inherits [13:13:45.281] invokeRestart <- base::invokeRestart [13:13:45.281] length <- base::length [13:13:45.281] list <- base::list [13:13:45.281] seq.int <- base::seq.int [13:13:45.281] signalCondition <- base::signalCondition [13:13:45.281] sys.calls <- base::sys.calls [13:13:45.281] `[[` <- base::`[[` [13:13:45.281] `+` <- base::`+` [13:13:45.281] `<<-` <- base::`<<-` [13:13:45.281] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:45.281] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:45.281] 3L)] [13:13:45.281] } [13:13:45.281] function(cond) { [13:13:45.281] is_error <- inherits(cond, "error") [13:13:45.281] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:45.281] NULL) [13:13:45.281] if (is_error) { [13:13:45.281] sessionInformation <- function() { [13:13:45.281] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:45.281] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:45.281] search = base::search(), system = base::Sys.info()) [13:13:45.281] } [13:13:45.281] ...future.conditions[[length(...future.conditions) + [13:13:45.281] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:45.281] cond$call), session = sessionInformation(), [13:13:45.281] timestamp = base::Sys.time(), signaled = 0L) [13:13:45.281] signalCondition(cond) [13:13:45.281] } [13:13:45.281] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:45.281] "immediateCondition"))) { [13:13:45.281] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:45.281] ...future.conditions[[length(...future.conditions) + [13:13:45.281] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:45.281] if (TRUE && !signal) { [13:13:45.281] muffleCondition <- function (cond, pattern = "^muffle") [13:13:45.281] { [13:13:45.281] inherits <- base::inherits [13:13:45.281] invokeRestart <- base::invokeRestart [13:13:45.281] is.null <- base::is.null [13:13:45.281] muffled <- FALSE [13:13:45.281] if (inherits(cond, "message")) { [13:13:45.281] muffled <- grepl(pattern, "muffleMessage") [13:13:45.281] if (muffled) [13:13:45.281] invokeRestart("muffleMessage") [13:13:45.281] } [13:13:45.281] else if (inherits(cond, "warning")) { [13:13:45.281] muffled <- grepl(pattern, "muffleWarning") [13:13:45.281] if (muffled) [13:13:45.281] invokeRestart("muffleWarning") [13:13:45.281] } [13:13:45.281] else if (inherits(cond, "condition")) { [13:13:45.281] if (!is.null(pattern)) { [13:13:45.281] computeRestarts <- base::computeRestarts [13:13:45.281] grepl <- base::grepl [13:13:45.281] restarts <- computeRestarts(cond) [13:13:45.281] for (restart in restarts) { [13:13:45.281] name <- restart$name [13:13:45.281] if (is.null(name)) [13:13:45.281] next [13:13:45.281] if (!grepl(pattern, name)) [13:13:45.281] next [13:13:45.281] invokeRestart(restart) [13:13:45.281] muffled <- TRUE [13:13:45.281] break [13:13:45.281] } [13:13:45.281] } [13:13:45.281] } [13:13:45.281] invisible(muffled) [13:13:45.281] } [13:13:45.281] muffleCondition(cond, pattern = "^muffle") [13:13:45.281] } [13:13:45.281] } [13:13:45.281] else { [13:13:45.281] if (TRUE) { [13:13:45.281] muffleCondition <- function (cond, pattern = "^muffle") [13:13:45.281] { [13:13:45.281] inherits <- base::inherits [13:13:45.281] invokeRestart <- base::invokeRestart [13:13:45.281] is.null <- base::is.null [13:13:45.281] muffled <- FALSE [13:13:45.281] if (inherits(cond, "message")) { [13:13:45.281] muffled <- grepl(pattern, "muffleMessage") [13:13:45.281] if (muffled) [13:13:45.281] invokeRestart("muffleMessage") [13:13:45.281] } [13:13:45.281] else if (inherits(cond, "warning")) { [13:13:45.281] muffled <- grepl(pattern, "muffleWarning") [13:13:45.281] if (muffled) [13:13:45.281] invokeRestart("muffleWarning") [13:13:45.281] } [13:13:45.281] else if (inherits(cond, "condition")) { [13:13:45.281] if (!is.null(pattern)) { [13:13:45.281] computeRestarts <- base::computeRestarts [13:13:45.281] grepl <- base::grepl [13:13:45.281] restarts <- computeRestarts(cond) [13:13:45.281] for (restart in restarts) { [13:13:45.281] name <- restart$name [13:13:45.281] if (is.null(name)) [13:13:45.281] next [13:13:45.281] if (!grepl(pattern, name)) [13:13:45.281] next [13:13:45.281] invokeRestart(restart) [13:13:45.281] muffled <- TRUE [13:13:45.281] break [13:13:45.281] } [13:13:45.281] } [13:13:45.281] } [13:13:45.281] invisible(muffled) [13:13:45.281] } [13:13:45.281] muffleCondition(cond, pattern = "^muffle") [13:13:45.281] } [13:13:45.281] } [13:13:45.281] } [13:13:45.281] })) [13:13:45.281] }, error = function(ex) { [13:13:45.281] base::structure(base::list(value = NULL, visible = NULL, [13:13:45.281] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:45.281] ...future.rng), started = ...future.startTime, [13:13:45.281] finished = Sys.time(), session_uuid = NA_character_, [13:13:45.281] version = "1.8"), class = "FutureResult") [13:13:45.281] }, finally = { [13:13:45.281] if (!identical(...future.workdir, getwd())) [13:13:45.281] setwd(...future.workdir) [13:13:45.281] { [13:13:45.281] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:45.281] ...future.oldOptions$nwarnings <- NULL [13:13:45.281] } [13:13:45.281] base::options(...future.oldOptions) [13:13:45.281] if (.Platform$OS.type == "windows") { [13:13:45.281] old_names <- names(...future.oldEnvVars) [13:13:45.281] envs <- base::Sys.getenv() [13:13:45.281] names <- names(envs) [13:13:45.281] common <- intersect(names, old_names) [13:13:45.281] added <- setdiff(names, old_names) [13:13:45.281] removed <- setdiff(old_names, names) [13:13:45.281] changed <- common[...future.oldEnvVars[common] != [13:13:45.281] envs[common]] [13:13:45.281] NAMES <- toupper(changed) [13:13:45.281] args <- list() [13:13:45.281] for (kk in seq_along(NAMES)) { [13:13:45.281] name <- changed[[kk]] [13:13:45.281] NAME <- NAMES[[kk]] [13:13:45.281] if (name != NAME && is.element(NAME, old_names)) [13:13:45.281] next [13:13:45.281] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:45.281] } [13:13:45.281] NAMES <- toupper(added) [13:13:45.281] for (kk in seq_along(NAMES)) { [13:13:45.281] name <- added[[kk]] [13:13:45.281] NAME <- NAMES[[kk]] [13:13:45.281] if (name != NAME && is.element(NAME, old_names)) [13:13:45.281] next [13:13:45.281] args[[name]] <- "" [13:13:45.281] } [13:13:45.281] NAMES <- toupper(removed) [13:13:45.281] for (kk in seq_along(NAMES)) { [13:13:45.281] name <- removed[[kk]] [13:13:45.281] NAME <- NAMES[[kk]] [13:13:45.281] if (name != NAME && is.element(NAME, old_names)) [13:13:45.281] next [13:13:45.281] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:45.281] } [13:13:45.281] if (length(args) > 0) [13:13:45.281] base::do.call(base::Sys.setenv, args = args) [13:13:45.281] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:45.281] } [13:13:45.281] else { [13:13:45.281] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:45.281] } [13:13:45.281] { [13:13:45.281] if (base::length(...future.futureOptionsAdded) > [13:13:45.281] 0L) { [13:13:45.281] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:45.281] base::names(opts) <- ...future.futureOptionsAdded [13:13:45.281] base::options(opts) [13:13:45.281] } [13:13:45.281] { [13:13:45.281] { [13:13:45.281] base::options(mc.cores = ...future.mc.cores.old) [13:13:45.281] NULL [13:13:45.281] } [13:13:45.281] options(future.plan = NULL) [13:13:45.281] if (is.na(NA_character_)) [13:13:45.281] Sys.unsetenv("R_FUTURE_PLAN") [13:13:45.281] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:45.281] future::plan(list(function (..., workers = availableCores(), [13:13:45.281] lazy = FALSE, rscript_libs = .libPaths(), [13:13:45.281] envir = parent.frame()) [13:13:45.281] { [13:13:45.281] if (is.function(workers)) [13:13:45.281] workers <- workers() [13:13:45.281] workers <- structure(as.integer(workers), [13:13:45.281] class = class(workers)) [13:13:45.281] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:45.281] workers >= 1) [13:13:45.281] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:45.281] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:45.281] } [13:13:45.281] future <- MultisessionFuture(..., workers = workers, [13:13:45.281] lazy = lazy, rscript_libs = rscript_libs, [13:13:45.281] envir = envir) [13:13:45.281] if (!future$lazy) [13:13:45.281] future <- run(future) [13:13:45.281] invisible(future) [13:13:45.281] }), .cleanup = FALSE, .init = FALSE) [13:13:45.281] } [13:13:45.281] } [13:13:45.281] } [13:13:45.281] }) [13:13:45.281] if (TRUE) { [13:13:45.281] base::sink(type = "output", split = FALSE) [13:13:45.281] if (TRUE) { [13:13:45.281] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:45.281] } [13:13:45.281] else { [13:13:45.281] ...future.result["stdout"] <- base::list(NULL) [13:13:45.281] } [13:13:45.281] base::close(...future.stdout) [13:13:45.281] ...future.stdout <- NULL [13:13:45.281] } [13:13:45.281] ...future.result$conditions <- ...future.conditions [13:13:45.281] ...future.result$finished <- base::Sys.time() [13:13:45.281] ...future.result [13:13:45.281] } [13:13:45.287] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... [13:13:45.287] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... [13:13:45.287] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... DONE [13:13:45.288] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... [13:13:45.288] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... DONE [13:13:45.288] Exporting '...future.elements_ii' (120 bytes) to cluster node #1 ... [13:13:45.289] Exporting '...future.elements_ii' (120 bytes) to cluster node #1 ... DONE [13:13:45.289] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:13:45.289] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:13:45.290] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:13:45.290] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:13:45.290] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... DONE [13:13:45.291] MultisessionFuture started [13:13:45.291] - Launch lazy future ... done [13:13:45.291] run() for 'MultisessionFuture' ... done [13:13:45.291] Created future: [13:13:45.307] receiveMessageFromWorker() for ClusterFuture ... [13:13:45.307] - Validating connection of MultisessionFuture [13:13:45.308] - received message: FutureResult [13:13:45.308] - Received FutureResult [13:13:45.308] - Erased future from FutureRegistry [13:13:45.308] result() for ClusterFuture ... [13:13:45.308] - result already collected: FutureResult [13:13:45.308] result() for ClusterFuture ... done [13:13:45.309] receiveMessageFromWorker() for ClusterFuture ... done [13:13:45.292] MultisessionFuture: [13:13:45.292] Label: 'future_lapply-3' [13:13:45.292] Expression: [13:13:45.292] { [13:13:45.292] do.call(function(...) { [13:13:45.292] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:45.292] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:45.292] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:45.292] on.exit(options(oopts), add = TRUE) [13:13:45.292] } [13:13:45.292] { [13:13:45.292] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:45.292] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:45.292] ...future.FUN(...future.X_jj, ...) [13:13:45.292] }) [13:13:45.292] } [13:13:45.292] }, args = future.call.arguments) [13:13:45.292] } [13:13:45.292] Lazy evaluation: FALSE [13:13:45.292] Asynchronous evaluation: TRUE [13:13:45.292] Local evaluation: TRUE [13:13:45.292] Environment: R_GlobalEnv [13:13:45.292] Capture standard output: TRUE [13:13:45.292] Capture condition classes: 'condition' (excluding 'nothing') [13:13:45.292] 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) [13:13:45.292] Packages: [13:13:45.292] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:45.292] Resolved: TRUE [13:13:45.292] Value: [13:13:45.292] Conditions captured: [13:13:45.292] Early signaling: FALSE [13:13:45.292] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:45.292] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:45.309] Chunk #3 of 4 ... DONE [13:13:45.309] Chunk #4 of 4 ... [13:13:45.309] - Finding globals in 'X' for chunk #4 ... [13:13:45.309] getGlobalsAndPackages() ... [13:13:45.310] Searching for globals... [13:13:45.310] [13:13:45.310] Searching for globals ... DONE [13:13:45.310] - globals: [0] [13:13:45.310] getGlobalsAndPackages() ... DONE [13:13:45.311] + additional globals found: [n=0] [13:13:45.311] + additional namespaces needed: [n=0] [13:13:45.311] - Finding globals in 'X' for chunk #4 ... DONE [13:13:45.311] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [13:13:45.311] - seeds: [13:13:45.311] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:45.312] getGlobalsAndPackages() ... [13:13:45.312] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:45.312] Resolving globals: FALSE [13:13:45.312] Tweak future expression to call with '...' arguments ... [13:13:45.312] { [13:13:45.312] do.call(function(...) { [13:13:45.312] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:45.312] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:45.312] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:45.312] on.exit(options(oopts), add = TRUE) [13:13:45.312] } [13:13:45.312] { [13:13:45.312] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:45.312] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:45.312] ...future.FUN(...future.X_jj, ...) [13:13:45.312] }) [13:13:45.312] } [13:13:45.312] }, args = future.call.arguments) [13:13:45.312] } [13:13:45.313] Tweak future expression to call with '...' arguments ... DONE [13:13:45.313] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:45.313] [13:13:45.313] getGlobalsAndPackages() ... DONE [13:13:45.314] run() for 'Future' ... [13:13:45.314] - state: 'created' [13:13:45.314] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:45.328] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:45.328] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:13:45.328] - Field: 'node' [13:13:45.328] - Field: 'label' [13:13:45.329] - Field: 'local' [13:13:45.329] - Field: 'owner' [13:13:45.329] - Field: 'envir' [13:13:45.329] - Field: 'workers' [13:13:45.329] - Field: 'packages' [13:13:45.329] - Field: 'gc' [13:13:45.330] - Field: 'conditions' [13:13:45.330] - Field: 'persistent' [13:13:45.330] - Field: 'expr' [13:13:45.330] - Field: 'uuid' [13:13:45.330] - Field: 'seed' [13:13:45.330] - Field: 'version' [13:13:45.331] - Field: 'result' [13:13:45.331] - Field: 'asynchronous' [13:13:45.331] - Field: 'calls' [13:13:45.331] - Field: 'globals' [13:13:45.331] - Field: 'stdout' [13:13:45.332] - Field: 'earlySignal' [13:13:45.332] - Field: 'lazy' [13:13:45.332] - Field: 'state' [13:13:45.332] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:13:45.332] - Launch lazy future ... [13:13:45.333] Packages needed by the future expression (n = 0): [13:13:45.333] Packages needed by future strategies (n = 0): [13:13:45.333] { [13:13:45.333] { [13:13:45.333] { [13:13:45.333] ...future.startTime <- base::Sys.time() [13:13:45.333] { [13:13:45.333] { [13:13:45.333] { [13:13:45.333] { [13:13:45.333] base::local({ [13:13:45.333] has_future <- base::requireNamespace("future", [13:13:45.333] quietly = TRUE) [13:13:45.333] if (has_future) { [13:13:45.333] ns <- base::getNamespace("future") [13:13:45.333] version <- ns[[".package"]][["version"]] [13:13:45.333] if (is.null(version)) [13:13:45.333] version <- utils::packageVersion("future") [13:13:45.333] } [13:13:45.333] else { [13:13:45.333] version <- NULL [13:13:45.333] } [13:13:45.333] if (!has_future || version < "1.8.0") { [13:13:45.333] info <- base::c(r_version = base::gsub("R version ", [13:13:45.333] "", base::R.version$version.string), [13:13:45.333] platform = base::sprintf("%s (%s-bit)", [13:13:45.333] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:45.333] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:45.333] "release", "version")], collapse = " "), [13:13:45.333] hostname = base::Sys.info()[["nodename"]]) [13:13:45.333] info <- base::sprintf("%s: %s", base::names(info), [13:13:45.333] info) [13:13:45.333] info <- base::paste(info, collapse = "; ") [13:13:45.333] if (!has_future) { [13:13:45.333] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:45.333] info) [13:13:45.333] } [13:13:45.333] else { [13:13:45.333] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:45.333] info, version) [13:13:45.333] } [13:13:45.333] base::stop(msg) [13:13:45.333] } [13:13:45.333] }) [13:13:45.333] } [13:13:45.333] ...future.mc.cores.old <- base::getOption("mc.cores") [13:13:45.333] base::options(mc.cores = 1L) [13:13:45.333] } [13:13:45.333] options(future.plan = NULL) [13:13:45.333] Sys.unsetenv("R_FUTURE_PLAN") [13:13:45.333] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:45.333] } [13:13:45.333] ...future.workdir <- getwd() [13:13:45.333] } [13:13:45.333] ...future.oldOptions <- base::as.list(base::.Options) [13:13:45.333] ...future.oldEnvVars <- base::Sys.getenv() [13:13:45.333] } [13:13:45.333] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:45.333] future.globals.maxSize = 2097152000, future.globals.method = NULL, [13:13:45.333] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:45.333] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:45.333] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:45.333] future.stdout.windows.reencode = NULL, width = 80L) [13:13:45.333] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:45.333] base::names(...future.oldOptions)) [13:13:45.333] } [13:13:45.333] if (FALSE) { [13:13:45.333] } [13:13:45.333] else { [13:13:45.333] if (TRUE) { [13:13:45.333] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:45.333] open = "w") [13:13:45.333] } [13:13:45.333] else { [13:13:45.333] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:45.333] windows = "NUL", "/dev/null"), open = "w") [13:13:45.333] } [13:13:45.333] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:45.333] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:45.333] base::sink(type = "output", split = FALSE) [13:13:45.333] base::close(...future.stdout) [13:13:45.333] }, add = TRUE) [13:13:45.333] } [13:13:45.333] ...future.frame <- base::sys.nframe() [13:13:45.333] ...future.conditions <- base::list() [13:13:45.333] ...future.rng <- base::globalenv()$.Random.seed [13:13:45.333] if (FALSE) { [13:13:45.333] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:45.333] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:45.333] } [13:13:45.333] ...future.result <- base::tryCatch({ [13:13:45.333] base::withCallingHandlers({ [13:13:45.333] ...future.value <- base::withVisible(base::local({ [13:13:45.333] ...future.makeSendCondition <- local({ [13:13:45.333] sendCondition <- NULL [13:13:45.333] function(frame = 1L) { [13:13:45.333] if (is.function(sendCondition)) [13:13:45.333] return(sendCondition) [13:13:45.333] ns <- getNamespace("parallel") [13:13:45.333] if (exists("sendData", mode = "function", [13:13:45.333] envir = ns)) { [13:13:45.333] parallel_sendData <- get("sendData", mode = "function", [13:13:45.333] envir = ns) [13:13:45.333] envir <- sys.frame(frame) [13:13:45.333] master <- NULL [13:13:45.333] while (!identical(envir, .GlobalEnv) && [13:13:45.333] !identical(envir, emptyenv())) { [13:13:45.333] if (exists("master", mode = "list", envir = envir, [13:13:45.333] inherits = FALSE)) { [13:13:45.333] master <- get("master", mode = "list", [13:13:45.333] envir = envir, inherits = FALSE) [13:13:45.333] if (inherits(master, c("SOCKnode", [13:13:45.333] "SOCK0node"))) { [13:13:45.333] sendCondition <<- function(cond) { [13:13:45.333] data <- list(type = "VALUE", value = cond, [13:13:45.333] success = TRUE) [13:13:45.333] parallel_sendData(master, data) [13:13:45.333] } [13:13:45.333] return(sendCondition) [13:13:45.333] } [13:13:45.333] } [13:13:45.333] frame <- frame + 1L [13:13:45.333] envir <- sys.frame(frame) [13:13:45.333] } [13:13:45.333] } [13:13:45.333] sendCondition <<- function(cond) NULL [13:13:45.333] } [13:13:45.333] }) [13:13:45.333] withCallingHandlers({ [13:13:45.333] { [13:13:45.333] do.call(function(...) { [13:13:45.333] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:45.333] if (!identical(...future.globals.maxSize.org, [13:13:45.333] ...future.globals.maxSize)) { [13:13:45.333] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:45.333] on.exit(options(oopts), add = TRUE) [13:13:45.333] } [13:13:45.333] { [13:13:45.333] lapply(seq_along(...future.elements_ii), [13:13:45.333] FUN = function(jj) { [13:13:45.333] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:45.333] ...future.FUN(...future.X_jj, ...) [13:13:45.333] }) [13:13:45.333] } [13:13:45.333] }, args = future.call.arguments) [13:13:45.333] } [13:13:45.333] }, immediateCondition = function(cond) { [13:13:45.333] sendCondition <- ...future.makeSendCondition() [13:13:45.333] sendCondition(cond) [13:13:45.333] muffleCondition <- function (cond, pattern = "^muffle") [13:13:45.333] { [13:13:45.333] inherits <- base::inherits [13:13:45.333] invokeRestart <- base::invokeRestart [13:13:45.333] is.null <- base::is.null [13:13:45.333] muffled <- FALSE [13:13:45.333] if (inherits(cond, "message")) { [13:13:45.333] muffled <- grepl(pattern, "muffleMessage") [13:13:45.333] if (muffled) [13:13:45.333] invokeRestart("muffleMessage") [13:13:45.333] } [13:13:45.333] else if (inherits(cond, "warning")) { [13:13:45.333] muffled <- grepl(pattern, "muffleWarning") [13:13:45.333] if (muffled) [13:13:45.333] invokeRestart("muffleWarning") [13:13:45.333] } [13:13:45.333] else if (inherits(cond, "condition")) { [13:13:45.333] if (!is.null(pattern)) { [13:13:45.333] computeRestarts <- base::computeRestarts [13:13:45.333] grepl <- base::grepl [13:13:45.333] restarts <- computeRestarts(cond) [13:13:45.333] for (restart in restarts) { [13:13:45.333] name <- restart$name [13:13:45.333] if (is.null(name)) [13:13:45.333] next [13:13:45.333] if (!grepl(pattern, name)) [13:13:45.333] next [13:13:45.333] invokeRestart(restart) [13:13:45.333] muffled <- TRUE [13:13:45.333] break [13:13:45.333] } [13:13:45.333] } [13:13:45.333] } [13:13:45.333] invisible(muffled) [13:13:45.333] } [13:13:45.333] muffleCondition(cond) [13:13:45.333] }) [13:13:45.333] })) [13:13:45.333] future::FutureResult(value = ...future.value$value, [13:13:45.333] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:45.333] ...future.rng), globalenv = if (FALSE) [13:13:45.333] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:45.333] ...future.globalenv.names)) [13:13:45.333] else NULL, started = ...future.startTime, version = "1.8") [13:13:45.333] }, condition = base::local({ [13:13:45.333] c <- base::c [13:13:45.333] inherits <- base::inherits [13:13:45.333] invokeRestart <- base::invokeRestart [13:13:45.333] length <- base::length [13:13:45.333] list <- base::list [13:13:45.333] seq.int <- base::seq.int [13:13:45.333] signalCondition <- base::signalCondition [13:13:45.333] sys.calls <- base::sys.calls [13:13:45.333] `[[` <- base::`[[` [13:13:45.333] `+` <- base::`+` [13:13:45.333] `<<-` <- base::`<<-` [13:13:45.333] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:45.333] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:45.333] 3L)] [13:13:45.333] } [13:13:45.333] function(cond) { [13:13:45.333] is_error <- inherits(cond, "error") [13:13:45.333] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:45.333] NULL) [13:13:45.333] if (is_error) { [13:13:45.333] sessionInformation <- function() { [13:13:45.333] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:45.333] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:45.333] search = base::search(), system = base::Sys.info()) [13:13:45.333] } [13:13:45.333] ...future.conditions[[length(...future.conditions) + [13:13:45.333] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:45.333] cond$call), session = sessionInformation(), [13:13:45.333] timestamp = base::Sys.time(), signaled = 0L) [13:13:45.333] signalCondition(cond) [13:13:45.333] } [13:13:45.333] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:45.333] "immediateCondition"))) { [13:13:45.333] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:45.333] ...future.conditions[[length(...future.conditions) + [13:13:45.333] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:45.333] if (TRUE && !signal) { [13:13:45.333] muffleCondition <- function (cond, pattern = "^muffle") [13:13:45.333] { [13:13:45.333] inherits <- base::inherits [13:13:45.333] invokeRestart <- base::invokeRestart [13:13:45.333] is.null <- base::is.null [13:13:45.333] muffled <- FALSE [13:13:45.333] if (inherits(cond, "message")) { [13:13:45.333] muffled <- grepl(pattern, "muffleMessage") [13:13:45.333] if (muffled) [13:13:45.333] invokeRestart("muffleMessage") [13:13:45.333] } [13:13:45.333] else if (inherits(cond, "warning")) { [13:13:45.333] muffled <- grepl(pattern, "muffleWarning") [13:13:45.333] if (muffled) [13:13:45.333] invokeRestart("muffleWarning") [13:13:45.333] } [13:13:45.333] else if (inherits(cond, "condition")) { [13:13:45.333] if (!is.null(pattern)) { [13:13:45.333] computeRestarts <- base::computeRestarts [13:13:45.333] grepl <- base::grepl [13:13:45.333] restarts <- computeRestarts(cond) [13:13:45.333] for (restart in restarts) { [13:13:45.333] name <- restart$name [13:13:45.333] if (is.null(name)) [13:13:45.333] next [13:13:45.333] if (!grepl(pattern, name)) [13:13:45.333] next [13:13:45.333] invokeRestart(restart) [13:13:45.333] muffled <- TRUE [13:13:45.333] break [13:13:45.333] } [13:13:45.333] } [13:13:45.333] } [13:13:45.333] invisible(muffled) [13:13:45.333] } [13:13:45.333] muffleCondition(cond, pattern = "^muffle") [13:13:45.333] } [13:13:45.333] } [13:13:45.333] else { [13:13:45.333] if (TRUE) { [13:13:45.333] muffleCondition <- function (cond, pattern = "^muffle") [13:13:45.333] { [13:13:45.333] inherits <- base::inherits [13:13:45.333] invokeRestart <- base::invokeRestart [13:13:45.333] is.null <- base::is.null [13:13:45.333] muffled <- FALSE [13:13:45.333] if (inherits(cond, "message")) { [13:13:45.333] muffled <- grepl(pattern, "muffleMessage") [13:13:45.333] if (muffled) [13:13:45.333] invokeRestart("muffleMessage") [13:13:45.333] } [13:13:45.333] else if (inherits(cond, "warning")) { [13:13:45.333] muffled <- grepl(pattern, "muffleWarning") [13:13:45.333] if (muffled) [13:13:45.333] invokeRestart("muffleWarning") [13:13:45.333] } [13:13:45.333] else if (inherits(cond, "condition")) { [13:13:45.333] if (!is.null(pattern)) { [13:13:45.333] computeRestarts <- base::computeRestarts [13:13:45.333] grepl <- base::grepl [13:13:45.333] restarts <- computeRestarts(cond) [13:13:45.333] for (restart in restarts) { [13:13:45.333] name <- restart$name [13:13:45.333] if (is.null(name)) [13:13:45.333] next [13:13:45.333] if (!grepl(pattern, name)) [13:13:45.333] next [13:13:45.333] invokeRestart(restart) [13:13:45.333] muffled <- TRUE [13:13:45.333] break [13:13:45.333] } [13:13:45.333] } [13:13:45.333] } [13:13:45.333] invisible(muffled) [13:13:45.333] } [13:13:45.333] muffleCondition(cond, pattern = "^muffle") [13:13:45.333] } [13:13:45.333] } [13:13:45.333] } [13:13:45.333] })) [13:13:45.333] }, error = function(ex) { [13:13:45.333] base::structure(base::list(value = NULL, visible = NULL, [13:13:45.333] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:45.333] ...future.rng), started = ...future.startTime, [13:13:45.333] finished = Sys.time(), session_uuid = NA_character_, [13:13:45.333] version = "1.8"), class = "FutureResult") [13:13:45.333] }, finally = { [13:13:45.333] if (!identical(...future.workdir, getwd())) [13:13:45.333] setwd(...future.workdir) [13:13:45.333] { [13:13:45.333] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:45.333] ...future.oldOptions$nwarnings <- NULL [13:13:45.333] } [13:13:45.333] base::options(...future.oldOptions) [13:13:45.333] if (.Platform$OS.type == "windows") { [13:13:45.333] old_names <- names(...future.oldEnvVars) [13:13:45.333] envs <- base::Sys.getenv() [13:13:45.333] names <- names(envs) [13:13:45.333] common <- intersect(names, old_names) [13:13:45.333] added <- setdiff(names, old_names) [13:13:45.333] removed <- setdiff(old_names, names) [13:13:45.333] changed <- common[...future.oldEnvVars[common] != [13:13:45.333] envs[common]] [13:13:45.333] NAMES <- toupper(changed) [13:13:45.333] args <- list() [13:13:45.333] for (kk in seq_along(NAMES)) { [13:13:45.333] name <- changed[[kk]] [13:13:45.333] NAME <- NAMES[[kk]] [13:13:45.333] if (name != NAME && is.element(NAME, old_names)) [13:13:45.333] next [13:13:45.333] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:45.333] } [13:13:45.333] NAMES <- toupper(added) [13:13:45.333] for (kk in seq_along(NAMES)) { [13:13:45.333] name <- added[[kk]] [13:13:45.333] NAME <- NAMES[[kk]] [13:13:45.333] if (name != NAME && is.element(NAME, old_names)) [13:13:45.333] next [13:13:45.333] args[[name]] <- "" [13:13:45.333] } [13:13:45.333] NAMES <- toupper(removed) [13:13:45.333] for (kk in seq_along(NAMES)) { [13:13:45.333] name <- removed[[kk]] [13:13:45.333] NAME <- NAMES[[kk]] [13:13:45.333] if (name != NAME && is.element(NAME, old_names)) [13:13:45.333] next [13:13:45.333] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:45.333] } [13:13:45.333] if (length(args) > 0) [13:13:45.333] base::do.call(base::Sys.setenv, args = args) [13:13:45.333] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:45.333] } [13:13:45.333] else { [13:13:45.333] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:45.333] } [13:13:45.333] { [13:13:45.333] if (base::length(...future.futureOptionsAdded) > [13:13:45.333] 0L) { [13:13:45.333] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:45.333] base::names(opts) <- ...future.futureOptionsAdded [13:13:45.333] base::options(opts) [13:13:45.333] } [13:13:45.333] { [13:13:45.333] { [13:13:45.333] base::options(mc.cores = ...future.mc.cores.old) [13:13:45.333] NULL [13:13:45.333] } [13:13:45.333] options(future.plan = NULL) [13:13:45.333] if (is.na(NA_character_)) [13:13:45.333] Sys.unsetenv("R_FUTURE_PLAN") [13:13:45.333] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:45.333] future::plan(list(function (..., workers = availableCores(), [13:13:45.333] lazy = FALSE, rscript_libs = .libPaths(), [13:13:45.333] envir = parent.frame()) [13:13:45.333] { [13:13:45.333] if (is.function(workers)) [13:13:45.333] workers <- workers() [13:13:45.333] workers <- structure(as.integer(workers), [13:13:45.333] class = class(workers)) [13:13:45.333] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:45.333] workers >= 1) [13:13:45.333] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:45.333] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:45.333] } [13:13:45.333] future <- MultisessionFuture(..., workers = workers, [13:13:45.333] lazy = lazy, rscript_libs = rscript_libs, [13:13:45.333] envir = envir) [13:13:45.333] if (!future$lazy) [13:13:45.333] future <- run(future) [13:13:45.333] invisible(future) [13:13:45.333] }), .cleanup = FALSE, .init = FALSE) [13:13:45.333] } [13:13:45.333] } [13:13:45.333] } [13:13:45.333] }) [13:13:45.333] if (TRUE) { [13:13:45.333] base::sink(type = "output", split = FALSE) [13:13:45.333] if (TRUE) { [13:13:45.333] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:45.333] } [13:13:45.333] else { [13:13:45.333] ...future.result["stdout"] <- base::list(NULL) [13:13:45.333] } [13:13:45.333] base::close(...future.stdout) [13:13:45.333] ...future.stdout <- NULL [13:13:45.333] } [13:13:45.333] ...future.result$conditions <- ...future.conditions [13:13:45.333] ...future.result$finished <- base::Sys.time() [13:13:45.333] ...future.result [13:13:45.333] } [13:13:45.339] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... [13:13:45.339] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... [13:13:45.339] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... DONE [13:13:45.340] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... [13:13:45.340] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... DONE [13:13:45.340] Exporting '...future.elements_ii' (112 bytes) to cluster node #1 ... [13:13:45.341] Exporting '...future.elements_ii' (112 bytes) to cluster node #1 ... DONE [13:13:45.341] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:13:45.341] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:13:45.342] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:13:45.342] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:13:45.342] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... DONE [13:13:45.343] MultisessionFuture started [13:13:45.343] - Launch lazy future ... done [13:13:45.343] run() for 'MultisessionFuture' ... done [13:13:45.343] Created future: [13:13:45.359] receiveMessageFromWorker() for ClusterFuture ... [13:13:45.359] - Validating connection of MultisessionFuture [13:13:45.359] - received message: FutureResult [13:13:45.360] - Received FutureResult [13:13:45.360] - Erased future from FutureRegistry [13:13:45.360] result() for ClusterFuture ... [13:13:45.360] - result already collected: FutureResult [13:13:45.360] result() for ClusterFuture ... done [13:13:45.360] receiveMessageFromWorker() for ClusterFuture ... done [13:13:45.343] MultisessionFuture: [13:13:45.343] Label: 'future_lapply-4' [13:13:45.343] Expression: [13:13:45.343] { [13:13:45.343] do.call(function(...) { [13:13:45.343] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:45.343] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:45.343] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:45.343] on.exit(options(oopts), add = TRUE) [13:13:45.343] } [13:13:45.343] { [13:13:45.343] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:45.343] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:45.343] ...future.FUN(...future.X_jj, ...) [13:13:45.343] }) [13:13:45.343] } [13:13:45.343] }, args = future.call.arguments) [13:13:45.343] } [13:13:45.343] Lazy evaluation: FALSE [13:13:45.343] Asynchronous evaluation: TRUE [13:13:45.343] Local evaluation: TRUE [13:13:45.343] Environment: R_GlobalEnv [13:13:45.343] Capture standard output: TRUE [13:13:45.343] Capture condition classes: 'condition' (excluding 'nothing') [13:13:45.343] 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) [13:13:45.343] Packages: [13:13:45.343] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:45.343] Resolved: TRUE [13:13:45.343] Value: [13:13:45.343] Conditions captured: [13:13:45.343] Early signaling: FALSE [13:13:45.343] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:45.343] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:45.361] Chunk #4 of 4 ... DONE [13:13:45.361] Launching 4 futures (chunks) ... DONE [13:13:45.361] Resolving 4 futures (chunks) ... [13:13:45.361] resolve() on list ... [13:13:45.361] recursive: 0 [13:13:45.362] length: 4 [13:13:45.362] [13:13:45.362] Future #1 [13:13:45.362] result() for ClusterFuture ... [13:13:45.362] - result already collected: FutureResult [13:13:45.362] result() for ClusterFuture ... done [13:13:45.362] result() for ClusterFuture ... [13:13:45.363] - result already collected: FutureResult [13:13:45.363] result() for ClusterFuture ... done [13:13:45.363] signalConditionsASAP(MultisessionFuture, pos=1) ... [13:13:45.363] - nx: 4 [13:13:45.363] - relay: TRUE [13:13:45.363] - stdout: TRUE [13:13:45.364] - signal: TRUE [13:13:45.364] - resignal: FALSE [13:13:45.364] - force: TRUE [13:13:45.364] - relayed: [n=4] FALSE, FALSE, FALSE, FALSE [13:13:45.364] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [13:13:45.364] - until=1 [13:13:45.364] - relaying element #1 [13:13:45.365] result() for ClusterFuture ... [13:13:45.365] - result already collected: FutureResult [13:13:45.365] result() for ClusterFuture ... done [13:13:45.365] result() for ClusterFuture ... [13:13:45.365] - result already collected: FutureResult [13:13:45.365] result() for ClusterFuture ... done [13:13:45.366] result() for ClusterFuture ... [13:13:45.366] - result already collected: FutureResult [13:13:45.366] result() for ClusterFuture ... done [13:13:45.366] result() for ClusterFuture ... [13:13:45.366] - result already collected: FutureResult [13:13:45.366] result() for ClusterFuture ... done [13:13:45.367] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [13:13:45.367] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [13:13:45.367] signalConditionsASAP(MultisessionFuture, pos=1) ... done [13:13:45.367] length: 3 (resolved future 1) [13:13:45.367] Future #2 [13:13:45.367] result() for ClusterFuture ... [13:13:45.368] - result already collected: FutureResult [13:13:45.368] result() for ClusterFuture ... done [13:13:45.368] result() for ClusterFuture ... [13:13:45.368] - result already collected: FutureResult [13:13:45.368] result() for ClusterFuture ... done [13:13:45.368] signalConditionsASAP(MultisessionFuture, pos=2) ... [13:13:45.369] - nx: 4 [13:13:45.369] - relay: TRUE [13:13:45.369] - stdout: TRUE [13:13:45.369] - signal: TRUE [13:13:45.369] - resignal: FALSE [13:13:45.369] - force: TRUE [13:13:45.369] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [13:13:45.370] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [13:13:45.370] - until=2 [13:13:45.370] - relaying element #2 [13:13:45.370] result() for ClusterFuture ... [13:13:45.370] - result already collected: FutureResult [13:13:45.370] result() for ClusterFuture ... done [13:13:45.370] result() for ClusterFuture ... [13:13:45.371] - result already collected: FutureResult [13:13:45.371] result() for ClusterFuture ... done [13:13:45.371] result() for ClusterFuture ... [13:13:45.371] - result already collected: FutureResult [13:13:45.371] result() for ClusterFuture ... done [13:13:45.371] result() for ClusterFuture ... [13:13:45.372] - result already collected: FutureResult [13:13:45.372] result() for ClusterFuture ... done [13:13:45.372] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [13:13:45.372] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [13:13:45.372] signalConditionsASAP(MultisessionFuture, pos=2) ... done [13:13:45.372] length: 2 (resolved future 2) [13:13:45.373] Future #3 [13:13:45.373] result() for ClusterFuture ... [13:13:45.373] - result already collected: FutureResult [13:13:45.373] result() for ClusterFuture ... done [13:13:45.373] result() for ClusterFuture ... [13:13:45.373] - result already collected: FutureResult [13:13:45.373] result() for ClusterFuture ... done [13:13:45.374] signalConditionsASAP(MultisessionFuture, pos=3) ... [13:13:45.374] - nx: 4 [13:13:45.374] - relay: TRUE [13:13:45.374] - stdout: TRUE [13:13:45.374] - signal: TRUE [13:13:45.374] - resignal: FALSE [13:13:45.375] - force: TRUE [13:13:45.375] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [13:13:45.375] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [13:13:45.375] - until=3 [13:13:45.375] - relaying element #3 [13:13:45.375] result() for ClusterFuture ... [13:13:45.375] - result already collected: FutureResult [13:13:45.376] result() for ClusterFuture ... done [13:13:45.376] result() for ClusterFuture ... [13:13:45.376] - result already collected: FutureResult [13:13:45.376] result() for ClusterFuture ... done [13:13:45.376] result() for ClusterFuture ... [13:13:45.376] - result already collected: FutureResult [13:13:45.377] result() for ClusterFuture ... done [13:13:45.377] result() for ClusterFuture ... [13:13:45.377] - result already collected: FutureResult [13:13:45.377] result() for ClusterFuture ... done [13:13:45.377] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [13:13:45.377] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [13:13:45.377] signalConditionsASAP(MultisessionFuture, pos=3) ... done [13:13:45.378] length: 1 (resolved future 3) [13:13:45.378] Future #4 [13:13:45.378] result() for ClusterFuture ... [13:13:45.378] - result already collected: FutureResult [13:13:45.378] result() for ClusterFuture ... done [13:13:45.378] result() for ClusterFuture ... [13:13:45.379] - result already collected: FutureResult [13:13:45.379] result() for ClusterFuture ... done [13:13:45.379] signalConditionsASAP(MultisessionFuture, pos=4) ... [13:13:45.379] - nx: 4 [13:13:45.379] - relay: TRUE [13:13:45.379] - stdout: TRUE [13:13:45.380] - signal: TRUE [13:13:45.380] - resignal: FALSE [13:13:45.380] - force: TRUE [13:13:45.380] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [13:13:45.380] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [13:13:45.380] - until=4 [13:13:45.380] - relaying element #4 [13:13:45.381] result() for ClusterFuture ... [13:13:45.381] - result already collected: FutureResult [13:13:45.381] result() for ClusterFuture ... done [13:13:45.381] result() for ClusterFuture ... [13:13:45.381] - result already collected: FutureResult [13:13:45.381] result() for ClusterFuture ... done [13:13:45.382] result() for ClusterFuture ... [13:13:45.382] - result already collected: FutureResult [13:13:45.382] result() for ClusterFuture ... done [13:13:45.382] result() for ClusterFuture ... [13:13:45.382] - result already collected: FutureResult [13:13:45.382] result() for ClusterFuture ... done [13:13:45.383] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [13:13:45.383] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [13:13:45.383] signalConditionsASAP(MultisessionFuture, pos=4) ... done [13:13:45.383] length: 0 (resolved future 4) [13:13:45.383] Relaying remaining futures [13:13:45.383] signalConditionsASAP(NULL, pos=0) ... [13:13:45.384] - nx: 4 [13:13:45.384] - relay: TRUE [13:13:45.384] - stdout: TRUE [13:13:45.384] - signal: TRUE [13:13:45.384] - resignal: FALSE [13:13:45.384] - force: TRUE [13:13:45.384] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [13:13:45.385] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE - flush all [13:13:45.385] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [13:13:45.385] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [13:13:45.385] signalConditionsASAP(NULL, pos=0) ... done [13:13:45.385] resolve() on list ... DONE [13:13:45.385] result() for ClusterFuture ... [13:13:45.386] - result already collected: FutureResult [13:13:45.386] result() for ClusterFuture ... done [13:13:45.386] result() for ClusterFuture ... [13:13:45.386] - result already collected: FutureResult [13:13:45.386] result() for ClusterFuture ... done [13:13:45.386] result() for ClusterFuture ... [13:13:45.387] - result already collected: FutureResult [13:13:45.387] result() for ClusterFuture ... done [13:13:45.387] result() for ClusterFuture ... [13:13:45.387] - result already collected: FutureResult [13:13:45.387] result() for ClusterFuture ... done [13:13:45.387] result() for ClusterFuture ... [13:13:45.387] - result already collected: FutureResult [13:13:45.388] result() for ClusterFuture ... done [13:13:45.388] result() for ClusterFuture ... [13:13:45.388] - result already collected: FutureResult [13:13:45.388] result() for ClusterFuture ... done [13:13:45.388] result() for ClusterFuture ... [13:13:45.388] - result already collected: FutureResult [13:13:45.389] result() for ClusterFuture ... done [13:13:45.389] result() for ClusterFuture ... [13:13:45.389] - result already collected: FutureResult [13:13:45.389] result() for ClusterFuture ... done [13:13:45.389] - Number of value chunks collected: 4 [13:13:45.389] Resolving 4 futures (chunks) ... DONE [13:13:45.390] Reducing values from 4 chunks ... [13:13:45.390] - Number of values collected after concatenation: 4 [13:13:45.390] - Number of values expected: 4 [13:13:45.390] Reducing values from 4 chunks ... DONE [13:13:45.390] 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, ...) ... [13:13:45.393] future_lapply() ... [13:13:45.396] Number of chunks: 4 [13:13:45.396] getGlobalsAndPackagesXApply() ... [13:13:45.396] - future.globals: TRUE [13:13:45.396] getGlobalsAndPackages() ... [13:13:45.397] Searching for globals... [13:13:45.398] - globals found: [2] 'FUN', '.Internal' [13:13:45.398] Searching for globals ... DONE [13:13:45.398] Resolving globals: FALSE [13:13:45.399] The total size of the 1 globals is 2.13 KiB (2184 bytes) [13:13:45.399] 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') [13:13:45.399] - globals: [1] 'FUN' [13:13:45.400] [13:13:45.400] getGlobalsAndPackages() ... DONE [13:13:45.400] - globals found/used: [n=1] 'FUN' [13:13:45.400] - needed namespaces: [n=0] [13:13:45.400] Finding globals ... DONE [13:13:45.400] - use_args: TRUE [13:13:45.401] - Getting '...' globals ... [13:13:45.401] resolve() on list ... [13:13:45.401] recursive: 0 [13:13:45.401] length: 1 [13:13:45.401] elements: '...' [13:13:45.402] length: 0 (resolved future 1) [13:13:45.402] resolve() on list ... DONE [13:13:45.404] - '...' content: [n=1] 'length' [13:13:45.404] List of 1 [13:13:45.404] $ ...:List of 1 [13:13:45.404] ..$ length: int 2 [13:13:45.404] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:45.404] - attr(*, "where")=List of 1 [13:13:45.404] ..$ ...: [13:13:45.404] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:45.404] - attr(*, "resolved")= logi TRUE [13:13:45.404] - attr(*, "total_size")= num NA [13:13:45.407] - Getting '...' globals ... DONE [13:13:45.408] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:45.408] List of 2 [13:13:45.408] $ ...future.FUN:function (mode = "logical", length = 0L) [13:13:45.408] $ ... :List of 1 [13:13:45.408] ..$ length: int 2 [13:13:45.408] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:45.408] - attr(*, "where")=List of 2 [13:13:45.408] ..$ ...future.FUN: [13:13:45.408] ..$ ... : [13:13:45.408] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:45.408] - attr(*, "resolved")= logi FALSE [13:13:45.408] - attr(*, "total_size")= num 2240 [13:13:45.412] Packages to be attached in all futures: [n=0] [13:13:45.412] getGlobalsAndPackagesXApply() ... DONE [13:13:45.412] Number of futures (= number of chunks): 4 [13:13:45.412] Launching 4 futures (chunks) ... [13:13:45.412] Chunk #1 of 4 ... [13:13:45.413] - Finding globals in 'X' for chunk #1 ... [13:13:45.413] getGlobalsAndPackages() ... [13:13:45.413] Searching for globals... [13:13:45.413] [13:13:45.413] Searching for globals ... DONE [13:13:45.414] - globals: [0] [13:13:45.414] getGlobalsAndPackages() ... DONE [13:13:45.414] + additional globals found: [n=0] [13:13:45.414] + additional namespaces needed: [n=0] [13:13:45.414] - Finding globals in 'X' for chunk #1 ... DONE [13:13:45.414] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [13:13:45.415] - seeds: [13:13:45.415] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:45.415] getGlobalsAndPackages() ... [13:13:45.415] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:45.415] Resolving globals: FALSE [13:13:45.415] Tweak future expression to call with '...' arguments ... [13:13:45.416] { [13:13:45.416] do.call(function(...) { [13:13:45.416] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:45.416] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:45.416] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:45.416] on.exit(options(oopts), add = TRUE) [13:13:45.416] } [13:13:45.416] { [13:13:45.416] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:45.416] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:45.416] ...future.FUN(...future.X_jj, ...) [13:13:45.416] }) [13:13:45.416] } [13:13:45.416] }, args = future.call.arguments) [13:13:45.416] } [13:13:45.416] Tweak future expression to call with '...' arguments ... DONE [13:13:45.417] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:45.417] [13:13:45.417] getGlobalsAndPackages() ... DONE [13:13:45.417] run() for 'Future' ... [13:13:45.417] - state: 'created' [13:13:45.418] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:45.433] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:45.433] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:13:45.434] - Field: 'node' [13:13:45.434] - Field: 'label' [13:13:45.434] - Field: 'local' [13:13:45.434] - Field: 'owner' [13:13:45.435] - Field: 'envir' [13:13:45.435] - Field: 'workers' [13:13:45.435] - Field: 'packages' [13:13:45.435] - Field: 'gc' [13:13:45.435] - Field: 'conditions' [13:13:45.436] - Field: 'persistent' [13:13:45.436] - Field: 'expr' [13:13:45.436] - Field: 'uuid' [13:13:45.436] - Field: 'seed' [13:13:45.436] - Field: 'version' [13:13:45.437] - Field: 'result' [13:13:45.437] - Field: 'asynchronous' [13:13:45.437] - Field: 'calls' [13:13:45.437] - Field: 'globals' [13:13:45.437] - Field: 'stdout' [13:13:45.438] - Field: 'earlySignal' [13:13:45.438] - Field: 'lazy' [13:13:45.438] - Field: 'state' [13:13:45.438] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:13:45.439] - Launch lazy future ... [13:13:45.439] Packages needed by the future expression (n = 0): [13:13:45.440] Packages needed by future strategies (n = 0): [13:13:45.441] { [13:13:45.441] { [13:13:45.441] { [13:13:45.441] ...future.startTime <- base::Sys.time() [13:13:45.441] { [13:13:45.441] { [13:13:45.441] { [13:13:45.441] { [13:13:45.441] base::local({ [13:13:45.441] has_future <- base::requireNamespace("future", [13:13:45.441] quietly = TRUE) [13:13:45.441] if (has_future) { [13:13:45.441] ns <- base::getNamespace("future") [13:13:45.441] version <- ns[[".package"]][["version"]] [13:13:45.441] if (is.null(version)) [13:13:45.441] version <- utils::packageVersion("future") [13:13:45.441] } [13:13:45.441] else { [13:13:45.441] version <- NULL [13:13:45.441] } [13:13:45.441] if (!has_future || version < "1.8.0") { [13:13:45.441] info <- base::c(r_version = base::gsub("R version ", [13:13:45.441] "", base::R.version$version.string), [13:13:45.441] platform = base::sprintf("%s (%s-bit)", [13:13:45.441] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:45.441] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:45.441] "release", "version")], collapse = " "), [13:13:45.441] hostname = base::Sys.info()[["nodename"]]) [13:13:45.441] info <- base::sprintf("%s: %s", base::names(info), [13:13:45.441] info) [13:13:45.441] info <- base::paste(info, collapse = "; ") [13:13:45.441] if (!has_future) { [13:13:45.441] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:45.441] info) [13:13:45.441] } [13:13:45.441] else { [13:13:45.441] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:45.441] info, version) [13:13:45.441] } [13:13:45.441] base::stop(msg) [13:13:45.441] } [13:13:45.441] }) [13:13:45.441] } [13:13:45.441] ...future.mc.cores.old <- base::getOption("mc.cores") [13:13:45.441] base::options(mc.cores = 1L) [13:13:45.441] } [13:13:45.441] options(future.plan = NULL) [13:13:45.441] Sys.unsetenv("R_FUTURE_PLAN") [13:13:45.441] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:45.441] } [13:13:45.441] ...future.workdir <- getwd() [13:13:45.441] } [13:13:45.441] ...future.oldOptions <- base::as.list(base::.Options) [13:13:45.441] ...future.oldEnvVars <- base::Sys.getenv() [13:13:45.441] } [13:13:45.441] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:45.441] future.globals.maxSize = 2097152000, future.globals.method = NULL, [13:13:45.441] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:45.441] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:45.441] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:45.441] future.stdout.windows.reencode = NULL, width = 80L) [13:13:45.441] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:45.441] base::names(...future.oldOptions)) [13:13:45.441] } [13:13:45.441] if (FALSE) { [13:13:45.441] } [13:13:45.441] else { [13:13:45.441] if (TRUE) { [13:13:45.441] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:45.441] open = "w") [13:13:45.441] } [13:13:45.441] else { [13:13:45.441] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:45.441] windows = "NUL", "/dev/null"), open = "w") [13:13:45.441] } [13:13:45.441] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:45.441] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:45.441] base::sink(type = "output", split = FALSE) [13:13:45.441] base::close(...future.stdout) [13:13:45.441] }, add = TRUE) [13:13:45.441] } [13:13:45.441] ...future.frame <- base::sys.nframe() [13:13:45.441] ...future.conditions <- base::list() [13:13:45.441] ...future.rng <- base::globalenv()$.Random.seed [13:13:45.441] if (FALSE) { [13:13:45.441] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:45.441] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:45.441] } [13:13:45.441] ...future.result <- base::tryCatch({ [13:13:45.441] base::withCallingHandlers({ [13:13:45.441] ...future.value <- base::withVisible(base::local({ [13:13:45.441] ...future.makeSendCondition <- local({ [13:13:45.441] sendCondition <- NULL [13:13:45.441] function(frame = 1L) { [13:13:45.441] if (is.function(sendCondition)) [13:13:45.441] return(sendCondition) [13:13:45.441] ns <- getNamespace("parallel") [13:13:45.441] if (exists("sendData", mode = "function", [13:13:45.441] envir = ns)) { [13:13:45.441] parallel_sendData <- get("sendData", mode = "function", [13:13:45.441] envir = ns) [13:13:45.441] envir <- sys.frame(frame) [13:13:45.441] master <- NULL [13:13:45.441] while (!identical(envir, .GlobalEnv) && [13:13:45.441] !identical(envir, emptyenv())) { [13:13:45.441] if (exists("master", mode = "list", envir = envir, [13:13:45.441] inherits = FALSE)) { [13:13:45.441] master <- get("master", mode = "list", [13:13:45.441] envir = envir, inherits = FALSE) [13:13:45.441] if (inherits(master, c("SOCKnode", [13:13:45.441] "SOCK0node"))) { [13:13:45.441] sendCondition <<- function(cond) { [13:13:45.441] data <- list(type = "VALUE", value = cond, [13:13:45.441] success = TRUE) [13:13:45.441] parallel_sendData(master, data) [13:13:45.441] } [13:13:45.441] return(sendCondition) [13:13:45.441] } [13:13:45.441] } [13:13:45.441] frame <- frame + 1L [13:13:45.441] envir <- sys.frame(frame) [13:13:45.441] } [13:13:45.441] } [13:13:45.441] sendCondition <<- function(cond) NULL [13:13:45.441] } [13:13:45.441] }) [13:13:45.441] withCallingHandlers({ [13:13:45.441] { [13:13:45.441] do.call(function(...) { [13:13:45.441] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:45.441] if (!identical(...future.globals.maxSize.org, [13:13:45.441] ...future.globals.maxSize)) { [13:13:45.441] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:45.441] on.exit(options(oopts), add = TRUE) [13:13:45.441] } [13:13:45.441] { [13:13:45.441] lapply(seq_along(...future.elements_ii), [13:13:45.441] FUN = function(jj) { [13:13:45.441] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:45.441] ...future.FUN(...future.X_jj, ...) [13:13:45.441] }) [13:13:45.441] } [13:13:45.441] }, args = future.call.arguments) [13:13:45.441] } [13:13:45.441] }, immediateCondition = function(cond) { [13:13:45.441] sendCondition <- ...future.makeSendCondition() [13:13:45.441] sendCondition(cond) [13:13:45.441] muffleCondition <- function (cond, pattern = "^muffle") [13:13:45.441] { [13:13:45.441] inherits <- base::inherits [13:13:45.441] invokeRestart <- base::invokeRestart [13:13:45.441] is.null <- base::is.null [13:13:45.441] muffled <- FALSE [13:13:45.441] if (inherits(cond, "message")) { [13:13:45.441] muffled <- grepl(pattern, "muffleMessage") [13:13:45.441] if (muffled) [13:13:45.441] invokeRestart("muffleMessage") [13:13:45.441] } [13:13:45.441] else if (inherits(cond, "warning")) { [13:13:45.441] muffled <- grepl(pattern, "muffleWarning") [13:13:45.441] if (muffled) [13:13:45.441] invokeRestart("muffleWarning") [13:13:45.441] } [13:13:45.441] else if (inherits(cond, "condition")) { [13:13:45.441] if (!is.null(pattern)) { [13:13:45.441] computeRestarts <- base::computeRestarts [13:13:45.441] grepl <- base::grepl [13:13:45.441] restarts <- computeRestarts(cond) [13:13:45.441] for (restart in restarts) { [13:13:45.441] name <- restart$name [13:13:45.441] if (is.null(name)) [13:13:45.441] next [13:13:45.441] if (!grepl(pattern, name)) [13:13:45.441] next [13:13:45.441] invokeRestart(restart) [13:13:45.441] muffled <- TRUE [13:13:45.441] break [13:13:45.441] } [13:13:45.441] } [13:13:45.441] } [13:13:45.441] invisible(muffled) [13:13:45.441] } [13:13:45.441] muffleCondition(cond) [13:13:45.441] }) [13:13:45.441] })) [13:13:45.441] future::FutureResult(value = ...future.value$value, [13:13:45.441] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:45.441] ...future.rng), globalenv = if (FALSE) [13:13:45.441] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:45.441] ...future.globalenv.names)) [13:13:45.441] else NULL, started = ...future.startTime, version = "1.8") [13:13:45.441] }, condition = base::local({ [13:13:45.441] c <- base::c [13:13:45.441] inherits <- base::inherits [13:13:45.441] invokeRestart <- base::invokeRestart [13:13:45.441] length <- base::length [13:13:45.441] list <- base::list [13:13:45.441] seq.int <- base::seq.int [13:13:45.441] signalCondition <- base::signalCondition [13:13:45.441] sys.calls <- base::sys.calls [13:13:45.441] `[[` <- base::`[[` [13:13:45.441] `+` <- base::`+` [13:13:45.441] `<<-` <- base::`<<-` [13:13:45.441] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:45.441] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:45.441] 3L)] [13:13:45.441] } [13:13:45.441] function(cond) { [13:13:45.441] is_error <- inherits(cond, "error") [13:13:45.441] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:45.441] NULL) [13:13:45.441] if (is_error) { [13:13:45.441] sessionInformation <- function() { [13:13:45.441] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:45.441] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:45.441] search = base::search(), system = base::Sys.info()) [13:13:45.441] } [13:13:45.441] ...future.conditions[[length(...future.conditions) + [13:13:45.441] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:45.441] cond$call), session = sessionInformation(), [13:13:45.441] timestamp = base::Sys.time(), signaled = 0L) [13:13:45.441] signalCondition(cond) [13:13:45.441] } [13:13:45.441] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:45.441] "immediateCondition"))) { [13:13:45.441] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:45.441] ...future.conditions[[length(...future.conditions) + [13:13:45.441] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:45.441] if (TRUE && !signal) { [13:13:45.441] muffleCondition <- function (cond, pattern = "^muffle") [13:13:45.441] { [13:13:45.441] inherits <- base::inherits [13:13:45.441] invokeRestart <- base::invokeRestart [13:13:45.441] is.null <- base::is.null [13:13:45.441] muffled <- FALSE [13:13:45.441] if (inherits(cond, "message")) { [13:13:45.441] muffled <- grepl(pattern, "muffleMessage") [13:13:45.441] if (muffled) [13:13:45.441] invokeRestart("muffleMessage") [13:13:45.441] } [13:13:45.441] else if (inherits(cond, "warning")) { [13:13:45.441] muffled <- grepl(pattern, "muffleWarning") [13:13:45.441] if (muffled) [13:13:45.441] invokeRestart("muffleWarning") [13:13:45.441] } [13:13:45.441] else if (inherits(cond, "condition")) { [13:13:45.441] if (!is.null(pattern)) { [13:13:45.441] computeRestarts <- base::computeRestarts [13:13:45.441] grepl <- base::grepl [13:13:45.441] restarts <- computeRestarts(cond) [13:13:45.441] for (restart in restarts) { [13:13:45.441] name <- restart$name [13:13:45.441] if (is.null(name)) [13:13:45.441] next [13:13:45.441] if (!grepl(pattern, name)) [13:13:45.441] next [13:13:45.441] invokeRestart(restart) [13:13:45.441] muffled <- TRUE [13:13:45.441] break [13:13:45.441] } [13:13:45.441] } [13:13:45.441] } [13:13:45.441] invisible(muffled) [13:13:45.441] } [13:13:45.441] muffleCondition(cond, pattern = "^muffle") [13:13:45.441] } [13:13:45.441] } [13:13:45.441] else { [13:13:45.441] if (TRUE) { [13:13:45.441] muffleCondition <- function (cond, pattern = "^muffle") [13:13:45.441] { [13:13:45.441] inherits <- base::inherits [13:13:45.441] invokeRestart <- base::invokeRestart [13:13:45.441] is.null <- base::is.null [13:13:45.441] muffled <- FALSE [13:13:45.441] if (inherits(cond, "message")) { [13:13:45.441] muffled <- grepl(pattern, "muffleMessage") [13:13:45.441] if (muffled) [13:13:45.441] invokeRestart("muffleMessage") [13:13:45.441] } [13:13:45.441] else if (inherits(cond, "warning")) { [13:13:45.441] muffled <- grepl(pattern, "muffleWarning") [13:13:45.441] if (muffled) [13:13:45.441] invokeRestart("muffleWarning") [13:13:45.441] } [13:13:45.441] else if (inherits(cond, "condition")) { [13:13:45.441] if (!is.null(pattern)) { [13:13:45.441] computeRestarts <- base::computeRestarts [13:13:45.441] grepl <- base::grepl [13:13:45.441] restarts <- computeRestarts(cond) [13:13:45.441] for (restart in restarts) { [13:13:45.441] name <- restart$name [13:13:45.441] if (is.null(name)) [13:13:45.441] next [13:13:45.441] if (!grepl(pattern, name)) [13:13:45.441] next [13:13:45.441] invokeRestart(restart) [13:13:45.441] muffled <- TRUE [13:13:45.441] break [13:13:45.441] } [13:13:45.441] } [13:13:45.441] } [13:13:45.441] invisible(muffled) [13:13:45.441] } [13:13:45.441] muffleCondition(cond, pattern = "^muffle") [13:13:45.441] } [13:13:45.441] } [13:13:45.441] } [13:13:45.441] })) [13:13:45.441] }, error = function(ex) { [13:13:45.441] base::structure(base::list(value = NULL, visible = NULL, [13:13:45.441] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:45.441] ...future.rng), started = ...future.startTime, [13:13:45.441] finished = Sys.time(), session_uuid = NA_character_, [13:13:45.441] version = "1.8"), class = "FutureResult") [13:13:45.441] }, finally = { [13:13:45.441] if (!identical(...future.workdir, getwd())) [13:13:45.441] setwd(...future.workdir) [13:13:45.441] { [13:13:45.441] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:45.441] ...future.oldOptions$nwarnings <- NULL [13:13:45.441] } [13:13:45.441] base::options(...future.oldOptions) [13:13:45.441] if (.Platform$OS.type == "windows") { [13:13:45.441] old_names <- names(...future.oldEnvVars) [13:13:45.441] envs <- base::Sys.getenv() [13:13:45.441] names <- names(envs) [13:13:45.441] common <- intersect(names, old_names) [13:13:45.441] added <- setdiff(names, old_names) [13:13:45.441] removed <- setdiff(old_names, names) [13:13:45.441] changed <- common[...future.oldEnvVars[common] != [13:13:45.441] envs[common]] [13:13:45.441] NAMES <- toupper(changed) [13:13:45.441] args <- list() [13:13:45.441] for (kk in seq_along(NAMES)) { [13:13:45.441] name <- changed[[kk]] [13:13:45.441] NAME <- NAMES[[kk]] [13:13:45.441] if (name != NAME && is.element(NAME, old_names)) [13:13:45.441] next [13:13:45.441] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:45.441] } [13:13:45.441] NAMES <- toupper(added) [13:13:45.441] for (kk in seq_along(NAMES)) { [13:13:45.441] name <- added[[kk]] [13:13:45.441] NAME <- NAMES[[kk]] [13:13:45.441] if (name != NAME && is.element(NAME, old_names)) [13:13:45.441] next [13:13:45.441] args[[name]] <- "" [13:13:45.441] } [13:13:45.441] NAMES <- toupper(removed) [13:13:45.441] for (kk in seq_along(NAMES)) { [13:13:45.441] name <- removed[[kk]] [13:13:45.441] NAME <- NAMES[[kk]] [13:13:45.441] if (name != NAME && is.element(NAME, old_names)) [13:13:45.441] next [13:13:45.441] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:45.441] } [13:13:45.441] if (length(args) > 0) [13:13:45.441] base::do.call(base::Sys.setenv, args = args) [13:13:45.441] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:45.441] } [13:13:45.441] else { [13:13:45.441] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:45.441] } [13:13:45.441] { [13:13:45.441] if (base::length(...future.futureOptionsAdded) > [13:13:45.441] 0L) { [13:13:45.441] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:45.441] base::names(opts) <- ...future.futureOptionsAdded [13:13:45.441] base::options(opts) [13:13:45.441] } [13:13:45.441] { [13:13:45.441] { [13:13:45.441] base::options(mc.cores = ...future.mc.cores.old) [13:13:45.441] NULL [13:13:45.441] } [13:13:45.441] options(future.plan = NULL) [13:13:45.441] if (is.na(NA_character_)) [13:13:45.441] Sys.unsetenv("R_FUTURE_PLAN") [13:13:45.441] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:45.441] future::plan(list(function (..., workers = availableCores(), [13:13:45.441] lazy = FALSE, rscript_libs = .libPaths(), [13:13:45.441] envir = parent.frame()) [13:13:45.441] { [13:13:45.441] if (is.function(workers)) [13:13:45.441] workers <- workers() [13:13:45.441] workers <- structure(as.integer(workers), [13:13:45.441] class = class(workers)) [13:13:45.441] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:45.441] workers >= 1) [13:13:45.441] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:45.441] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:45.441] } [13:13:45.441] future <- MultisessionFuture(..., workers = workers, [13:13:45.441] lazy = lazy, rscript_libs = rscript_libs, [13:13:45.441] envir = envir) [13:13:45.441] if (!future$lazy) [13:13:45.441] future <- run(future) [13:13:45.441] invisible(future) [13:13:45.441] }), .cleanup = FALSE, .init = FALSE) [13:13:45.441] } [13:13:45.441] } [13:13:45.441] } [13:13:45.441] }) [13:13:45.441] if (TRUE) { [13:13:45.441] base::sink(type = "output", split = FALSE) [13:13:45.441] if (TRUE) { [13:13:45.441] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:45.441] } [13:13:45.441] else { [13:13:45.441] ...future.result["stdout"] <- base::list(NULL) [13:13:45.441] } [13:13:45.441] base::close(...future.stdout) [13:13:45.441] ...future.stdout <- NULL [13:13:45.441] } [13:13:45.441] ...future.result$conditions <- ...future.conditions [13:13:45.441] ...future.result$finished <- base::Sys.time() [13:13:45.441] ...future.result [13:13:45.441] } [13:13:45.447] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... [13:13:45.447] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... [13:13:45.447] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... DONE [13:13:45.448] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... [13:13:45.448] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... DONE [13:13:45.448] Exporting '...future.elements_ii' (112 bytes) to cluster node #1 ... [13:13:45.449] Exporting '...future.elements_ii' (112 bytes) to cluster node #1 ... DONE [13:13:45.449] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:13:45.449] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:13:45.450] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:13:45.450] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:13:45.450] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... DONE [13:13:45.451] MultisessionFuture started [13:13:45.451] - Launch lazy future ... done [13:13:45.451] run() for 'MultisessionFuture' ... done [13:13:45.452] Created future: [13:13:45.466] receiveMessageFromWorker() for ClusterFuture ... [13:13:45.467] - Validating connection of MultisessionFuture [13:13:45.467] - received message: FutureResult [13:13:45.467] - Received FutureResult [13:13:45.467] - Erased future from FutureRegistry [13:13:45.467] result() for ClusterFuture ... [13:13:45.468] - result already collected: FutureResult [13:13:45.468] result() for ClusterFuture ... done [13:13:45.468] receiveMessageFromWorker() for ClusterFuture ... done [13:13:45.452] MultisessionFuture: [13:13:45.452] Label: 'future_lapply-1' [13:13:45.452] Expression: [13:13:45.452] { [13:13:45.452] do.call(function(...) { [13:13:45.452] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:45.452] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:45.452] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:45.452] on.exit(options(oopts), add = TRUE) [13:13:45.452] } [13:13:45.452] { [13:13:45.452] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:45.452] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:45.452] ...future.FUN(...future.X_jj, ...) [13:13:45.452] }) [13:13:45.452] } [13:13:45.452] }, args = future.call.arguments) [13:13:45.452] } [13:13:45.452] Lazy evaluation: FALSE [13:13:45.452] Asynchronous evaluation: TRUE [13:13:45.452] Local evaluation: TRUE [13:13:45.452] Environment: R_GlobalEnv [13:13:45.452] Capture standard output: TRUE [13:13:45.452] Capture condition classes: 'condition' (excluding 'nothing') [13:13:45.452] 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) [13:13:45.452] Packages: [13:13:45.452] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:45.452] Resolved: TRUE [13:13:45.452] Value: [13:13:45.452] Conditions captured: [13:13:45.452] Early signaling: FALSE [13:13:45.452] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:45.452] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:45.468] Chunk #1 of 4 ... DONE [13:13:45.468] Chunk #2 of 4 ... [13:13:45.469] - Finding globals in 'X' for chunk #2 ... [13:13:45.469] getGlobalsAndPackages() ... [13:13:45.469] Searching for globals... [13:13:45.469] [13:13:45.469] Searching for globals ... DONE [13:13:45.470] - globals: [0] [13:13:45.470] getGlobalsAndPackages() ... DONE [13:13:45.470] + additional globals found: [n=0] [13:13:45.470] + additional namespaces needed: [n=0] [13:13:45.470] - Finding globals in 'X' for chunk #2 ... DONE [13:13:45.470] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [13:13:45.471] - seeds: [13:13:45.471] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:45.471] getGlobalsAndPackages() ... [13:13:45.471] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:45.471] Resolving globals: FALSE [13:13:45.471] Tweak future expression to call with '...' arguments ... [13:13:45.472] { [13:13:45.472] do.call(function(...) { [13:13:45.472] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:45.472] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:45.472] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:45.472] on.exit(options(oopts), add = TRUE) [13:13:45.472] } [13:13:45.472] { [13:13:45.472] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:45.472] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:45.472] ...future.FUN(...future.X_jj, ...) [13:13:45.472] }) [13:13:45.472] } [13:13:45.472] }, args = future.call.arguments) [13:13:45.472] } [13:13:45.472] Tweak future expression to call with '...' arguments ... DONE [13:13:45.472] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:45.473] [13:13:45.473] getGlobalsAndPackages() ... DONE [13:13:45.473] run() for 'Future' ... [13:13:45.473] - state: 'created' [13:13:45.474] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:45.488] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:45.488] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:13:45.488] - Field: 'node' [13:13:45.488] - Field: 'label' [13:13:45.488] - Field: 'local' [13:13:45.488] - Field: 'owner' [13:13:45.489] - Field: 'envir' [13:13:45.489] - Field: 'workers' [13:13:45.489] - Field: 'packages' [13:13:45.489] - Field: 'gc' [13:13:45.489] - Field: 'conditions' [13:13:45.490] - Field: 'persistent' [13:13:45.490] - Field: 'expr' [13:13:45.490] - Field: 'uuid' [13:13:45.490] - Field: 'seed' [13:13:45.490] - Field: 'version' [13:13:45.490] - Field: 'result' [13:13:45.491] - Field: 'asynchronous' [13:13:45.491] - Field: 'calls' [13:13:45.491] - Field: 'globals' [13:13:45.491] - Field: 'stdout' [13:13:45.491] - Field: 'earlySignal' [13:13:45.492] - Field: 'lazy' [13:13:45.492] - Field: 'state' [13:13:45.492] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:13:45.492] - Launch lazy future ... [13:13:45.493] Packages needed by the future expression (n = 0): [13:13:45.493] Packages needed by future strategies (n = 0): [13:13:45.493] { [13:13:45.493] { [13:13:45.493] { [13:13:45.493] ...future.startTime <- base::Sys.time() [13:13:45.493] { [13:13:45.493] { [13:13:45.493] { [13:13:45.493] { [13:13:45.493] base::local({ [13:13:45.493] has_future <- base::requireNamespace("future", [13:13:45.493] quietly = TRUE) [13:13:45.493] if (has_future) { [13:13:45.493] ns <- base::getNamespace("future") [13:13:45.493] version <- ns[[".package"]][["version"]] [13:13:45.493] if (is.null(version)) [13:13:45.493] version <- utils::packageVersion("future") [13:13:45.493] } [13:13:45.493] else { [13:13:45.493] version <- NULL [13:13:45.493] } [13:13:45.493] if (!has_future || version < "1.8.0") { [13:13:45.493] info <- base::c(r_version = base::gsub("R version ", [13:13:45.493] "", base::R.version$version.string), [13:13:45.493] platform = base::sprintf("%s (%s-bit)", [13:13:45.493] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:45.493] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:45.493] "release", "version")], collapse = " "), [13:13:45.493] hostname = base::Sys.info()[["nodename"]]) [13:13:45.493] info <- base::sprintf("%s: %s", base::names(info), [13:13:45.493] info) [13:13:45.493] info <- base::paste(info, collapse = "; ") [13:13:45.493] if (!has_future) { [13:13:45.493] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:45.493] info) [13:13:45.493] } [13:13:45.493] else { [13:13:45.493] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:45.493] info, version) [13:13:45.493] } [13:13:45.493] base::stop(msg) [13:13:45.493] } [13:13:45.493] }) [13:13:45.493] } [13:13:45.493] ...future.mc.cores.old <- base::getOption("mc.cores") [13:13:45.493] base::options(mc.cores = 1L) [13:13:45.493] } [13:13:45.493] options(future.plan = NULL) [13:13:45.493] Sys.unsetenv("R_FUTURE_PLAN") [13:13:45.493] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:45.493] } [13:13:45.493] ...future.workdir <- getwd() [13:13:45.493] } [13:13:45.493] ...future.oldOptions <- base::as.list(base::.Options) [13:13:45.493] ...future.oldEnvVars <- base::Sys.getenv() [13:13:45.493] } [13:13:45.493] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:45.493] future.globals.maxSize = 2097152000, future.globals.method = NULL, [13:13:45.493] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:45.493] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:45.493] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:45.493] future.stdout.windows.reencode = NULL, width = 80L) [13:13:45.493] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:45.493] base::names(...future.oldOptions)) [13:13:45.493] } [13:13:45.493] if (FALSE) { [13:13:45.493] } [13:13:45.493] else { [13:13:45.493] if (TRUE) { [13:13:45.493] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:45.493] open = "w") [13:13:45.493] } [13:13:45.493] else { [13:13:45.493] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:45.493] windows = "NUL", "/dev/null"), open = "w") [13:13:45.493] } [13:13:45.493] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:45.493] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:45.493] base::sink(type = "output", split = FALSE) [13:13:45.493] base::close(...future.stdout) [13:13:45.493] }, add = TRUE) [13:13:45.493] } [13:13:45.493] ...future.frame <- base::sys.nframe() [13:13:45.493] ...future.conditions <- base::list() [13:13:45.493] ...future.rng <- base::globalenv()$.Random.seed [13:13:45.493] if (FALSE) { [13:13:45.493] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:45.493] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:45.493] } [13:13:45.493] ...future.result <- base::tryCatch({ [13:13:45.493] base::withCallingHandlers({ [13:13:45.493] ...future.value <- base::withVisible(base::local({ [13:13:45.493] ...future.makeSendCondition <- local({ [13:13:45.493] sendCondition <- NULL [13:13:45.493] function(frame = 1L) { [13:13:45.493] if (is.function(sendCondition)) [13:13:45.493] return(sendCondition) [13:13:45.493] ns <- getNamespace("parallel") [13:13:45.493] if (exists("sendData", mode = "function", [13:13:45.493] envir = ns)) { [13:13:45.493] parallel_sendData <- get("sendData", mode = "function", [13:13:45.493] envir = ns) [13:13:45.493] envir <- sys.frame(frame) [13:13:45.493] master <- NULL [13:13:45.493] while (!identical(envir, .GlobalEnv) && [13:13:45.493] !identical(envir, emptyenv())) { [13:13:45.493] if (exists("master", mode = "list", envir = envir, [13:13:45.493] inherits = FALSE)) { [13:13:45.493] master <- get("master", mode = "list", [13:13:45.493] envir = envir, inherits = FALSE) [13:13:45.493] if (inherits(master, c("SOCKnode", [13:13:45.493] "SOCK0node"))) { [13:13:45.493] sendCondition <<- function(cond) { [13:13:45.493] data <- list(type = "VALUE", value = cond, [13:13:45.493] success = TRUE) [13:13:45.493] parallel_sendData(master, data) [13:13:45.493] } [13:13:45.493] return(sendCondition) [13:13:45.493] } [13:13:45.493] } [13:13:45.493] frame <- frame + 1L [13:13:45.493] envir <- sys.frame(frame) [13:13:45.493] } [13:13:45.493] } [13:13:45.493] sendCondition <<- function(cond) NULL [13:13:45.493] } [13:13:45.493] }) [13:13:45.493] withCallingHandlers({ [13:13:45.493] { [13:13:45.493] do.call(function(...) { [13:13:45.493] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:45.493] if (!identical(...future.globals.maxSize.org, [13:13:45.493] ...future.globals.maxSize)) { [13:13:45.493] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:45.493] on.exit(options(oopts), add = TRUE) [13:13:45.493] } [13:13:45.493] { [13:13:45.493] lapply(seq_along(...future.elements_ii), [13:13:45.493] FUN = function(jj) { [13:13:45.493] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:45.493] ...future.FUN(...future.X_jj, ...) [13:13:45.493] }) [13:13:45.493] } [13:13:45.493] }, args = future.call.arguments) [13:13:45.493] } [13:13:45.493] }, immediateCondition = function(cond) { [13:13:45.493] sendCondition <- ...future.makeSendCondition() [13:13:45.493] sendCondition(cond) [13:13:45.493] muffleCondition <- function (cond, pattern = "^muffle") [13:13:45.493] { [13:13:45.493] inherits <- base::inherits [13:13:45.493] invokeRestart <- base::invokeRestart [13:13:45.493] is.null <- base::is.null [13:13:45.493] muffled <- FALSE [13:13:45.493] if (inherits(cond, "message")) { [13:13:45.493] muffled <- grepl(pattern, "muffleMessage") [13:13:45.493] if (muffled) [13:13:45.493] invokeRestart("muffleMessage") [13:13:45.493] } [13:13:45.493] else if (inherits(cond, "warning")) { [13:13:45.493] muffled <- grepl(pattern, "muffleWarning") [13:13:45.493] if (muffled) [13:13:45.493] invokeRestart("muffleWarning") [13:13:45.493] } [13:13:45.493] else if (inherits(cond, "condition")) { [13:13:45.493] if (!is.null(pattern)) { [13:13:45.493] computeRestarts <- base::computeRestarts [13:13:45.493] grepl <- base::grepl [13:13:45.493] restarts <- computeRestarts(cond) [13:13:45.493] for (restart in restarts) { [13:13:45.493] name <- restart$name [13:13:45.493] if (is.null(name)) [13:13:45.493] next [13:13:45.493] if (!grepl(pattern, name)) [13:13:45.493] next [13:13:45.493] invokeRestart(restart) [13:13:45.493] muffled <- TRUE [13:13:45.493] break [13:13:45.493] } [13:13:45.493] } [13:13:45.493] } [13:13:45.493] invisible(muffled) [13:13:45.493] } [13:13:45.493] muffleCondition(cond) [13:13:45.493] }) [13:13:45.493] })) [13:13:45.493] future::FutureResult(value = ...future.value$value, [13:13:45.493] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:45.493] ...future.rng), globalenv = if (FALSE) [13:13:45.493] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:45.493] ...future.globalenv.names)) [13:13:45.493] else NULL, started = ...future.startTime, version = "1.8") [13:13:45.493] }, condition = base::local({ [13:13:45.493] c <- base::c [13:13:45.493] inherits <- base::inherits [13:13:45.493] invokeRestart <- base::invokeRestart [13:13:45.493] length <- base::length [13:13:45.493] list <- base::list [13:13:45.493] seq.int <- base::seq.int [13:13:45.493] signalCondition <- base::signalCondition [13:13:45.493] sys.calls <- base::sys.calls [13:13:45.493] `[[` <- base::`[[` [13:13:45.493] `+` <- base::`+` [13:13:45.493] `<<-` <- base::`<<-` [13:13:45.493] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:45.493] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:45.493] 3L)] [13:13:45.493] } [13:13:45.493] function(cond) { [13:13:45.493] is_error <- inherits(cond, "error") [13:13:45.493] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:45.493] NULL) [13:13:45.493] if (is_error) { [13:13:45.493] sessionInformation <- function() { [13:13:45.493] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:45.493] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:45.493] search = base::search(), system = base::Sys.info()) [13:13:45.493] } [13:13:45.493] ...future.conditions[[length(...future.conditions) + [13:13:45.493] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:45.493] cond$call), session = sessionInformation(), [13:13:45.493] timestamp = base::Sys.time(), signaled = 0L) [13:13:45.493] signalCondition(cond) [13:13:45.493] } [13:13:45.493] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:45.493] "immediateCondition"))) { [13:13:45.493] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:45.493] ...future.conditions[[length(...future.conditions) + [13:13:45.493] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:45.493] if (TRUE && !signal) { [13:13:45.493] muffleCondition <- function (cond, pattern = "^muffle") [13:13:45.493] { [13:13:45.493] inherits <- base::inherits [13:13:45.493] invokeRestart <- base::invokeRestart [13:13:45.493] is.null <- base::is.null [13:13:45.493] muffled <- FALSE [13:13:45.493] if (inherits(cond, "message")) { [13:13:45.493] muffled <- grepl(pattern, "muffleMessage") [13:13:45.493] if (muffled) [13:13:45.493] invokeRestart("muffleMessage") [13:13:45.493] } [13:13:45.493] else if (inherits(cond, "warning")) { [13:13:45.493] muffled <- grepl(pattern, "muffleWarning") [13:13:45.493] if (muffled) [13:13:45.493] invokeRestart("muffleWarning") [13:13:45.493] } [13:13:45.493] else if (inherits(cond, "condition")) { [13:13:45.493] if (!is.null(pattern)) { [13:13:45.493] computeRestarts <- base::computeRestarts [13:13:45.493] grepl <- base::grepl [13:13:45.493] restarts <- computeRestarts(cond) [13:13:45.493] for (restart in restarts) { [13:13:45.493] name <- restart$name [13:13:45.493] if (is.null(name)) [13:13:45.493] next [13:13:45.493] if (!grepl(pattern, name)) [13:13:45.493] next [13:13:45.493] invokeRestart(restart) [13:13:45.493] muffled <- TRUE [13:13:45.493] break [13:13:45.493] } [13:13:45.493] } [13:13:45.493] } [13:13:45.493] invisible(muffled) [13:13:45.493] } [13:13:45.493] muffleCondition(cond, pattern = "^muffle") [13:13:45.493] } [13:13:45.493] } [13:13:45.493] else { [13:13:45.493] if (TRUE) { [13:13:45.493] muffleCondition <- function (cond, pattern = "^muffle") [13:13:45.493] { [13:13:45.493] inherits <- base::inherits [13:13:45.493] invokeRestart <- base::invokeRestart [13:13:45.493] is.null <- base::is.null [13:13:45.493] muffled <- FALSE [13:13:45.493] if (inherits(cond, "message")) { [13:13:45.493] muffled <- grepl(pattern, "muffleMessage") [13:13:45.493] if (muffled) [13:13:45.493] invokeRestart("muffleMessage") [13:13:45.493] } [13:13:45.493] else if (inherits(cond, "warning")) { [13:13:45.493] muffled <- grepl(pattern, "muffleWarning") [13:13:45.493] if (muffled) [13:13:45.493] invokeRestart("muffleWarning") [13:13:45.493] } [13:13:45.493] else if (inherits(cond, "condition")) { [13:13:45.493] if (!is.null(pattern)) { [13:13:45.493] computeRestarts <- base::computeRestarts [13:13:45.493] grepl <- base::grepl [13:13:45.493] restarts <- computeRestarts(cond) [13:13:45.493] for (restart in restarts) { [13:13:45.493] name <- restart$name [13:13:45.493] if (is.null(name)) [13:13:45.493] next [13:13:45.493] if (!grepl(pattern, name)) [13:13:45.493] next [13:13:45.493] invokeRestart(restart) [13:13:45.493] muffled <- TRUE [13:13:45.493] break [13:13:45.493] } [13:13:45.493] } [13:13:45.493] } [13:13:45.493] invisible(muffled) [13:13:45.493] } [13:13:45.493] muffleCondition(cond, pattern = "^muffle") [13:13:45.493] } [13:13:45.493] } [13:13:45.493] } [13:13:45.493] })) [13:13:45.493] }, error = function(ex) { [13:13:45.493] base::structure(base::list(value = NULL, visible = NULL, [13:13:45.493] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:45.493] ...future.rng), started = ...future.startTime, [13:13:45.493] finished = Sys.time(), session_uuid = NA_character_, [13:13:45.493] version = "1.8"), class = "FutureResult") [13:13:45.493] }, finally = { [13:13:45.493] if (!identical(...future.workdir, getwd())) [13:13:45.493] setwd(...future.workdir) [13:13:45.493] { [13:13:45.493] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:45.493] ...future.oldOptions$nwarnings <- NULL [13:13:45.493] } [13:13:45.493] base::options(...future.oldOptions) [13:13:45.493] if (.Platform$OS.type == "windows") { [13:13:45.493] old_names <- names(...future.oldEnvVars) [13:13:45.493] envs <- base::Sys.getenv() [13:13:45.493] names <- names(envs) [13:13:45.493] common <- intersect(names, old_names) [13:13:45.493] added <- setdiff(names, old_names) [13:13:45.493] removed <- setdiff(old_names, names) [13:13:45.493] changed <- common[...future.oldEnvVars[common] != [13:13:45.493] envs[common]] [13:13:45.493] NAMES <- toupper(changed) [13:13:45.493] args <- list() [13:13:45.493] for (kk in seq_along(NAMES)) { [13:13:45.493] name <- changed[[kk]] [13:13:45.493] NAME <- NAMES[[kk]] [13:13:45.493] if (name != NAME && is.element(NAME, old_names)) [13:13:45.493] next [13:13:45.493] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:45.493] } [13:13:45.493] NAMES <- toupper(added) [13:13:45.493] for (kk in seq_along(NAMES)) { [13:13:45.493] name <- added[[kk]] [13:13:45.493] NAME <- NAMES[[kk]] [13:13:45.493] if (name != NAME && is.element(NAME, old_names)) [13:13:45.493] next [13:13:45.493] args[[name]] <- "" [13:13:45.493] } [13:13:45.493] NAMES <- toupper(removed) [13:13:45.493] for (kk in seq_along(NAMES)) { [13:13:45.493] name <- removed[[kk]] [13:13:45.493] NAME <- NAMES[[kk]] [13:13:45.493] if (name != NAME && is.element(NAME, old_names)) [13:13:45.493] next [13:13:45.493] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:45.493] } [13:13:45.493] if (length(args) > 0) [13:13:45.493] base::do.call(base::Sys.setenv, args = args) [13:13:45.493] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:45.493] } [13:13:45.493] else { [13:13:45.493] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:45.493] } [13:13:45.493] { [13:13:45.493] if (base::length(...future.futureOptionsAdded) > [13:13:45.493] 0L) { [13:13:45.493] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:45.493] base::names(opts) <- ...future.futureOptionsAdded [13:13:45.493] base::options(opts) [13:13:45.493] } [13:13:45.493] { [13:13:45.493] { [13:13:45.493] base::options(mc.cores = ...future.mc.cores.old) [13:13:45.493] NULL [13:13:45.493] } [13:13:45.493] options(future.plan = NULL) [13:13:45.493] if (is.na(NA_character_)) [13:13:45.493] Sys.unsetenv("R_FUTURE_PLAN") [13:13:45.493] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:45.493] future::plan(list(function (..., workers = availableCores(), [13:13:45.493] lazy = FALSE, rscript_libs = .libPaths(), [13:13:45.493] envir = parent.frame()) [13:13:45.493] { [13:13:45.493] if (is.function(workers)) [13:13:45.493] workers <- workers() [13:13:45.493] workers <- structure(as.integer(workers), [13:13:45.493] class = class(workers)) [13:13:45.493] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:45.493] workers >= 1) [13:13:45.493] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:45.493] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:45.493] } [13:13:45.493] future <- MultisessionFuture(..., workers = workers, [13:13:45.493] lazy = lazy, rscript_libs = rscript_libs, [13:13:45.493] envir = envir) [13:13:45.493] if (!future$lazy) [13:13:45.493] future <- run(future) [13:13:45.493] invisible(future) [13:13:45.493] }), .cleanup = FALSE, .init = FALSE) [13:13:45.493] } [13:13:45.493] } [13:13:45.493] } [13:13:45.493] }) [13:13:45.493] if (TRUE) { [13:13:45.493] base::sink(type = "output", split = FALSE) [13:13:45.493] if (TRUE) { [13:13:45.493] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:45.493] } [13:13:45.493] else { [13:13:45.493] ...future.result["stdout"] <- base::list(NULL) [13:13:45.493] } [13:13:45.493] base::close(...future.stdout) [13:13:45.493] ...future.stdout <- NULL [13:13:45.493] } [13:13:45.493] ...future.result$conditions <- ...future.conditions [13:13:45.493] ...future.result$finished <- base::Sys.time() [13:13:45.493] ...future.result [13:13:45.493] } [13:13:45.499] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... [13:13:45.499] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... [13:13:45.499] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... DONE [13:13:45.500] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... [13:13:45.500] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... DONE [13:13:45.500] Exporting '...future.elements_ii' (112 bytes) to cluster node #1 ... [13:13:45.501] Exporting '...future.elements_ii' (112 bytes) to cluster node #1 ... DONE [13:13:45.501] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:13:45.501] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:13:45.501] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:13:45.502] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:13:45.502] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... DONE [13:13:45.503] MultisessionFuture started [13:13:45.503] - Launch lazy future ... done [13:13:45.503] run() for 'MultisessionFuture' ... done [13:13:45.503] Created future: [13:13:45.519] receiveMessageFromWorker() for ClusterFuture ... [13:13:45.519] - Validating connection of MultisessionFuture [13:13:45.519] - received message: FutureResult [13:13:45.519] - Received FutureResult [13:13:45.520] - Erased future from FutureRegistry [13:13:45.520] result() for ClusterFuture ... [13:13:45.520] - result already collected: FutureResult [13:13:45.520] result() for ClusterFuture ... done [13:13:45.520] receiveMessageFromWorker() for ClusterFuture ... done [13:13:45.503] MultisessionFuture: [13:13:45.503] Label: 'future_lapply-2' [13:13:45.503] Expression: [13:13:45.503] { [13:13:45.503] do.call(function(...) { [13:13:45.503] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:45.503] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:45.503] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:45.503] on.exit(options(oopts), add = TRUE) [13:13:45.503] } [13:13:45.503] { [13:13:45.503] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:45.503] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:45.503] ...future.FUN(...future.X_jj, ...) [13:13:45.503] }) [13:13:45.503] } [13:13:45.503] }, args = future.call.arguments) [13:13:45.503] } [13:13:45.503] Lazy evaluation: FALSE [13:13:45.503] Asynchronous evaluation: TRUE [13:13:45.503] Local evaluation: TRUE [13:13:45.503] Environment: R_GlobalEnv [13:13:45.503] Capture standard output: TRUE [13:13:45.503] Capture condition classes: 'condition' (excluding 'nothing') [13:13:45.503] 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) [13:13:45.503] Packages: [13:13:45.503] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:45.503] Resolved: TRUE [13:13:45.503] Value: [13:13:45.503] Conditions captured: [13:13:45.503] Early signaling: FALSE [13:13:45.503] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:45.503] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:45.521] Chunk #2 of 4 ... DONE [13:13:45.521] Chunk #3 of 4 ... [13:13:45.521] - Finding globals in 'X' for chunk #3 ... [13:13:45.521] getGlobalsAndPackages() ... [13:13:45.521] Searching for globals... [13:13:45.522] [13:13:45.522] Searching for globals ... DONE [13:13:45.522] - globals: [0] [13:13:45.522] getGlobalsAndPackages() ... DONE [13:13:45.522] + additional globals found: [n=0] [13:13:45.522] + additional namespaces needed: [n=0] [13:13:45.523] - Finding globals in 'X' for chunk #3 ... DONE [13:13:45.523] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [13:13:45.523] - seeds: [13:13:45.523] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:45.523] getGlobalsAndPackages() ... [13:13:45.524] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:45.524] Resolving globals: FALSE [13:13:45.524] Tweak future expression to call with '...' arguments ... [13:13:45.524] { [13:13:45.524] do.call(function(...) { [13:13:45.524] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:45.524] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:45.524] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:45.524] on.exit(options(oopts), add = TRUE) [13:13:45.524] } [13:13:45.524] { [13:13:45.524] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:45.524] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:45.524] ...future.FUN(...future.X_jj, ...) [13:13:45.524] }) [13:13:45.524] } [13:13:45.524] }, args = future.call.arguments) [13:13:45.524] } [13:13:45.524] Tweak future expression to call with '...' arguments ... DONE [13:13:45.525] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:45.525] [13:13:45.525] getGlobalsAndPackages() ... DONE [13:13:45.526] run() for 'Future' ... [13:13:45.526] - state: 'created' [13:13:45.526] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:45.540] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:45.540] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:13:45.540] - Field: 'node' [13:13:45.540] - Field: 'label' [13:13:45.541] - Field: 'local' [13:13:45.541] - Field: 'owner' [13:13:45.541] - Field: 'envir' [13:13:45.541] - Field: 'workers' [13:13:45.541] - Field: 'packages' [13:13:45.541] - Field: 'gc' [13:13:45.542] - Field: 'conditions' [13:13:45.542] - Field: 'persistent' [13:13:45.542] - Field: 'expr' [13:13:45.542] - Field: 'uuid' [13:13:45.542] - Field: 'seed' [13:13:45.542] - Field: 'version' [13:13:45.543] - Field: 'result' [13:13:45.543] - Field: 'asynchronous' [13:13:45.543] - Field: 'calls' [13:13:45.543] - Field: 'globals' [13:13:45.543] - Field: 'stdout' [13:13:45.543] - Field: 'earlySignal' [13:13:45.544] - Field: 'lazy' [13:13:45.544] - Field: 'state' [13:13:45.544] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:13:45.544] - Launch lazy future ... [13:13:45.545] Packages needed by the future expression (n = 0): [13:13:45.545] Packages needed by future strategies (n = 0): [13:13:45.545] { [13:13:45.545] { [13:13:45.545] { [13:13:45.545] ...future.startTime <- base::Sys.time() [13:13:45.545] { [13:13:45.545] { [13:13:45.545] { [13:13:45.545] { [13:13:45.545] base::local({ [13:13:45.545] has_future <- base::requireNamespace("future", [13:13:45.545] quietly = TRUE) [13:13:45.545] if (has_future) { [13:13:45.545] ns <- base::getNamespace("future") [13:13:45.545] version <- ns[[".package"]][["version"]] [13:13:45.545] if (is.null(version)) [13:13:45.545] version <- utils::packageVersion("future") [13:13:45.545] } [13:13:45.545] else { [13:13:45.545] version <- NULL [13:13:45.545] } [13:13:45.545] if (!has_future || version < "1.8.0") { [13:13:45.545] info <- base::c(r_version = base::gsub("R version ", [13:13:45.545] "", base::R.version$version.string), [13:13:45.545] platform = base::sprintf("%s (%s-bit)", [13:13:45.545] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:45.545] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:45.545] "release", "version")], collapse = " "), [13:13:45.545] hostname = base::Sys.info()[["nodename"]]) [13:13:45.545] info <- base::sprintf("%s: %s", base::names(info), [13:13:45.545] info) [13:13:45.545] info <- base::paste(info, collapse = "; ") [13:13:45.545] if (!has_future) { [13:13:45.545] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:45.545] info) [13:13:45.545] } [13:13:45.545] else { [13:13:45.545] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:45.545] info, version) [13:13:45.545] } [13:13:45.545] base::stop(msg) [13:13:45.545] } [13:13:45.545] }) [13:13:45.545] } [13:13:45.545] ...future.mc.cores.old <- base::getOption("mc.cores") [13:13:45.545] base::options(mc.cores = 1L) [13:13:45.545] } [13:13:45.545] options(future.plan = NULL) [13:13:45.545] Sys.unsetenv("R_FUTURE_PLAN") [13:13:45.545] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:45.545] } [13:13:45.545] ...future.workdir <- getwd() [13:13:45.545] } [13:13:45.545] ...future.oldOptions <- base::as.list(base::.Options) [13:13:45.545] ...future.oldEnvVars <- base::Sys.getenv() [13:13:45.545] } [13:13:45.545] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:45.545] future.globals.maxSize = 2097152000, future.globals.method = NULL, [13:13:45.545] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:45.545] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:45.545] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:45.545] future.stdout.windows.reencode = NULL, width = 80L) [13:13:45.545] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:45.545] base::names(...future.oldOptions)) [13:13:45.545] } [13:13:45.545] if (FALSE) { [13:13:45.545] } [13:13:45.545] else { [13:13:45.545] if (TRUE) { [13:13:45.545] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:45.545] open = "w") [13:13:45.545] } [13:13:45.545] else { [13:13:45.545] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:45.545] windows = "NUL", "/dev/null"), open = "w") [13:13:45.545] } [13:13:45.545] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:45.545] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:45.545] base::sink(type = "output", split = FALSE) [13:13:45.545] base::close(...future.stdout) [13:13:45.545] }, add = TRUE) [13:13:45.545] } [13:13:45.545] ...future.frame <- base::sys.nframe() [13:13:45.545] ...future.conditions <- base::list() [13:13:45.545] ...future.rng <- base::globalenv()$.Random.seed [13:13:45.545] if (FALSE) { [13:13:45.545] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:45.545] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:45.545] } [13:13:45.545] ...future.result <- base::tryCatch({ [13:13:45.545] base::withCallingHandlers({ [13:13:45.545] ...future.value <- base::withVisible(base::local({ [13:13:45.545] ...future.makeSendCondition <- local({ [13:13:45.545] sendCondition <- NULL [13:13:45.545] function(frame = 1L) { [13:13:45.545] if (is.function(sendCondition)) [13:13:45.545] return(sendCondition) [13:13:45.545] ns <- getNamespace("parallel") [13:13:45.545] if (exists("sendData", mode = "function", [13:13:45.545] envir = ns)) { [13:13:45.545] parallel_sendData <- get("sendData", mode = "function", [13:13:45.545] envir = ns) [13:13:45.545] envir <- sys.frame(frame) [13:13:45.545] master <- NULL [13:13:45.545] while (!identical(envir, .GlobalEnv) && [13:13:45.545] !identical(envir, emptyenv())) { [13:13:45.545] if (exists("master", mode = "list", envir = envir, [13:13:45.545] inherits = FALSE)) { [13:13:45.545] master <- get("master", mode = "list", [13:13:45.545] envir = envir, inherits = FALSE) [13:13:45.545] if (inherits(master, c("SOCKnode", [13:13:45.545] "SOCK0node"))) { [13:13:45.545] sendCondition <<- function(cond) { [13:13:45.545] data <- list(type = "VALUE", value = cond, [13:13:45.545] success = TRUE) [13:13:45.545] parallel_sendData(master, data) [13:13:45.545] } [13:13:45.545] return(sendCondition) [13:13:45.545] } [13:13:45.545] } [13:13:45.545] frame <- frame + 1L [13:13:45.545] envir <- sys.frame(frame) [13:13:45.545] } [13:13:45.545] } [13:13:45.545] sendCondition <<- function(cond) NULL [13:13:45.545] } [13:13:45.545] }) [13:13:45.545] withCallingHandlers({ [13:13:45.545] { [13:13:45.545] do.call(function(...) { [13:13:45.545] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:45.545] if (!identical(...future.globals.maxSize.org, [13:13:45.545] ...future.globals.maxSize)) { [13:13:45.545] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:45.545] on.exit(options(oopts), add = TRUE) [13:13:45.545] } [13:13:45.545] { [13:13:45.545] lapply(seq_along(...future.elements_ii), [13:13:45.545] FUN = function(jj) { [13:13:45.545] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:45.545] ...future.FUN(...future.X_jj, ...) [13:13:45.545] }) [13:13:45.545] } [13:13:45.545] }, args = future.call.arguments) [13:13:45.545] } [13:13:45.545] }, immediateCondition = function(cond) { [13:13:45.545] sendCondition <- ...future.makeSendCondition() [13:13:45.545] sendCondition(cond) [13:13:45.545] muffleCondition <- function (cond, pattern = "^muffle") [13:13:45.545] { [13:13:45.545] inherits <- base::inherits [13:13:45.545] invokeRestart <- base::invokeRestart [13:13:45.545] is.null <- base::is.null [13:13:45.545] muffled <- FALSE [13:13:45.545] if (inherits(cond, "message")) { [13:13:45.545] muffled <- grepl(pattern, "muffleMessage") [13:13:45.545] if (muffled) [13:13:45.545] invokeRestart("muffleMessage") [13:13:45.545] } [13:13:45.545] else if (inherits(cond, "warning")) { [13:13:45.545] muffled <- grepl(pattern, "muffleWarning") [13:13:45.545] if (muffled) [13:13:45.545] invokeRestart("muffleWarning") [13:13:45.545] } [13:13:45.545] else if (inherits(cond, "condition")) { [13:13:45.545] if (!is.null(pattern)) { [13:13:45.545] computeRestarts <- base::computeRestarts [13:13:45.545] grepl <- base::grepl [13:13:45.545] restarts <- computeRestarts(cond) [13:13:45.545] for (restart in restarts) { [13:13:45.545] name <- restart$name [13:13:45.545] if (is.null(name)) [13:13:45.545] next [13:13:45.545] if (!grepl(pattern, name)) [13:13:45.545] next [13:13:45.545] invokeRestart(restart) [13:13:45.545] muffled <- TRUE [13:13:45.545] break [13:13:45.545] } [13:13:45.545] } [13:13:45.545] } [13:13:45.545] invisible(muffled) [13:13:45.545] } [13:13:45.545] muffleCondition(cond) [13:13:45.545] }) [13:13:45.545] })) [13:13:45.545] future::FutureResult(value = ...future.value$value, [13:13:45.545] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:45.545] ...future.rng), globalenv = if (FALSE) [13:13:45.545] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:45.545] ...future.globalenv.names)) [13:13:45.545] else NULL, started = ...future.startTime, version = "1.8") [13:13:45.545] }, condition = base::local({ [13:13:45.545] c <- base::c [13:13:45.545] inherits <- base::inherits [13:13:45.545] invokeRestart <- base::invokeRestart [13:13:45.545] length <- base::length [13:13:45.545] list <- base::list [13:13:45.545] seq.int <- base::seq.int [13:13:45.545] signalCondition <- base::signalCondition [13:13:45.545] sys.calls <- base::sys.calls [13:13:45.545] `[[` <- base::`[[` [13:13:45.545] `+` <- base::`+` [13:13:45.545] `<<-` <- base::`<<-` [13:13:45.545] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:45.545] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:45.545] 3L)] [13:13:45.545] } [13:13:45.545] function(cond) { [13:13:45.545] is_error <- inherits(cond, "error") [13:13:45.545] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:45.545] NULL) [13:13:45.545] if (is_error) { [13:13:45.545] sessionInformation <- function() { [13:13:45.545] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:45.545] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:45.545] search = base::search(), system = base::Sys.info()) [13:13:45.545] } [13:13:45.545] ...future.conditions[[length(...future.conditions) + [13:13:45.545] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:45.545] cond$call), session = sessionInformation(), [13:13:45.545] timestamp = base::Sys.time(), signaled = 0L) [13:13:45.545] signalCondition(cond) [13:13:45.545] } [13:13:45.545] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:45.545] "immediateCondition"))) { [13:13:45.545] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:45.545] ...future.conditions[[length(...future.conditions) + [13:13:45.545] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:45.545] if (TRUE && !signal) { [13:13:45.545] muffleCondition <- function (cond, pattern = "^muffle") [13:13:45.545] { [13:13:45.545] inherits <- base::inherits [13:13:45.545] invokeRestart <- base::invokeRestart [13:13:45.545] is.null <- base::is.null [13:13:45.545] muffled <- FALSE [13:13:45.545] if (inherits(cond, "message")) { [13:13:45.545] muffled <- grepl(pattern, "muffleMessage") [13:13:45.545] if (muffled) [13:13:45.545] invokeRestart("muffleMessage") [13:13:45.545] } [13:13:45.545] else if (inherits(cond, "warning")) { [13:13:45.545] muffled <- grepl(pattern, "muffleWarning") [13:13:45.545] if (muffled) [13:13:45.545] invokeRestart("muffleWarning") [13:13:45.545] } [13:13:45.545] else if (inherits(cond, "condition")) { [13:13:45.545] if (!is.null(pattern)) { [13:13:45.545] computeRestarts <- base::computeRestarts [13:13:45.545] grepl <- base::grepl [13:13:45.545] restarts <- computeRestarts(cond) [13:13:45.545] for (restart in restarts) { [13:13:45.545] name <- restart$name [13:13:45.545] if (is.null(name)) [13:13:45.545] next [13:13:45.545] if (!grepl(pattern, name)) [13:13:45.545] next [13:13:45.545] invokeRestart(restart) [13:13:45.545] muffled <- TRUE [13:13:45.545] break [13:13:45.545] } [13:13:45.545] } [13:13:45.545] } [13:13:45.545] invisible(muffled) [13:13:45.545] } [13:13:45.545] muffleCondition(cond, pattern = "^muffle") [13:13:45.545] } [13:13:45.545] } [13:13:45.545] else { [13:13:45.545] if (TRUE) { [13:13:45.545] muffleCondition <- function (cond, pattern = "^muffle") [13:13:45.545] { [13:13:45.545] inherits <- base::inherits [13:13:45.545] invokeRestart <- base::invokeRestart [13:13:45.545] is.null <- base::is.null [13:13:45.545] muffled <- FALSE [13:13:45.545] if (inherits(cond, "message")) { [13:13:45.545] muffled <- grepl(pattern, "muffleMessage") [13:13:45.545] if (muffled) [13:13:45.545] invokeRestart("muffleMessage") [13:13:45.545] } [13:13:45.545] else if (inherits(cond, "warning")) { [13:13:45.545] muffled <- grepl(pattern, "muffleWarning") [13:13:45.545] if (muffled) [13:13:45.545] invokeRestart("muffleWarning") [13:13:45.545] } [13:13:45.545] else if (inherits(cond, "condition")) { [13:13:45.545] if (!is.null(pattern)) { [13:13:45.545] computeRestarts <- base::computeRestarts [13:13:45.545] grepl <- base::grepl [13:13:45.545] restarts <- computeRestarts(cond) [13:13:45.545] for (restart in restarts) { [13:13:45.545] name <- restart$name [13:13:45.545] if (is.null(name)) [13:13:45.545] next [13:13:45.545] if (!grepl(pattern, name)) [13:13:45.545] next [13:13:45.545] invokeRestart(restart) [13:13:45.545] muffled <- TRUE [13:13:45.545] break [13:13:45.545] } [13:13:45.545] } [13:13:45.545] } [13:13:45.545] invisible(muffled) [13:13:45.545] } [13:13:45.545] muffleCondition(cond, pattern = "^muffle") [13:13:45.545] } [13:13:45.545] } [13:13:45.545] } [13:13:45.545] })) [13:13:45.545] }, error = function(ex) { [13:13:45.545] base::structure(base::list(value = NULL, visible = NULL, [13:13:45.545] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:45.545] ...future.rng), started = ...future.startTime, [13:13:45.545] finished = Sys.time(), session_uuid = NA_character_, [13:13:45.545] version = "1.8"), class = "FutureResult") [13:13:45.545] }, finally = { [13:13:45.545] if (!identical(...future.workdir, getwd())) [13:13:45.545] setwd(...future.workdir) [13:13:45.545] { [13:13:45.545] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:45.545] ...future.oldOptions$nwarnings <- NULL [13:13:45.545] } [13:13:45.545] base::options(...future.oldOptions) [13:13:45.545] if (.Platform$OS.type == "windows") { [13:13:45.545] old_names <- names(...future.oldEnvVars) [13:13:45.545] envs <- base::Sys.getenv() [13:13:45.545] names <- names(envs) [13:13:45.545] common <- intersect(names, old_names) [13:13:45.545] added <- setdiff(names, old_names) [13:13:45.545] removed <- setdiff(old_names, names) [13:13:45.545] changed <- common[...future.oldEnvVars[common] != [13:13:45.545] envs[common]] [13:13:45.545] NAMES <- toupper(changed) [13:13:45.545] args <- list() [13:13:45.545] for (kk in seq_along(NAMES)) { [13:13:45.545] name <- changed[[kk]] [13:13:45.545] NAME <- NAMES[[kk]] [13:13:45.545] if (name != NAME && is.element(NAME, old_names)) [13:13:45.545] next [13:13:45.545] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:45.545] } [13:13:45.545] NAMES <- toupper(added) [13:13:45.545] for (kk in seq_along(NAMES)) { [13:13:45.545] name <- added[[kk]] [13:13:45.545] NAME <- NAMES[[kk]] [13:13:45.545] if (name != NAME && is.element(NAME, old_names)) [13:13:45.545] next [13:13:45.545] args[[name]] <- "" [13:13:45.545] } [13:13:45.545] NAMES <- toupper(removed) [13:13:45.545] for (kk in seq_along(NAMES)) { [13:13:45.545] name <- removed[[kk]] [13:13:45.545] NAME <- NAMES[[kk]] [13:13:45.545] if (name != NAME && is.element(NAME, old_names)) [13:13:45.545] next [13:13:45.545] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:45.545] } [13:13:45.545] if (length(args) > 0) [13:13:45.545] base::do.call(base::Sys.setenv, args = args) [13:13:45.545] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:45.545] } [13:13:45.545] else { [13:13:45.545] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:45.545] } [13:13:45.545] { [13:13:45.545] if (base::length(...future.futureOptionsAdded) > [13:13:45.545] 0L) { [13:13:45.545] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:45.545] base::names(opts) <- ...future.futureOptionsAdded [13:13:45.545] base::options(opts) [13:13:45.545] } [13:13:45.545] { [13:13:45.545] { [13:13:45.545] base::options(mc.cores = ...future.mc.cores.old) [13:13:45.545] NULL [13:13:45.545] } [13:13:45.545] options(future.plan = NULL) [13:13:45.545] if (is.na(NA_character_)) [13:13:45.545] Sys.unsetenv("R_FUTURE_PLAN") [13:13:45.545] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:45.545] future::plan(list(function (..., workers = availableCores(), [13:13:45.545] lazy = FALSE, rscript_libs = .libPaths(), [13:13:45.545] envir = parent.frame()) [13:13:45.545] { [13:13:45.545] if (is.function(workers)) [13:13:45.545] workers <- workers() [13:13:45.545] workers <- structure(as.integer(workers), [13:13:45.545] class = class(workers)) [13:13:45.545] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:45.545] workers >= 1) [13:13:45.545] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:45.545] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:45.545] } [13:13:45.545] future <- MultisessionFuture(..., workers = workers, [13:13:45.545] lazy = lazy, rscript_libs = rscript_libs, [13:13:45.545] envir = envir) [13:13:45.545] if (!future$lazy) [13:13:45.545] future <- run(future) [13:13:45.545] invisible(future) [13:13:45.545] }), .cleanup = FALSE, .init = FALSE) [13:13:45.545] } [13:13:45.545] } [13:13:45.545] } [13:13:45.545] }) [13:13:45.545] if (TRUE) { [13:13:45.545] base::sink(type = "output", split = FALSE) [13:13:45.545] if (TRUE) { [13:13:45.545] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:45.545] } [13:13:45.545] else { [13:13:45.545] ...future.result["stdout"] <- base::list(NULL) [13:13:45.545] } [13:13:45.545] base::close(...future.stdout) [13:13:45.545] ...future.stdout <- NULL [13:13:45.545] } [13:13:45.545] ...future.result$conditions <- ...future.conditions [13:13:45.545] ...future.result$finished <- base::Sys.time() [13:13:45.545] ...future.result [13:13:45.545] } [13:13:45.551] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... [13:13:45.551] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... [13:13:45.551] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... DONE [13:13:45.552] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... [13:13:45.552] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... DONE [13:13:45.552] Exporting '...future.elements_ii' (120 bytes) to cluster node #1 ... [13:13:45.553] Exporting '...future.elements_ii' (120 bytes) to cluster node #1 ... DONE [13:13:45.553] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:13:45.553] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:13:45.553] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:13:45.554] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:13:45.554] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... DONE [13:13:45.555] MultisessionFuture started [13:13:45.555] - Launch lazy future ... done [13:13:45.555] run() for 'MultisessionFuture' ... done [13:13:45.555] Created future: [13:13:45.571] receiveMessageFromWorker() for ClusterFuture ... [13:13:45.571] - Validating connection of MultisessionFuture [13:13:45.572] - received message: FutureResult [13:13:45.572] - Received FutureResult [13:13:45.572] - Erased future from FutureRegistry [13:13:45.572] result() for ClusterFuture ... [13:13:45.572] - result already collected: FutureResult [13:13:45.573] result() for ClusterFuture ... done [13:13:45.573] receiveMessageFromWorker() for ClusterFuture ... done [13:13:45.556] MultisessionFuture: [13:13:45.556] Label: 'future_lapply-3' [13:13:45.556] Expression: [13:13:45.556] { [13:13:45.556] do.call(function(...) { [13:13:45.556] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:45.556] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:45.556] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:45.556] on.exit(options(oopts), add = TRUE) [13:13:45.556] } [13:13:45.556] { [13:13:45.556] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:45.556] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:45.556] ...future.FUN(...future.X_jj, ...) [13:13:45.556] }) [13:13:45.556] } [13:13:45.556] }, args = future.call.arguments) [13:13:45.556] } [13:13:45.556] Lazy evaluation: FALSE [13:13:45.556] Asynchronous evaluation: TRUE [13:13:45.556] Local evaluation: TRUE [13:13:45.556] Environment: R_GlobalEnv [13:13:45.556] Capture standard output: TRUE [13:13:45.556] Capture condition classes: 'condition' (excluding 'nothing') [13:13:45.556] 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) [13:13:45.556] Packages: [13:13:45.556] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:45.556] Resolved: TRUE [13:13:45.556] Value: [13:13:45.556] Conditions captured: [13:13:45.556] Early signaling: FALSE [13:13:45.556] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:45.556] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:45.573] Chunk #3 of 4 ... DONE [13:13:45.573] Chunk #4 of 4 ... [13:13:45.574] - Finding globals in 'X' for chunk #4 ... [13:13:45.574] getGlobalsAndPackages() ... [13:13:45.574] Searching for globals... [13:13:45.574] [13:13:45.574] Searching for globals ... DONE [13:13:45.574] - globals: [0] [13:13:45.575] getGlobalsAndPackages() ... DONE [13:13:45.575] + additional globals found: [n=0] [13:13:45.575] + additional namespaces needed: [n=0] [13:13:45.575] - Finding globals in 'X' for chunk #4 ... DONE [13:13:45.575] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [13:13:45.575] - seeds: [13:13:45.576] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:45.576] getGlobalsAndPackages() ... [13:13:45.576] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:45.576] Resolving globals: FALSE [13:13:45.576] Tweak future expression to call with '...' arguments ... [13:13:45.576] { [13:13:45.576] do.call(function(...) { [13:13:45.576] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:45.576] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:45.576] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:45.576] on.exit(options(oopts), add = TRUE) [13:13:45.576] } [13:13:45.576] { [13:13:45.576] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:45.576] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:45.576] ...future.FUN(...future.X_jj, ...) [13:13:45.576] }) [13:13:45.576] } [13:13:45.576] }, args = future.call.arguments) [13:13:45.576] } [13:13:45.577] Tweak future expression to call with '...' arguments ... DONE [13:13:45.577] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:45.578] [13:13:45.578] getGlobalsAndPackages() ... DONE [13:13:45.578] run() for 'Future' ... [13:13:45.578] - state: 'created' [13:13:45.578] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:45.592] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:45.593] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:13:45.593] - Field: 'node' [13:13:45.593] - Field: 'label' [13:13:45.593] - Field: 'local' [13:13:45.593] - Field: 'owner' [13:13:45.594] - Field: 'envir' [13:13:45.594] - Field: 'workers' [13:13:45.594] - Field: 'packages' [13:13:45.594] - Field: 'gc' [13:13:45.594] - Field: 'conditions' [13:13:45.594] - Field: 'persistent' [13:13:45.595] - Field: 'expr' [13:13:45.595] - Field: 'uuid' [13:13:45.595] - Field: 'seed' [13:13:45.595] - Field: 'version' [13:13:45.595] - Field: 'result' [13:13:45.595] - Field: 'asynchronous' [13:13:45.596] - Field: 'calls' [13:13:45.596] - Field: 'globals' [13:13:45.596] - Field: 'stdout' [13:13:45.596] - Field: 'earlySignal' [13:13:45.596] - Field: 'lazy' [13:13:45.597] - Field: 'state' [13:13:45.597] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:13:45.597] - Launch lazy future ... [13:13:45.597] Packages needed by the future expression (n = 0): [13:13:45.597] Packages needed by future strategies (n = 0): [13:13:45.598] { [13:13:45.598] { [13:13:45.598] { [13:13:45.598] ...future.startTime <- base::Sys.time() [13:13:45.598] { [13:13:45.598] { [13:13:45.598] { [13:13:45.598] { [13:13:45.598] base::local({ [13:13:45.598] has_future <- base::requireNamespace("future", [13:13:45.598] quietly = TRUE) [13:13:45.598] if (has_future) { [13:13:45.598] ns <- base::getNamespace("future") [13:13:45.598] version <- ns[[".package"]][["version"]] [13:13:45.598] if (is.null(version)) [13:13:45.598] version <- utils::packageVersion("future") [13:13:45.598] } [13:13:45.598] else { [13:13:45.598] version <- NULL [13:13:45.598] } [13:13:45.598] if (!has_future || version < "1.8.0") { [13:13:45.598] info <- base::c(r_version = base::gsub("R version ", [13:13:45.598] "", base::R.version$version.string), [13:13:45.598] platform = base::sprintf("%s (%s-bit)", [13:13:45.598] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:45.598] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:45.598] "release", "version")], collapse = " "), [13:13:45.598] hostname = base::Sys.info()[["nodename"]]) [13:13:45.598] info <- base::sprintf("%s: %s", base::names(info), [13:13:45.598] info) [13:13:45.598] info <- base::paste(info, collapse = "; ") [13:13:45.598] if (!has_future) { [13:13:45.598] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:45.598] info) [13:13:45.598] } [13:13:45.598] else { [13:13:45.598] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:45.598] info, version) [13:13:45.598] } [13:13:45.598] base::stop(msg) [13:13:45.598] } [13:13:45.598] }) [13:13:45.598] } [13:13:45.598] ...future.mc.cores.old <- base::getOption("mc.cores") [13:13:45.598] base::options(mc.cores = 1L) [13:13:45.598] } [13:13:45.598] options(future.plan = NULL) [13:13:45.598] Sys.unsetenv("R_FUTURE_PLAN") [13:13:45.598] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:45.598] } [13:13:45.598] ...future.workdir <- getwd() [13:13:45.598] } [13:13:45.598] ...future.oldOptions <- base::as.list(base::.Options) [13:13:45.598] ...future.oldEnvVars <- base::Sys.getenv() [13:13:45.598] } [13:13:45.598] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:45.598] future.globals.maxSize = 2097152000, future.globals.method = NULL, [13:13:45.598] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:45.598] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:45.598] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:45.598] future.stdout.windows.reencode = NULL, width = 80L) [13:13:45.598] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:45.598] base::names(...future.oldOptions)) [13:13:45.598] } [13:13:45.598] if (FALSE) { [13:13:45.598] } [13:13:45.598] else { [13:13:45.598] if (TRUE) { [13:13:45.598] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:45.598] open = "w") [13:13:45.598] } [13:13:45.598] else { [13:13:45.598] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:45.598] windows = "NUL", "/dev/null"), open = "w") [13:13:45.598] } [13:13:45.598] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:45.598] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:45.598] base::sink(type = "output", split = FALSE) [13:13:45.598] base::close(...future.stdout) [13:13:45.598] }, add = TRUE) [13:13:45.598] } [13:13:45.598] ...future.frame <- base::sys.nframe() [13:13:45.598] ...future.conditions <- base::list() [13:13:45.598] ...future.rng <- base::globalenv()$.Random.seed [13:13:45.598] if (FALSE) { [13:13:45.598] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:45.598] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:45.598] } [13:13:45.598] ...future.result <- base::tryCatch({ [13:13:45.598] base::withCallingHandlers({ [13:13:45.598] ...future.value <- base::withVisible(base::local({ [13:13:45.598] ...future.makeSendCondition <- local({ [13:13:45.598] sendCondition <- NULL [13:13:45.598] function(frame = 1L) { [13:13:45.598] if (is.function(sendCondition)) [13:13:45.598] return(sendCondition) [13:13:45.598] ns <- getNamespace("parallel") [13:13:45.598] if (exists("sendData", mode = "function", [13:13:45.598] envir = ns)) { [13:13:45.598] parallel_sendData <- get("sendData", mode = "function", [13:13:45.598] envir = ns) [13:13:45.598] envir <- sys.frame(frame) [13:13:45.598] master <- NULL [13:13:45.598] while (!identical(envir, .GlobalEnv) && [13:13:45.598] !identical(envir, emptyenv())) { [13:13:45.598] if (exists("master", mode = "list", envir = envir, [13:13:45.598] inherits = FALSE)) { [13:13:45.598] master <- get("master", mode = "list", [13:13:45.598] envir = envir, inherits = FALSE) [13:13:45.598] if (inherits(master, c("SOCKnode", [13:13:45.598] "SOCK0node"))) { [13:13:45.598] sendCondition <<- function(cond) { [13:13:45.598] data <- list(type = "VALUE", value = cond, [13:13:45.598] success = TRUE) [13:13:45.598] parallel_sendData(master, data) [13:13:45.598] } [13:13:45.598] return(sendCondition) [13:13:45.598] } [13:13:45.598] } [13:13:45.598] frame <- frame + 1L [13:13:45.598] envir <- sys.frame(frame) [13:13:45.598] } [13:13:45.598] } [13:13:45.598] sendCondition <<- function(cond) NULL [13:13:45.598] } [13:13:45.598] }) [13:13:45.598] withCallingHandlers({ [13:13:45.598] { [13:13:45.598] do.call(function(...) { [13:13:45.598] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:45.598] if (!identical(...future.globals.maxSize.org, [13:13:45.598] ...future.globals.maxSize)) { [13:13:45.598] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:45.598] on.exit(options(oopts), add = TRUE) [13:13:45.598] } [13:13:45.598] { [13:13:45.598] lapply(seq_along(...future.elements_ii), [13:13:45.598] FUN = function(jj) { [13:13:45.598] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:45.598] ...future.FUN(...future.X_jj, ...) [13:13:45.598] }) [13:13:45.598] } [13:13:45.598] }, args = future.call.arguments) [13:13:45.598] } [13:13:45.598] }, immediateCondition = function(cond) { [13:13:45.598] sendCondition <- ...future.makeSendCondition() [13:13:45.598] sendCondition(cond) [13:13:45.598] muffleCondition <- function (cond, pattern = "^muffle") [13:13:45.598] { [13:13:45.598] inherits <- base::inherits [13:13:45.598] invokeRestart <- base::invokeRestart [13:13:45.598] is.null <- base::is.null [13:13:45.598] muffled <- FALSE [13:13:45.598] if (inherits(cond, "message")) { [13:13:45.598] muffled <- grepl(pattern, "muffleMessage") [13:13:45.598] if (muffled) [13:13:45.598] invokeRestart("muffleMessage") [13:13:45.598] } [13:13:45.598] else if (inherits(cond, "warning")) { [13:13:45.598] muffled <- grepl(pattern, "muffleWarning") [13:13:45.598] if (muffled) [13:13:45.598] invokeRestart("muffleWarning") [13:13:45.598] } [13:13:45.598] else if (inherits(cond, "condition")) { [13:13:45.598] if (!is.null(pattern)) { [13:13:45.598] computeRestarts <- base::computeRestarts [13:13:45.598] grepl <- base::grepl [13:13:45.598] restarts <- computeRestarts(cond) [13:13:45.598] for (restart in restarts) { [13:13:45.598] name <- restart$name [13:13:45.598] if (is.null(name)) [13:13:45.598] next [13:13:45.598] if (!grepl(pattern, name)) [13:13:45.598] next [13:13:45.598] invokeRestart(restart) [13:13:45.598] muffled <- TRUE [13:13:45.598] break [13:13:45.598] } [13:13:45.598] } [13:13:45.598] } [13:13:45.598] invisible(muffled) [13:13:45.598] } [13:13:45.598] muffleCondition(cond) [13:13:45.598] }) [13:13:45.598] })) [13:13:45.598] future::FutureResult(value = ...future.value$value, [13:13:45.598] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:45.598] ...future.rng), globalenv = if (FALSE) [13:13:45.598] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:45.598] ...future.globalenv.names)) [13:13:45.598] else NULL, started = ...future.startTime, version = "1.8") [13:13:45.598] }, condition = base::local({ [13:13:45.598] c <- base::c [13:13:45.598] inherits <- base::inherits [13:13:45.598] invokeRestart <- base::invokeRestart [13:13:45.598] length <- base::length [13:13:45.598] list <- base::list [13:13:45.598] seq.int <- base::seq.int [13:13:45.598] signalCondition <- base::signalCondition [13:13:45.598] sys.calls <- base::sys.calls [13:13:45.598] `[[` <- base::`[[` [13:13:45.598] `+` <- base::`+` [13:13:45.598] `<<-` <- base::`<<-` [13:13:45.598] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:45.598] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:45.598] 3L)] [13:13:45.598] } [13:13:45.598] function(cond) { [13:13:45.598] is_error <- inherits(cond, "error") [13:13:45.598] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:45.598] NULL) [13:13:45.598] if (is_error) { [13:13:45.598] sessionInformation <- function() { [13:13:45.598] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:45.598] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:45.598] search = base::search(), system = base::Sys.info()) [13:13:45.598] } [13:13:45.598] ...future.conditions[[length(...future.conditions) + [13:13:45.598] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:45.598] cond$call), session = sessionInformation(), [13:13:45.598] timestamp = base::Sys.time(), signaled = 0L) [13:13:45.598] signalCondition(cond) [13:13:45.598] } [13:13:45.598] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:45.598] "immediateCondition"))) { [13:13:45.598] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:45.598] ...future.conditions[[length(...future.conditions) + [13:13:45.598] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:45.598] if (TRUE && !signal) { [13:13:45.598] muffleCondition <- function (cond, pattern = "^muffle") [13:13:45.598] { [13:13:45.598] inherits <- base::inherits [13:13:45.598] invokeRestart <- base::invokeRestart [13:13:45.598] is.null <- base::is.null [13:13:45.598] muffled <- FALSE [13:13:45.598] if (inherits(cond, "message")) { [13:13:45.598] muffled <- grepl(pattern, "muffleMessage") [13:13:45.598] if (muffled) [13:13:45.598] invokeRestart("muffleMessage") [13:13:45.598] } [13:13:45.598] else if (inherits(cond, "warning")) { [13:13:45.598] muffled <- grepl(pattern, "muffleWarning") [13:13:45.598] if (muffled) [13:13:45.598] invokeRestart("muffleWarning") [13:13:45.598] } [13:13:45.598] else if (inherits(cond, "condition")) { [13:13:45.598] if (!is.null(pattern)) { [13:13:45.598] computeRestarts <- base::computeRestarts [13:13:45.598] grepl <- base::grepl [13:13:45.598] restarts <- computeRestarts(cond) [13:13:45.598] for (restart in restarts) { [13:13:45.598] name <- restart$name [13:13:45.598] if (is.null(name)) [13:13:45.598] next [13:13:45.598] if (!grepl(pattern, name)) [13:13:45.598] next [13:13:45.598] invokeRestart(restart) [13:13:45.598] muffled <- TRUE [13:13:45.598] break [13:13:45.598] } [13:13:45.598] } [13:13:45.598] } [13:13:45.598] invisible(muffled) [13:13:45.598] } [13:13:45.598] muffleCondition(cond, pattern = "^muffle") [13:13:45.598] } [13:13:45.598] } [13:13:45.598] else { [13:13:45.598] if (TRUE) { [13:13:45.598] muffleCondition <- function (cond, pattern = "^muffle") [13:13:45.598] { [13:13:45.598] inherits <- base::inherits [13:13:45.598] invokeRestart <- base::invokeRestart [13:13:45.598] is.null <- base::is.null [13:13:45.598] muffled <- FALSE [13:13:45.598] if (inherits(cond, "message")) { [13:13:45.598] muffled <- grepl(pattern, "muffleMessage") [13:13:45.598] if (muffled) [13:13:45.598] invokeRestart("muffleMessage") [13:13:45.598] } [13:13:45.598] else if (inherits(cond, "warning")) { [13:13:45.598] muffled <- grepl(pattern, "muffleWarning") [13:13:45.598] if (muffled) [13:13:45.598] invokeRestart("muffleWarning") [13:13:45.598] } [13:13:45.598] else if (inherits(cond, "condition")) { [13:13:45.598] if (!is.null(pattern)) { [13:13:45.598] computeRestarts <- base::computeRestarts [13:13:45.598] grepl <- base::grepl [13:13:45.598] restarts <- computeRestarts(cond) [13:13:45.598] for (restart in restarts) { [13:13:45.598] name <- restart$name [13:13:45.598] if (is.null(name)) [13:13:45.598] next [13:13:45.598] if (!grepl(pattern, name)) [13:13:45.598] next [13:13:45.598] invokeRestart(restart) [13:13:45.598] muffled <- TRUE [13:13:45.598] break [13:13:45.598] } [13:13:45.598] } [13:13:45.598] } [13:13:45.598] invisible(muffled) [13:13:45.598] } [13:13:45.598] muffleCondition(cond, pattern = "^muffle") [13:13:45.598] } [13:13:45.598] } [13:13:45.598] } [13:13:45.598] })) [13:13:45.598] }, error = function(ex) { [13:13:45.598] base::structure(base::list(value = NULL, visible = NULL, [13:13:45.598] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:45.598] ...future.rng), started = ...future.startTime, [13:13:45.598] finished = Sys.time(), session_uuid = NA_character_, [13:13:45.598] version = "1.8"), class = "FutureResult") [13:13:45.598] }, finally = { [13:13:45.598] if (!identical(...future.workdir, getwd())) [13:13:45.598] setwd(...future.workdir) [13:13:45.598] { [13:13:45.598] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:45.598] ...future.oldOptions$nwarnings <- NULL [13:13:45.598] } [13:13:45.598] base::options(...future.oldOptions) [13:13:45.598] if (.Platform$OS.type == "windows") { [13:13:45.598] old_names <- names(...future.oldEnvVars) [13:13:45.598] envs <- base::Sys.getenv() [13:13:45.598] names <- names(envs) [13:13:45.598] common <- intersect(names, old_names) [13:13:45.598] added <- setdiff(names, old_names) [13:13:45.598] removed <- setdiff(old_names, names) [13:13:45.598] changed <- common[...future.oldEnvVars[common] != [13:13:45.598] envs[common]] [13:13:45.598] NAMES <- toupper(changed) [13:13:45.598] args <- list() [13:13:45.598] for (kk in seq_along(NAMES)) { [13:13:45.598] name <- changed[[kk]] [13:13:45.598] NAME <- NAMES[[kk]] [13:13:45.598] if (name != NAME && is.element(NAME, old_names)) [13:13:45.598] next [13:13:45.598] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:45.598] } [13:13:45.598] NAMES <- toupper(added) [13:13:45.598] for (kk in seq_along(NAMES)) { [13:13:45.598] name <- added[[kk]] [13:13:45.598] NAME <- NAMES[[kk]] [13:13:45.598] if (name != NAME && is.element(NAME, old_names)) [13:13:45.598] next [13:13:45.598] args[[name]] <- "" [13:13:45.598] } [13:13:45.598] NAMES <- toupper(removed) [13:13:45.598] for (kk in seq_along(NAMES)) { [13:13:45.598] name <- removed[[kk]] [13:13:45.598] NAME <- NAMES[[kk]] [13:13:45.598] if (name != NAME && is.element(NAME, old_names)) [13:13:45.598] next [13:13:45.598] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:45.598] } [13:13:45.598] if (length(args) > 0) [13:13:45.598] base::do.call(base::Sys.setenv, args = args) [13:13:45.598] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:45.598] } [13:13:45.598] else { [13:13:45.598] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:45.598] } [13:13:45.598] { [13:13:45.598] if (base::length(...future.futureOptionsAdded) > [13:13:45.598] 0L) { [13:13:45.598] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:45.598] base::names(opts) <- ...future.futureOptionsAdded [13:13:45.598] base::options(opts) [13:13:45.598] } [13:13:45.598] { [13:13:45.598] { [13:13:45.598] base::options(mc.cores = ...future.mc.cores.old) [13:13:45.598] NULL [13:13:45.598] } [13:13:45.598] options(future.plan = NULL) [13:13:45.598] if (is.na(NA_character_)) [13:13:45.598] Sys.unsetenv("R_FUTURE_PLAN") [13:13:45.598] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:45.598] future::plan(list(function (..., workers = availableCores(), [13:13:45.598] lazy = FALSE, rscript_libs = .libPaths(), [13:13:45.598] envir = parent.frame()) [13:13:45.598] { [13:13:45.598] if (is.function(workers)) [13:13:45.598] workers <- workers() [13:13:45.598] workers <- structure(as.integer(workers), [13:13:45.598] class = class(workers)) [13:13:45.598] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:45.598] workers >= 1) [13:13:45.598] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:45.598] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:45.598] } [13:13:45.598] future <- MultisessionFuture(..., workers = workers, [13:13:45.598] lazy = lazy, rscript_libs = rscript_libs, [13:13:45.598] envir = envir) [13:13:45.598] if (!future$lazy) [13:13:45.598] future <- run(future) [13:13:45.598] invisible(future) [13:13:45.598] }), .cleanup = FALSE, .init = FALSE) [13:13:45.598] } [13:13:45.598] } [13:13:45.598] } [13:13:45.598] }) [13:13:45.598] if (TRUE) { [13:13:45.598] base::sink(type = "output", split = FALSE) [13:13:45.598] if (TRUE) { [13:13:45.598] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:45.598] } [13:13:45.598] else { [13:13:45.598] ...future.result["stdout"] <- base::list(NULL) [13:13:45.598] } [13:13:45.598] base::close(...future.stdout) [13:13:45.598] ...future.stdout <- NULL [13:13:45.598] } [13:13:45.598] ...future.result$conditions <- ...future.conditions [13:13:45.598] ...future.result$finished <- base::Sys.time() [13:13:45.598] ...future.result [13:13:45.598] } [13:13:45.603] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... [13:13:45.604] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... [13:13:45.604] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... DONE [13:13:45.604] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... [13:13:45.605] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... DONE [13:13:45.605] Exporting '...future.elements_ii' (112 bytes) to cluster node #1 ... [13:13:45.605] Exporting '...future.elements_ii' (112 bytes) to cluster node #1 ... DONE [13:13:45.606] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:13:45.606] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:13:45.606] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:13:45.607] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:13:45.607] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... DONE [13:13:45.607] MultisessionFuture started [13:13:45.608] - Launch lazy future ... done [13:13:45.608] run() for 'MultisessionFuture' ... done [13:13:45.608] Created future: [13:13:45.623] receiveMessageFromWorker() for ClusterFuture ... [13:13:45.623] - Validating connection of MultisessionFuture [13:13:45.623] - received message: FutureResult [13:13:45.623] - Received FutureResult [13:13:45.624] - Erased future from FutureRegistry [13:13:45.624] result() for ClusterFuture ... [13:13:45.624] - result already collected: FutureResult [13:13:45.624] result() for ClusterFuture ... done [13:13:45.624] receiveMessageFromWorker() for ClusterFuture ... done [13:13:45.608] MultisessionFuture: [13:13:45.608] Label: 'future_lapply-4' [13:13:45.608] Expression: [13:13:45.608] { [13:13:45.608] do.call(function(...) { [13:13:45.608] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:45.608] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:45.608] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:45.608] on.exit(options(oopts), add = TRUE) [13:13:45.608] } [13:13:45.608] { [13:13:45.608] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:45.608] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:45.608] ...future.FUN(...future.X_jj, ...) [13:13:45.608] }) [13:13:45.608] } [13:13:45.608] }, args = future.call.arguments) [13:13:45.608] } [13:13:45.608] Lazy evaluation: FALSE [13:13:45.608] Asynchronous evaluation: TRUE [13:13:45.608] Local evaluation: TRUE [13:13:45.608] Environment: R_GlobalEnv [13:13:45.608] Capture standard output: TRUE [13:13:45.608] Capture condition classes: 'condition' (excluding 'nothing') [13:13:45.608] 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) [13:13:45.608] Packages: [13:13:45.608] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:45.608] Resolved: TRUE [13:13:45.608] Value: [13:13:45.608] Conditions captured: [13:13:45.608] Early signaling: FALSE [13:13:45.608] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:45.608] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:45.625] Chunk #4 of 4 ... DONE [13:13:45.625] Launching 4 futures (chunks) ... DONE [13:13:45.625] Resolving 4 futures (chunks) ... [13:13:45.625] resolve() on list ... [13:13:45.625] recursive: 0 [13:13:45.625] length: 4 [13:13:45.626] [13:13:45.626] Future #1 [13:13:45.626] result() for ClusterFuture ... [13:13:45.626] - result already collected: FutureResult [13:13:45.626] result() for ClusterFuture ... done [13:13:45.626] result() for ClusterFuture ... [13:13:45.627] - result already collected: FutureResult [13:13:45.627] result() for ClusterFuture ... done [13:13:45.627] signalConditionsASAP(MultisessionFuture, pos=1) ... [13:13:45.627] - nx: 4 [13:13:45.627] - relay: TRUE [13:13:45.627] - stdout: TRUE [13:13:45.628] - signal: TRUE [13:13:45.628] - resignal: FALSE [13:13:45.628] - force: TRUE [13:13:45.628] - relayed: [n=4] FALSE, FALSE, FALSE, FALSE [13:13:45.628] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [13:13:45.628] - until=1 [13:13:45.628] - relaying element #1 [13:13:45.629] result() for ClusterFuture ... [13:13:45.629] - result already collected: FutureResult [13:13:45.629] result() for ClusterFuture ... done [13:13:45.629] result() for ClusterFuture ... [13:13:45.629] - result already collected: FutureResult [13:13:45.629] result() for ClusterFuture ... done [13:13:45.630] result() for ClusterFuture ... [13:13:45.630] - result already collected: FutureResult [13:13:45.630] result() for ClusterFuture ... done [13:13:45.630] result() for ClusterFuture ... [13:13:45.630] - result already collected: FutureResult [13:13:45.630] result() for ClusterFuture ... done [13:13:45.631] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [13:13:45.631] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [13:13:45.631] signalConditionsASAP(MultisessionFuture, pos=1) ... done [13:13:45.631] length: 3 (resolved future 1) [13:13:45.631] Future #2 [13:13:45.631] result() for ClusterFuture ... [13:13:45.632] - result already collected: FutureResult [13:13:45.632] result() for ClusterFuture ... done [13:13:45.632] result() for ClusterFuture ... [13:13:45.632] - result already collected: FutureResult [13:13:45.632] result() for ClusterFuture ... done [13:13:45.633] signalConditionsASAP(MultisessionFuture, pos=2) ... [13:13:45.633] - nx: 4 [13:13:45.633] - relay: TRUE [13:13:45.633] - stdout: TRUE [13:13:45.633] - signal: TRUE [13:13:45.633] - resignal: FALSE [13:13:45.634] - force: TRUE [13:13:45.634] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [13:13:45.634] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [13:13:45.634] - until=2 [13:13:45.634] - relaying element #2 [13:13:45.634] result() for ClusterFuture ... [13:13:45.635] - result already collected: FutureResult [13:13:45.635] result() for ClusterFuture ... done [13:13:45.635] result() for ClusterFuture ... [13:13:45.635] - result already collected: FutureResult [13:13:45.635] result() for ClusterFuture ... done [13:13:45.635] result() for ClusterFuture ... [13:13:45.636] - result already collected: FutureResult [13:13:45.636] result() for ClusterFuture ... done [13:13:45.636] result() for ClusterFuture ... [13:13:45.636] - result already collected: FutureResult [13:13:45.636] result() for ClusterFuture ... done [13:13:45.636] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [13:13:45.637] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [13:13:45.637] signalConditionsASAP(MultisessionFuture, pos=2) ... done [13:13:45.637] length: 2 (resolved future 2) [13:13:45.637] Future #3 [13:13:45.637] result() for ClusterFuture ... [13:13:45.637] - result already collected: FutureResult [13:13:45.638] result() for ClusterFuture ... done [13:13:45.638] result() for ClusterFuture ... [13:13:45.638] - result already collected: FutureResult [13:13:45.638] result() for ClusterFuture ... done [13:13:45.638] signalConditionsASAP(MultisessionFuture, pos=3) ... [13:13:45.638] - nx: 4 [13:13:45.639] - relay: TRUE [13:13:45.639] - stdout: TRUE [13:13:45.639] - signal: TRUE [13:13:45.639] - resignal: FALSE [13:13:45.639] - force: TRUE [13:13:45.639] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [13:13:45.639] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [13:13:45.640] - until=3 [13:13:45.640] - relaying element #3 [13:13:45.640] result() for ClusterFuture ... [13:13:45.640] - result already collected: FutureResult [13:13:45.640] result() for ClusterFuture ... done [13:13:45.640] result() for ClusterFuture ... [13:13:45.643] - result already collected: FutureResult [13:13:45.643] result() for ClusterFuture ... done [13:13:45.643] result() for ClusterFuture ... [13:13:45.643] - result already collected: FutureResult [13:13:45.644] result() for ClusterFuture ... done [13:13:45.644] result() for ClusterFuture ... [13:13:45.644] - result already collected: FutureResult [13:13:45.644] result() for ClusterFuture ... done [13:13:45.644] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [13:13:45.644] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [13:13:45.645] signalConditionsASAP(MultisessionFuture, pos=3) ... done [13:13:45.645] length: 1 (resolved future 3) [13:13:45.645] Future #4 [13:13:45.645] result() for ClusterFuture ... [13:13:45.645] - result already collected: FutureResult [13:13:45.645] result() for ClusterFuture ... done [13:13:45.646] result() for ClusterFuture ... [13:13:45.646] - result already collected: FutureResult [13:13:45.646] result() for ClusterFuture ... done [13:13:45.646] signalConditionsASAP(MultisessionFuture, pos=4) ... [13:13:45.646] - nx: 4 [13:13:45.646] - relay: TRUE [13:13:45.646] - stdout: TRUE [13:13:45.647] - signal: TRUE [13:13:45.647] - resignal: FALSE [13:13:45.647] - force: TRUE [13:13:45.647] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [13:13:45.647] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [13:13:45.647] - until=4 [13:13:45.648] - relaying element #4 [13:13:45.648] result() for ClusterFuture ... [13:13:45.648] - result already collected: FutureResult [13:13:45.648] result() for ClusterFuture ... done [13:13:45.648] result() for ClusterFuture ... [13:13:45.648] - result already collected: FutureResult [13:13:45.648] result() for ClusterFuture ... done [13:13:45.649] result() for ClusterFuture ... [13:13:45.649] - result already collected: FutureResult [13:13:45.649] result() for ClusterFuture ... done [13:13:45.649] result() for ClusterFuture ... [13:13:45.649] - result already collected: FutureResult [13:13:45.649] result() for ClusterFuture ... done [13:13:45.650] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [13:13:45.650] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [13:13:45.650] signalConditionsASAP(MultisessionFuture, pos=4) ... done [13:13:45.650] length: 0 (resolved future 4) [13:13:45.650] Relaying remaining futures [13:13:45.650] signalConditionsASAP(NULL, pos=0) ... [13:13:45.651] - nx: 4 [13:13:45.651] - relay: TRUE [13:13:45.651] - stdout: TRUE [13:13:45.651] - signal: TRUE [13:13:45.651] - resignal: FALSE [13:13:45.651] - force: TRUE [13:13:45.651] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [13:13:45.652] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE - flush all [13:13:45.652] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [13:13:45.652] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [13:13:45.652] signalConditionsASAP(NULL, pos=0) ... done [13:13:45.652] resolve() on list ... DONE [13:13:45.652] result() for ClusterFuture ... [13:13:45.653] - result already collected: FutureResult [13:13:45.653] result() for ClusterFuture ... done [13:13:45.653] result() for ClusterFuture ... [13:13:45.653] - result already collected: FutureResult [13:13:45.653] result() for ClusterFuture ... done [13:13:45.653] result() for ClusterFuture ... [13:13:45.654] - result already collected: FutureResult [13:13:45.654] result() for ClusterFuture ... done [13:13:45.654] result() for ClusterFuture ... [13:13:45.654] - result already collected: FutureResult [13:13:45.654] result() for ClusterFuture ... done [13:13:45.654] result() for ClusterFuture ... [13:13:45.655] - result already collected: FutureResult [13:13:45.655] result() for ClusterFuture ... done [13:13:45.655] result() for ClusterFuture ... [13:13:45.655] - result already collected: FutureResult [13:13:45.655] result() for ClusterFuture ... done [13:13:45.655] result() for ClusterFuture ... [13:13:45.655] - result already collected: FutureResult [13:13:45.656] result() for ClusterFuture ... done [13:13:45.656] result() for ClusterFuture ... [13:13:45.656] - result already collected: FutureResult [13:13:45.656] result() for ClusterFuture ... done [13:13:45.656] - Number of value chunks collected: 4 [13:13:45.656] Resolving 4 futures (chunks) ... DONE [13:13:45.657] Reducing values from 4 chunks ... [13:13:45.657] - Number of values collected after concatenation: 4 [13:13:45.657] - Number of values expected: 4 [13:13:45.657] Reducing values from 4 chunks ... DONE [13:13:45.657] 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, ...) ... [13:13:45.660] future_lapply() ... [13:13:45.673] Number of chunks: 1 [13:13:45.673] getGlobalsAndPackagesXApply() ... [13:13:45.673] - future.globals: TRUE [13:13:45.673] getGlobalsAndPackages() ... [13:13:45.673] Searching for globals... [13:13:45.683] - globals found: [22] 'FUN', 'if', 'missing', 'is.finite', '{', 'is.null', '<-', 'paste', 'length', '==', 'return', '>', '+', '[', 'seq_len', 'rev', 'c', '&&', '!', ':', '(', '-' [13:13:45.683] Searching for globals ... DONE [13:13:45.683] Resolving globals: FALSE [13:13:45.684] The total size of the 1 globals is 69.62 KiB (71288 bytes) [13:13:45.685] 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') [13:13:45.685] - globals: [1] 'FUN' [13:13:45.685] - packages: [1] 'future' [13:13:45.686] getGlobalsAndPackages() ... DONE [13:13:45.686] - globals found/used: [n=1] 'FUN' [13:13:45.686] - needed namespaces: [n=1] 'future' [13:13:45.686] Finding globals ... DONE [13:13:45.686] - use_args: TRUE [13:13:45.686] - Getting '...' globals ... [13:13:45.687] resolve() on list ... [13:13:45.687] recursive: 0 [13:13:45.687] length: 1 [13:13:45.687] elements: '...' [13:13:45.687] length: 0 (resolved future 1) [13:13:45.688] resolve() on list ... DONE [13:13:45.688] - '...' content: [n=2] 'collapse', 'maxHead' [13:13:45.688] List of 1 [13:13:45.688] $ ...:List of 2 [13:13:45.688] ..$ collapse: chr "; " [13:13:45.688] ..$ maxHead : int 3 [13:13:45.688] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:45.688] - attr(*, "where")=List of 1 [13:13:45.688] ..$ ...: [13:13:45.688] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:45.688] - attr(*, "resolved")= logi TRUE [13:13:45.688] - attr(*, "total_size")= num NA [13:13:45.692] - Getting '...' globals ... DONE [13:13:45.692] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:45.692] List of 2 [13:13:45.692] $ ...future.FUN:function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [13:13:45.692] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [13:13:45.692] $ ... :List of 2 [13:13:45.692] ..$ collapse: chr "; " [13:13:45.692] ..$ maxHead : int 3 [13:13:45.692] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:45.692] - attr(*, "where")=List of 2 [13:13:45.692] ..$ ...future.FUN: [13:13:45.692] ..$ ... : [13:13:45.692] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:45.692] - attr(*, "resolved")= logi FALSE [13:13:45.692] - attr(*, "total_size")= num 71456 [13:13:45.696] Packages to be attached in all futures: [n=1] 'future' [13:13:45.696] getGlobalsAndPackagesXApply() ... DONE [13:13:45.697] Number of futures (= number of chunks): 1 [13:13:45.697] Launching 1 futures (chunks) ... [13:13:45.697] Chunk #1 of 1 ... [13:13:45.697] - Finding globals in 'X' for chunk #1 ... [13:13:45.697] getGlobalsAndPackages() ... [13:13:45.697] Searching for globals... [13:13:45.698] [13:13:45.698] Searching for globals ... DONE [13:13:45.698] - globals: [0] [13:13:45.698] getGlobalsAndPackages() ... DONE [13:13:45.698] + additional globals found: [n=0] [13:13:45.699] + additional namespaces needed: [n=0] [13:13:45.699] - Finding globals in 'X' for chunk #1 ... DONE [13:13:45.699] - seeds: [13:13:45.699] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:45.699] getGlobalsAndPackages() ... [13:13:45.699] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:45.700] Resolving globals: FALSE [13:13:45.700] Tweak future expression to call with '...' arguments ... [13:13:45.700] { [13:13:45.700] do.call(function(...) { [13:13:45.700] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:45.700] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:45.700] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:45.700] on.exit(options(oopts), add = TRUE) [13:13:45.700] } [13:13:45.700] { [13:13:45.700] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:45.700] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:45.700] ...future.FUN(...future.X_jj, ...) [13:13:45.700] }) [13:13:45.700] } [13:13:45.700] }, args = future.call.arguments) [13:13:45.700] } [13:13:45.700] Tweak future expression to call with '...' arguments ... DONE [13:13:45.701] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:45.701] - packages: [1] 'future' [13:13:45.701] getGlobalsAndPackages() ... DONE [13:13:45.702] run() for 'Future' ... [13:13:45.702] - state: 'created' [13:13:45.702] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:45.716] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:45.716] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:13:45.716] - Field: 'node' [13:13:45.716] - Field: 'label' [13:13:45.717] - Field: 'local' [13:13:45.717] - Field: 'owner' [13:13:45.717] - Field: 'envir' [13:13:45.717] - Field: 'workers' [13:13:45.717] - Field: 'packages' [13:13:45.717] - Field: 'gc' [13:13:45.718] - Field: 'conditions' [13:13:45.718] - Field: 'persistent' [13:13:45.718] - Field: 'expr' [13:13:45.718] - Field: 'uuid' [13:13:45.718] - Field: 'seed' [13:13:45.718] - Field: 'version' [13:13:45.719] - Field: 'result' [13:13:45.719] - Field: 'asynchronous' [13:13:45.719] - Field: 'calls' [13:13:45.719] - Field: 'globals' [13:13:45.719] - Field: 'stdout' [13:13:45.720] - Field: 'earlySignal' [13:13:45.720] - Field: 'lazy' [13:13:45.720] - Field: 'state' [13:13:45.720] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:13:45.720] - Launch lazy future ... [13:13:45.721] Packages needed by the future expression (n = 1): 'future' [13:13:45.721] Packages needed by future strategies (n = 0): [13:13:45.721] { [13:13:45.721] { [13:13:45.721] { [13:13:45.721] ...future.startTime <- base::Sys.time() [13:13:45.721] { [13:13:45.721] { [13:13:45.721] { [13:13:45.721] { [13:13:45.721] { [13:13:45.721] base::local({ [13:13:45.721] has_future <- base::requireNamespace("future", [13:13:45.721] quietly = TRUE) [13:13:45.721] if (has_future) { [13:13:45.721] ns <- base::getNamespace("future") [13:13:45.721] version <- ns[[".package"]][["version"]] [13:13:45.721] if (is.null(version)) [13:13:45.721] version <- utils::packageVersion("future") [13:13:45.721] } [13:13:45.721] else { [13:13:45.721] version <- NULL [13:13:45.721] } [13:13:45.721] if (!has_future || version < "1.8.0") { [13:13:45.721] info <- base::c(r_version = base::gsub("R version ", [13:13:45.721] "", base::R.version$version.string), [13:13:45.721] platform = base::sprintf("%s (%s-bit)", [13:13:45.721] base::R.version$platform, 8 * [13:13:45.721] base::.Machine$sizeof.pointer), [13:13:45.721] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:45.721] "release", "version")], collapse = " "), [13:13:45.721] hostname = base::Sys.info()[["nodename"]]) [13:13:45.721] info <- base::sprintf("%s: %s", base::names(info), [13:13:45.721] info) [13:13:45.721] info <- base::paste(info, collapse = "; ") [13:13:45.721] if (!has_future) { [13:13:45.721] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:45.721] info) [13:13:45.721] } [13:13:45.721] else { [13:13:45.721] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:45.721] info, version) [13:13:45.721] } [13:13:45.721] base::stop(msg) [13:13:45.721] } [13:13:45.721] }) [13:13:45.721] } [13:13:45.721] ...future.mc.cores.old <- base::getOption("mc.cores") [13:13:45.721] base::options(mc.cores = 1L) [13:13:45.721] } [13:13:45.721] base::local({ [13:13:45.721] for (pkg in "future") { [13:13:45.721] base::loadNamespace(pkg) [13:13:45.721] base::library(pkg, character.only = TRUE) [13:13:45.721] } [13:13:45.721] }) [13:13:45.721] } [13:13:45.721] options(future.plan = NULL) [13:13:45.721] Sys.unsetenv("R_FUTURE_PLAN") [13:13:45.721] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:45.721] } [13:13:45.721] ...future.workdir <- getwd() [13:13:45.721] } [13:13:45.721] ...future.oldOptions <- base::as.list(base::.Options) [13:13:45.721] ...future.oldEnvVars <- base::Sys.getenv() [13:13:45.721] } [13:13:45.721] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:45.721] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:45.721] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:45.721] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:45.721] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:45.721] future.stdout.windows.reencode = NULL, width = 80L) [13:13:45.721] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:45.721] base::names(...future.oldOptions)) [13:13:45.721] } [13:13:45.721] if (FALSE) { [13:13:45.721] } [13:13:45.721] else { [13:13:45.721] if (TRUE) { [13:13:45.721] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:45.721] open = "w") [13:13:45.721] } [13:13:45.721] else { [13:13:45.721] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:45.721] windows = "NUL", "/dev/null"), open = "w") [13:13:45.721] } [13:13:45.721] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:45.721] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:45.721] base::sink(type = "output", split = FALSE) [13:13:45.721] base::close(...future.stdout) [13:13:45.721] }, add = TRUE) [13:13:45.721] } [13:13:45.721] ...future.frame <- base::sys.nframe() [13:13:45.721] ...future.conditions <- base::list() [13:13:45.721] ...future.rng <- base::globalenv()$.Random.seed [13:13:45.721] if (FALSE) { [13:13:45.721] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:45.721] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:45.721] } [13:13:45.721] ...future.result <- base::tryCatch({ [13:13:45.721] base::withCallingHandlers({ [13:13:45.721] ...future.value <- base::withVisible(base::local({ [13:13:45.721] ...future.makeSendCondition <- local({ [13:13:45.721] sendCondition <- NULL [13:13:45.721] function(frame = 1L) { [13:13:45.721] if (is.function(sendCondition)) [13:13:45.721] return(sendCondition) [13:13:45.721] ns <- getNamespace("parallel") [13:13:45.721] if (exists("sendData", mode = "function", [13:13:45.721] envir = ns)) { [13:13:45.721] parallel_sendData <- get("sendData", mode = "function", [13:13:45.721] envir = ns) [13:13:45.721] envir <- sys.frame(frame) [13:13:45.721] master <- NULL [13:13:45.721] while (!identical(envir, .GlobalEnv) && [13:13:45.721] !identical(envir, emptyenv())) { [13:13:45.721] if (exists("master", mode = "list", envir = envir, [13:13:45.721] inherits = FALSE)) { [13:13:45.721] master <- get("master", mode = "list", [13:13:45.721] envir = envir, inherits = FALSE) [13:13:45.721] if (inherits(master, c("SOCKnode", [13:13:45.721] "SOCK0node"))) { [13:13:45.721] sendCondition <<- function(cond) { [13:13:45.721] data <- list(type = "VALUE", value = cond, [13:13:45.721] success = TRUE) [13:13:45.721] parallel_sendData(master, data) [13:13:45.721] } [13:13:45.721] return(sendCondition) [13:13:45.721] } [13:13:45.721] } [13:13:45.721] frame <- frame + 1L [13:13:45.721] envir <- sys.frame(frame) [13:13:45.721] } [13:13:45.721] } [13:13:45.721] sendCondition <<- function(cond) NULL [13:13:45.721] } [13:13:45.721] }) [13:13:45.721] withCallingHandlers({ [13:13:45.721] { [13:13:45.721] do.call(function(...) { [13:13:45.721] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:45.721] if (!identical(...future.globals.maxSize.org, [13:13:45.721] ...future.globals.maxSize)) { [13:13:45.721] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:45.721] on.exit(options(oopts), add = TRUE) [13:13:45.721] } [13:13:45.721] { [13:13:45.721] lapply(seq_along(...future.elements_ii), [13:13:45.721] FUN = function(jj) { [13:13:45.721] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:45.721] ...future.FUN(...future.X_jj, ...) [13:13:45.721] }) [13:13:45.721] } [13:13:45.721] }, args = future.call.arguments) [13:13:45.721] } [13:13:45.721] }, immediateCondition = function(cond) { [13:13:45.721] sendCondition <- ...future.makeSendCondition() [13:13:45.721] sendCondition(cond) [13:13:45.721] muffleCondition <- function (cond, pattern = "^muffle") [13:13:45.721] { [13:13:45.721] inherits <- base::inherits [13:13:45.721] invokeRestart <- base::invokeRestart [13:13:45.721] is.null <- base::is.null [13:13:45.721] muffled <- FALSE [13:13:45.721] if (inherits(cond, "message")) { [13:13:45.721] muffled <- grepl(pattern, "muffleMessage") [13:13:45.721] if (muffled) [13:13:45.721] invokeRestart("muffleMessage") [13:13:45.721] } [13:13:45.721] else if (inherits(cond, "warning")) { [13:13:45.721] muffled <- grepl(pattern, "muffleWarning") [13:13:45.721] if (muffled) [13:13:45.721] invokeRestart("muffleWarning") [13:13:45.721] } [13:13:45.721] else if (inherits(cond, "condition")) { [13:13:45.721] if (!is.null(pattern)) { [13:13:45.721] computeRestarts <- base::computeRestarts [13:13:45.721] grepl <- base::grepl [13:13:45.721] restarts <- computeRestarts(cond) [13:13:45.721] for (restart in restarts) { [13:13:45.721] name <- restart$name [13:13:45.721] if (is.null(name)) [13:13:45.721] next [13:13:45.721] if (!grepl(pattern, name)) [13:13:45.721] next [13:13:45.721] invokeRestart(restart) [13:13:45.721] muffled <- TRUE [13:13:45.721] break [13:13:45.721] } [13:13:45.721] } [13:13:45.721] } [13:13:45.721] invisible(muffled) [13:13:45.721] } [13:13:45.721] muffleCondition(cond) [13:13:45.721] }) [13:13:45.721] })) [13:13:45.721] future::FutureResult(value = ...future.value$value, [13:13:45.721] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:45.721] ...future.rng), globalenv = if (FALSE) [13:13:45.721] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:45.721] ...future.globalenv.names)) [13:13:45.721] else NULL, started = ...future.startTime, version = "1.8") [13:13:45.721] }, condition = base::local({ [13:13:45.721] c <- base::c [13:13:45.721] inherits <- base::inherits [13:13:45.721] invokeRestart <- base::invokeRestart [13:13:45.721] length <- base::length [13:13:45.721] list <- base::list [13:13:45.721] seq.int <- base::seq.int [13:13:45.721] signalCondition <- base::signalCondition [13:13:45.721] sys.calls <- base::sys.calls [13:13:45.721] `[[` <- base::`[[` [13:13:45.721] `+` <- base::`+` [13:13:45.721] `<<-` <- base::`<<-` [13:13:45.721] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:45.721] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:45.721] 3L)] [13:13:45.721] } [13:13:45.721] function(cond) { [13:13:45.721] is_error <- inherits(cond, "error") [13:13:45.721] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:45.721] NULL) [13:13:45.721] if (is_error) { [13:13:45.721] sessionInformation <- function() { [13:13:45.721] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:45.721] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:45.721] search = base::search(), system = base::Sys.info()) [13:13:45.721] } [13:13:45.721] ...future.conditions[[length(...future.conditions) + [13:13:45.721] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:45.721] cond$call), session = sessionInformation(), [13:13:45.721] timestamp = base::Sys.time(), signaled = 0L) [13:13:45.721] signalCondition(cond) [13:13:45.721] } [13:13:45.721] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:45.721] "immediateCondition"))) { [13:13:45.721] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:45.721] ...future.conditions[[length(...future.conditions) + [13:13:45.721] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:45.721] if (TRUE && !signal) { [13:13:45.721] muffleCondition <- function (cond, pattern = "^muffle") [13:13:45.721] { [13:13:45.721] inherits <- base::inherits [13:13:45.721] invokeRestart <- base::invokeRestart [13:13:45.721] is.null <- base::is.null [13:13:45.721] muffled <- FALSE [13:13:45.721] if (inherits(cond, "message")) { [13:13:45.721] muffled <- grepl(pattern, "muffleMessage") [13:13:45.721] if (muffled) [13:13:45.721] invokeRestart("muffleMessage") [13:13:45.721] } [13:13:45.721] else if (inherits(cond, "warning")) { [13:13:45.721] muffled <- grepl(pattern, "muffleWarning") [13:13:45.721] if (muffled) [13:13:45.721] invokeRestart("muffleWarning") [13:13:45.721] } [13:13:45.721] else if (inherits(cond, "condition")) { [13:13:45.721] if (!is.null(pattern)) { [13:13:45.721] computeRestarts <- base::computeRestarts [13:13:45.721] grepl <- base::grepl [13:13:45.721] restarts <- computeRestarts(cond) [13:13:45.721] for (restart in restarts) { [13:13:45.721] name <- restart$name [13:13:45.721] if (is.null(name)) [13:13:45.721] next [13:13:45.721] if (!grepl(pattern, name)) [13:13:45.721] next [13:13:45.721] invokeRestart(restart) [13:13:45.721] muffled <- TRUE [13:13:45.721] break [13:13:45.721] } [13:13:45.721] } [13:13:45.721] } [13:13:45.721] invisible(muffled) [13:13:45.721] } [13:13:45.721] muffleCondition(cond, pattern = "^muffle") [13:13:45.721] } [13:13:45.721] } [13:13:45.721] else { [13:13:45.721] if (TRUE) { [13:13:45.721] muffleCondition <- function (cond, pattern = "^muffle") [13:13:45.721] { [13:13:45.721] inherits <- base::inherits [13:13:45.721] invokeRestart <- base::invokeRestart [13:13:45.721] is.null <- base::is.null [13:13:45.721] muffled <- FALSE [13:13:45.721] if (inherits(cond, "message")) { [13:13:45.721] muffled <- grepl(pattern, "muffleMessage") [13:13:45.721] if (muffled) [13:13:45.721] invokeRestart("muffleMessage") [13:13:45.721] } [13:13:45.721] else if (inherits(cond, "warning")) { [13:13:45.721] muffled <- grepl(pattern, "muffleWarning") [13:13:45.721] if (muffled) [13:13:45.721] invokeRestart("muffleWarning") [13:13:45.721] } [13:13:45.721] else if (inherits(cond, "condition")) { [13:13:45.721] if (!is.null(pattern)) { [13:13:45.721] computeRestarts <- base::computeRestarts [13:13:45.721] grepl <- base::grepl [13:13:45.721] restarts <- computeRestarts(cond) [13:13:45.721] for (restart in restarts) { [13:13:45.721] name <- restart$name [13:13:45.721] if (is.null(name)) [13:13:45.721] next [13:13:45.721] if (!grepl(pattern, name)) [13:13:45.721] next [13:13:45.721] invokeRestart(restart) [13:13:45.721] muffled <- TRUE [13:13:45.721] break [13:13:45.721] } [13:13:45.721] } [13:13:45.721] } [13:13:45.721] invisible(muffled) [13:13:45.721] } [13:13:45.721] muffleCondition(cond, pattern = "^muffle") [13:13:45.721] } [13:13:45.721] } [13:13:45.721] } [13:13:45.721] })) [13:13:45.721] }, error = function(ex) { [13:13:45.721] base::structure(base::list(value = NULL, visible = NULL, [13:13:45.721] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:45.721] ...future.rng), started = ...future.startTime, [13:13:45.721] finished = Sys.time(), session_uuid = NA_character_, [13:13:45.721] version = "1.8"), class = "FutureResult") [13:13:45.721] }, finally = { [13:13:45.721] if (!identical(...future.workdir, getwd())) [13:13:45.721] setwd(...future.workdir) [13:13:45.721] { [13:13:45.721] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:45.721] ...future.oldOptions$nwarnings <- NULL [13:13:45.721] } [13:13:45.721] base::options(...future.oldOptions) [13:13:45.721] if (.Platform$OS.type == "windows") { [13:13:45.721] old_names <- names(...future.oldEnvVars) [13:13:45.721] envs <- base::Sys.getenv() [13:13:45.721] names <- names(envs) [13:13:45.721] common <- intersect(names, old_names) [13:13:45.721] added <- setdiff(names, old_names) [13:13:45.721] removed <- setdiff(old_names, names) [13:13:45.721] changed <- common[...future.oldEnvVars[common] != [13:13:45.721] envs[common]] [13:13:45.721] NAMES <- toupper(changed) [13:13:45.721] args <- list() [13:13:45.721] for (kk in seq_along(NAMES)) { [13:13:45.721] name <- changed[[kk]] [13:13:45.721] NAME <- NAMES[[kk]] [13:13:45.721] if (name != NAME && is.element(NAME, old_names)) [13:13:45.721] next [13:13:45.721] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:45.721] } [13:13:45.721] NAMES <- toupper(added) [13:13:45.721] for (kk in seq_along(NAMES)) { [13:13:45.721] name <- added[[kk]] [13:13:45.721] NAME <- NAMES[[kk]] [13:13:45.721] if (name != NAME && is.element(NAME, old_names)) [13:13:45.721] next [13:13:45.721] args[[name]] <- "" [13:13:45.721] } [13:13:45.721] NAMES <- toupper(removed) [13:13:45.721] for (kk in seq_along(NAMES)) { [13:13:45.721] name <- removed[[kk]] [13:13:45.721] NAME <- NAMES[[kk]] [13:13:45.721] if (name != NAME && is.element(NAME, old_names)) [13:13:45.721] next [13:13:45.721] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:45.721] } [13:13:45.721] if (length(args) > 0) [13:13:45.721] base::do.call(base::Sys.setenv, args = args) [13:13:45.721] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:45.721] } [13:13:45.721] else { [13:13:45.721] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:45.721] } [13:13:45.721] { [13:13:45.721] if (base::length(...future.futureOptionsAdded) > [13:13:45.721] 0L) { [13:13:45.721] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:45.721] base::names(opts) <- ...future.futureOptionsAdded [13:13:45.721] base::options(opts) [13:13:45.721] } [13:13:45.721] { [13:13:45.721] { [13:13:45.721] base::options(mc.cores = ...future.mc.cores.old) [13:13:45.721] NULL [13:13:45.721] } [13:13:45.721] options(future.plan = NULL) [13:13:45.721] if (is.na(NA_character_)) [13:13:45.721] Sys.unsetenv("R_FUTURE_PLAN") [13:13:45.721] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:45.721] future::plan(list(function (..., workers = availableCores(), [13:13:45.721] lazy = FALSE, rscript_libs = .libPaths(), [13:13:45.721] envir = parent.frame()) [13:13:45.721] { [13:13:45.721] if (is.function(workers)) [13:13:45.721] workers <- workers() [13:13:45.721] workers <- structure(as.integer(workers), [13:13:45.721] class = class(workers)) [13:13:45.721] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:45.721] workers >= 1) [13:13:45.721] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:45.721] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:45.721] } [13:13:45.721] future <- MultisessionFuture(..., workers = workers, [13:13:45.721] lazy = lazy, rscript_libs = rscript_libs, [13:13:45.721] envir = envir) [13:13:45.721] if (!future$lazy) [13:13:45.721] future <- run(future) [13:13:45.721] invisible(future) [13:13:45.721] }), .cleanup = FALSE, .init = FALSE) [13:13:45.721] } [13:13:45.721] } [13:13:45.721] } [13:13:45.721] }) [13:13:45.721] if (TRUE) { [13:13:45.721] base::sink(type = "output", split = FALSE) [13:13:45.721] if (TRUE) { [13:13:45.721] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:45.721] } [13:13:45.721] else { [13:13:45.721] ...future.result["stdout"] <- base::list(NULL) [13:13:45.721] } [13:13:45.721] base::close(...future.stdout) [13:13:45.721] ...future.stdout <- NULL [13:13:45.721] } [13:13:45.721] ...future.result$conditions <- ...future.conditions [13:13:45.721] ...future.result$finished <- base::Sys.time() [13:13:45.721] ...future.result [13:13:45.721] } [13:13:45.727] Exporting 5 global objects (69.78 KiB) to cluster node #1 ... [13:13:45.728] Exporting '...future.FUN' (69.62 KiB) to cluster node #1 ... [13:13:45.728] Exporting '...future.FUN' (69.62 KiB) to cluster node #1 ... DONE [13:13:45.729] Exporting 'future.call.arguments' (168 bytes) to cluster node #1 ... [13:13:45.729] Exporting 'future.call.arguments' (168 bytes) to cluster node #1 ... DONE [13:13:45.729] Exporting '...future.elements_ii' (12.83 KiB) to cluster node #1 ... [13:13:45.730] Exporting '...future.elements_ii' (12.83 KiB) to cluster node #1 ... DONE [13:13:45.730] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:13:45.730] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:13:45.731] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:13:45.731] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:13:45.731] Exporting 5 global objects (69.78 KiB) to cluster node #1 ... DONE [13:13:45.732] MultisessionFuture started [13:13:45.732] - Launch lazy future ... done [13:13:45.732] run() for 'MultisessionFuture' ... done [13:13:45.733] Created future: [13:13:45.753] receiveMessageFromWorker() for ClusterFuture ... [13:13:45.753] - Validating connection of MultisessionFuture [13:13:45.754] - received message: FutureResult [13:13:45.754] - Received FutureResult [13:13:45.754] - Erased future from FutureRegistry [13:13:45.754] result() for ClusterFuture ... [13:13:45.754] - result already collected: FutureResult [13:13:45.754] result() for ClusterFuture ... done [13:13:45.755] receiveMessageFromWorker() for ClusterFuture ... done [13:13:45.733] MultisessionFuture: [13:13:45.733] Label: 'future_lapply-1' [13:13:45.733] Expression: [13:13:45.733] { [13:13:45.733] do.call(function(...) { [13:13:45.733] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:45.733] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:45.733] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:45.733] on.exit(options(oopts), add = TRUE) [13:13:45.733] } [13:13:45.733] { [13:13:45.733] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:45.733] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:45.733] ...future.FUN(...future.X_jj, ...) [13:13:45.733] }) [13:13:45.733] } [13:13:45.733] }, args = future.call.arguments) [13:13:45.733] } [13:13:45.733] Lazy evaluation: FALSE [13:13:45.733] Asynchronous evaluation: TRUE [13:13:45.733] Local evaluation: TRUE [13:13:45.733] Environment: R_GlobalEnv [13:13:45.733] Capture standard output: TRUE [13:13:45.733] Capture condition classes: 'condition' (excluding 'nothing') [13:13:45.733] 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) [13:13:45.733] Packages: 1 packages ('future') [13:13:45.733] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:45.733] Resolved: TRUE [13:13:45.733] Value: [13:13:45.733] Conditions captured: [13:13:45.733] Early signaling: FALSE [13:13:45.733] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:45.733] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:45.755] Chunk #1 of 1 ... DONE [13:13:45.755] Launching 1 futures (chunks) ... DONE [13:13:45.755] Resolving 1 futures (chunks) ... [13:13:45.756] resolve() on list ... [13:13:45.756] recursive: 0 [13:13:45.756] length: 1 [13:13:45.756] [13:13:45.756] Future #1 [13:13:45.756] result() for ClusterFuture ... [13:13:45.756] - result already collected: FutureResult [13:13:45.757] result() for ClusterFuture ... done [13:13:45.757] result() for ClusterFuture ... [13:13:45.757] - result already collected: FutureResult [13:13:45.757] result() for ClusterFuture ... done [13:13:45.757] signalConditionsASAP(MultisessionFuture, pos=1) ... [13:13:45.757] - nx: 1 [13:13:45.758] - relay: TRUE [13:13:45.758] - stdout: TRUE [13:13:45.758] - signal: TRUE [13:13:45.758] - resignal: FALSE [13:13:45.758] - force: TRUE [13:13:45.758] - relayed: [n=1] FALSE [13:13:45.759] - queued futures: [n=1] FALSE [13:13:45.759] - until=1 [13:13:45.759] - relaying element #1 [13:13:45.759] result() for ClusterFuture ... [13:13:45.759] - result already collected: FutureResult [13:13:45.759] result() for ClusterFuture ... done [13:13:45.759] result() for ClusterFuture ... [13:13:45.760] - result already collected: FutureResult [13:13:45.760] result() for ClusterFuture ... done [13:13:45.760] result() for ClusterFuture ... [13:13:45.760] - result already collected: FutureResult [13:13:45.760] result() for ClusterFuture ... done [13:13:45.760] result() for ClusterFuture ... [13:13:45.761] - result already collected: FutureResult [13:13:45.761] result() for ClusterFuture ... done [13:13:45.761] - relayed: [n=1] TRUE [13:13:45.761] - queued futures: [n=1] TRUE [13:13:45.761] signalConditionsASAP(MultisessionFuture, pos=1) ... done [13:13:45.761] length: 0 (resolved future 1) [13:13:45.762] Relaying remaining futures [13:13:45.762] signalConditionsASAP(NULL, pos=0) ... [13:13:45.762] - nx: 1 [13:13:45.762] - relay: TRUE [13:13:45.762] - stdout: TRUE [13:13:45.762] - signal: TRUE [13:13:45.762] - resignal: FALSE [13:13:45.763] - force: TRUE [13:13:45.763] - relayed: [n=1] TRUE [13:13:45.763] - queued futures: [n=1] TRUE - flush all [13:13:45.763] - relayed: [n=1] TRUE [13:13:45.763] - queued futures: [n=1] TRUE [13:13:45.763] signalConditionsASAP(NULL, pos=0) ... done [13:13:45.764] resolve() on list ... DONE [13:13:45.764] result() for ClusterFuture ... [13:13:45.764] - result already collected: FutureResult [13:13:45.764] result() for ClusterFuture ... done [13:13:45.764] result() for ClusterFuture ... [13:13:45.764] - result already collected: FutureResult [13:13:45.765] result() for ClusterFuture ... done [13:13:45.765] - Number of value chunks collected: 1 [13:13:45.765] Resolving 1 futures (chunks) ... DONE [13:13:45.765] Reducing values from 1 chunks ... [13:13:45.765] - Number of values collected after concatenation: 1 [13:13:45.765] - Number of values expected: 1 [13:13:45.766] Reducing values from 1 chunks ... DONE [13:13:45.766] future_lapply() ... DONE List of 1 $ y:List of 1 ..$ a: chr "hello; 1; 2; ...; 100" - future_lapply(x, FUN = listenv::listenv, ...) ... [13:13:45.767] future_lapply() ... [13:13:45.770] Number of chunks: 2 [13:13:45.770] getGlobalsAndPackagesXApply() ... [13:13:45.770] - future.globals: TRUE [13:13:45.770] getGlobalsAndPackages() ... [13:13:45.770] Searching for globals... [13:13:45.772] - globals found: [4] 'FUN', '{', 'get', 'parent.env' [13:13:45.772] Searching for globals ... DONE [13:13:45.772] Resolving globals: FALSE [13:13:45.773] The total size of the 1 globals is 4.85 KiB (4968 bytes) [13:13:45.773] 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') [13:13:45.774] - globals: [1] 'FUN' [13:13:45.774] - packages: [1] 'listenv' [13:13:45.774] getGlobalsAndPackages() ... DONE [13:13:45.774] - globals found/used: [n=1] 'FUN' [13:13:45.774] - needed namespaces: [n=1] 'listenv' [13:13:45.775] Finding globals ... DONE [13:13:45.775] - use_args: TRUE [13:13:45.775] - Getting '...' globals ... [13:13:45.775] resolve() on list ... [13:13:45.775] recursive: 0 [13:13:45.776] length: 1 [13:13:45.776] elements: '...' [13:13:45.776] length: 0 (resolved future 1) [13:13:45.776] resolve() on list ... DONE [13:13:45.776] - '...' content: [n=0] [13:13:45.776] List of 1 [13:13:45.776] $ ...: list() [13:13:45.776] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:45.776] - attr(*, "where")=List of 1 [13:13:45.776] ..$ ...: [13:13:45.776] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:45.776] - attr(*, "resolved")= logi TRUE [13:13:45.776] - attr(*, "total_size")= num NA [13:13:45.779] - Getting '...' globals ... DONE [13:13:45.780] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:45.780] List of 2 [13:13:45.780] $ ...future.FUN:function (x, ...) [13:13:45.780] $ ... : list() [13:13:45.780] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:45.780] - attr(*, "where")=List of 2 [13:13:45.780] ..$ ...future.FUN: [13:13:45.780] ..$ ... : [13:13:45.780] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:45.780] - attr(*, "resolved")= logi FALSE [13:13:45.780] - attr(*, "total_size")= num 4968 [13:13:45.785] Packages to be attached in all futures: [n=1] 'listenv' [13:13:45.785] getGlobalsAndPackagesXApply() ... DONE [13:13:45.786] Number of futures (= number of chunks): 2 [13:13:45.786] Launching 2 futures (chunks) ... [13:13:45.786] Chunk #1 of 2 ... [13:13:45.786] - Finding globals in 'X' for chunk #1 ... [13:13:45.786] getGlobalsAndPackages() ... [13:13:45.787] Searching for globals... [13:13:45.787] [13:13:45.787] Searching for globals ... DONE [13:13:45.787] - globals: [0] [13:13:45.788] getGlobalsAndPackages() ... DONE [13:13:45.788] + additional globals found: [n=0] [13:13:45.788] + additional namespaces needed: [n=0] [13:13:45.788] - Finding globals in 'X' for chunk #1 ... DONE [13:13:45.788] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:13:45.788] - seeds: [13:13:45.789] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:45.789] getGlobalsAndPackages() ... [13:13:45.789] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:45.789] Resolving globals: FALSE [13:13:45.789] Tweak future expression to call with '...' arguments ... [13:13:45.789] { [13:13:45.789] do.call(function(...) { [13:13:45.789] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:45.789] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:45.789] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:45.789] on.exit(options(oopts), add = TRUE) [13:13:45.789] } [13:13:45.789] { [13:13:45.789] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:45.789] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:45.789] ...future.FUN(...future.X_jj, ...) [13:13:45.789] }) [13:13:45.789] } [13:13:45.789] }, args = future.call.arguments) [13:13:45.789] } [13:13:45.790] Tweak future expression to call with '...' arguments ... DONE [13:13:45.790] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:45.791] - packages: [1] 'listenv' [13:13:45.791] getGlobalsAndPackages() ... DONE [13:13:45.791] run() for 'Future' ... [13:13:45.791] - state: 'created' [13:13:45.791] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:45.805] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:45.805] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:13:45.806] - Field: 'node' [13:13:45.806] - Field: 'label' [13:13:45.806] - Field: 'local' [13:13:45.806] - Field: 'owner' [13:13:45.806] - Field: 'envir' [13:13:45.806] - Field: 'workers' [13:13:45.807] - Field: 'packages' [13:13:45.807] - Field: 'gc' [13:13:45.807] - Field: 'conditions' [13:13:45.807] - Field: 'persistent' [13:13:45.807] - Field: 'expr' [13:13:45.808] - Field: 'uuid' [13:13:45.808] - Field: 'seed' [13:13:45.808] - Field: 'version' [13:13:45.808] - Field: 'result' [13:13:45.808] - Field: 'asynchronous' [13:13:45.808] - Field: 'calls' [13:13:45.809] - Field: 'globals' [13:13:45.809] - Field: 'stdout' [13:13:45.809] - Field: 'earlySignal' [13:13:45.809] - Field: 'lazy' [13:13:45.809] - Field: 'state' [13:13:45.809] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:13:45.810] - Launch lazy future ... [13:13:45.810] Packages needed by the future expression (n = 1): 'listenv' [13:13:45.810] Packages needed by future strategies (n = 0): [13:13:45.811] { [13:13:45.811] { [13:13:45.811] { [13:13:45.811] ...future.startTime <- base::Sys.time() [13:13:45.811] { [13:13:45.811] { [13:13:45.811] { [13:13:45.811] { [13:13:45.811] { [13:13:45.811] base::local({ [13:13:45.811] has_future <- base::requireNamespace("future", [13:13:45.811] quietly = TRUE) [13:13:45.811] if (has_future) { [13:13:45.811] ns <- base::getNamespace("future") [13:13:45.811] version <- ns[[".package"]][["version"]] [13:13:45.811] if (is.null(version)) [13:13:45.811] version <- utils::packageVersion("future") [13:13:45.811] } [13:13:45.811] else { [13:13:45.811] version <- NULL [13:13:45.811] } [13:13:45.811] if (!has_future || version < "1.8.0") { [13:13:45.811] info <- base::c(r_version = base::gsub("R version ", [13:13:45.811] "", base::R.version$version.string), [13:13:45.811] platform = base::sprintf("%s (%s-bit)", [13:13:45.811] base::R.version$platform, 8 * [13:13:45.811] base::.Machine$sizeof.pointer), [13:13:45.811] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:45.811] "release", "version")], collapse = " "), [13:13:45.811] hostname = base::Sys.info()[["nodename"]]) [13:13:45.811] info <- base::sprintf("%s: %s", base::names(info), [13:13:45.811] info) [13:13:45.811] info <- base::paste(info, collapse = "; ") [13:13:45.811] if (!has_future) { [13:13:45.811] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:45.811] info) [13:13:45.811] } [13:13:45.811] else { [13:13:45.811] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:45.811] info, version) [13:13:45.811] } [13:13:45.811] base::stop(msg) [13:13:45.811] } [13:13:45.811] }) [13:13:45.811] } [13:13:45.811] ...future.mc.cores.old <- base::getOption("mc.cores") [13:13:45.811] base::options(mc.cores = 1L) [13:13:45.811] } [13:13:45.811] base::local({ [13:13:45.811] for (pkg in "listenv") { [13:13:45.811] base::loadNamespace(pkg) [13:13:45.811] base::library(pkg, character.only = TRUE) [13:13:45.811] } [13:13:45.811] }) [13:13:45.811] } [13:13:45.811] options(future.plan = NULL) [13:13:45.811] Sys.unsetenv("R_FUTURE_PLAN") [13:13:45.811] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:45.811] } [13:13:45.811] ...future.workdir <- getwd() [13:13:45.811] } [13:13:45.811] ...future.oldOptions <- base::as.list(base::.Options) [13:13:45.811] ...future.oldEnvVars <- base::Sys.getenv() [13:13:45.811] } [13:13:45.811] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:45.811] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:13:45.811] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:45.811] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:45.811] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:45.811] future.stdout.windows.reencode = NULL, width = 80L) [13:13:45.811] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:45.811] base::names(...future.oldOptions)) [13:13:45.811] } [13:13:45.811] if (FALSE) { [13:13:45.811] } [13:13:45.811] else { [13:13:45.811] if (TRUE) { [13:13:45.811] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:45.811] open = "w") [13:13:45.811] } [13:13:45.811] else { [13:13:45.811] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:45.811] windows = "NUL", "/dev/null"), open = "w") [13:13:45.811] } [13:13:45.811] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:45.811] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:45.811] base::sink(type = "output", split = FALSE) [13:13:45.811] base::close(...future.stdout) [13:13:45.811] }, add = TRUE) [13:13:45.811] } [13:13:45.811] ...future.frame <- base::sys.nframe() [13:13:45.811] ...future.conditions <- base::list() [13:13:45.811] ...future.rng <- base::globalenv()$.Random.seed [13:13:45.811] if (FALSE) { [13:13:45.811] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:45.811] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:45.811] } [13:13:45.811] ...future.result <- base::tryCatch({ [13:13:45.811] base::withCallingHandlers({ [13:13:45.811] ...future.value <- base::withVisible(base::local({ [13:13:45.811] ...future.makeSendCondition <- local({ [13:13:45.811] sendCondition <- NULL [13:13:45.811] function(frame = 1L) { [13:13:45.811] if (is.function(sendCondition)) [13:13:45.811] return(sendCondition) [13:13:45.811] ns <- getNamespace("parallel") [13:13:45.811] if (exists("sendData", mode = "function", [13:13:45.811] envir = ns)) { [13:13:45.811] parallel_sendData <- get("sendData", mode = "function", [13:13:45.811] envir = ns) [13:13:45.811] envir <- sys.frame(frame) [13:13:45.811] master <- NULL [13:13:45.811] while (!identical(envir, .GlobalEnv) && [13:13:45.811] !identical(envir, emptyenv())) { [13:13:45.811] if (exists("master", mode = "list", envir = envir, [13:13:45.811] inherits = FALSE)) { [13:13:45.811] master <- get("master", mode = "list", [13:13:45.811] envir = envir, inherits = FALSE) [13:13:45.811] if (inherits(master, c("SOCKnode", [13:13:45.811] "SOCK0node"))) { [13:13:45.811] sendCondition <<- function(cond) { [13:13:45.811] data <- list(type = "VALUE", value = cond, [13:13:45.811] success = TRUE) [13:13:45.811] parallel_sendData(master, data) [13:13:45.811] } [13:13:45.811] return(sendCondition) [13:13:45.811] } [13:13:45.811] } [13:13:45.811] frame <- frame + 1L [13:13:45.811] envir <- sys.frame(frame) [13:13:45.811] } [13:13:45.811] } [13:13:45.811] sendCondition <<- function(cond) NULL [13:13:45.811] } [13:13:45.811] }) [13:13:45.811] withCallingHandlers({ [13:13:45.811] { [13:13:45.811] do.call(function(...) { [13:13:45.811] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:45.811] if (!identical(...future.globals.maxSize.org, [13:13:45.811] ...future.globals.maxSize)) { [13:13:45.811] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:45.811] on.exit(options(oopts), add = TRUE) [13:13:45.811] } [13:13:45.811] { [13:13:45.811] lapply(seq_along(...future.elements_ii), [13:13:45.811] FUN = function(jj) { [13:13:45.811] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:45.811] ...future.FUN(...future.X_jj, ...) [13:13:45.811] }) [13:13:45.811] } [13:13:45.811] }, args = future.call.arguments) [13:13:45.811] } [13:13:45.811] }, immediateCondition = function(cond) { [13:13:45.811] sendCondition <- ...future.makeSendCondition() [13:13:45.811] sendCondition(cond) [13:13:45.811] muffleCondition <- function (cond, pattern = "^muffle") [13:13:45.811] { [13:13:45.811] inherits <- base::inherits [13:13:45.811] invokeRestart <- base::invokeRestart [13:13:45.811] is.null <- base::is.null [13:13:45.811] muffled <- FALSE [13:13:45.811] if (inherits(cond, "message")) { [13:13:45.811] muffled <- grepl(pattern, "muffleMessage") [13:13:45.811] if (muffled) [13:13:45.811] invokeRestart("muffleMessage") [13:13:45.811] } [13:13:45.811] else if (inherits(cond, "warning")) { [13:13:45.811] muffled <- grepl(pattern, "muffleWarning") [13:13:45.811] if (muffled) [13:13:45.811] invokeRestart("muffleWarning") [13:13:45.811] } [13:13:45.811] else if (inherits(cond, "condition")) { [13:13:45.811] if (!is.null(pattern)) { [13:13:45.811] computeRestarts <- base::computeRestarts [13:13:45.811] grepl <- base::grepl [13:13:45.811] restarts <- computeRestarts(cond) [13:13:45.811] for (restart in restarts) { [13:13:45.811] name <- restart$name [13:13:45.811] if (is.null(name)) [13:13:45.811] next [13:13:45.811] if (!grepl(pattern, name)) [13:13:45.811] next [13:13:45.811] invokeRestart(restart) [13:13:45.811] muffled <- TRUE [13:13:45.811] break [13:13:45.811] } [13:13:45.811] } [13:13:45.811] } [13:13:45.811] invisible(muffled) [13:13:45.811] } [13:13:45.811] muffleCondition(cond) [13:13:45.811] }) [13:13:45.811] })) [13:13:45.811] future::FutureResult(value = ...future.value$value, [13:13:45.811] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:45.811] ...future.rng), globalenv = if (FALSE) [13:13:45.811] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:45.811] ...future.globalenv.names)) [13:13:45.811] else NULL, started = ...future.startTime, version = "1.8") [13:13:45.811] }, condition = base::local({ [13:13:45.811] c <- base::c [13:13:45.811] inherits <- base::inherits [13:13:45.811] invokeRestart <- base::invokeRestart [13:13:45.811] length <- base::length [13:13:45.811] list <- base::list [13:13:45.811] seq.int <- base::seq.int [13:13:45.811] signalCondition <- base::signalCondition [13:13:45.811] sys.calls <- base::sys.calls [13:13:45.811] `[[` <- base::`[[` [13:13:45.811] `+` <- base::`+` [13:13:45.811] `<<-` <- base::`<<-` [13:13:45.811] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:45.811] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:45.811] 3L)] [13:13:45.811] } [13:13:45.811] function(cond) { [13:13:45.811] is_error <- inherits(cond, "error") [13:13:45.811] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:45.811] NULL) [13:13:45.811] if (is_error) { [13:13:45.811] sessionInformation <- function() { [13:13:45.811] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:45.811] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:45.811] search = base::search(), system = base::Sys.info()) [13:13:45.811] } [13:13:45.811] ...future.conditions[[length(...future.conditions) + [13:13:45.811] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:45.811] cond$call), session = sessionInformation(), [13:13:45.811] timestamp = base::Sys.time(), signaled = 0L) [13:13:45.811] signalCondition(cond) [13:13:45.811] } [13:13:45.811] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:45.811] "immediateCondition"))) { [13:13:45.811] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:45.811] ...future.conditions[[length(...future.conditions) + [13:13:45.811] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:45.811] if (TRUE && !signal) { [13:13:45.811] muffleCondition <- function (cond, pattern = "^muffle") [13:13:45.811] { [13:13:45.811] inherits <- base::inherits [13:13:45.811] invokeRestart <- base::invokeRestart [13:13:45.811] is.null <- base::is.null [13:13:45.811] muffled <- FALSE [13:13:45.811] if (inherits(cond, "message")) { [13:13:45.811] muffled <- grepl(pattern, "muffleMessage") [13:13:45.811] if (muffled) [13:13:45.811] invokeRestart("muffleMessage") [13:13:45.811] } [13:13:45.811] else if (inherits(cond, "warning")) { [13:13:45.811] muffled <- grepl(pattern, "muffleWarning") [13:13:45.811] if (muffled) [13:13:45.811] invokeRestart("muffleWarning") [13:13:45.811] } [13:13:45.811] else if (inherits(cond, "condition")) { [13:13:45.811] if (!is.null(pattern)) { [13:13:45.811] computeRestarts <- base::computeRestarts [13:13:45.811] grepl <- base::grepl [13:13:45.811] restarts <- computeRestarts(cond) [13:13:45.811] for (restart in restarts) { [13:13:45.811] name <- restart$name [13:13:45.811] if (is.null(name)) [13:13:45.811] next [13:13:45.811] if (!grepl(pattern, name)) [13:13:45.811] next [13:13:45.811] invokeRestart(restart) [13:13:45.811] muffled <- TRUE [13:13:45.811] break [13:13:45.811] } [13:13:45.811] } [13:13:45.811] } [13:13:45.811] invisible(muffled) [13:13:45.811] } [13:13:45.811] muffleCondition(cond, pattern = "^muffle") [13:13:45.811] } [13:13:45.811] } [13:13:45.811] else { [13:13:45.811] if (TRUE) { [13:13:45.811] muffleCondition <- function (cond, pattern = "^muffle") [13:13:45.811] { [13:13:45.811] inherits <- base::inherits [13:13:45.811] invokeRestart <- base::invokeRestart [13:13:45.811] is.null <- base::is.null [13:13:45.811] muffled <- FALSE [13:13:45.811] if (inherits(cond, "message")) { [13:13:45.811] muffled <- grepl(pattern, "muffleMessage") [13:13:45.811] if (muffled) [13:13:45.811] invokeRestart("muffleMessage") [13:13:45.811] } [13:13:45.811] else if (inherits(cond, "warning")) { [13:13:45.811] muffled <- grepl(pattern, "muffleWarning") [13:13:45.811] if (muffled) [13:13:45.811] invokeRestart("muffleWarning") [13:13:45.811] } [13:13:45.811] else if (inherits(cond, "condition")) { [13:13:45.811] if (!is.null(pattern)) { [13:13:45.811] computeRestarts <- base::computeRestarts [13:13:45.811] grepl <- base::grepl [13:13:45.811] restarts <- computeRestarts(cond) [13:13:45.811] for (restart in restarts) { [13:13:45.811] name <- restart$name [13:13:45.811] if (is.null(name)) [13:13:45.811] next [13:13:45.811] if (!grepl(pattern, name)) [13:13:45.811] next [13:13:45.811] invokeRestart(restart) [13:13:45.811] muffled <- TRUE [13:13:45.811] break [13:13:45.811] } [13:13:45.811] } [13:13:45.811] } [13:13:45.811] invisible(muffled) [13:13:45.811] } [13:13:45.811] muffleCondition(cond, pattern = "^muffle") [13:13:45.811] } [13:13:45.811] } [13:13:45.811] } [13:13:45.811] })) [13:13:45.811] }, error = function(ex) { [13:13:45.811] base::structure(base::list(value = NULL, visible = NULL, [13:13:45.811] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:45.811] ...future.rng), started = ...future.startTime, [13:13:45.811] finished = Sys.time(), session_uuid = NA_character_, [13:13:45.811] version = "1.8"), class = "FutureResult") [13:13:45.811] }, finally = { [13:13:45.811] if (!identical(...future.workdir, getwd())) [13:13:45.811] setwd(...future.workdir) [13:13:45.811] { [13:13:45.811] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:45.811] ...future.oldOptions$nwarnings <- NULL [13:13:45.811] } [13:13:45.811] base::options(...future.oldOptions) [13:13:45.811] if (.Platform$OS.type == "windows") { [13:13:45.811] old_names <- names(...future.oldEnvVars) [13:13:45.811] envs <- base::Sys.getenv() [13:13:45.811] names <- names(envs) [13:13:45.811] common <- intersect(names, old_names) [13:13:45.811] added <- setdiff(names, old_names) [13:13:45.811] removed <- setdiff(old_names, names) [13:13:45.811] changed <- common[...future.oldEnvVars[common] != [13:13:45.811] envs[common]] [13:13:45.811] NAMES <- toupper(changed) [13:13:45.811] args <- list() [13:13:45.811] for (kk in seq_along(NAMES)) { [13:13:45.811] name <- changed[[kk]] [13:13:45.811] NAME <- NAMES[[kk]] [13:13:45.811] if (name != NAME && is.element(NAME, old_names)) [13:13:45.811] next [13:13:45.811] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:45.811] } [13:13:45.811] NAMES <- toupper(added) [13:13:45.811] for (kk in seq_along(NAMES)) { [13:13:45.811] name <- added[[kk]] [13:13:45.811] NAME <- NAMES[[kk]] [13:13:45.811] if (name != NAME && is.element(NAME, old_names)) [13:13:45.811] next [13:13:45.811] args[[name]] <- "" [13:13:45.811] } [13:13:45.811] NAMES <- toupper(removed) [13:13:45.811] for (kk in seq_along(NAMES)) { [13:13:45.811] name <- removed[[kk]] [13:13:45.811] NAME <- NAMES[[kk]] [13:13:45.811] if (name != NAME && is.element(NAME, old_names)) [13:13:45.811] next [13:13:45.811] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:45.811] } [13:13:45.811] if (length(args) > 0) [13:13:45.811] base::do.call(base::Sys.setenv, args = args) [13:13:45.811] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:45.811] } [13:13:45.811] else { [13:13:45.811] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:45.811] } [13:13:45.811] { [13:13:45.811] if (base::length(...future.futureOptionsAdded) > [13:13:45.811] 0L) { [13:13:45.811] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:45.811] base::names(opts) <- ...future.futureOptionsAdded [13:13:45.811] base::options(opts) [13:13:45.811] } [13:13:45.811] { [13:13:45.811] { [13:13:45.811] base::options(mc.cores = ...future.mc.cores.old) [13:13:45.811] NULL [13:13:45.811] } [13:13:45.811] options(future.plan = NULL) [13:13:45.811] if (is.na(NA_character_)) [13:13:45.811] Sys.unsetenv("R_FUTURE_PLAN") [13:13:45.811] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:45.811] future::plan(list(function (..., workers = availableCores(), [13:13:45.811] lazy = FALSE, rscript_libs = .libPaths(), [13:13:45.811] envir = parent.frame()) [13:13:45.811] { [13:13:45.811] if (is.function(workers)) [13:13:45.811] workers <- workers() [13:13:45.811] workers <- structure(as.integer(workers), [13:13:45.811] class = class(workers)) [13:13:45.811] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:45.811] workers >= 1) [13:13:45.811] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:45.811] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:45.811] } [13:13:45.811] future <- MultisessionFuture(..., workers = workers, [13:13:45.811] lazy = lazy, rscript_libs = rscript_libs, [13:13:45.811] envir = envir) [13:13:45.811] if (!future$lazy) [13:13:45.811] future <- run(future) [13:13:45.811] invisible(future) [13:13:45.811] }), .cleanup = FALSE, .init = FALSE) [13:13:45.811] } [13:13:45.811] } [13:13:45.811] } [13:13:45.811] }) [13:13:45.811] if (TRUE) { [13:13:45.811] base::sink(type = "output", split = FALSE) [13:13:45.811] if (TRUE) { [13:13:45.811] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:45.811] } [13:13:45.811] else { [13:13:45.811] ...future.result["stdout"] <- base::list(NULL) [13:13:45.811] } [13:13:45.811] base::close(...future.stdout) [13:13:45.811] ...future.stdout <- NULL [13:13:45.811] } [13:13:45.811] ...future.result$conditions <- ...future.conditions [13:13:45.811] ...future.result$finished <- base::Sys.time() [13:13:45.811] ...future.result [13:13:45.811] } [13:13:45.816] Exporting 5 global objects (4.85 KiB) to cluster node #1 ... [13:13:45.816] Exporting '...future.FUN' (4.85 KiB) to cluster node #1 ... [13:13:45.817] Exporting '...future.FUN' (4.85 KiB) to cluster node #1 ... DONE [13:13:45.817] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... [13:13:45.818] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... DONE [13:13:45.818] Exporting '...future.elements_ii' (112 bytes) to cluster node #1 ... [13:13:45.818] Exporting '...future.elements_ii' (112 bytes) to cluster node #1 ... DONE [13:13:45.819] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:13:45.819] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:13:45.819] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:13:45.820] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:13:45.820] Exporting 5 global objects (4.85 KiB) to cluster node #1 ... DONE [13:13:45.821] MultisessionFuture started [13:13:45.821] - Launch lazy future ... done [13:13:45.821] run() for 'MultisessionFuture' ... done [13:13:45.821] Created future: [13:13:45.841] receiveMessageFromWorker() for ClusterFuture ... [13:13:45.841] - Validating connection of MultisessionFuture [13:13:45.842] - received message: FutureResult [13:13:45.842] - Received FutureResult [13:13:45.842] - Erased future from FutureRegistry [13:13:45.842] result() for ClusterFuture ... [13:13:45.842] - result already collected: FutureResult [13:13:45.843] result() for ClusterFuture ... done [13:13:45.843] receiveMessageFromWorker() for ClusterFuture ... done [13:13:45.822] MultisessionFuture: [13:13:45.822] Label: 'future_lapply-1' [13:13:45.822] Expression: [13:13:45.822] { [13:13:45.822] do.call(function(...) { [13:13:45.822] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:45.822] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:45.822] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:45.822] on.exit(options(oopts), add = TRUE) [13:13:45.822] } [13:13:45.822] { [13:13:45.822] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:45.822] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:45.822] ...future.FUN(...future.X_jj, ...) [13:13:45.822] }) [13:13:45.822] } [13:13:45.822] }, args = future.call.arguments) [13:13:45.822] } [13:13:45.822] Lazy evaluation: FALSE [13:13:45.822] Asynchronous evaluation: TRUE [13:13:45.822] Local evaluation: TRUE [13:13:45.822] Environment: R_GlobalEnv [13:13:45.822] Capture standard output: TRUE [13:13:45.822] Capture condition classes: 'condition' (excluding 'nothing') [13:13:45.822] 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) [13:13:45.822] Packages: 1 packages ('listenv') [13:13:45.822] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:45.822] Resolved: TRUE [13:13:45.822] Value: [13:13:45.822] Conditions captured: [13:13:45.822] Early signaling: FALSE [13:13:45.822] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:45.822] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:45.843] Chunk #1 of 2 ... DONE [13:13:45.843] Chunk #2 of 2 ... [13:13:45.844] - Finding globals in 'X' for chunk #2 ... [13:13:45.844] getGlobalsAndPackages() ... [13:13:45.844] Searching for globals... [13:13:45.844] [13:13:45.845] Searching for globals ... DONE [13:13:45.845] - globals: [0] [13:13:45.845] getGlobalsAndPackages() ... DONE [13:13:45.845] + additional globals found: [n=0] [13:13:45.845] + additional namespaces needed: [n=0] [13:13:45.845] - Finding globals in 'X' for chunk #2 ... DONE [13:13:45.846] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:13:45.846] - seeds: [13:13:45.846] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:45.846] getGlobalsAndPackages() ... [13:13:45.846] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:45.846] Resolving globals: FALSE [13:13:45.847] Tweak future expression to call with '...' arguments ... [13:13:45.847] { [13:13:45.847] do.call(function(...) { [13:13:45.847] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:45.847] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:45.847] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:45.847] on.exit(options(oopts), add = TRUE) [13:13:45.847] } [13:13:45.847] { [13:13:45.847] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:45.847] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:45.847] ...future.FUN(...future.X_jj, ...) [13:13:45.847] }) [13:13:45.847] } [13:13:45.847] }, args = future.call.arguments) [13:13:45.847] } [13:13:45.847] Tweak future expression to call with '...' arguments ... DONE [13:13:45.848] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:45.848] - packages: [1] 'listenv' [13:13:45.848] getGlobalsAndPackages() ... DONE [13:13:45.848] run() for 'Future' ... [13:13:45.849] - state: 'created' [13:13:45.849] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:45.862] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:45.863] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:13:45.863] - Field: 'node' [13:13:45.863] - Field: 'label' [13:13:45.863] - Field: 'local' [13:13:45.863] - Field: 'owner' [13:13:45.864] - Field: 'envir' [13:13:45.864] - Field: 'workers' [13:13:45.864] - Field: 'packages' [13:13:45.864] - Field: 'gc' [13:13:45.864] - Field: 'conditions' [13:13:45.864] - Field: 'persistent' [13:13:45.865] - Field: 'expr' [13:13:45.865] - Field: 'uuid' [13:13:45.865] - Field: 'seed' [13:13:45.865] - Field: 'version' [13:13:45.865] - Field: 'result' [13:13:45.865] - Field: 'asynchronous' [13:13:45.866] - Field: 'calls' [13:13:45.866] - Field: 'globals' [13:13:45.866] - Field: 'stdout' [13:13:45.866] - Field: 'earlySignal' [13:13:45.866] - Field: 'lazy' [13:13:45.866] - Field: 'state' [13:13:45.867] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:13:45.867] - Launch lazy future ... [13:13:45.867] Packages needed by the future expression (n = 1): 'listenv' [13:13:45.867] Packages needed by future strategies (n = 0): [13:13:45.868] { [13:13:45.868] { [13:13:45.868] { [13:13:45.868] ...future.startTime <- base::Sys.time() [13:13:45.868] { [13:13:45.868] { [13:13:45.868] { [13:13:45.868] { [13:13:45.868] { [13:13:45.868] base::local({ [13:13:45.868] has_future <- base::requireNamespace("future", [13:13:45.868] quietly = TRUE) [13:13:45.868] if (has_future) { [13:13:45.868] ns <- base::getNamespace("future") [13:13:45.868] version <- ns[[".package"]][["version"]] [13:13:45.868] if (is.null(version)) [13:13:45.868] version <- utils::packageVersion("future") [13:13:45.868] } [13:13:45.868] else { [13:13:45.868] version <- NULL [13:13:45.868] } [13:13:45.868] if (!has_future || version < "1.8.0") { [13:13:45.868] info <- base::c(r_version = base::gsub("R version ", [13:13:45.868] "", base::R.version$version.string), [13:13:45.868] platform = base::sprintf("%s (%s-bit)", [13:13:45.868] base::R.version$platform, 8 * [13:13:45.868] base::.Machine$sizeof.pointer), [13:13:45.868] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:45.868] "release", "version")], collapse = " "), [13:13:45.868] hostname = base::Sys.info()[["nodename"]]) [13:13:45.868] info <- base::sprintf("%s: %s", base::names(info), [13:13:45.868] info) [13:13:45.868] info <- base::paste(info, collapse = "; ") [13:13:45.868] if (!has_future) { [13:13:45.868] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:45.868] info) [13:13:45.868] } [13:13:45.868] else { [13:13:45.868] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:45.868] info, version) [13:13:45.868] } [13:13:45.868] base::stop(msg) [13:13:45.868] } [13:13:45.868] }) [13:13:45.868] } [13:13:45.868] ...future.mc.cores.old <- base::getOption("mc.cores") [13:13:45.868] base::options(mc.cores = 1L) [13:13:45.868] } [13:13:45.868] base::local({ [13:13:45.868] for (pkg in "listenv") { [13:13:45.868] base::loadNamespace(pkg) [13:13:45.868] base::library(pkg, character.only = TRUE) [13:13:45.868] } [13:13:45.868] }) [13:13:45.868] } [13:13:45.868] options(future.plan = NULL) [13:13:45.868] Sys.unsetenv("R_FUTURE_PLAN") [13:13:45.868] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:45.868] } [13:13:45.868] ...future.workdir <- getwd() [13:13:45.868] } [13:13:45.868] ...future.oldOptions <- base::as.list(base::.Options) [13:13:45.868] ...future.oldEnvVars <- base::Sys.getenv() [13:13:45.868] } [13:13:45.868] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:45.868] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:13:45.868] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:45.868] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:45.868] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:45.868] future.stdout.windows.reencode = NULL, width = 80L) [13:13:45.868] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:45.868] base::names(...future.oldOptions)) [13:13:45.868] } [13:13:45.868] if (FALSE) { [13:13:45.868] } [13:13:45.868] else { [13:13:45.868] if (TRUE) { [13:13:45.868] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:45.868] open = "w") [13:13:45.868] } [13:13:45.868] else { [13:13:45.868] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:45.868] windows = "NUL", "/dev/null"), open = "w") [13:13:45.868] } [13:13:45.868] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:45.868] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:45.868] base::sink(type = "output", split = FALSE) [13:13:45.868] base::close(...future.stdout) [13:13:45.868] }, add = TRUE) [13:13:45.868] } [13:13:45.868] ...future.frame <- base::sys.nframe() [13:13:45.868] ...future.conditions <- base::list() [13:13:45.868] ...future.rng <- base::globalenv()$.Random.seed [13:13:45.868] if (FALSE) { [13:13:45.868] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:45.868] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:45.868] } [13:13:45.868] ...future.result <- base::tryCatch({ [13:13:45.868] base::withCallingHandlers({ [13:13:45.868] ...future.value <- base::withVisible(base::local({ [13:13:45.868] ...future.makeSendCondition <- local({ [13:13:45.868] sendCondition <- NULL [13:13:45.868] function(frame = 1L) { [13:13:45.868] if (is.function(sendCondition)) [13:13:45.868] return(sendCondition) [13:13:45.868] ns <- getNamespace("parallel") [13:13:45.868] if (exists("sendData", mode = "function", [13:13:45.868] envir = ns)) { [13:13:45.868] parallel_sendData <- get("sendData", mode = "function", [13:13:45.868] envir = ns) [13:13:45.868] envir <- sys.frame(frame) [13:13:45.868] master <- NULL [13:13:45.868] while (!identical(envir, .GlobalEnv) && [13:13:45.868] !identical(envir, emptyenv())) { [13:13:45.868] if (exists("master", mode = "list", envir = envir, [13:13:45.868] inherits = FALSE)) { [13:13:45.868] master <- get("master", mode = "list", [13:13:45.868] envir = envir, inherits = FALSE) [13:13:45.868] if (inherits(master, c("SOCKnode", [13:13:45.868] "SOCK0node"))) { [13:13:45.868] sendCondition <<- function(cond) { [13:13:45.868] data <- list(type = "VALUE", value = cond, [13:13:45.868] success = TRUE) [13:13:45.868] parallel_sendData(master, data) [13:13:45.868] } [13:13:45.868] return(sendCondition) [13:13:45.868] } [13:13:45.868] } [13:13:45.868] frame <- frame + 1L [13:13:45.868] envir <- sys.frame(frame) [13:13:45.868] } [13:13:45.868] } [13:13:45.868] sendCondition <<- function(cond) NULL [13:13:45.868] } [13:13:45.868] }) [13:13:45.868] withCallingHandlers({ [13:13:45.868] { [13:13:45.868] do.call(function(...) { [13:13:45.868] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:45.868] if (!identical(...future.globals.maxSize.org, [13:13:45.868] ...future.globals.maxSize)) { [13:13:45.868] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:45.868] on.exit(options(oopts), add = TRUE) [13:13:45.868] } [13:13:45.868] { [13:13:45.868] lapply(seq_along(...future.elements_ii), [13:13:45.868] FUN = function(jj) { [13:13:45.868] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:45.868] ...future.FUN(...future.X_jj, ...) [13:13:45.868] }) [13:13:45.868] } [13:13:45.868] }, args = future.call.arguments) [13:13:45.868] } [13:13:45.868] }, immediateCondition = function(cond) { [13:13:45.868] sendCondition <- ...future.makeSendCondition() [13:13:45.868] sendCondition(cond) [13:13:45.868] muffleCondition <- function (cond, pattern = "^muffle") [13:13:45.868] { [13:13:45.868] inherits <- base::inherits [13:13:45.868] invokeRestart <- base::invokeRestart [13:13:45.868] is.null <- base::is.null [13:13:45.868] muffled <- FALSE [13:13:45.868] if (inherits(cond, "message")) { [13:13:45.868] muffled <- grepl(pattern, "muffleMessage") [13:13:45.868] if (muffled) [13:13:45.868] invokeRestart("muffleMessage") [13:13:45.868] } [13:13:45.868] else if (inherits(cond, "warning")) { [13:13:45.868] muffled <- grepl(pattern, "muffleWarning") [13:13:45.868] if (muffled) [13:13:45.868] invokeRestart("muffleWarning") [13:13:45.868] } [13:13:45.868] else if (inherits(cond, "condition")) { [13:13:45.868] if (!is.null(pattern)) { [13:13:45.868] computeRestarts <- base::computeRestarts [13:13:45.868] grepl <- base::grepl [13:13:45.868] restarts <- computeRestarts(cond) [13:13:45.868] for (restart in restarts) { [13:13:45.868] name <- restart$name [13:13:45.868] if (is.null(name)) [13:13:45.868] next [13:13:45.868] if (!grepl(pattern, name)) [13:13:45.868] next [13:13:45.868] invokeRestart(restart) [13:13:45.868] muffled <- TRUE [13:13:45.868] break [13:13:45.868] } [13:13:45.868] } [13:13:45.868] } [13:13:45.868] invisible(muffled) [13:13:45.868] } [13:13:45.868] muffleCondition(cond) [13:13:45.868] }) [13:13:45.868] })) [13:13:45.868] future::FutureResult(value = ...future.value$value, [13:13:45.868] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:45.868] ...future.rng), globalenv = if (FALSE) [13:13:45.868] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:45.868] ...future.globalenv.names)) [13:13:45.868] else NULL, started = ...future.startTime, version = "1.8") [13:13:45.868] }, condition = base::local({ [13:13:45.868] c <- base::c [13:13:45.868] inherits <- base::inherits [13:13:45.868] invokeRestart <- base::invokeRestart [13:13:45.868] length <- base::length [13:13:45.868] list <- base::list [13:13:45.868] seq.int <- base::seq.int [13:13:45.868] signalCondition <- base::signalCondition [13:13:45.868] sys.calls <- base::sys.calls [13:13:45.868] `[[` <- base::`[[` [13:13:45.868] `+` <- base::`+` [13:13:45.868] `<<-` <- base::`<<-` [13:13:45.868] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:45.868] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:45.868] 3L)] [13:13:45.868] } [13:13:45.868] function(cond) { [13:13:45.868] is_error <- inherits(cond, "error") [13:13:45.868] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:45.868] NULL) [13:13:45.868] if (is_error) { [13:13:45.868] sessionInformation <- function() { [13:13:45.868] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:45.868] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:45.868] search = base::search(), system = base::Sys.info()) [13:13:45.868] } [13:13:45.868] ...future.conditions[[length(...future.conditions) + [13:13:45.868] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:45.868] cond$call), session = sessionInformation(), [13:13:45.868] timestamp = base::Sys.time(), signaled = 0L) [13:13:45.868] signalCondition(cond) [13:13:45.868] } [13:13:45.868] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:45.868] "immediateCondition"))) { [13:13:45.868] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:45.868] ...future.conditions[[length(...future.conditions) + [13:13:45.868] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:45.868] if (TRUE && !signal) { [13:13:45.868] muffleCondition <- function (cond, pattern = "^muffle") [13:13:45.868] { [13:13:45.868] inherits <- base::inherits [13:13:45.868] invokeRestart <- base::invokeRestart [13:13:45.868] is.null <- base::is.null [13:13:45.868] muffled <- FALSE [13:13:45.868] if (inherits(cond, "message")) { [13:13:45.868] muffled <- grepl(pattern, "muffleMessage") [13:13:45.868] if (muffled) [13:13:45.868] invokeRestart("muffleMessage") [13:13:45.868] } [13:13:45.868] else if (inherits(cond, "warning")) { [13:13:45.868] muffled <- grepl(pattern, "muffleWarning") [13:13:45.868] if (muffled) [13:13:45.868] invokeRestart("muffleWarning") [13:13:45.868] } [13:13:45.868] else if (inherits(cond, "condition")) { [13:13:45.868] if (!is.null(pattern)) { [13:13:45.868] computeRestarts <- base::computeRestarts [13:13:45.868] grepl <- base::grepl [13:13:45.868] restarts <- computeRestarts(cond) [13:13:45.868] for (restart in restarts) { [13:13:45.868] name <- restart$name [13:13:45.868] if (is.null(name)) [13:13:45.868] next [13:13:45.868] if (!grepl(pattern, name)) [13:13:45.868] next [13:13:45.868] invokeRestart(restart) [13:13:45.868] muffled <- TRUE [13:13:45.868] break [13:13:45.868] } [13:13:45.868] } [13:13:45.868] } [13:13:45.868] invisible(muffled) [13:13:45.868] } [13:13:45.868] muffleCondition(cond, pattern = "^muffle") [13:13:45.868] } [13:13:45.868] } [13:13:45.868] else { [13:13:45.868] if (TRUE) { [13:13:45.868] muffleCondition <- function (cond, pattern = "^muffle") [13:13:45.868] { [13:13:45.868] inherits <- base::inherits [13:13:45.868] invokeRestart <- base::invokeRestart [13:13:45.868] is.null <- base::is.null [13:13:45.868] muffled <- FALSE [13:13:45.868] if (inherits(cond, "message")) { [13:13:45.868] muffled <- grepl(pattern, "muffleMessage") [13:13:45.868] if (muffled) [13:13:45.868] invokeRestart("muffleMessage") [13:13:45.868] } [13:13:45.868] else if (inherits(cond, "warning")) { [13:13:45.868] muffled <- grepl(pattern, "muffleWarning") [13:13:45.868] if (muffled) [13:13:45.868] invokeRestart("muffleWarning") [13:13:45.868] } [13:13:45.868] else if (inherits(cond, "condition")) { [13:13:45.868] if (!is.null(pattern)) { [13:13:45.868] computeRestarts <- base::computeRestarts [13:13:45.868] grepl <- base::grepl [13:13:45.868] restarts <- computeRestarts(cond) [13:13:45.868] for (restart in restarts) { [13:13:45.868] name <- restart$name [13:13:45.868] if (is.null(name)) [13:13:45.868] next [13:13:45.868] if (!grepl(pattern, name)) [13:13:45.868] next [13:13:45.868] invokeRestart(restart) [13:13:45.868] muffled <- TRUE [13:13:45.868] break [13:13:45.868] } [13:13:45.868] } [13:13:45.868] } [13:13:45.868] invisible(muffled) [13:13:45.868] } [13:13:45.868] muffleCondition(cond, pattern = "^muffle") [13:13:45.868] } [13:13:45.868] } [13:13:45.868] } [13:13:45.868] })) [13:13:45.868] }, error = function(ex) { [13:13:45.868] base::structure(base::list(value = NULL, visible = NULL, [13:13:45.868] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:45.868] ...future.rng), started = ...future.startTime, [13:13:45.868] finished = Sys.time(), session_uuid = NA_character_, [13:13:45.868] version = "1.8"), class = "FutureResult") [13:13:45.868] }, finally = { [13:13:45.868] if (!identical(...future.workdir, getwd())) [13:13:45.868] setwd(...future.workdir) [13:13:45.868] { [13:13:45.868] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:45.868] ...future.oldOptions$nwarnings <- NULL [13:13:45.868] } [13:13:45.868] base::options(...future.oldOptions) [13:13:45.868] if (.Platform$OS.type == "windows") { [13:13:45.868] old_names <- names(...future.oldEnvVars) [13:13:45.868] envs <- base::Sys.getenv() [13:13:45.868] names <- names(envs) [13:13:45.868] common <- intersect(names, old_names) [13:13:45.868] added <- setdiff(names, old_names) [13:13:45.868] removed <- setdiff(old_names, names) [13:13:45.868] changed <- common[...future.oldEnvVars[common] != [13:13:45.868] envs[common]] [13:13:45.868] NAMES <- toupper(changed) [13:13:45.868] args <- list() [13:13:45.868] for (kk in seq_along(NAMES)) { [13:13:45.868] name <- changed[[kk]] [13:13:45.868] NAME <- NAMES[[kk]] [13:13:45.868] if (name != NAME && is.element(NAME, old_names)) [13:13:45.868] next [13:13:45.868] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:45.868] } [13:13:45.868] NAMES <- toupper(added) [13:13:45.868] for (kk in seq_along(NAMES)) { [13:13:45.868] name <- added[[kk]] [13:13:45.868] NAME <- NAMES[[kk]] [13:13:45.868] if (name != NAME && is.element(NAME, old_names)) [13:13:45.868] next [13:13:45.868] args[[name]] <- "" [13:13:45.868] } [13:13:45.868] NAMES <- toupper(removed) [13:13:45.868] for (kk in seq_along(NAMES)) { [13:13:45.868] name <- removed[[kk]] [13:13:45.868] NAME <- NAMES[[kk]] [13:13:45.868] if (name != NAME && is.element(NAME, old_names)) [13:13:45.868] next [13:13:45.868] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:45.868] } [13:13:45.868] if (length(args) > 0) [13:13:45.868] base::do.call(base::Sys.setenv, args = args) [13:13:45.868] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:45.868] } [13:13:45.868] else { [13:13:45.868] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:45.868] } [13:13:45.868] { [13:13:45.868] if (base::length(...future.futureOptionsAdded) > [13:13:45.868] 0L) { [13:13:45.868] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:45.868] base::names(opts) <- ...future.futureOptionsAdded [13:13:45.868] base::options(opts) [13:13:45.868] } [13:13:45.868] { [13:13:45.868] { [13:13:45.868] base::options(mc.cores = ...future.mc.cores.old) [13:13:45.868] NULL [13:13:45.868] } [13:13:45.868] options(future.plan = NULL) [13:13:45.868] if (is.na(NA_character_)) [13:13:45.868] Sys.unsetenv("R_FUTURE_PLAN") [13:13:45.868] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:45.868] future::plan(list(function (..., workers = availableCores(), [13:13:45.868] lazy = FALSE, rscript_libs = .libPaths(), [13:13:45.868] envir = parent.frame()) [13:13:45.868] { [13:13:45.868] if (is.function(workers)) [13:13:45.868] workers <- workers() [13:13:45.868] workers <- structure(as.integer(workers), [13:13:45.868] class = class(workers)) [13:13:45.868] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:45.868] workers >= 1) [13:13:45.868] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:45.868] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:45.868] } [13:13:45.868] future <- MultisessionFuture(..., workers = workers, [13:13:45.868] lazy = lazy, rscript_libs = rscript_libs, [13:13:45.868] envir = envir) [13:13:45.868] if (!future$lazy) [13:13:45.868] future <- run(future) [13:13:45.868] invisible(future) [13:13:45.868] }), .cleanup = FALSE, .init = FALSE) [13:13:45.868] } [13:13:45.868] } [13:13:45.868] } [13:13:45.868] }) [13:13:45.868] if (TRUE) { [13:13:45.868] base::sink(type = "output", split = FALSE) [13:13:45.868] if (TRUE) { [13:13:45.868] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:45.868] } [13:13:45.868] else { [13:13:45.868] ...future.result["stdout"] <- base::list(NULL) [13:13:45.868] } [13:13:45.868] base::close(...future.stdout) [13:13:45.868] ...future.stdout <- NULL [13:13:45.868] } [13:13:45.868] ...future.result$conditions <- ...future.conditions [13:13:45.868] ...future.result$finished <- base::Sys.time() [13:13:45.868] ...future.result [13:13:45.868] } [13:13:45.873] Exporting 5 global objects (4.85 KiB) to cluster node #1 ... [13:13:45.874] Exporting '...future.FUN' (4.85 KiB) to cluster node #1 ... [13:13:45.874] Exporting '...future.FUN' (4.85 KiB) to cluster node #1 ... DONE [13:13:45.874] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... [13:13:45.875] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... DONE [13:13:45.875] Exporting '...future.elements_ii' (12.94 KiB) to cluster node #1 ... [13:13:45.876] Exporting '...future.elements_ii' (12.94 KiB) to cluster node #1 ... DONE [13:13:45.876] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:13:45.876] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:13:45.876] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:13:45.877] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:13:45.877] Exporting 5 global objects (4.85 KiB) to cluster node #1 ... DONE [13:13:45.878] MultisessionFuture started [13:13:45.878] - Launch lazy future ... done [13:13:45.878] run() for 'MultisessionFuture' ... done [13:13:45.878] Created future: [13:13:45.894] receiveMessageFromWorker() for ClusterFuture ... [13:13:45.895] - Validating connection of MultisessionFuture [13:13:45.895] - received message: FutureResult [13:13:45.895] - Received FutureResult [13:13:45.895] - Erased future from FutureRegistry [13:13:45.895] result() for ClusterFuture ... [13:13:45.896] - result already collected: FutureResult [13:13:45.896] result() for ClusterFuture ... done [13:13:45.896] receiveMessageFromWorker() for ClusterFuture ... done [13:13:45.878] MultisessionFuture: [13:13:45.878] Label: 'future_lapply-2' [13:13:45.878] Expression: [13:13:45.878] { [13:13:45.878] do.call(function(...) { [13:13:45.878] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:45.878] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:45.878] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:45.878] on.exit(options(oopts), add = TRUE) [13:13:45.878] } [13:13:45.878] { [13:13:45.878] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:45.878] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:45.878] ...future.FUN(...future.X_jj, ...) [13:13:45.878] }) [13:13:45.878] } [13:13:45.878] }, args = future.call.arguments) [13:13:45.878] } [13:13:45.878] Lazy evaluation: FALSE [13:13:45.878] Asynchronous evaluation: TRUE [13:13:45.878] Local evaluation: TRUE [13:13:45.878] Environment: R_GlobalEnv [13:13:45.878] Capture standard output: TRUE [13:13:45.878] Capture condition classes: 'condition' (excluding 'nothing') [13:13:45.878] 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) [13:13:45.878] Packages: 1 packages ('listenv') [13:13:45.878] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:45.878] Resolved: TRUE [13:13:45.878] Value: [13:13:45.878] Conditions captured: [13:13:45.878] Early signaling: FALSE [13:13:45.878] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:45.878] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:45.896] Chunk #2 of 2 ... DONE [13:13:45.896] Launching 2 futures (chunks) ... DONE [13:13:45.897] Resolving 2 futures (chunks) ... [13:13:45.897] resolve() on list ... [13:13:45.897] recursive: 0 [13:13:45.897] length: 2 [13:13:45.897] [13:13:45.897] Future #1 [13:13:45.898] result() for ClusterFuture ... [13:13:45.898] - result already collected: FutureResult [13:13:45.898] result() for ClusterFuture ... done [13:13:45.898] result() for ClusterFuture ... [13:13:45.898] - result already collected: FutureResult [13:13:45.898] result() for ClusterFuture ... done [13:13:45.899] signalConditionsASAP(MultisessionFuture, pos=1) ... [13:13:45.899] - nx: 2 [13:13:45.899] - relay: TRUE [13:13:45.899] - stdout: TRUE [13:13:45.899] - signal: TRUE [13:13:45.899] - resignal: FALSE [13:13:45.899] - force: TRUE [13:13:45.900] - relayed: [n=2] FALSE, FALSE [13:13:45.900] - queued futures: [n=2] FALSE, FALSE [13:13:45.900] - until=1 [13:13:45.900] - relaying element #1 [13:13:45.900] result() for ClusterFuture ... [13:13:45.900] - result already collected: FutureResult [13:13:45.900] result() for ClusterFuture ... done [13:13:45.901] result() for ClusterFuture ... [13:13:45.901] - result already collected: FutureResult [13:13:45.901] result() for ClusterFuture ... done [13:13:45.901] result() for ClusterFuture ... [13:13:45.901] - result already collected: FutureResult [13:13:45.901] result() for ClusterFuture ... done [13:13:45.902] result() for ClusterFuture ... [13:13:45.902] - result already collected: FutureResult [13:13:45.902] result() for ClusterFuture ... done [13:13:45.902] - relayed: [n=2] TRUE, FALSE [13:13:45.902] - queued futures: [n=2] TRUE, FALSE [13:13:45.902] signalConditionsASAP(MultisessionFuture, pos=1) ... done [13:13:45.903] length: 1 (resolved future 1) [13:13:45.903] Future #2 [13:13:45.903] result() for ClusterFuture ... [13:13:45.903] - result already collected: FutureResult [13:13:45.903] result() for ClusterFuture ... done [13:13:45.903] result() for ClusterFuture ... [13:13:45.904] - result already collected: FutureResult [13:13:45.904] result() for ClusterFuture ... done [13:13:45.904] signalConditionsASAP(MultisessionFuture, pos=2) ... [13:13:45.904] - nx: 2 [13:13:45.904] - relay: TRUE [13:13:45.904] - stdout: TRUE [13:13:45.904] - signal: TRUE [13:13:45.905] - resignal: FALSE [13:13:45.905] - force: TRUE [13:13:45.905] - relayed: [n=2] TRUE, FALSE [13:13:45.905] - queued futures: [n=2] TRUE, FALSE [13:13:45.905] - until=2 [13:13:45.905] - relaying element #2 [13:13:45.905] result() for ClusterFuture ... [13:13:45.906] - result already collected: FutureResult [13:13:45.906] result() for ClusterFuture ... done [13:13:45.906] result() for ClusterFuture ... [13:13:45.906] - result already collected: FutureResult [13:13:45.906] result() for ClusterFuture ... done [13:13:45.906] result() for ClusterFuture ... [13:13:45.907] - result already collected: FutureResult [13:13:45.907] result() for ClusterFuture ... done [13:13:45.907] result() for ClusterFuture ... [13:13:45.907] - result already collected: FutureResult [13:13:45.907] result() for ClusterFuture ... done [13:13:45.907] - relayed: [n=2] TRUE, TRUE [13:13:45.908] - queued futures: [n=2] TRUE, TRUE [13:13:45.908] signalConditionsASAP(MultisessionFuture, pos=2) ... done [13:13:45.908] length: 0 (resolved future 2) [13:13:45.908] Relaying remaining futures [13:13:45.908] signalConditionsASAP(NULL, pos=0) ... [13:13:45.908] - nx: 2 [13:13:45.908] - relay: TRUE [13:13:45.909] - stdout: TRUE [13:13:45.909] - signal: TRUE [13:13:45.909] - resignal: FALSE [13:13:45.909] - force: TRUE [13:13:45.909] - relayed: [n=2] TRUE, TRUE [13:13:45.909] - queued futures: [n=2] TRUE, TRUE - flush all [13:13:45.910] - relayed: [n=2] TRUE, TRUE [13:13:45.910] - queued futures: [n=2] TRUE, TRUE [13:13:45.910] signalConditionsASAP(NULL, pos=0) ... done [13:13:45.910] resolve() on list ... DONE [13:13:45.910] result() for ClusterFuture ... [13:13:45.910] - result already collected: FutureResult [13:13:45.911] result() for ClusterFuture ... done [13:13:45.911] result() for ClusterFuture ... [13:13:45.911] - result already collected: FutureResult [13:13:45.911] result() for ClusterFuture ... done [13:13:45.911] result() for ClusterFuture ... [13:13:45.911] - result already collected: FutureResult [13:13:45.911] result() for ClusterFuture ... done [13:13:45.912] result() for ClusterFuture ... [13:13:45.912] - result already collected: FutureResult [13:13:45.912] result() for ClusterFuture ... done [13:13:45.912] - Number of value chunks collected: 2 [13:13:45.912] Resolving 2 futures (chunks) ... DONE [13:13:45.912] Reducing values from 2 chunks ... [13:13:45.913] - Number of values collected after concatenation: 2 [13:13:45.913] - Number of values expected: 2 [13:13:45.913] Reducing values from 2 chunks ... DONE [13:13:45.913] 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, ...) ... [13:13:45.915] future_lapply() ... [13:13:45.918] Number of chunks: 2 [13:13:45.918] getGlobalsAndPackagesXApply() ... [13:13:45.918] - future.globals: TRUE [13:13:45.919] getGlobalsAndPackages() ... [13:13:45.919] Searching for globals... [13:13:45.920] - globals found: [2] 'FUN', '.Internal' [13:13:45.920] Searching for globals ... DONE [13:13:45.920] Resolving globals: FALSE [13:13:45.921] The total size of the 1 globals is 2.13 KiB (2184 bytes) [13:13:45.921] 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') [13:13:45.922] - globals: [1] 'FUN' [13:13:45.922] [13:13:45.922] getGlobalsAndPackages() ... DONE [13:13:45.922] - globals found/used: [n=1] 'FUN' [13:13:45.922] - needed namespaces: [n=0] [13:13:45.922] Finding globals ... DONE [13:13:45.923] - use_args: TRUE [13:13:45.923] - Getting '...' globals ... [13:13:45.923] resolve() on list ... [13:13:45.923] recursive: 0 [13:13:45.923] length: 1 [13:13:45.924] elements: '...' [13:13:45.924] length: 0 (resolved future 1) [13:13:45.924] resolve() on list ... DONE [13:13:45.924] - '...' content: [n=1] 'length' [13:13:45.924] List of 1 [13:13:45.924] $ ...:List of 1 [13:13:45.924] ..$ length: int 2 [13:13:45.924] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:45.924] - attr(*, "where")=List of 1 [13:13:45.924] ..$ ...: [13:13:45.924] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:45.924] - attr(*, "resolved")= logi TRUE [13:13:45.924] - attr(*, "total_size")= num NA [13:13:45.928] - Getting '...' globals ... DONE [13:13:45.928] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:45.928] List of 2 [13:13:45.928] $ ...future.FUN:function (mode = "logical", length = 0L) [13:13:45.928] $ ... :List of 1 [13:13:45.928] ..$ length: int 2 [13:13:45.928] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:45.928] - attr(*, "where")=List of 2 [13:13:45.928] ..$ ...future.FUN: [13:13:45.928] ..$ ... : [13:13:45.928] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:45.928] - attr(*, "resolved")= logi FALSE [13:13:45.928] - attr(*, "total_size")= num 2240 [13:13:45.932] Packages to be attached in all futures: [n=0] [13:13:45.932] getGlobalsAndPackagesXApply() ... DONE [13:13:45.932] Number of futures (= number of chunks): 2 [13:13:45.933] Launching 2 futures (chunks) ... [13:13:45.933] Chunk #1 of 2 ... [13:13:45.933] - Finding globals in 'X' for chunk #1 ... [13:13:45.933] getGlobalsAndPackages() ... [13:13:45.933] Searching for globals... [13:13:45.934] [13:13:45.934] Searching for globals ... DONE [13:13:45.934] - globals: [0] [13:13:45.934] getGlobalsAndPackages() ... DONE [13:13:45.934] + additional globals found: [n=0] [13:13:45.934] + additional namespaces needed: [n=0] [13:13:45.935] - Finding globals in 'X' for chunk #1 ... DONE [13:13:45.935] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:13:45.935] - seeds: [13:13:45.935] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:45.935] getGlobalsAndPackages() ... [13:13:45.935] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:45.936] Resolving globals: FALSE [13:13:45.936] Tweak future expression to call with '...' arguments ... [13:13:45.936] { [13:13:45.936] do.call(function(...) { [13:13:45.936] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:45.936] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:45.936] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:45.936] on.exit(options(oopts), add = TRUE) [13:13:45.936] } [13:13:45.936] { [13:13:45.936] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:45.936] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:45.936] ...future.FUN(...future.X_jj, ...) [13:13:45.936] }) [13:13:45.936] } [13:13:45.936] }, args = future.call.arguments) [13:13:45.936] } [13:13:45.936] Tweak future expression to call with '...' arguments ... DONE [13:13:45.937] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:45.937] [13:13:45.937] getGlobalsAndPackages() ... DONE [13:13:45.938] run() for 'Future' ... [13:13:45.938] - state: 'created' [13:13:45.938] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:45.952] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:45.952] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:13:45.953] - Field: 'node' [13:13:45.953] - Field: 'label' [13:13:45.953] - Field: 'local' [13:13:45.953] - Field: 'owner' [13:13:45.953] - Field: 'envir' [13:13:45.954] - Field: 'workers' [13:13:45.954] - Field: 'packages' [13:13:45.954] - Field: 'gc' [13:13:45.954] - Field: 'conditions' [13:13:45.954] - Field: 'persistent' [13:13:45.954] - Field: 'expr' [13:13:45.955] - Field: 'uuid' [13:13:45.955] - Field: 'seed' [13:13:45.955] - Field: 'version' [13:13:45.955] - Field: 'result' [13:13:45.955] - Field: 'asynchronous' [13:13:45.955] - Field: 'calls' [13:13:45.956] - Field: 'globals' [13:13:45.956] - Field: 'stdout' [13:13:45.956] - Field: 'earlySignal' [13:13:45.956] - Field: 'lazy' [13:13:45.956] - Field: 'state' [13:13:45.956] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:13:45.957] - Launch lazy future ... [13:13:45.957] Packages needed by the future expression (n = 0): [13:13:45.957] Packages needed by future strategies (n = 0): [13:13:45.958] { [13:13:45.958] { [13:13:45.958] { [13:13:45.958] ...future.startTime <- base::Sys.time() [13:13:45.958] { [13:13:45.958] { [13:13:45.958] { [13:13:45.958] { [13:13:45.958] base::local({ [13:13:45.958] has_future <- base::requireNamespace("future", [13:13:45.958] quietly = TRUE) [13:13:45.958] if (has_future) { [13:13:45.958] ns <- base::getNamespace("future") [13:13:45.958] version <- ns[[".package"]][["version"]] [13:13:45.958] if (is.null(version)) [13:13:45.958] version <- utils::packageVersion("future") [13:13:45.958] } [13:13:45.958] else { [13:13:45.958] version <- NULL [13:13:45.958] } [13:13:45.958] if (!has_future || version < "1.8.0") { [13:13:45.958] info <- base::c(r_version = base::gsub("R version ", [13:13:45.958] "", base::R.version$version.string), [13:13:45.958] platform = base::sprintf("%s (%s-bit)", [13:13:45.958] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:45.958] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:45.958] "release", "version")], collapse = " "), [13:13:45.958] hostname = base::Sys.info()[["nodename"]]) [13:13:45.958] info <- base::sprintf("%s: %s", base::names(info), [13:13:45.958] info) [13:13:45.958] info <- base::paste(info, collapse = "; ") [13:13:45.958] if (!has_future) { [13:13:45.958] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:45.958] info) [13:13:45.958] } [13:13:45.958] else { [13:13:45.958] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:45.958] info, version) [13:13:45.958] } [13:13:45.958] base::stop(msg) [13:13:45.958] } [13:13:45.958] }) [13:13:45.958] } [13:13:45.958] ...future.mc.cores.old <- base::getOption("mc.cores") [13:13:45.958] base::options(mc.cores = 1L) [13:13:45.958] } [13:13:45.958] options(future.plan = NULL) [13:13:45.958] Sys.unsetenv("R_FUTURE_PLAN") [13:13:45.958] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:45.958] } [13:13:45.958] ...future.workdir <- getwd() [13:13:45.958] } [13:13:45.958] ...future.oldOptions <- base::as.list(base::.Options) [13:13:45.958] ...future.oldEnvVars <- base::Sys.getenv() [13:13:45.958] } [13:13:45.958] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:45.958] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:13:45.958] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:45.958] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:45.958] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:45.958] future.stdout.windows.reencode = NULL, width = 80L) [13:13:45.958] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:45.958] base::names(...future.oldOptions)) [13:13:45.958] } [13:13:45.958] if (FALSE) { [13:13:45.958] } [13:13:45.958] else { [13:13:45.958] if (TRUE) { [13:13:45.958] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:45.958] open = "w") [13:13:45.958] } [13:13:45.958] else { [13:13:45.958] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:45.958] windows = "NUL", "/dev/null"), open = "w") [13:13:45.958] } [13:13:45.958] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:45.958] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:45.958] base::sink(type = "output", split = FALSE) [13:13:45.958] base::close(...future.stdout) [13:13:45.958] }, add = TRUE) [13:13:45.958] } [13:13:45.958] ...future.frame <- base::sys.nframe() [13:13:45.958] ...future.conditions <- base::list() [13:13:45.958] ...future.rng <- base::globalenv()$.Random.seed [13:13:45.958] if (FALSE) { [13:13:45.958] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:45.958] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:45.958] } [13:13:45.958] ...future.result <- base::tryCatch({ [13:13:45.958] base::withCallingHandlers({ [13:13:45.958] ...future.value <- base::withVisible(base::local({ [13:13:45.958] ...future.makeSendCondition <- local({ [13:13:45.958] sendCondition <- NULL [13:13:45.958] function(frame = 1L) { [13:13:45.958] if (is.function(sendCondition)) [13:13:45.958] return(sendCondition) [13:13:45.958] ns <- getNamespace("parallel") [13:13:45.958] if (exists("sendData", mode = "function", [13:13:45.958] envir = ns)) { [13:13:45.958] parallel_sendData <- get("sendData", mode = "function", [13:13:45.958] envir = ns) [13:13:45.958] envir <- sys.frame(frame) [13:13:45.958] master <- NULL [13:13:45.958] while (!identical(envir, .GlobalEnv) && [13:13:45.958] !identical(envir, emptyenv())) { [13:13:45.958] if (exists("master", mode = "list", envir = envir, [13:13:45.958] inherits = FALSE)) { [13:13:45.958] master <- get("master", mode = "list", [13:13:45.958] envir = envir, inherits = FALSE) [13:13:45.958] if (inherits(master, c("SOCKnode", [13:13:45.958] "SOCK0node"))) { [13:13:45.958] sendCondition <<- function(cond) { [13:13:45.958] data <- list(type = "VALUE", value = cond, [13:13:45.958] success = TRUE) [13:13:45.958] parallel_sendData(master, data) [13:13:45.958] } [13:13:45.958] return(sendCondition) [13:13:45.958] } [13:13:45.958] } [13:13:45.958] frame <- frame + 1L [13:13:45.958] envir <- sys.frame(frame) [13:13:45.958] } [13:13:45.958] } [13:13:45.958] sendCondition <<- function(cond) NULL [13:13:45.958] } [13:13:45.958] }) [13:13:45.958] withCallingHandlers({ [13:13:45.958] { [13:13:45.958] do.call(function(...) { [13:13:45.958] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:45.958] if (!identical(...future.globals.maxSize.org, [13:13:45.958] ...future.globals.maxSize)) { [13:13:45.958] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:45.958] on.exit(options(oopts), add = TRUE) [13:13:45.958] } [13:13:45.958] { [13:13:45.958] lapply(seq_along(...future.elements_ii), [13:13:45.958] FUN = function(jj) { [13:13:45.958] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:45.958] ...future.FUN(...future.X_jj, ...) [13:13:45.958] }) [13:13:45.958] } [13:13:45.958] }, args = future.call.arguments) [13:13:45.958] } [13:13:45.958] }, immediateCondition = function(cond) { [13:13:45.958] sendCondition <- ...future.makeSendCondition() [13:13:45.958] sendCondition(cond) [13:13:45.958] muffleCondition <- function (cond, pattern = "^muffle") [13:13:45.958] { [13:13:45.958] inherits <- base::inherits [13:13:45.958] invokeRestart <- base::invokeRestart [13:13:45.958] is.null <- base::is.null [13:13:45.958] muffled <- FALSE [13:13:45.958] if (inherits(cond, "message")) { [13:13:45.958] muffled <- grepl(pattern, "muffleMessage") [13:13:45.958] if (muffled) [13:13:45.958] invokeRestart("muffleMessage") [13:13:45.958] } [13:13:45.958] else if (inherits(cond, "warning")) { [13:13:45.958] muffled <- grepl(pattern, "muffleWarning") [13:13:45.958] if (muffled) [13:13:45.958] invokeRestart("muffleWarning") [13:13:45.958] } [13:13:45.958] else if (inherits(cond, "condition")) { [13:13:45.958] if (!is.null(pattern)) { [13:13:45.958] computeRestarts <- base::computeRestarts [13:13:45.958] grepl <- base::grepl [13:13:45.958] restarts <- computeRestarts(cond) [13:13:45.958] for (restart in restarts) { [13:13:45.958] name <- restart$name [13:13:45.958] if (is.null(name)) [13:13:45.958] next [13:13:45.958] if (!grepl(pattern, name)) [13:13:45.958] next [13:13:45.958] invokeRestart(restart) [13:13:45.958] muffled <- TRUE [13:13:45.958] break [13:13:45.958] } [13:13:45.958] } [13:13:45.958] } [13:13:45.958] invisible(muffled) [13:13:45.958] } [13:13:45.958] muffleCondition(cond) [13:13:45.958] }) [13:13:45.958] })) [13:13:45.958] future::FutureResult(value = ...future.value$value, [13:13:45.958] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:45.958] ...future.rng), globalenv = if (FALSE) [13:13:45.958] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:45.958] ...future.globalenv.names)) [13:13:45.958] else NULL, started = ...future.startTime, version = "1.8") [13:13:45.958] }, condition = base::local({ [13:13:45.958] c <- base::c [13:13:45.958] inherits <- base::inherits [13:13:45.958] invokeRestart <- base::invokeRestart [13:13:45.958] length <- base::length [13:13:45.958] list <- base::list [13:13:45.958] seq.int <- base::seq.int [13:13:45.958] signalCondition <- base::signalCondition [13:13:45.958] sys.calls <- base::sys.calls [13:13:45.958] `[[` <- base::`[[` [13:13:45.958] `+` <- base::`+` [13:13:45.958] `<<-` <- base::`<<-` [13:13:45.958] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:45.958] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:45.958] 3L)] [13:13:45.958] } [13:13:45.958] function(cond) { [13:13:45.958] is_error <- inherits(cond, "error") [13:13:45.958] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:45.958] NULL) [13:13:45.958] if (is_error) { [13:13:45.958] sessionInformation <- function() { [13:13:45.958] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:45.958] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:45.958] search = base::search(), system = base::Sys.info()) [13:13:45.958] } [13:13:45.958] ...future.conditions[[length(...future.conditions) + [13:13:45.958] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:45.958] cond$call), session = sessionInformation(), [13:13:45.958] timestamp = base::Sys.time(), signaled = 0L) [13:13:45.958] signalCondition(cond) [13:13:45.958] } [13:13:45.958] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:45.958] "immediateCondition"))) { [13:13:45.958] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:45.958] ...future.conditions[[length(...future.conditions) + [13:13:45.958] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:45.958] if (TRUE && !signal) { [13:13:45.958] muffleCondition <- function (cond, pattern = "^muffle") [13:13:45.958] { [13:13:45.958] inherits <- base::inherits [13:13:45.958] invokeRestart <- base::invokeRestart [13:13:45.958] is.null <- base::is.null [13:13:45.958] muffled <- FALSE [13:13:45.958] if (inherits(cond, "message")) { [13:13:45.958] muffled <- grepl(pattern, "muffleMessage") [13:13:45.958] if (muffled) [13:13:45.958] invokeRestart("muffleMessage") [13:13:45.958] } [13:13:45.958] else if (inherits(cond, "warning")) { [13:13:45.958] muffled <- grepl(pattern, "muffleWarning") [13:13:45.958] if (muffled) [13:13:45.958] invokeRestart("muffleWarning") [13:13:45.958] } [13:13:45.958] else if (inherits(cond, "condition")) { [13:13:45.958] if (!is.null(pattern)) { [13:13:45.958] computeRestarts <- base::computeRestarts [13:13:45.958] grepl <- base::grepl [13:13:45.958] restarts <- computeRestarts(cond) [13:13:45.958] for (restart in restarts) { [13:13:45.958] name <- restart$name [13:13:45.958] if (is.null(name)) [13:13:45.958] next [13:13:45.958] if (!grepl(pattern, name)) [13:13:45.958] next [13:13:45.958] invokeRestart(restart) [13:13:45.958] muffled <- TRUE [13:13:45.958] break [13:13:45.958] } [13:13:45.958] } [13:13:45.958] } [13:13:45.958] invisible(muffled) [13:13:45.958] } [13:13:45.958] muffleCondition(cond, pattern = "^muffle") [13:13:45.958] } [13:13:45.958] } [13:13:45.958] else { [13:13:45.958] if (TRUE) { [13:13:45.958] muffleCondition <- function (cond, pattern = "^muffle") [13:13:45.958] { [13:13:45.958] inherits <- base::inherits [13:13:45.958] invokeRestart <- base::invokeRestart [13:13:45.958] is.null <- base::is.null [13:13:45.958] muffled <- FALSE [13:13:45.958] if (inherits(cond, "message")) { [13:13:45.958] muffled <- grepl(pattern, "muffleMessage") [13:13:45.958] if (muffled) [13:13:45.958] invokeRestart("muffleMessage") [13:13:45.958] } [13:13:45.958] else if (inherits(cond, "warning")) { [13:13:45.958] muffled <- grepl(pattern, "muffleWarning") [13:13:45.958] if (muffled) [13:13:45.958] invokeRestart("muffleWarning") [13:13:45.958] } [13:13:45.958] else if (inherits(cond, "condition")) { [13:13:45.958] if (!is.null(pattern)) { [13:13:45.958] computeRestarts <- base::computeRestarts [13:13:45.958] grepl <- base::grepl [13:13:45.958] restarts <- computeRestarts(cond) [13:13:45.958] for (restart in restarts) { [13:13:45.958] name <- restart$name [13:13:45.958] if (is.null(name)) [13:13:45.958] next [13:13:45.958] if (!grepl(pattern, name)) [13:13:45.958] next [13:13:45.958] invokeRestart(restart) [13:13:45.958] muffled <- TRUE [13:13:45.958] break [13:13:45.958] } [13:13:45.958] } [13:13:45.958] } [13:13:45.958] invisible(muffled) [13:13:45.958] } [13:13:45.958] muffleCondition(cond, pattern = "^muffle") [13:13:45.958] } [13:13:45.958] } [13:13:45.958] } [13:13:45.958] })) [13:13:45.958] }, error = function(ex) { [13:13:45.958] base::structure(base::list(value = NULL, visible = NULL, [13:13:45.958] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:45.958] ...future.rng), started = ...future.startTime, [13:13:45.958] finished = Sys.time(), session_uuid = NA_character_, [13:13:45.958] version = "1.8"), class = "FutureResult") [13:13:45.958] }, finally = { [13:13:45.958] if (!identical(...future.workdir, getwd())) [13:13:45.958] setwd(...future.workdir) [13:13:45.958] { [13:13:45.958] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:45.958] ...future.oldOptions$nwarnings <- NULL [13:13:45.958] } [13:13:45.958] base::options(...future.oldOptions) [13:13:45.958] if (.Platform$OS.type == "windows") { [13:13:45.958] old_names <- names(...future.oldEnvVars) [13:13:45.958] envs <- base::Sys.getenv() [13:13:45.958] names <- names(envs) [13:13:45.958] common <- intersect(names, old_names) [13:13:45.958] added <- setdiff(names, old_names) [13:13:45.958] removed <- setdiff(old_names, names) [13:13:45.958] changed <- common[...future.oldEnvVars[common] != [13:13:45.958] envs[common]] [13:13:45.958] NAMES <- toupper(changed) [13:13:45.958] args <- list() [13:13:45.958] for (kk in seq_along(NAMES)) { [13:13:45.958] name <- changed[[kk]] [13:13:45.958] NAME <- NAMES[[kk]] [13:13:45.958] if (name != NAME && is.element(NAME, old_names)) [13:13:45.958] next [13:13:45.958] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:45.958] } [13:13:45.958] NAMES <- toupper(added) [13:13:45.958] for (kk in seq_along(NAMES)) { [13:13:45.958] name <- added[[kk]] [13:13:45.958] NAME <- NAMES[[kk]] [13:13:45.958] if (name != NAME && is.element(NAME, old_names)) [13:13:45.958] next [13:13:45.958] args[[name]] <- "" [13:13:45.958] } [13:13:45.958] NAMES <- toupper(removed) [13:13:45.958] for (kk in seq_along(NAMES)) { [13:13:45.958] name <- removed[[kk]] [13:13:45.958] NAME <- NAMES[[kk]] [13:13:45.958] if (name != NAME && is.element(NAME, old_names)) [13:13:45.958] next [13:13:45.958] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:45.958] } [13:13:45.958] if (length(args) > 0) [13:13:45.958] base::do.call(base::Sys.setenv, args = args) [13:13:45.958] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:45.958] } [13:13:45.958] else { [13:13:45.958] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:45.958] } [13:13:45.958] { [13:13:45.958] if (base::length(...future.futureOptionsAdded) > [13:13:45.958] 0L) { [13:13:45.958] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:45.958] base::names(opts) <- ...future.futureOptionsAdded [13:13:45.958] base::options(opts) [13:13:45.958] } [13:13:45.958] { [13:13:45.958] { [13:13:45.958] base::options(mc.cores = ...future.mc.cores.old) [13:13:45.958] NULL [13:13:45.958] } [13:13:45.958] options(future.plan = NULL) [13:13:45.958] if (is.na(NA_character_)) [13:13:45.958] Sys.unsetenv("R_FUTURE_PLAN") [13:13:45.958] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:45.958] future::plan(list(function (..., workers = availableCores(), [13:13:45.958] lazy = FALSE, rscript_libs = .libPaths(), [13:13:45.958] envir = parent.frame()) [13:13:45.958] { [13:13:45.958] if (is.function(workers)) [13:13:45.958] workers <- workers() [13:13:45.958] workers <- structure(as.integer(workers), [13:13:45.958] class = class(workers)) [13:13:45.958] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:45.958] workers >= 1) [13:13:45.958] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:45.958] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:45.958] } [13:13:45.958] future <- MultisessionFuture(..., workers = workers, [13:13:45.958] lazy = lazy, rscript_libs = rscript_libs, [13:13:45.958] envir = envir) [13:13:45.958] if (!future$lazy) [13:13:45.958] future <- run(future) [13:13:45.958] invisible(future) [13:13:45.958] }), .cleanup = FALSE, .init = FALSE) [13:13:45.958] } [13:13:45.958] } [13:13:45.958] } [13:13:45.958] }) [13:13:45.958] if (TRUE) { [13:13:45.958] base::sink(type = "output", split = FALSE) [13:13:45.958] if (TRUE) { [13:13:45.958] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:45.958] } [13:13:45.958] else { [13:13:45.958] ...future.result["stdout"] <- base::list(NULL) [13:13:45.958] } [13:13:45.958] base::close(...future.stdout) [13:13:45.958] ...future.stdout <- NULL [13:13:45.958] } [13:13:45.958] ...future.result$conditions <- ...future.conditions [13:13:45.958] ...future.result$finished <- base::Sys.time() [13:13:45.958] ...future.result [13:13:45.958] } [13:13:45.963] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... [13:13:45.963] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... [13:13:45.964] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... DONE [13:13:45.964] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... [13:13:45.965] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... DONE [13:13:45.965] Exporting '...future.elements_ii' (224 bytes) to cluster node #1 ... [13:13:45.965] Exporting '...future.elements_ii' (224 bytes) to cluster node #1 ... DONE [13:13:45.965] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:13:45.966] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:13:45.966] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:13:45.966] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:13:45.967] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... DONE [13:13:45.967] MultisessionFuture started [13:13:45.968] - Launch lazy future ... done [13:13:45.968] run() for 'MultisessionFuture' ... done [13:13:45.968] Created future: [13:13:45.983] receiveMessageFromWorker() for ClusterFuture ... [13:13:45.983] - Validating connection of MultisessionFuture [13:13:45.983] - received message: FutureResult [13:13:45.984] - Received FutureResult [13:13:45.984] - Erased future from FutureRegistry [13:13:45.984] result() for ClusterFuture ... [13:13:45.984] - result already collected: FutureResult [13:13:45.984] result() for ClusterFuture ... done [13:13:45.984] receiveMessageFromWorker() for ClusterFuture ... done [13:13:45.968] MultisessionFuture: [13:13:45.968] Label: 'future_lapply-1' [13:13:45.968] Expression: [13:13:45.968] { [13:13:45.968] do.call(function(...) { [13:13:45.968] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:45.968] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:45.968] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:45.968] on.exit(options(oopts), add = TRUE) [13:13:45.968] } [13:13:45.968] { [13:13:45.968] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:45.968] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:45.968] ...future.FUN(...future.X_jj, ...) [13:13:45.968] }) [13:13:45.968] } [13:13:45.968] }, args = future.call.arguments) [13:13:45.968] } [13:13:45.968] Lazy evaluation: FALSE [13:13:45.968] Asynchronous evaluation: TRUE [13:13:45.968] Local evaluation: TRUE [13:13:45.968] Environment: R_GlobalEnv [13:13:45.968] Capture standard output: TRUE [13:13:45.968] Capture condition classes: 'condition' (excluding 'nothing') [13:13:45.968] 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) [13:13:45.968] Packages: [13:13:45.968] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:45.968] Resolved: TRUE [13:13:45.968] Value: [13:13:45.968] Conditions captured: [13:13:45.968] Early signaling: FALSE [13:13:45.968] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:45.968] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:45.985] Chunk #1 of 2 ... DONE [13:13:45.985] Chunk #2 of 2 ... [13:13:45.985] - Finding globals in 'X' for chunk #2 ... [13:13:45.985] getGlobalsAndPackages() ... [13:13:45.986] Searching for globals... [13:13:45.986] [13:13:45.986] Searching for globals ... DONE [13:13:45.986] - globals: [0] [13:13:45.986] getGlobalsAndPackages() ... DONE [13:13:45.986] + additional globals found: [n=0] [13:13:45.987] + additional namespaces needed: [n=0] [13:13:45.987] - Finding globals in 'X' for chunk #2 ... DONE [13:13:45.987] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:13:45.987] - seeds: [13:13:45.987] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:45.987] getGlobalsAndPackages() ... [13:13:45.988] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:45.988] Resolving globals: FALSE [13:13:45.988] Tweak future expression to call with '...' arguments ... [13:13:45.988] { [13:13:45.988] do.call(function(...) { [13:13:45.988] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:45.988] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:45.988] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:45.988] on.exit(options(oopts), add = TRUE) [13:13:45.988] } [13:13:45.988] { [13:13:45.988] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:45.988] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:45.988] ...future.FUN(...future.X_jj, ...) [13:13:45.988] }) [13:13:45.988] } [13:13:45.988] }, args = future.call.arguments) [13:13:45.988] } [13:13:45.991] Tweak future expression to call with '...' arguments ... DONE [13:13:45.991] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:45.992] [13:13:45.992] getGlobalsAndPackages() ... DONE [13:13:45.992] run() for 'Future' ... [13:13:45.992] - state: 'created' [13:13:45.992] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:46.006] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:46.006] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:13:46.006] - Field: 'node' [13:13:46.007] - Field: 'label' [13:13:46.007] - Field: 'local' [13:13:46.007] - Field: 'owner' [13:13:46.007] - Field: 'envir' [13:13:46.007] - Field: 'workers' [13:13:46.008] - Field: 'packages' [13:13:46.008] - Field: 'gc' [13:13:46.008] - Field: 'conditions' [13:13:46.008] - Field: 'persistent' [13:13:46.008] - Field: 'expr' [13:13:46.008] - Field: 'uuid' [13:13:46.009] - Field: 'seed' [13:13:46.009] - Field: 'version' [13:13:46.009] - Field: 'result' [13:13:46.009] - Field: 'asynchronous' [13:13:46.009] - Field: 'calls' [13:13:46.009] - Field: 'globals' [13:13:46.010] - Field: 'stdout' [13:13:46.010] - Field: 'earlySignal' [13:13:46.010] - Field: 'lazy' [13:13:46.010] - Field: 'state' [13:13:46.010] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:13:46.011] - Launch lazy future ... [13:13:46.011] Packages needed by the future expression (n = 0): [13:13:46.011] Packages needed by future strategies (n = 0): [13:13:46.012] { [13:13:46.012] { [13:13:46.012] { [13:13:46.012] ...future.startTime <- base::Sys.time() [13:13:46.012] { [13:13:46.012] { [13:13:46.012] { [13:13:46.012] { [13:13:46.012] base::local({ [13:13:46.012] has_future <- base::requireNamespace("future", [13:13:46.012] quietly = TRUE) [13:13:46.012] if (has_future) { [13:13:46.012] ns <- base::getNamespace("future") [13:13:46.012] version <- ns[[".package"]][["version"]] [13:13:46.012] if (is.null(version)) [13:13:46.012] version <- utils::packageVersion("future") [13:13:46.012] } [13:13:46.012] else { [13:13:46.012] version <- NULL [13:13:46.012] } [13:13:46.012] if (!has_future || version < "1.8.0") { [13:13:46.012] info <- base::c(r_version = base::gsub("R version ", [13:13:46.012] "", base::R.version$version.string), [13:13:46.012] platform = base::sprintf("%s (%s-bit)", [13:13:46.012] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:46.012] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:46.012] "release", "version")], collapse = " "), [13:13:46.012] hostname = base::Sys.info()[["nodename"]]) [13:13:46.012] info <- base::sprintf("%s: %s", base::names(info), [13:13:46.012] info) [13:13:46.012] info <- base::paste(info, collapse = "; ") [13:13:46.012] if (!has_future) { [13:13:46.012] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:46.012] info) [13:13:46.012] } [13:13:46.012] else { [13:13:46.012] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:46.012] info, version) [13:13:46.012] } [13:13:46.012] base::stop(msg) [13:13:46.012] } [13:13:46.012] }) [13:13:46.012] } [13:13:46.012] ...future.mc.cores.old <- base::getOption("mc.cores") [13:13:46.012] base::options(mc.cores = 1L) [13:13:46.012] } [13:13:46.012] options(future.plan = NULL) [13:13:46.012] Sys.unsetenv("R_FUTURE_PLAN") [13:13:46.012] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:46.012] } [13:13:46.012] ...future.workdir <- getwd() [13:13:46.012] } [13:13:46.012] ...future.oldOptions <- base::as.list(base::.Options) [13:13:46.012] ...future.oldEnvVars <- base::Sys.getenv() [13:13:46.012] } [13:13:46.012] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:46.012] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:13:46.012] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:46.012] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:46.012] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:46.012] future.stdout.windows.reencode = NULL, width = 80L) [13:13:46.012] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:46.012] base::names(...future.oldOptions)) [13:13:46.012] } [13:13:46.012] if (FALSE) { [13:13:46.012] } [13:13:46.012] else { [13:13:46.012] if (TRUE) { [13:13:46.012] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:46.012] open = "w") [13:13:46.012] } [13:13:46.012] else { [13:13:46.012] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:46.012] windows = "NUL", "/dev/null"), open = "w") [13:13:46.012] } [13:13:46.012] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:46.012] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:46.012] base::sink(type = "output", split = FALSE) [13:13:46.012] base::close(...future.stdout) [13:13:46.012] }, add = TRUE) [13:13:46.012] } [13:13:46.012] ...future.frame <- base::sys.nframe() [13:13:46.012] ...future.conditions <- base::list() [13:13:46.012] ...future.rng <- base::globalenv()$.Random.seed [13:13:46.012] if (FALSE) { [13:13:46.012] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:46.012] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:46.012] } [13:13:46.012] ...future.result <- base::tryCatch({ [13:13:46.012] base::withCallingHandlers({ [13:13:46.012] ...future.value <- base::withVisible(base::local({ [13:13:46.012] ...future.makeSendCondition <- local({ [13:13:46.012] sendCondition <- NULL [13:13:46.012] function(frame = 1L) { [13:13:46.012] if (is.function(sendCondition)) [13:13:46.012] return(sendCondition) [13:13:46.012] ns <- getNamespace("parallel") [13:13:46.012] if (exists("sendData", mode = "function", [13:13:46.012] envir = ns)) { [13:13:46.012] parallel_sendData <- get("sendData", mode = "function", [13:13:46.012] envir = ns) [13:13:46.012] envir <- sys.frame(frame) [13:13:46.012] master <- NULL [13:13:46.012] while (!identical(envir, .GlobalEnv) && [13:13:46.012] !identical(envir, emptyenv())) { [13:13:46.012] if (exists("master", mode = "list", envir = envir, [13:13:46.012] inherits = FALSE)) { [13:13:46.012] master <- get("master", mode = "list", [13:13:46.012] envir = envir, inherits = FALSE) [13:13:46.012] if (inherits(master, c("SOCKnode", [13:13:46.012] "SOCK0node"))) { [13:13:46.012] sendCondition <<- function(cond) { [13:13:46.012] data <- list(type = "VALUE", value = cond, [13:13:46.012] success = TRUE) [13:13:46.012] parallel_sendData(master, data) [13:13:46.012] } [13:13:46.012] return(sendCondition) [13:13:46.012] } [13:13:46.012] } [13:13:46.012] frame <- frame + 1L [13:13:46.012] envir <- sys.frame(frame) [13:13:46.012] } [13:13:46.012] } [13:13:46.012] sendCondition <<- function(cond) NULL [13:13:46.012] } [13:13:46.012] }) [13:13:46.012] withCallingHandlers({ [13:13:46.012] { [13:13:46.012] do.call(function(...) { [13:13:46.012] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:46.012] if (!identical(...future.globals.maxSize.org, [13:13:46.012] ...future.globals.maxSize)) { [13:13:46.012] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:46.012] on.exit(options(oopts), add = TRUE) [13:13:46.012] } [13:13:46.012] { [13:13:46.012] lapply(seq_along(...future.elements_ii), [13:13:46.012] FUN = function(jj) { [13:13:46.012] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:46.012] ...future.FUN(...future.X_jj, ...) [13:13:46.012] }) [13:13:46.012] } [13:13:46.012] }, args = future.call.arguments) [13:13:46.012] } [13:13:46.012] }, immediateCondition = function(cond) { [13:13:46.012] sendCondition <- ...future.makeSendCondition() [13:13:46.012] sendCondition(cond) [13:13:46.012] muffleCondition <- function (cond, pattern = "^muffle") [13:13:46.012] { [13:13:46.012] inherits <- base::inherits [13:13:46.012] invokeRestart <- base::invokeRestart [13:13:46.012] is.null <- base::is.null [13:13:46.012] muffled <- FALSE [13:13:46.012] if (inherits(cond, "message")) { [13:13:46.012] muffled <- grepl(pattern, "muffleMessage") [13:13:46.012] if (muffled) [13:13:46.012] invokeRestart("muffleMessage") [13:13:46.012] } [13:13:46.012] else if (inherits(cond, "warning")) { [13:13:46.012] muffled <- grepl(pattern, "muffleWarning") [13:13:46.012] if (muffled) [13:13:46.012] invokeRestart("muffleWarning") [13:13:46.012] } [13:13:46.012] else if (inherits(cond, "condition")) { [13:13:46.012] if (!is.null(pattern)) { [13:13:46.012] computeRestarts <- base::computeRestarts [13:13:46.012] grepl <- base::grepl [13:13:46.012] restarts <- computeRestarts(cond) [13:13:46.012] for (restart in restarts) { [13:13:46.012] name <- restart$name [13:13:46.012] if (is.null(name)) [13:13:46.012] next [13:13:46.012] if (!grepl(pattern, name)) [13:13:46.012] next [13:13:46.012] invokeRestart(restart) [13:13:46.012] muffled <- TRUE [13:13:46.012] break [13:13:46.012] } [13:13:46.012] } [13:13:46.012] } [13:13:46.012] invisible(muffled) [13:13:46.012] } [13:13:46.012] muffleCondition(cond) [13:13:46.012] }) [13:13:46.012] })) [13:13:46.012] future::FutureResult(value = ...future.value$value, [13:13:46.012] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:46.012] ...future.rng), globalenv = if (FALSE) [13:13:46.012] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:46.012] ...future.globalenv.names)) [13:13:46.012] else NULL, started = ...future.startTime, version = "1.8") [13:13:46.012] }, condition = base::local({ [13:13:46.012] c <- base::c [13:13:46.012] inherits <- base::inherits [13:13:46.012] invokeRestart <- base::invokeRestart [13:13:46.012] length <- base::length [13:13:46.012] list <- base::list [13:13:46.012] seq.int <- base::seq.int [13:13:46.012] signalCondition <- base::signalCondition [13:13:46.012] sys.calls <- base::sys.calls [13:13:46.012] `[[` <- base::`[[` [13:13:46.012] `+` <- base::`+` [13:13:46.012] `<<-` <- base::`<<-` [13:13:46.012] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:46.012] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:46.012] 3L)] [13:13:46.012] } [13:13:46.012] function(cond) { [13:13:46.012] is_error <- inherits(cond, "error") [13:13:46.012] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:46.012] NULL) [13:13:46.012] if (is_error) { [13:13:46.012] sessionInformation <- function() { [13:13:46.012] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:46.012] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:46.012] search = base::search(), system = base::Sys.info()) [13:13:46.012] } [13:13:46.012] ...future.conditions[[length(...future.conditions) + [13:13:46.012] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:46.012] cond$call), session = sessionInformation(), [13:13:46.012] timestamp = base::Sys.time(), signaled = 0L) [13:13:46.012] signalCondition(cond) [13:13:46.012] } [13:13:46.012] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:46.012] "immediateCondition"))) { [13:13:46.012] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:46.012] ...future.conditions[[length(...future.conditions) + [13:13:46.012] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:46.012] if (TRUE && !signal) { [13:13:46.012] muffleCondition <- function (cond, pattern = "^muffle") [13:13:46.012] { [13:13:46.012] inherits <- base::inherits [13:13:46.012] invokeRestart <- base::invokeRestart [13:13:46.012] is.null <- base::is.null [13:13:46.012] muffled <- FALSE [13:13:46.012] if (inherits(cond, "message")) { [13:13:46.012] muffled <- grepl(pattern, "muffleMessage") [13:13:46.012] if (muffled) [13:13:46.012] invokeRestart("muffleMessage") [13:13:46.012] } [13:13:46.012] else if (inherits(cond, "warning")) { [13:13:46.012] muffled <- grepl(pattern, "muffleWarning") [13:13:46.012] if (muffled) [13:13:46.012] invokeRestart("muffleWarning") [13:13:46.012] } [13:13:46.012] else if (inherits(cond, "condition")) { [13:13:46.012] if (!is.null(pattern)) { [13:13:46.012] computeRestarts <- base::computeRestarts [13:13:46.012] grepl <- base::grepl [13:13:46.012] restarts <- computeRestarts(cond) [13:13:46.012] for (restart in restarts) { [13:13:46.012] name <- restart$name [13:13:46.012] if (is.null(name)) [13:13:46.012] next [13:13:46.012] if (!grepl(pattern, name)) [13:13:46.012] next [13:13:46.012] invokeRestart(restart) [13:13:46.012] muffled <- TRUE [13:13:46.012] break [13:13:46.012] } [13:13:46.012] } [13:13:46.012] } [13:13:46.012] invisible(muffled) [13:13:46.012] } [13:13:46.012] muffleCondition(cond, pattern = "^muffle") [13:13:46.012] } [13:13:46.012] } [13:13:46.012] else { [13:13:46.012] if (TRUE) { [13:13:46.012] muffleCondition <- function (cond, pattern = "^muffle") [13:13:46.012] { [13:13:46.012] inherits <- base::inherits [13:13:46.012] invokeRestart <- base::invokeRestart [13:13:46.012] is.null <- base::is.null [13:13:46.012] muffled <- FALSE [13:13:46.012] if (inherits(cond, "message")) { [13:13:46.012] muffled <- grepl(pattern, "muffleMessage") [13:13:46.012] if (muffled) [13:13:46.012] invokeRestart("muffleMessage") [13:13:46.012] } [13:13:46.012] else if (inherits(cond, "warning")) { [13:13:46.012] muffled <- grepl(pattern, "muffleWarning") [13:13:46.012] if (muffled) [13:13:46.012] invokeRestart("muffleWarning") [13:13:46.012] } [13:13:46.012] else if (inherits(cond, "condition")) { [13:13:46.012] if (!is.null(pattern)) { [13:13:46.012] computeRestarts <- base::computeRestarts [13:13:46.012] grepl <- base::grepl [13:13:46.012] restarts <- computeRestarts(cond) [13:13:46.012] for (restart in restarts) { [13:13:46.012] name <- restart$name [13:13:46.012] if (is.null(name)) [13:13:46.012] next [13:13:46.012] if (!grepl(pattern, name)) [13:13:46.012] next [13:13:46.012] invokeRestart(restart) [13:13:46.012] muffled <- TRUE [13:13:46.012] break [13:13:46.012] } [13:13:46.012] } [13:13:46.012] } [13:13:46.012] invisible(muffled) [13:13:46.012] } [13:13:46.012] muffleCondition(cond, pattern = "^muffle") [13:13:46.012] } [13:13:46.012] } [13:13:46.012] } [13:13:46.012] })) [13:13:46.012] }, error = function(ex) { [13:13:46.012] base::structure(base::list(value = NULL, visible = NULL, [13:13:46.012] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:46.012] ...future.rng), started = ...future.startTime, [13:13:46.012] finished = Sys.time(), session_uuid = NA_character_, [13:13:46.012] version = "1.8"), class = "FutureResult") [13:13:46.012] }, finally = { [13:13:46.012] if (!identical(...future.workdir, getwd())) [13:13:46.012] setwd(...future.workdir) [13:13:46.012] { [13:13:46.012] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:46.012] ...future.oldOptions$nwarnings <- NULL [13:13:46.012] } [13:13:46.012] base::options(...future.oldOptions) [13:13:46.012] if (.Platform$OS.type == "windows") { [13:13:46.012] old_names <- names(...future.oldEnvVars) [13:13:46.012] envs <- base::Sys.getenv() [13:13:46.012] names <- names(envs) [13:13:46.012] common <- intersect(names, old_names) [13:13:46.012] added <- setdiff(names, old_names) [13:13:46.012] removed <- setdiff(old_names, names) [13:13:46.012] changed <- common[...future.oldEnvVars[common] != [13:13:46.012] envs[common]] [13:13:46.012] NAMES <- toupper(changed) [13:13:46.012] args <- list() [13:13:46.012] for (kk in seq_along(NAMES)) { [13:13:46.012] name <- changed[[kk]] [13:13:46.012] NAME <- NAMES[[kk]] [13:13:46.012] if (name != NAME && is.element(NAME, old_names)) [13:13:46.012] next [13:13:46.012] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:46.012] } [13:13:46.012] NAMES <- toupper(added) [13:13:46.012] for (kk in seq_along(NAMES)) { [13:13:46.012] name <- added[[kk]] [13:13:46.012] NAME <- NAMES[[kk]] [13:13:46.012] if (name != NAME && is.element(NAME, old_names)) [13:13:46.012] next [13:13:46.012] args[[name]] <- "" [13:13:46.012] } [13:13:46.012] NAMES <- toupper(removed) [13:13:46.012] for (kk in seq_along(NAMES)) { [13:13:46.012] name <- removed[[kk]] [13:13:46.012] NAME <- NAMES[[kk]] [13:13:46.012] if (name != NAME && is.element(NAME, old_names)) [13:13:46.012] next [13:13:46.012] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:46.012] } [13:13:46.012] if (length(args) > 0) [13:13:46.012] base::do.call(base::Sys.setenv, args = args) [13:13:46.012] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:46.012] } [13:13:46.012] else { [13:13:46.012] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:46.012] } [13:13:46.012] { [13:13:46.012] if (base::length(...future.futureOptionsAdded) > [13:13:46.012] 0L) { [13:13:46.012] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:46.012] base::names(opts) <- ...future.futureOptionsAdded [13:13:46.012] base::options(opts) [13:13:46.012] } [13:13:46.012] { [13:13:46.012] { [13:13:46.012] base::options(mc.cores = ...future.mc.cores.old) [13:13:46.012] NULL [13:13:46.012] } [13:13:46.012] options(future.plan = NULL) [13:13:46.012] if (is.na(NA_character_)) [13:13:46.012] Sys.unsetenv("R_FUTURE_PLAN") [13:13:46.012] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:46.012] future::plan(list(function (..., workers = availableCores(), [13:13:46.012] lazy = FALSE, rscript_libs = .libPaths(), [13:13:46.012] envir = parent.frame()) [13:13:46.012] { [13:13:46.012] if (is.function(workers)) [13:13:46.012] workers <- workers() [13:13:46.012] workers <- structure(as.integer(workers), [13:13:46.012] class = class(workers)) [13:13:46.012] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:46.012] workers >= 1) [13:13:46.012] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:46.012] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:46.012] } [13:13:46.012] future <- MultisessionFuture(..., workers = workers, [13:13:46.012] lazy = lazy, rscript_libs = rscript_libs, [13:13:46.012] envir = envir) [13:13:46.012] if (!future$lazy) [13:13:46.012] future <- run(future) [13:13:46.012] invisible(future) [13:13:46.012] }), .cleanup = FALSE, .init = FALSE) [13:13:46.012] } [13:13:46.012] } [13:13:46.012] } [13:13:46.012] }) [13:13:46.012] if (TRUE) { [13:13:46.012] base::sink(type = "output", split = FALSE) [13:13:46.012] if (TRUE) { [13:13:46.012] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:46.012] } [13:13:46.012] else { [13:13:46.012] ...future.result["stdout"] <- base::list(NULL) [13:13:46.012] } [13:13:46.012] base::close(...future.stdout) [13:13:46.012] ...future.stdout <- NULL [13:13:46.012] } [13:13:46.012] ...future.result$conditions <- ...future.conditions [13:13:46.012] ...future.result$finished <- base::Sys.time() [13:13:46.012] ...future.result [13:13:46.012] } [13:13:46.017] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... [13:13:46.017] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... [13:13:46.018] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... DONE [13:13:46.018] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... [13:13:46.018] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... DONE [13:13:46.019] Exporting '...future.elements_ii' (232 bytes) to cluster node #1 ... [13:13:46.019] Exporting '...future.elements_ii' (232 bytes) to cluster node #1 ... DONE [13:13:46.019] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:13:46.020] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:13:46.020] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:13:46.020] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:13:46.020] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... DONE [13:13:46.021] MultisessionFuture started [13:13:46.021] - Launch lazy future ... done [13:13:46.021] run() for 'MultisessionFuture' ... done [13:13:46.022] Created future: [13:13:46.038] receiveMessageFromWorker() for ClusterFuture ... [13:13:46.038] - Validating connection of MultisessionFuture [13:13:46.038] - received message: FutureResult [13:13:46.038] - Received FutureResult [13:13:46.038] - Erased future from FutureRegistry [13:13:46.039] result() for ClusterFuture ... [13:13:46.039] - result already collected: FutureResult [13:13:46.039] result() for ClusterFuture ... done [13:13:46.039] receiveMessageFromWorker() for ClusterFuture ... done [13:13:46.022] MultisessionFuture: [13:13:46.022] Label: 'future_lapply-2' [13:13:46.022] Expression: [13:13:46.022] { [13:13:46.022] do.call(function(...) { [13:13:46.022] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:46.022] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:46.022] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:46.022] on.exit(options(oopts), add = TRUE) [13:13:46.022] } [13:13:46.022] { [13:13:46.022] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:46.022] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:46.022] ...future.FUN(...future.X_jj, ...) [13:13:46.022] }) [13:13:46.022] } [13:13:46.022] }, args = future.call.arguments) [13:13:46.022] } [13:13:46.022] Lazy evaluation: FALSE [13:13:46.022] Asynchronous evaluation: TRUE [13:13:46.022] Local evaluation: TRUE [13:13:46.022] Environment: R_GlobalEnv [13:13:46.022] Capture standard output: TRUE [13:13:46.022] Capture condition classes: 'condition' (excluding 'nothing') [13:13:46.022] 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) [13:13:46.022] Packages: [13:13:46.022] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:46.022] Resolved: TRUE [13:13:46.022] Value: [13:13:46.022] Conditions captured: [13:13:46.022] Early signaling: FALSE [13:13:46.022] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:46.022] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:46.039] Chunk #2 of 2 ... DONE [13:13:46.040] Launching 2 futures (chunks) ... DONE [13:13:46.040] Resolving 2 futures (chunks) ... [13:13:46.040] resolve() on list ... [13:13:46.040] recursive: 0 [13:13:46.040] length: 2 [13:13:46.040] [13:13:46.041] Future #1 [13:13:46.041] result() for ClusterFuture ... [13:13:46.041] - result already collected: FutureResult [13:13:46.041] result() for ClusterFuture ... done [13:13:46.041] result() for ClusterFuture ... [13:13:46.041] - result already collected: FutureResult [13:13:46.042] result() for ClusterFuture ... done [13:13:46.042] signalConditionsASAP(MultisessionFuture, pos=1) ... [13:13:46.042] - nx: 2 [13:13:46.042] - relay: TRUE [13:13:46.042] - stdout: TRUE [13:13:46.042] - signal: TRUE [13:13:46.042] - resignal: FALSE [13:13:46.043] - force: TRUE [13:13:46.043] - relayed: [n=2] FALSE, FALSE [13:13:46.043] - queued futures: [n=2] FALSE, FALSE [13:13:46.043] - until=1 [13:13:46.043] - relaying element #1 [13:13:46.043] result() for ClusterFuture ... [13:13:46.044] - result already collected: FutureResult [13:13:46.044] result() for ClusterFuture ... done [13:13:46.044] result() for ClusterFuture ... [13:13:46.044] - result already collected: FutureResult [13:13:46.044] result() for ClusterFuture ... done [13:13:46.044] result() for ClusterFuture ... [13:13:46.045] - result already collected: FutureResult [13:13:46.045] result() for ClusterFuture ... done [13:13:46.045] result() for ClusterFuture ... [13:13:46.045] - result already collected: FutureResult [13:13:46.045] result() for ClusterFuture ... done [13:13:46.045] - relayed: [n=2] TRUE, FALSE [13:13:46.045] - queued futures: [n=2] TRUE, FALSE [13:13:46.046] signalConditionsASAP(MultisessionFuture, pos=1) ... done [13:13:46.046] length: 1 (resolved future 1) [13:13:46.046] Future #2 [13:13:46.046] result() for ClusterFuture ... [13:13:46.046] - result already collected: FutureResult [13:13:46.047] result() for ClusterFuture ... done [13:13:46.047] result() for ClusterFuture ... [13:13:46.047] - result already collected: FutureResult [13:13:46.047] result() for ClusterFuture ... done [13:13:46.047] signalConditionsASAP(MultisessionFuture, pos=2) ... [13:13:46.047] - nx: 2 [13:13:46.048] - relay: TRUE [13:13:46.048] - stdout: TRUE [13:13:46.048] - signal: TRUE [13:13:46.048] - resignal: FALSE [13:13:46.048] - force: TRUE [13:13:46.048] - relayed: [n=2] TRUE, FALSE [13:13:46.049] - queued futures: [n=2] TRUE, FALSE [13:13:46.049] - until=2 [13:13:46.049] - relaying element #2 [13:13:46.049] result() for ClusterFuture ... [13:13:46.049] - result already collected: FutureResult [13:13:46.049] result() for ClusterFuture ... done [13:13:46.050] result() for ClusterFuture ... [13:13:46.050] - result already collected: FutureResult [13:13:46.050] result() for ClusterFuture ... done [13:13:46.050] result() for ClusterFuture ... [13:13:46.050] - result already collected: FutureResult [13:13:46.050] result() for ClusterFuture ... done [13:13:46.051] result() for ClusterFuture ... [13:13:46.051] - result already collected: FutureResult [13:13:46.051] result() for ClusterFuture ... done [13:13:46.051] - relayed: [n=2] TRUE, TRUE [13:13:46.051] - queued futures: [n=2] TRUE, TRUE [13:13:46.051] signalConditionsASAP(MultisessionFuture, pos=2) ... done [13:13:46.052] length: 0 (resolved future 2) [13:13:46.052] Relaying remaining futures [13:13:46.052] signalConditionsASAP(NULL, pos=0) ... [13:13:46.052] - nx: 2 [13:13:46.052] - relay: TRUE [13:13:46.052] - stdout: TRUE [13:13:46.052] - signal: TRUE [13:13:46.053] - resignal: FALSE [13:13:46.053] - force: TRUE [13:13:46.053] - relayed: [n=2] TRUE, TRUE [13:13:46.053] - queued futures: [n=2] TRUE, TRUE - flush all [13:13:46.053] - relayed: [n=2] TRUE, TRUE [13:13:46.053] - queued futures: [n=2] TRUE, TRUE [13:13:46.054] signalConditionsASAP(NULL, pos=0) ... done [13:13:46.054] resolve() on list ... DONE [13:13:46.054] result() for ClusterFuture ... [13:13:46.054] - result already collected: FutureResult [13:13:46.054] result() for ClusterFuture ... done [13:13:46.054] result() for ClusterFuture ... [13:13:46.055] - result already collected: FutureResult [13:13:46.055] result() for ClusterFuture ... done [13:13:46.055] result() for ClusterFuture ... [13:13:46.055] - result already collected: FutureResult [13:13:46.055] result() for ClusterFuture ... done [13:13:46.055] result() for ClusterFuture ... [13:13:46.055] - result already collected: FutureResult [13:13:46.056] result() for ClusterFuture ... done [13:13:46.056] - Number of value chunks collected: 2 [13:13:46.056] Resolving 2 futures (chunks) ... DONE [13:13:46.056] Reducing values from 2 chunks ... [13:13:46.056] - Number of values collected after concatenation: 4 [13:13:46.056] - Number of values expected: 4 [13:13:46.057] Reducing values from 2 chunks ... DONE [13:13:46.057] 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 [13:13:46.059] future_lapply() ... [13:13:46.062] Number of chunks: 2 [13:13:46.062] getGlobalsAndPackagesXApply() ... [13:13:46.063] - future.globals: TRUE [13:13:46.063] getGlobalsAndPackages() ... [13:13:46.063] Searching for globals... [13:13:46.064] - globals found: [2] 'FUN', '.Internal' [13:13:46.064] Searching for globals ... DONE [13:13:46.065] Resolving globals: FALSE [13:13:46.065] The total size of the 1 globals is 2.13 KiB (2184 bytes) [13:13: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') [13:13:46.066] - globals: [1] 'FUN' [13:13:46.066] [13:13:46.066] getGlobalsAndPackages() ... DONE [13:13:46.066] - globals found/used: [n=1] 'FUN' [13:13:46.066] - needed namespaces: [n=0] [13:13:46.066] Finding globals ... DONE [13:13:46.067] - use_args: TRUE [13:13:46.067] - Getting '...' globals ... [13:13:46.067] resolve() on list ... [13:13:46.067] recursive: 0 [13:13:46.068] length: 1 [13:13:46.068] elements: '...' [13:13:46.068] length: 0 (resolved future 1) [13:13:46.068] resolve() on list ... DONE [13:13:46.068] - '...' content: [n=1] 'length' [13:13:46.068] List of 1 [13:13:46.068] $ ...:List of 1 [13:13:46.068] ..$ length: int 2 [13:13:46.068] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:46.068] - attr(*, "where")=List of 1 [13:13:46.068] ..$ ...: [13:13:46.068] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:46.068] - attr(*, "resolved")= logi TRUE [13:13:46.068] - attr(*, "total_size")= num NA [13:13:46.072] - Getting '...' globals ... DONE [13:13:46.072] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:46.073] List of 2 [13:13:46.073] $ ...future.FUN:function (mode = "logical", length = 0L) [13:13:46.073] $ ... :List of 1 [13:13:46.073] ..$ length: int 2 [13:13:46.073] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:46.073] - attr(*, "where")=List of 2 [13:13:46.073] ..$ ...future.FUN: [13:13:46.073] ..$ ... : [13:13:46.073] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:46.073] - attr(*, "resolved")= logi FALSE [13:13:46.073] - attr(*, "total_size")= num 2240 [13:13:46.076] Packages to be attached in all futures: [n=0] [13:13:46.076] getGlobalsAndPackagesXApply() ... DONE [13:13:46.077] Number of futures (= number of chunks): 2 [13:13:46.077] Launching 2 futures (chunks) ... [13:13:46.077] Chunk #1 of 2 ... [13:13:46.077] - Finding globals in 'X' for chunk #1 ... [13:13:46.077] getGlobalsAndPackages() ... [13:13:46.078] Searching for globals... [13:13:46.078] [13:13:46.078] Searching for globals ... DONE [13:13:46.078] - globals: [0] [13:13:46.078] getGlobalsAndPackages() ... DONE [13:13:46.079] + additional globals found: [n=0] [13:13:46.079] + additional namespaces needed: [n=0] [13:13:46.079] - Finding globals in 'X' for chunk #1 ... DONE [13:13:46.079] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:13:46.079] - seeds: [13:13:46.079] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:46.080] getGlobalsAndPackages() ... [13:13:46.080] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:46.080] Resolving globals: FALSE [13:13:46.080] Tweak future expression to call with '...' arguments ... [13:13:46.080] { [13:13:46.080] do.call(function(...) { [13:13:46.080] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:46.080] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:46.080] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:46.080] on.exit(options(oopts), add = TRUE) [13:13:46.080] } [13:13:46.080] { [13:13:46.080] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:46.080] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:46.080] ...future.FUN(...future.X_jj, ...) [13:13:46.080] }) [13:13:46.080] } [13:13:46.080] }, args = future.call.arguments) [13:13:46.080] } [13:13:46.081] Tweak future expression to call with '...' arguments ... DONE [13:13:46.081] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:46.081] [13:13:46.081] getGlobalsAndPackages() ... DONE [13:13:46.082] run() for 'Future' ... [13:13:46.082] - state: 'created' [13:13:46.082] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:46.096] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:46.096] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:13:46.096] - Field: 'node' [13:13:46.096] - Field: 'label' [13:13:46.097] - Field: 'local' [13:13:46.097] - Field: 'owner' [13:13:46.097] - Field: 'envir' [13:13:46.097] - Field: 'workers' [13:13:46.097] - Field: 'packages' [13:13:46.097] - Field: 'gc' [13:13:46.098] - Field: 'conditions' [13:13:46.098] - Field: 'persistent' [13:13:46.098] - Field: 'expr' [13:13:46.098] - Field: 'uuid' [13:13:46.098] - Field: 'seed' [13:13:46.098] - Field: 'version' [13:13:46.099] - Field: 'result' [13:13:46.099] - Field: 'asynchronous' [13:13:46.099] - Field: 'calls' [13:13:46.099] - Field: 'globals' [13:13:46.099] - Field: 'stdout' [13:13:46.100] - Field: 'earlySignal' [13:13:46.100] - Field: 'lazy' [13:13:46.100] - Field: 'state' [13:13:46.100] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:13:46.100] - Launch lazy future ... [13:13:46.101] Packages needed by the future expression (n = 0): [13:13:46.101] Packages needed by future strategies (n = 0): [13:13:46.101] { [13:13:46.101] { [13:13:46.101] { [13:13:46.101] ...future.startTime <- base::Sys.time() [13:13:46.101] { [13:13:46.101] { [13:13:46.101] { [13:13:46.101] { [13:13:46.101] base::local({ [13:13:46.101] has_future <- base::requireNamespace("future", [13:13:46.101] quietly = TRUE) [13:13:46.101] if (has_future) { [13:13:46.101] ns <- base::getNamespace("future") [13:13:46.101] version <- ns[[".package"]][["version"]] [13:13:46.101] if (is.null(version)) [13:13:46.101] version <- utils::packageVersion("future") [13:13:46.101] } [13:13:46.101] else { [13:13:46.101] version <- NULL [13:13:46.101] } [13:13:46.101] if (!has_future || version < "1.8.0") { [13:13:46.101] info <- base::c(r_version = base::gsub("R version ", [13:13:46.101] "", base::R.version$version.string), [13:13:46.101] platform = base::sprintf("%s (%s-bit)", [13:13:46.101] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:46.101] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:46.101] "release", "version")], collapse = " "), [13:13:46.101] hostname = base::Sys.info()[["nodename"]]) [13:13:46.101] info <- base::sprintf("%s: %s", base::names(info), [13:13:46.101] info) [13:13:46.101] info <- base::paste(info, collapse = "; ") [13:13:46.101] if (!has_future) { [13:13:46.101] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:46.101] info) [13:13:46.101] } [13:13:46.101] else { [13:13:46.101] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:46.101] info, version) [13:13:46.101] } [13:13:46.101] base::stop(msg) [13:13:46.101] } [13:13:46.101] }) [13:13:46.101] } [13:13:46.101] ...future.mc.cores.old <- base::getOption("mc.cores") [13:13:46.101] base::options(mc.cores = 1L) [13:13:46.101] } [13:13:46.101] options(future.plan = NULL) [13:13:46.101] Sys.unsetenv("R_FUTURE_PLAN") [13:13:46.101] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:46.101] } [13:13:46.101] ...future.workdir <- getwd() [13:13:46.101] } [13:13:46.101] ...future.oldOptions <- base::as.list(base::.Options) [13:13:46.101] ...future.oldEnvVars <- base::Sys.getenv() [13:13:46.101] } [13:13:46.101] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:46.101] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:13:46.101] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:46.101] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:46.101] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:46.101] future.stdout.windows.reencode = NULL, width = 80L) [13:13:46.101] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:46.101] base::names(...future.oldOptions)) [13:13:46.101] } [13:13:46.101] if (FALSE) { [13:13:46.101] } [13:13:46.101] else { [13:13:46.101] if (TRUE) { [13:13:46.101] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:46.101] open = "w") [13:13:46.101] } [13:13:46.101] else { [13:13:46.101] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:46.101] windows = "NUL", "/dev/null"), open = "w") [13:13:46.101] } [13:13:46.101] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:46.101] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:46.101] base::sink(type = "output", split = FALSE) [13:13:46.101] base::close(...future.stdout) [13:13:46.101] }, add = TRUE) [13:13:46.101] } [13:13:46.101] ...future.frame <- base::sys.nframe() [13:13:46.101] ...future.conditions <- base::list() [13:13:46.101] ...future.rng <- base::globalenv()$.Random.seed [13:13:46.101] if (FALSE) { [13:13:46.101] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:46.101] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:46.101] } [13:13:46.101] ...future.result <- base::tryCatch({ [13:13:46.101] base::withCallingHandlers({ [13:13:46.101] ...future.value <- base::withVisible(base::local({ [13:13:46.101] ...future.makeSendCondition <- local({ [13:13:46.101] sendCondition <- NULL [13:13:46.101] function(frame = 1L) { [13:13:46.101] if (is.function(sendCondition)) [13:13:46.101] return(sendCondition) [13:13:46.101] ns <- getNamespace("parallel") [13:13:46.101] if (exists("sendData", mode = "function", [13:13:46.101] envir = ns)) { [13:13:46.101] parallel_sendData <- get("sendData", mode = "function", [13:13:46.101] envir = ns) [13:13:46.101] envir <- sys.frame(frame) [13:13:46.101] master <- NULL [13:13:46.101] while (!identical(envir, .GlobalEnv) && [13:13:46.101] !identical(envir, emptyenv())) { [13:13:46.101] if (exists("master", mode = "list", envir = envir, [13:13:46.101] inherits = FALSE)) { [13:13:46.101] master <- get("master", mode = "list", [13:13:46.101] envir = envir, inherits = FALSE) [13:13:46.101] if (inherits(master, c("SOCKnode", [13:13:46.101] "SOCK0node"))) { [13:13:46.101] sendCondition <<- function(cond) { [13:13:46.101] data <- list(type = "VALUE", value = cond, [13:13:46.101] success = TRUE) [13:13:46.101] parallel_sendData(master, data) [13:13:46.101] } [13:13:46.101] return(sendCondition) [13:13:46.101] } [13:13:46.101] } [13:13:46.101] frame <- frame + 1L [13:13:46.101] envir <- sys.frame(frame) [13:13:46.101] } [13:13:46.101] } [13:13:46.101] sendCondition <<- function(cond) NULL [13:13:46.101] } [13:13:46.101] }) [13:13:46.101] withCallingHandlers({ [13:13:46.101] { [13:13:46.101] do.call(function(...) { [13:13:46.101] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:46.101] if (!identical(...future.globals.maxSize.org, [13:13:46.101] ...future.globals.maxSize)) { [13:13:46.101] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:46.101] on.exit(options(oopts), add = TRUE) [13:13:46.101] } [13:13:46.101] { [13:13:46.101] lapply(seq_along(...future.elements_ii), [13:13:46.101] FUN = function(jj) { [13:13:46.101] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:46.101] ...future.FUN(...future.X_jj, ...) [13:13:46.101] }) [13:13:46.101] } [13:13:46.101] }, args = future.call.arguments) [13:13:46.101] } [13:13:46.101] }, immediateCondition = function(cond) { [13:13:46.101] sendCondition <- ...future.makeSendCondition() [13:13:46.101] sendCondition(cond) [13:13:46.101] muffleCondition <- function (cond, pattern = "^muffle") [13:13:46.101] { [13:13:46.101] inherits <- base::inherits [13:13:46.101] invokeRestart <- base::invokeRestart [13:13:46.101] is.null <- base::is.null [13:13:46.101] muffled <- FALSE [13:13:46.101] if (inherits(cond, "message")) { [13:13:46.101] muffled <- grepl(pattern, "muffleMessage") [13:13:46.101] if (muffled) [13:13:46.101] invokeRestart("muffleMessage") [13:13:46.101] } [13:13:46.101] else if (inherits(cond, "warning")) { [13:13:46.101] muffled <- grepl(pattern, "muffleWarning") [13:13:46.101] if (muffled) [13:13:46.101] invokeRestart("muffleWarning") [13:13:46.101] } [13:13:46.101] else if (inherits(cond, "condition")) { [13:13:46.101] if (!is.null(pattern)) { [13:13:46.101] computeRestarts <- base::computeRestarts [13:13:46.101] grepl <- base::grepl [13:13:46.101] restarts <- computeRestarts(cond) [13:13:46.101] for (restart in restarts) { [13:13:46.101] name <- restart$name [13:13:46.101] if (is.null(name)) [13:13:46.101] next [13:13:46.101] if (!grepl(pattern, name)) [13:13:46.101] next [13:13:46.101] invokeRestart(restart) [13:13:46.101] muffled <- TRUE [13:13:46.101] break [13:13:46.101] } [13:13:46.101] } [13:13:46.101] } [13:13:46.101] invisible(muffled) [13:13:46.101] } [13:13:46.101] muffleCondition(cond) [13:13:46.101] }) [13:13:46.101] })) [13:13:46.101] future::FutureResult(value = ...future.value$value, [13:13:46.101] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:46.101] ...future.rng), globalenv = if (FALSE) [13:13:46.101] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:46.101] ...future.globalenv.names)) [13:13:46.101] else NULL, started = ...future.startTime, version = "1.8") [13:13:46.101] }, condition = base::local({ [13:13:46.101] c <- base::c [13:13:46.101] inherits <- base::inherits [13:13:46.101] invokeRestart <- base::invokeRestart [13:13:46.101] length <- base::length [13:13:46.101] list <- base::list [13:13:46.101] seq.int <- base::seq.int [13:13:46.101] signalCondition <- base::signalCondition [13:13:46.101] sys.calls <- base::sys.calls [13:13:46.101] `[[` <- base::`[[` [13:13:46.101] `+` <- base::`+` [13:13:46.101] `<<-` <- base::`<<-` [13:13:46.101] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:46.101] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:46.101] 3L)] [13:13:46.101] } [13:13:46.101] function(cond) { [13:13:46.101] is_error <- inherits(cond, "error") [13:13:46.101] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:46.101] NULL) [13:13:46.101] if (is_error) { [13:13:46.101] sessionInformation <- function() { [13:13:46.101] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:46.101] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:46.101] search = base::search(), system = base::Sys.info()) [13:13:46.101] } [13:13:46.101] ...future.conditions[[length(...future.conditions) + [13:13:46.101] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:46.101] cond$call), session = sessionInformation(), [13:13:46.101] timestamp = base::Sys.time(), signaled = 0L) [13:13:46.101] signalCondition(cond) [13:13:46.101] } [13:13:46.101] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:46.101] "immediateCondition"))) { [13:13:46.101] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:46.101] ...future.conditions[[length(...future.conditions) + [13:13:46.101] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:46.101] if (TRUE && !signal) { [13:13:46.101] muffleCondition <- function (cond, pattern = "^muffle") [13:13:46.101] { [13:13:46.101] inherits <- base::inherits [13:13:46.101] invokeRestart <- base::invokeRestart [13:13:46.101] is.null <- base::is.null [13:13:46.101] muffled <- FALSE [13:13:46.101] if (inherits(cond, "message")) { [13:13:46.101] muffled <- grepl(pattern, "muffleMessage") [13:13:46.101] if (muffled) [13:13:46.101] invokeRestart("muffleMessage") [13:13:46.101] } [13:13:46.101] else if (inherits(cond, "warning")) { [13:13:46.101] muffled <- grepl(pattern, "muffleWarning") [13:13:46.101] if (muffled) [13:13:46.101] invokeRestart("muffleWarning") [13:13:46.101] } [13:13:46.101] else if (inherits(cond, "condition")) { [13:13:46.101] if (!is.null(pattern)) { [13:13:46.101] computeRestarts <- base::computeRestarts [13:13:46.101] grepl <- base::grepl [13:13:46.101] restarts <- computeRestarts(cond) [13:13:46.101] for (restart in restarts) { [13:13:46.101] name <- restart$name [13:13:46.101] if (is.null(name)) [13:13:46.101] next [13:13:46.101] if (!grepl(pattern, name)) [13:13:46.101] next [13:13:46.101] invokeRestart(restart) [13:13:46.101] muffled <- TRUE [13:13:46.101] break [13:13:46.101] } [13:13:46.101] } [13:13:46.101] } [13:13:46.101] invisible(muffled) [13:13:46.101] } [13:13:46.101] muffleCondition(cond, pattern = "^muffle") [13:13:46.101] } [13:13:46.101] } [13:13:46.101] else { [13:13:46.101] if (TRUE) { [13:13:46.101] muffleCondition <- function (cond, pattern = "^muffle") [13:13:46.101] { [13:13:46.101] inherits <- base::inherits [13:13:46.101] invokeRestart <- base::invokeRestart [13:13:46.101] is.null <- base::is.null [13:13:46.101] muffled <- FALSE [13:13:46.101] if (inherits(cond, "message")) { [13:13:46.101] muffled <- grepl(pattern, "muffleMessage") [13:13:46.101] if (muffled) [13:13:46.101] invokeRestart("muffleMessage") [13:13:46.101] } [13:13:46.101] else if (inherits(cond, "warning")) { [13:13:46.101] muffled <- grepl(pattern, "muffleWarning") [13:13:46.101] if (muffled) [13:13:46.101] invokeRestart("muffleWarning") [13:13:46.101] } [13:13:46.101] else if (inherits(cond, "condition")) { [13:13:46.101] if (!is.null(pattern)) { [13:13:46.101] computeRestarts <- base::computeRestarts [13:13:46.101] grepl <- base::grepl [13:13:46.101] restarts <- computeRestarts(cond) [13:13:46.101] for (restart in restarts) { [13:13:46.101] name <- restart$name [13:13:46.101] if (is.null(name)) [13:13:46.101] next [13:13:46.101] if (!grepl(pattern, name)) [13:13:46.101] next [13:13:46.101] invokeRestart(restart) [13:13:46.101] muffled <- TRUE [13:13:46.101] break [13:13:46.101] } [13:13:46.101] } [13:13:46.101] } [13:13:46.101] invisible(muffled) [13:13:46.101] } [13:13:46.101] muffleCondition(cond, pattern = "^muffle") [13:13:46.101] } [13:13:46.101] } [13:13:46.101] } [13:13:46.101] })) [13:13:46.101] }, error = function(ex) { [13:13:46.101] base::structure(base::list(value = NULL, visible = NULL, [13:13:46.101] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:46.101] ...future.rng), started = ...future.startTime, [13:13:46.101] finished = Sys.time(), session_uuid = NA_character_, [13:13:46.101] version = "1.8"), class = "FutureResult") [13:13:46.101] }, finally = { [13:13:46.101] if (!identical(...future.workdir, getwd())) [13:13:46.101] setwd(...future.workdir) [13:13:46.101] { [13:13:46.101] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:46.101] ...future.oldOptions$nwarnings <- NULL [13:13:46.101] } [13:13:46.101] base::options(...future.oldOptions) [13:13:46.101] if (.Platform$OS.type == "windows") { [13:13:46.101] old_names <- names(...future.oldEnvVars) [13:13:46.101] envs <- base::Sys.getenv() [13:13:46.101] names <- names(envs) [13:13:46.101] common <- intersect(names, old_names) [13:13:46.101] added <- setdiff(names, old_names) [13:13:46.101] removed <- setdiff(old_names, names) [13:13:46.101] changed <- common[...future.oldEnvVars[common] != [13:13:46.101] envs[common]] [13:13:46.101] NAMES <- toupper(changed) [13:13:46.101] args <- list() [13:13:46.101] for (kk in seq_along(NAMES)) { [13:13:46.101] name <- changed[[kk]] [13:13:46.101] NAME <- NAMES[[kk]] [13:13:46.101] if (name != NAME && is.element(NAME, old_names)) [13:13:46.101] next [13:13:46.101] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:46.101] } [13:13:46.101] NAMES <- toupper(added) [13:13:46.101] for (kk in seq_along(NAMES)) { [13:13:46.101] name <- added[[kk]] [13:13:46.101] NAME <- NAMES[[kk]] [13:13:46.101] if (name != NAME && is.element(NAME, old_names)) [13:13:46.101] next [13:13:46.101] args[[name]] <- "" [13:13:46.101] } [13:13:46.101] NAMES <- toupper(removed) [13:13:46.101] for (kk in seq_along(NAMES)) { [13:13:46.101] name <- removed[[kk]] [13:13:46.101] NAME <- NAMES[[kk]] [13:13:46.101] if (name != NAME && is.element(NAME, old_names)) [13:13:46.101] next [13:13:46.101] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:46.101] } [13:13:46.101] if (length(args) > 0) [13:13:46.101] base::do.call(base::Sys.setenv, args = args) [13:13:46.101] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:46.101] } [13:13:46.101] else { [13:13:46.101] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:46.101] } [13:13:46.101] { [13:13:46.101] if (base::length(...future.futureOptionsAdded) > [13:13:46.101] 0L) { [13:13:46.101] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:46.101] base::names(opts) <- ...future.futureOptionsAdded [13:13:46.101] base::options(opts) [13:13:46.101] } [13:13:46.101] { [13:13:46.101] { [13:13:46.101] base::options(mc.cores = ...future.mc.cores.old) [13:13:46.101] NULL [13:13:46.101] } [13:13:46.101] options(future.plan = NULL) [13:13:46.101] if (is.na(NA_character_)) [13:13:46.101] Sys.unsetenv("R_FUTURE_PLAN") [13:13:46.101] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:46.101] future::plan(list(function (..., workers = availableCores(), [13:13:46.101] lazy = FALSE, rscript_libs = .libPaths(), [13:13:46.101] envir = parent.frame()) [13:13:46.101] { [13:13:46.101] if (is.function(workers)) [13:13:46.101] workers <- workers() [13:13:46.101] workers <- structure(as.integer(workers), [13:13:46.101] class = class(workers)) [13:13:46.101] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:46.101] workers >= 1) [13:13:46.101] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:46.101] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:46.101] } [13:13:46.101] future <- MultisessionFuture(..., workers = workers, [13:13:46.101] lazy = lazy, rscript_libs = rscript_libs, [13:13:46.101] envir = envir) [13:13:46.101] if (!future$lazy) [13:13:46.101] future <- run(future) [13:13:46.101] invisible(future) [13:13:46.101] }), .cleanup = FALSE, .init = FALSE) [13:13:46.101] } [13:13:46.101] } [13:13:46.101] } [13:13:46.101] }) [13:13:46.101] if (TRUE) { [13:13:46.101] base::sink(type = "output", split = FALSE) [13:13:46.101] if (TRUE) { [13:13:46.101] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:46.101] } [13:13:46.101] else { [13:13:46.101] ...future.result["stdout"] <- base::list(NULL) [13:13:46.101] } [13:13:46.101] base::close(...future.stdout) [13:13:46.101] ...future.stdout <- NULL [13:13:46.101] } [13:13:46.101] ...future.result$conditions <- ...future.conditions [13:13:46.101] ...future.result$finished <- base::Sys.time() [13:13:46.101] ...future.result [13:13:46.101] } [13:13:46.107] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... [13:13:46.107] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... [13:13:46.107] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... DONE [13:13:46.108] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... [13:13:46.108] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... DONE [13:13:46.108] Exporting '...future.elements_ii' (224 bytes) to cluster node #1 ... [13:13:46.109] Exporting '...future.elements_ii' (224 bytes) to cluster node #1 ... DONE [13:13:46.109] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:13:46.109] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:13:46.110] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:13:46.110] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:13:46.110] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... DONE [13:13:46.111] MultisessionFuture started [13:13:46.111] - Launch lazy future ... done [13:13:46.111] run() for 'MultisessionFuture' ... done [13:13:46.111] Created future: [13:13:46.127] receiveMessageFromWorker() for ClusterFuture ... [13:13:46.128] - Validating connection of MultisessionFuture [13:13:46.128] - received message: FutureResult [13:13:46.128] - Received FutureResult [13:13:46.128] - Erased future from FutureRegistry [13:13:46.128] result() for ClusterFuture ... [13:13:46.129] - result already collected: FutureResult [13:13:46.129] result() for ClusterFuture ... done [13:13:46.129] receiveMessageFromWorker() for ClusterFuture ... done [13:13:46.112] MultisessionFuture: [13:13:46.112] Label: 'future_lapply-1' [13:13:46.112] Expression: [13:13:46.112] { [13:13:46.112] do.call(function(...) { [13:13:46.112] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:46.112] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:46.112] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:46.112] on.exit(options(oopts), add = TRUE) [13:13:46.112] } [13:13:46.112] { [13:13:46.112] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:46.112] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:46.112] ...future.FUN(...future.X_jj, ...) [13:13:46.112] }) [13:13:46.112] } [13:13:46.112] }, args = future.call.arguments) [13:13:46.112] } [13:13:46.112] Lazy evaluation: FALSE [13:13:46.112] Asynchronous evaluation: TRUE [13:13:46.112] Local evaluation: TRUE [13:13:46.112] Environment: R_GlobalEnv [13:13:46.112] Capture standard output: TRUE [13:13:46.112] Capture condition classes: 'condition' (excluding 'nothing') [13:13:46.112] 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) [13:13:46.112] Packages: [13:13:46.112] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:46.112] Resolved: TRUE [13:13:46.112] Value: [13:13:46.112] Conditions captured: [13:13:46.112] Early signaling: FALSE [13:13:46.112] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:46.112] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:46.129] Chunk #1 of 2 ... DONE [13:13:46.129] Chunk #2 of 2 ... [13:13:46.130] - Finding globals in 'X' for chunk #2 ... [13:13:46.130] getGlobalsAndPackages() ... [13:13:46.130] Searching for globals... [13:13:46.130] [13:13:46.130] Searching for globals ... DONE [13:13:46.131] - globals: [0] [13:13:46.131] getGlobalsAndPackages() ... DONE [13:13:46.131] + additional globals found: [n=0] [13:13:46.131] + additional namespaces needed: [n=0] [13:13:46.131] - Finding globals in 'X' for chunk #2 ... DONE [13:13:46.131] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:13:46.132] - seeds: [13:13:46.132] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:46.132] getGlobalsAndPackages() ... [13:13:46.132] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:46.132] Resolving globals: FALSE [13:13:46.132] Tweak future expression to call with '...' arguments ... [13:13:46.133] { [13:13:46.133] do.call(function(...) { [13:13:46.133] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:46.133] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:46.133] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:46.133] on.exit(options(oopts), add = TRUE) [13:13:46.133] } [13:13:46.133] { [13:13:46.133] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:46.133] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:46.133] ...future.FUN(...future.X_jj, ...) [13:13:46.133] }) [13:13:46.133] } [13:13:46.133] }, args = future.call.arguments) [13:13:46.133] } [13:13:46.133] Tweak future expression to call with '...' arguments ... DONE [13:13:46.134] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:46.134] [13:13:46.134] getGlobalsAndPackages() ... DONE [13:13:46.134] run() for 'Future' ... [13:13:46.134] - state: 'created' [13:13:46.135] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:46.149] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:46.149] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:13:46.149] - Field: 'node' [13:13:46.149] - Field: 'label' [13:13:46.150] - Field: 'local' [13:13:46.150] - Field: 'owner' [13:13:46.150] - Field: 'envir' [13:13:46.150] - Field: 'workers' [13:13:46.150] - Field: 'packages' [13:13:46.151] - Field: 'gc' [13:13:46.151] - Field: 'conditions' [13:13:46.151] - Field: 'persistent' [13:13:46.151] - Field: 'expr' [13:13:46.151] - Field: 'uuid' [13:13:46.151] - Field: 'seed' [13:13:46.152] - Field: 'version' [13:13:46.152] - Field: 'result' [13:13:46.152] - Field: 'asynchronous' [13:13:46.152] - Field: 'calls' [13:13:46.152] - Field: 'globals' [13:13:46.152] - Field: 'stdout' [13:13:46.153] - Field: 'earlySignal' [13:13:46.153] - Field: 'lazy' [13:13:46.153] - Field: 'state' [13:13:46.153] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:13:46.153] - Launch lazy future ... [13:13:46.154] Packages needed by the future expression (n = 0): [13:13:46.154] Packages needed by future strategies (n = 0): [13:13:46.154] { [13:13:46.154] { [13:13:46.154] { [13:13:46.154] ...future.startTime <- base::Sys.time() [13:13:46.154] { [13:13:46.154] { [13:13:46.154] { [13:13:46.154] { [13:13:46.154] base::local({ [13:13:46.154] has_future <- base::requireNamespace("future", [13:13:46.154] quietly = TRUE) [13:13:46.154] if (has_future) { [13:13:46.154] ns <- base::getNamespace("future") [13:13:46.154] version <- ns[[".package"]][["version"]] [13:13:46.154] if (is.null(version)) [13:13:46.154] version <- utils::packageVersion("future") [13:13:46.154] } [13:13:46.154] else { [13:13:46.154] version <- NULL [13:13:46.154] } [13:13:46.154] if (!has_future || version < "1.8.0") { [13:13:46.154] info <- base::c(r_version = base::gsub("R version ", [13:13:46.154] "", base::R.version$version.string), [13:13:46.154] platform = base::sprintf("%s (%s-bit)", [13:13:46.154] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:46.154] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:46.154] "release", "version")], collapse = " "), [13:13:46.154] hostname = base::Sys.info()[["nodename"]]) [13:13:46.154] info <- base::sprintf("%s: %s", base::names(info), [13:13:46.154] info) [13:13:46.154] info <- base::paste(info, collapse = "; ") [13:13:46.154] if (!has_future) { [13:13:46.154] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:46.154] info) [13:13:46.154] } [13:13:46.154] else { [13:13:46.154] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:46.154] info, version) [13:13:46.154] } [13:13:46.154] base::stop(msg) [13:13:46.154] } [13:13:46.154] }) [13:13:46.154] } [13:13:46.154] ...future.mc.cores.old <- base::getOption("mc.cores") [13:13:46.154] base::options(mc.cores = 1L) [13:13:46.154] } [13:13:46.154] options(future.plan = NULL) [13:13:46.154] Sys.unsetenv("R_FUTURE_PLAN") [13:13:46.154] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:46.154] } [13:13:46.154] ...future.workdir <- getwd() [13:13:46.154] } [13:13:46.154] ...future.oldOptions <- base::as.list(base::.Options) [13:13:46.154] ...future.oldEnvVars <- base::Sys.getenv() [13:13:46.154] } [13:13:46.154] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:46.154] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:13:46.154] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:46.154] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:46.154] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:46.154] future.stdout.windows.reencode = NULL, width = 80L) [13:13:46.154] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:46.154] base::names(...future.oldOptions)) [13:13:46.154] } [13:13:46.154] if (FALSE) { [13:13:46.154] } [13:13:46.154] else { [13:13:46.154] if (TRUE) { [13:13:46.154] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:46.154] open = "w") [13:13:46.154] } [13:13:46.154] else { [13:13:46.154] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:46.154] windows = "NUL", "/dev/null"), open = "w") [13:13:46.154] } [13:13:46.154] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:46.154] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:46.154] base::sink(type = "output", split = FALSE) [13:13:46.154] base::close(...future.stdout) [13:13:46.154] }, add = TRUE) [13:13:46.154] } [13:13:46.154] ...future.frame <- base::sys.nframe() [13:13:46.154] ...future.conditions <- base::list() [13:13:46.154] ...future.rng <- base::globalenv()$.Random.seed [13:13:46.154] if (FALSE) { [13:13:46.154] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:46.154] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:46.154] } [13:13:46.154] ...future.result <- base::tryCatch({ [13:13:46.154] base::withCallingHandlers({ [13:13:46.154] ...future.value <- base::withVisible(base::local({ [13:13:46.154] ...future.makeSendCondition <- local({ [13:13:46.154] sendCondition <- NULL [13:13:46.154] function(frame = 1L) { [13:13:46.154] if (is.function(sendCondition)) [13:13:46.154] return(sendCondition) [13:13:46.154] ns <- getNamespace("parallel") [13:13:46.154] if (exists("sendData", mode = "function", [13:13:46.154] envir = ns)) { [13:13:46.154] parallel_sendData <- get("sendData", mode = "function", [13:13:46.154] envir = ns) [13:13:46.154] envir <- sys.frame(frame) [13:13:46.154] master <- NULL [13:13:46.154] while (!identical(envir, .GlobalEnv) && [13:13:46.154] !identical(envir, emptyenv())) { [13:13:46.154] if (exists("master", mode = "list", envir = envir, [13:13:46.154] inherits = FALSE)) { [13:13:46.154] master <- get("master", mode = "list", [13:13:46.154] envir = envir, inherits = FALSE) [13:13:46.154] if (inherits(master, c("SOCKnode", [13:13:46.154] "SOCK0node"))) { [13:13:46.154] sendCondition <<- function(cond) { [13:13:46.154] data <- list(type = "VALUE", value = cond, [13:13:46.154] success = TRUE) [13:13:46.154] parallel_sendData(master, data) [13:13:46.154] } [13:13:46.154] return(sendCondition) [13:13:46.154] } [13:13:46.154] } [13:13:46.154] frame <- frame + 1L [13:13:46.154] envir <- sys.frame(frame) [13:13:46.154] } [13:13:46.154] } [13:13:46.154] sendCondition <<- function(cond) NULL [13:13:46.154] } [13:13:46.154] }) [13:13:46.154] withCallingHandlers({ [13:13:46.154] { [13:13:46.154] do.call(function(...) { [13:13:46.154] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:46.154] if (!identical(...future.globals.maxSize.org, [13:13:46.154] ...future.globals.maxSize)) { [13:13:46.154] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:46.154] on.exit(options(oopts), add = TRUE) [13:13:46.154] } [13:13:46.154] { [13:13:46.154] lapply(seq_along(...future.elements_ii), [13:13:46.154] FUN = function(jj) { [13:13:46.154] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:46.154] ...future.FUN(...future.X_jj, ...) [13:13:46.154] }) [13:13:46.154] } [13:13:46.154] }, args = future.call.arguments) [13:13:46.154] } [13:13:46.154] }, immediateCondition = function(cond) { [13:13:46.154] sendCondition <- ...future.makeSendCondition() [13:13:46.154] sendCondition(cond) [13:13:46.154] muffleCondition <- function (cond, pattern = "^muffle") [13:13:46.154] { [13:13:46.154] inherits <- base::inherits [13:13:46.154] invokeRestart <- base::invokeRestart [13:13:46.154] is.null <- base::is.null [13:13:46.154] muffled <- FALSE [13:13:46.154] if (inherits(cond, "message")) { [13:13:46.154] muffled <- grepl(pattern, "muffleMessage") [13:13:46.154] if (muffled) [13:13:46.154] invokeRestart("muffleMessage") [13:13:46.154] } [13:13:46.154] else if (inherits(cond, "warning")) { [13:13:46.154] muffled <- grepl(pattern, "muffleWarning") [13:13:46.154] if (muffled) [13:13:46.154] invokeRestart("muffleWarning") [13:13:46.154] } [13:13:46.154] else if (inherits(cond, "condition")) { [13:13:46.154] if (!is.null(pattern)) { [13:13:46.154] computeRestarts <- base::computeRestarts [13:13:46.154] grepl <- base::grepl [13:13:46.154] restarts <- computeRestarts(cond) [13:13:46.154] for (restart in restarts) { [13:13:46.154] name <- restart$name [13:13:46.154] if (is.null(name)) [13:13:46.154] next [13:13:46.154] if (!grepl(pattern, name)) [13:13:46.154] next [13:13:46.154] invokeRestart(restart) [13:13:46.154] muffled <- TRUE [13:13:46.154] break [13:13:46.154] } [13:13:46.154] } [13:13:46.154] } [13:13:46.154] invisible(muffled) [13:13:46.154] } [13:13:46.154] muffleCondition(cond) [13:13:46.154] }) [13:13:46.154] })) [13:13:46.154] future::FutureResult(value = ...future.value$value, [13:13:46.154] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:46.154] ...future.rng), globalenv = if (FALSE) [13:13:46.154] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:46.154] ...future.globalenv.names)) [13:13:46.154] else NULL, started = ...future.startTime, version = "1.8") [13:13:46.154] }, condition = base::local({ [13:13:46.154] c <- base::c [13:13:46.154] inherits <- base::inherits [13:13:46.154] invokeRestart <- base::invokeRestart [13:13:46.154] length <- base::length [13:13:46.154] list <- base::list [13:13:46.154] seq.int <- base::seq.int [13:13:46.154] signalCondition <- base::signalCondition [13:13:46.154] sys.calls <- base::sys.calls [13:13:46.154] `[[` <- base::`[[` [13:13:46.154] `+` <- base::`+` [13:13:46.154] `<<-` <- base::`<<-` [13:13:46.154] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:46.154] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:46.154] 3L)] [13:13:46.154] } [13:13:46.154] function(cond) { [13:13:46.154] is_error <- inherits(cond, "error") [13:13:46.154] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:46.154] NULL) [13:13:46.154] if (is_error) { [13:13:46.154] sessionInformation <- function() { [13:13:46.154] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:46.154] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:46.154] search = base::search(), system = base::Sys.info()) [13:13:46.154] } [13:13:46.154] ...future.conditions[[length(...future.conditions) + [13:13:46.154] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:46.154] cond$call), session = sessionInformation(), [13:13:46.154] timestamp = base::Sys.time(), signaled = 0L) [13:13:46.154] signalCondition(cond) [13:13:46.154] } [13:13:46.154] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:46.154] "immediateCondition"))) { [13:13:46.154] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:46.154] ...future.conditions[[length(...future.conditions) + [13:13:46.154] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:46.154] if (TRUE && !signal) { [13:13:46.154] muffleCondition <- function (cond, pattern = "^muffle") [13:13:46.154] { [13:13:46.154] inherits <- base::inherits [13:13:46.154] invokeRestart <- base::invokeRestart [13:13:46.154] is.null <- base::is.null [13:13:46.154] muffled <- FALSE [13:13:46.154] if (inherits(cond, "message")) { [13:13:46.154] muffled <- grepl(pattern, "muffleMessage") [13:13:46.154] if (muffled) [13:13:46.154] invokeRestart("muffleMessage") [13:13:46.154] } [13:13:46.154] else if (inherits(cond, "warning")) { [13:13:46.154] muffled <- grepl(pattern, "muffleWarning") [13:13:46.154] if (muffled) [13:13:46.154] invokeRestart("muffleWarning") [13:13:46.154] } [13:13:46.154] else if (inherits(cond, "condition")) { [13:13:46.154] if (!is.null(pattern)) { [13:13:46.154] computeRestarts <- base::computeRestarts [13:13:46.154] grepl <- base::grepl [13:13:46.154] restarts <- computeRestarts(cond) [13:13:46.154] for (restart in restarts) { [13:13:46.154] name <- restart$name [13:13:46.154] if (is.null(name)) [13:13:46.154] next [13:13:46.154] if (!grepl(pattern, name)) [13:13:46.154] next [13:13:46.154] invokeRestart(restart) [13:13:46.154] muffled <- TRUE [13:13:46.154] break [13:13:46.154] } [13:13:46.154] } [13:13:46.154] } [13:13:46.154] invisible(muffled) [13:13:46.154] } [13:13:46.154] muffleCondition(cond, pattern = "^muffle") [13:13:46.154] } [13:13:46.154] } [13:13:46.154] else { [13:13:46.154] if (TRUE) { [13:13:46.154] muffleCondition <- function (cond, pattern = "^muffle") [13:13:46.154] { [13:13:46.154] inherits <- base::inherits [13:13:46.154] invokeRestart <- base::invokeRestart [13:13:46.154] is.null <- base::is.null [13:13:46.154] muffled <- FALSE [13:13:46.154] if (inherits(cond, "message")) { [13:13:46.154] muffled <- grepl(pattern, "muffleMessage") [13:13:46.154] if (muffled) [13:13:46.154] invokeRestart("muffleMessage") [13:13:46.154] } [13:13:46.154] else if (inherits(cond, "warning")) { [13:13:46.154] muffled <- grepl(pattern, "muffleWarning") [13:13:46.154] if (muffled) [13:13:46.154] invokeRestart("muffleWarning") [13:13:46.154] } [13:13:46.154] else if (inherits(cond, "condition")) { [13:13:46.154] if (!is.null(pattern)) { [13:13:46.154] computeRestarts <- base::computeRestarts [13:13:46.154] grepl <- base::grepl [13:13:46.154] restarts <- computeRestarts(cond) [13:13:46.154] for (restart in restarts) { [13:13:46.154] name <- restart$name [13:13:46.154] if (is.null(name)) [13:13:46.154] next [13:13:46.154] if (!grepl(pattern, name)) [13:13:46.154] next [13:13:46.154] invokeRestart(restart) [13:13:46.154] muffled <- TRUE [13:13:46.154] break [13:13:46.154] } [13:13:46.154] } [13:13:46.154] } [13:13:46.154] invisible(muffled) [13:13:46.154] } [13:13:46.154] muffleCondition(cond, pattern = "^muffle") [13:13:46.154] } [13:13:46.154] } [13:13:46.154] } [13:13:46.154] })) [13:13:46.154] }, error = function(ex) { [13:13:46.154] base::structure(base::list(value = NULL, visible = NULL, [13:13:46.154] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:46.154] ...future.rng), started = ...future.startTime, [13:13:46.154] finished = Sys.time(), session_uuid = NA_character_, [13:13:46.154] version = "1.8"), class = "FutureResult") [13:13:46.154] }, finally = { [13:13:46.154] if (!identical(...future.workdir, getwd())) [13:13:46.154] setwd(...future.workdir) [13:13:46.154] { [13:13:46.154] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:46.154] ...future.oldOptions$nwarnings <- NULL [13:13:46.154] } [13:13:46.154] base::options(...future.oldOptions) [13:13:46.154] if (.Platform$OS.type == "windows") { [13:13:46.154] old_names <- names(...future.oldEnvVars) [13:13:46.154] envs <- base::Sys.getenv() [13:13:46.154] names <- names(envs) [13:13:46.154] common <- intersect(names, old_names) [13:13:46.154] added <- setdiff(names, old_names) [13:13:46.154] removed <- setdiff(old_names, names) [13:13:46.154] changed <- common[...future.oldEnvVars[common] != [13:13:46.154] envs[common]] [13:13:46.154] NAMES <- toupper(changed) [13:13:46.154] args <- list() [13:13:46.154] for (kk in seq_along(NAMES)) { [13:13:46.154] name <- changed[[kk]] [13:13:46.154] NAME <- NAMES[[kk]] [13:13:46.154] if (name != NAME && is.element(NAME, old_names)) [13:13:46.154] next [13:13:46.154] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:46.154] } [13:13:46.154] NAMES <- toupper(added) [13:13:46.154] for (kk in seq_along(NAMES)) { [13:13:46.154] name <- added[[kk]] [13:13:46.154] NAME <- NAMES[[kk]] [13:13:46.154] if (name != NAME && is.element(NAME, old_names)) [13:13:46.154] next [13:13:46.154] args[[name]] <- "" [13:13:46.154] } [13:13:46.154] NAMES <- toupper(removed) [13:13:46.154] for (kk in seq_along(NAMES)) { [13:13:46.154] name <- removed[[kk]] [13:13:46.154] NAME <- NAMES[[kk]] [13:13:46.154] if (name != NAME && is.element(NAME, old_names)) [13:13:46.154] next [13:13:46.154] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:46.154] } [13:13:46.154] if (length(args) > 0) [13:13:46.154] base::do.call(base::Sys.setenv, args = args) [13:13:46.154] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:46.154] } [13:13:46.154] else { [13:13:46.154] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:46.154] } [13:13:46.154] { [13:13:46.154] if (base::length(...future.futureOptionsAdded) > [13:13:46.154] 0L) { [13:13:46.154] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:46.154] base::names(opts) <- ...future.futureOptionsAdded [13:13:46.154] base::options(opts) [13:13:46.154] } [13:13:46.154] { [13:13:46.154] { [13:13:46.154] base::options(mc.cores = ...future.mc.cores.old) [13:13:46.154] NULL [13:13:46.154] } [13:13:46.154] options(future.plan = NULL) [13:13:46.154] if (is.na(NA_character_)) [13:13:46.154] Sys.unsetenv("R_FUTURE_PLAN") [13:13:46.154] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:46.154] future::plan(list(function (..., workers = availableCores(), [13:13:46.154] lazy = FALSE, rscript_libs = .libPaths(), [13:13:46.154] envir = parent.frame()) [13:13:46.154] { [13:13:46.154] if (is.function(workers)) [13:13:46.154] workers <- workers() [13:13:46.154] workers <- structure(as.integer(workers), [13:13:46.154] class = class(workers)) [13:13:46.154] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:46.154] workers >= 1) [13:13:46.154] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:46.154] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:46.154] } [13:13:46.154] future <- MultisessionFuture(..., workers = workers, [13:13:46.154] lazy = lazy, rscript_libs = rscript_libs, [13:13:46.154] envir = envir) [13:13:46.154] if (!future$lazy) [13:13:46.154] future <- run(future) [13:13:46.154] invisible(future) [13:13:46.154] }), .cleanup = FALSE, .init = FALSE) [13:13:46.154] } [13:13:46.154] } [13:13:46.154] } [13:13:46.154] }) [13:13:46.154] if (TRUE) { [13:13:46.154] base::sink(type = "output", split = FALSE) [13:13:46.154] if (TRUE) { [13:13:46.154] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:46.154] } [13:13:46.154] else { [13:13:46.154] ...future.result["stdout"] <- base::list(NULL) [13:13:46.154] } [13:13:46.154] base::close(...future.stdout) [13:13:46.154] ...future.stdout <- NULL [13:13:46.154] } [13:13:46.154] ...future.result$conditions <- ...future.conditions [13:13:46.154] ...future.result$finished <- base::Sys.time() [13:13:46.154] ...future.result [13:13:46.154] } [13:13:46.160] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... [13:13:46.160] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... [13:13:46.160] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... DONE [13:13:46.161] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... [13:13:46.161] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... DONE [13:13:46.161] Exporting '...future.elements_ii' (232 bytes) to cluster node #1 ... [13:13:46.162] Exporting '...future.elements_ii' (232 bytes) to cluster node #1 ... DONE [13:13:46.162] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:13:46.162] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:13:46.163] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:13:46.163] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:13:46.163] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... DONE [13:13:46.164] MultisessionFuture started [13:13:46.164] - Launch lazy future ... done [13:13:46.164] run() for 'MultisessionFuture' ... done [13:13:46.164] Created future: [13:13:46.180] receiveMessageFromWorker() for ClusterFuture ... [13:13:46.180] - Validating connection of MultisessionFuture [13:13:46.181] - received message: FutureResult [13:13:46.181] - Received FutureResult [13:13:46.181] - Erased future from FutureRegistry [13:13:46.181] result() for ClusterFuture ... [13:13:46.181] - result already collected: FutureResult [13:13:46.182] result() for ClusterFuture ... done [13:13:46.182] receiveMessageFromWorker() for ClusterFuture ... done [13:13:46.165] MultisessionFuture: [13:13:46.165] Label: 'future_lapply-2' [13:13:46.165] Expression: [13:13:46.165] { [13:13:46.165] do.call(function(...) { [13:13:46.165] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:46.165] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:46.165] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:46.165] on.exit(options(oopts), add = TRUE) [13:13:46.165] } [13:13:46.165] { [13:13:46.165] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:46.165] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:46.165] ...future.FUN(...future.X_jj, ...) [13:13:46.165] }) [13:13:46.165] } [13:13:46.165] }, args = future.call.arguments) [13:13:46.165] } [13:13:46.165] Lazy evaluation: FALSE [13:13:46.165] Asynchronous evaluation: TRUE [13:13:46.165] Local evaluation: TRUE [13:13:46.165] Environment: R_GlobalEnv [13:13:46.165] Capture standard output: TRUE [13:13:46.165] Capture condition classes: 'condition' (excluding 'nothing') [13:13:46.165] 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) [13:13:46.165] Packages: [13:13:46.165] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:46.165] Resolved: TRUE [13:13:46.165] Value: [13:13:46.165] Conditions captured: [13:13:46.165] Early signaling: FALSE [13:13:46.165] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:46.165] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:46.182] Chunk #2 of 2 ... DONE [13:13:46.182] Launching 2 futures (chunks) ... DONE [13:13:46.183] Resolving 2 futures (chunks) ... [13:13:46.183] resolve() on list ... [13:13:46.183] recursive: 0 [13:13:46.183] length: 2 [13:13:46.183] [13:13:46.183] Future #1 [13:13:46.183] result() for ClusterFuture ... [13:13:46.184] - result already collected: FutureResult [13:13:46.184] result() for ClusterFuture ... done [13:13:46.184] result() for ClusterFuture ... [13:13:46.184] - result already collected: FutureResult [13:13:46.184] result() for ClusterFuture ... done [13:13:46.184] signalConditionsASAP(MultisessionFuture, pos=1) ... [13:13:46.185] - nx: 2 [13:13:46.185] - relay: TRUE [13:13:46.185] - stdout: TRUE [13:13:46.185] - signal: TRUE [13:13:46.185] - resignal: FALSE [13:13:46.185] - force: TRUE [13:13:46.186] - relayed: [n=2] FALSE, FALSE [13:13:46.186] - queued futures: [n=2] FALSE, FALSE [13:13:46.186] - until=1 [13:13:46.186] - relaying element #1 [13:13:46.186] result() for ClusterFuture ... [13:13:46.186] - result already collected: FutureResult [13:13:46.186] result() for ClusterFuture ... done [13:13:46.187] result() for ClusterFuture ... [13:13:46.187] - result already collected: FutureResult [13:13:46.187] result() for ClusterFuture ... done [13:13:46.187] result() for ClusterFuture ... [13:13:46.187] - result already collected: FutureResult [13:13:46.187] result() for ClusterFuture ... done [13:13:46.188] result() for ClusterFuture ... [13:13:46.188] - result already collected: FutureResult [13:13:46.188] result() for ClusterFuture ... done [13:13:46.188] - relayed: [n=2] TRUE, FALSE [13:13:46.188] - queued futures: [n=2] TRUE, FALSE [13:13:46.188] signalConditionsASAP(MultisessionFuture, pos=1) ... done [13:13:46.189] length: 1 (resolved future 1) [13:13:46.189] Future #2 [13:13:46.189] result() for ClusterFuture ... [13:13:46.189] - result already collected: FutureResult [13:13:46.189] result() for ClusterFuture ... done [13:13:46.189] result() for ClusterFuture ... [13:13:46.190] - result already collected: FutureResult [13:13:46.190] result() for ClusterFuture ... done [13:13:46.190] signalConditionsASAP(MultisessionFuture, pos=2) ... [13:13:46.190] - nx: 2 [13:13:46.190] - relay: TRUE [13:13:46.190] - stdout: TRUE [13:13:46.191] - signal: TRUE [13:13:46.191] - resignal: FALSE [13:13:46.191] - force: TRUE [13:13:46.191] - relayed: [n=2] TRUE, FALSE [13:13:46.191] - queued futures: [n=2] TRUE, FALSE [13:13:46.191] - until=2 [13:13:46.191] - relaying element #2 [13:13:46.192] result() for ClusterFuture ... [13:13:46.192] - result already collected: FutureResult [13:13:46.192] result() for ClusterFuture ... done [13:13:46.192] result() for ClusterFuture ... [13:13:46.192] - result already collected: FutureResult [13:13:46.195] result() for ClusterFuture ... done [13:13:46.195] result() for ClusterFuture ... [13:13:46.195] - result already collected: FutureResult [13:13:46.195] result() for ClusterFuture ... done [13:13:46.195] result() for ClusterFuture ... [13:13:46.196] - result already collected: FutureResult [13:13:46.196] result() for ClusterFuture ... done [13:13:46.196] - relayed: [n=2] TRUE, TRUE [13:13:46.196] - queued futures: [n=2] TRUE, TRUE [13:13:46.196] signalConditionsASAP(MultisessionFuture, pos=2) ... done [13:13:46.196] length: 0 (resolved future 2) [13:13:46.196] Relaying remaining futures [13:13:46.197] signalConditionsASAP(NULL, pos=0) ... [13:13:46.197] - nx: 2 [13:13:46.197] - relay: TRUE [13:13:46.197] - stdout: TRUE [13:13:46.197] - signal: TRUE [13:13:46.197] - resignal: FALSE [13:13:46.198] - force: TRUE [13:13:46.198] - relayed: [n=2] TRUE, TRUE [13:13:46.198] - queued futures: [n=2] TRUE, TRUE - flush all [13:13:46.198] - relayed: [n=2] TRUE, TRUE [13:13:46.198] - queued futures: [n=2] TRUE, TRUE [13:13:46.198] signalConditionsASAP(NULL, pos=0) ... done [13:13:46.199] resolve() on list ... DONE [13:13:46.199] result() for ClusterFuture ... [13:13:46.199] - result already collected: FutureResult [13:13:46.199] result() for ClusterFuture ... done [13:13:46.199] result() for ClusterFuture ... [13:13:46.199] - result already collected: FutureResult [13:13:46.199] result() for ClusterFuture ... done [13:13:46.200] result() for ClusterFuture ... [13:13:46.200] - result already collected: FutureResult [13:13:46.200] result() for ClusterFuture ... done [13:13:46.200] result() for ClusterFuture ... [13:13:46.200] - result already collected: FutureResult [13:13:46.200] result() for ClusterFuture ... done [13:13:46.201] - Number of value chunks collected: 2 [13:13:46.201] Resolving 2 futures (chunks) ... DONE [13:13:46.201] Reducing values from 2 chunks ... [13:13:46.201] - Number of values collected after concatenation: 4 [13:13:46.201] - Number of values expected: 4 [13:13:46.201] Reducing values from 2 chunks ... DONE [13:13:46.202] 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, ...) ... [13:13:46.204] future_lapply() ... [13:13:46.207] Number of chunks: 2 [13:13:46.207] getGlobalsAndPackagesXApply() ... [13:13:46.207] - future.globals: TRUE [13:13:46.208] getGlobalsAndPackages() ... [13:13:46.208] Searching for globals... [13:13:46.209] - globals found: [2] 'FUN', '.Internal' [13:13:46.209] Searching for globals ... DONE [13:13:46.210] Resolving globals: FALSE [13:13:46.210] The total size of the 1 globals is 2.13 KiB (2184 bytes) [13:13:46.210] 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') [13:13:46.211] - globals: [1] 'FUN' [13:13:46.211] [13:13:46.211] getGlobalsAndPackages() ... DONE [13:13:46.211] - globals found/used: [n=1] 'FUN' [13:13:46.211] - needed namespaces: [n=0] [13:13:46.211] Finding globals ... DONE [13:13:46.212] - use_args: TRUE [13:13:46.212] - Getting '...' globals ... [13:13:46.212] resolve() on list ... [13:13:46.212] recursive: 0 [13:13:46.212] length: 1 [13:13:46.213] elements: '...' [13:13:46.213] length: 0 (resolved future 1) [13:13:46.213] resolve() on list ... DONE [13:13:46.213] - '...' content: [n=1] 'length' [13:13:46.213] List of 1 [13:13:46.213] $ ...:List of 1 [13:13:46.213] ..$ length: int 2 [13:13:46.213] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:46.213] - attr(*, "where")=List of 1 [13:13:46.213] ..$ ...: [13:13:46.213] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:46.213] - attr(*, "resolved")= logi TRUE [13:13:46.213] - attr(*, "total_size")= num NA [13:13:46.217] - Getting '...' globals ... DONE [13:13:46.217] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:46.217] List of 2 [13:13:46.217] $ ...future.FUN:function (mode = "logical", length = 0L) [13:13:46.217] $ ... :List of 1 [13:13:46.217] ..$ length: int 2 [13:13:46.217] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:46.217] - attr(*, "where")=List of 2 [13:13:46.217] ..$ ...future.FUN: [13:13:46.217] ..$ ... : [13:13:46.217] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:46.217] - attr(*, "resolved")= logi FALSE [13:13:46.217] - attr(*, "total_size")= num 2240 [13:13:46.221] Packages to be attached in all futures: [n=0] [13:13:46.221] getGlobalsAndPackagesXApply() ... DONE [13:13:46.222] Number of futures (= number of chunks): 2 [13:13:46.222] Launching 2 futures (chunks) ... [13:13:46.222] Chunk #1 of 2 ... [13:13:46.222] - Finding globals in 'X' for chunk #1 ... [13:13:46.222] getGlobalsAndPackages() ... [13:13:46.222] Searching for globals... [13:13:46.223] [13:13:46.223] Searching for globals ... DONE [13:13:46.223] - globals: [0] [13:13:46.223] getGlobalsAndPackages() ... DONE [13:13:46.223] + additional globals found: [n=0] [13:13:46.224] + additional namespaces needed: [n=0] [13:13:46.224] - Finding globals in 'X' for chunk #1 ... DONE [13:13:46.224] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:13:46.224] - seeds: [13:13:46.224] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:46.224] getGlobalsAndPackages() ... [13:13:46.225] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:46.225] Resolving globals: FALSE [13:13:46.225] Tweak future expression to call with '...' arguments ... [13:13:46.225] { [13:13:46.225] do.call(function(...) { [13:13:46.225] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:46.225] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:46.225] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:46.225] on.exit(options(oopts), add = TRUE) [13:13:46.225] } [13:13:46.225] { [13:13:46.225] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:46.225] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:46.225] ...future.FUN(...future.X_jj, ...) [13:13:46.225] }) [13:13:46.225] } [13:13:46.225] }, args = future.call.arguments) [13:13:46.225] } [13:13:46.226] Tweak future expression to call with '...' arguments ... DONE [13:13:46.226] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:46.226] [13:13:46.227] getGlobalsAndPackages() ... DONE [13:13:46.227] run() for 'Future' ... [13:13:46.227] - state: 'created' [13:13:46.227] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:46.241] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:46.241] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:13:46.241] - Field: 'node' [13:13:46.241] - Field: 'label' [13:13:46.242] - Field: 'local' [13:13:46.242] - Field: 'owner' [13:13:46.242] - Field: 'envir' [13:13:46.242] - Field: 'workers' [13:13:46.242] - Field: 'packages' [13:13:46.243] - Field: 'gc' [13:13:46.243] - Field: 'conditions' [13:13:46.243] - Field: 'persistent' [13:13:46.243] - Field: 'expr' [13:13:46.243] - Field: 'uuid' [13:13:46.244] - Field: 'seed' [13:13:46.244] - Field: 'version' [13:13:46.244] - Field: 'result' [13:13:46.244] - Field: 'asynchronous' [13:13:46.244] - Field: 'calls' [13:13:46.244] - Field: 'globals' [13:13:46.245] - Field: 'stdout' [13:13:46.245] - Field: 'earlySignal' [13:13:46.245] - Field: 'lazy' [13:13:46.245] - Field: 'state' [13:13:46.245] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:13:46.245] - Launch lazy future ... [13:13:46.246] Packages needed by the future expression (n = 0): [13:13:46.246] Packages needed by future strategies (n = 0): [13:13:46.247] { [13:13:46.247] { [13:13:46.247] { [13:13:46.247] ...future.startTime <- base::Sys.time() [13:13:46.247] { [13:13:46.247] { [13:13:46.247] { [13:13:46.247] { [13:13:46.247] base::local({ [13:13:46.247] has_future <- base::requireNamespace("future", [13:13:46.247] quietly = TRUE) [13:13:46.247] if (has_future) { [13:13:46.247] ns <- base::getNamespace("future") [13:13:46.247] version <- ns[[".package"]][["version"]] [13:13:46.247] if (is.null(version)) [13:13:46.247] version <- utils::packageVersion("future") [13:13:46.247] } [13:13:46.247] else { [13:13:46.247] version <- NULL [13:13:46.247] } [13:13:46.247] if (!has_future || version < "1.8.0") { [13:13:46.247] info <- base::c(r_version = base::gsub("R version ", [13:13:46.247] "", base::R.version$version.string), [13:13:46.247] platform = base::sprintf("%s (%s-bit)", [13:13:46.247] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:46.247] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:46.247] "release", "version")], collapse = " "), [13:13:46.247] hostname = base::Sys.info()[["nodename"]]) [13:13:46.247] info <- base::sprintf("%s: %s", base::names(info), [13:13:46.247] info) [13:13:46.247] info <- base::paste(info, collapse = "; ") [13:13:46.247] if (!has_future) { [13:13:46.247] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:46.247] info) [13:13:46.247] } [13:13:46.247] else { [13:13:46.247] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:46.247] info, version) [13:13:46.247] } [13:13:46.247] base::stop(msg) [13:13:46.247] } [13:13:46.247] }) [13:13:46.247] } [13:13:46.247] ...future.mc.cores.old <- base::getOption("mc.cores") [13:13:46.247] base::options(mc.cores = 1L) [13:13:46.247] } [13:13:46.247] options(future.plan = NULL) [13:13:46.247] Sys.unsetenv("R_FUTURE_PLAN") [13:13:46.247] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:46.247] } [13:13:46.247] ...future.workdir <- getwd() [13:13:46.247] } [13:13:46.247] ...future.oldOptions <- base::as.list(base::.Options) [13:13:46.247] ...future.oldEnvVars <- base::Sys.getenv() [13:13:46.247] } [13:13:46.247] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:46.247] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:13:46.247] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:46.247] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:46.247] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:46.247] future.stdout.windows.reencode = NULL, width = 80L) [13:13:46.247] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:46.247] base::names(...future.oldOptions)) [13:13:46.247] } [13:13:46.247] if (FALSE) { [13:13:46.247] } [13:13:46.247] else { [13:13:46.247] if (TRUE) { [13:13:46.247] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:46.247] open = "w") [13:13:46.247] } [13:13:46.247] else { [13:13:46.247] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:46.247] windows = "NUL", "/dev/null"), open = "w") [13:13:46.247] } [13:13:46.247] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:46.247] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:46.247] base::sink(type = "output", split = FALSE) [13:13:46.247] base::close(...future.stdout) [13:13:46.247] }, add = TRUE) [13:13:46.247] } [13:13:46.247] ...future.frame <- base::sys.nframe() [13:13:46.247] ...future.conditions <- base::list() [13:13:46.247] ...future.rng <- base::globalenv()$.Random.seed [13:13:46.247] if (FALSE) { [13:13:46.247] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:46.247] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:46.247] } [13:13:46.247] ...future.result <- base::tryCatch({ [13:13:46.247] base::withCallingHandlers({ [13:13:46.247] ...future.value <- base::withVisible(base::local({ [13:13:46.247] ...future.makeSendCondition <- local({ [13:13:46.247] sendCondition <- NULL [13:13:46.247] function(frame = 1L) { [13:13:46.247] if (is.function(sendCondition)) [13:13:46.247] return(sendCondition) [13:13:46.247] ns <- getNamespace("parallel") [13:13:46.247] if (exists("sendData", mode = "function", [13:13:46.247] envir = ns)) { [13:13:46.247] parallel_sendData <- get("sendData", mode = "function", [13:13:46.247] envir = ns) [13:13:46.247] envir <- sys.frame(frame) [13:13:46.247] master <- NULL [13:13:46.247] while (!identical(envir, .GlobalEnv) && [13:13:46.247] !identical(envir, emptyenv())) { [13:13:46.247] if (exists("master", mode = "list", envir = envir, [13:13:46.247] inherits = FALSE)) { [13:13:46.247] master <- get("master", mode = "list", [13:13:46.247] envir = envir, inherits = FALSE) [13:13:46.247] if (inherits(master, c("SOCKnode", [13:13:46.247] "SOCK0node"))) { [13:13:46.247] sendCondition <<- function(cond) { [13:13:46.247] data <- list(type = "VALUE", value = cond, [13:13:46.247] success = TRUE) [13:13:46.247] parallel_sendData(master, data) [13:13:46.247] } [13:13:46.247] return(sendCondition) [13:13:46.247] } [13:13:46.247] } [13:13:46.247] frame <- frame + 1L [13:13:46.247] envir <- sys.frame(frame) [13:13:46.247] } [13:13:46.247] } [13:13:46.247] sendCondition <<- function(cond) NULL [13:13:46.247] } [13:13:46.247] }) [13:13:46.247] withCallingHandlers({ [13:13:46.247] { [13:13:46.247] do.call(function(...) { [13:13:46.247] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:46.247] if (!identical(...future.globals.maxSize.org, [13:13:46.247] ...future.globals.maxSize)) { [13:13:46.247] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:46.247] on.exit(options(oopts), add = TRUE) [13:13:46.247] } [13:13:46.247] { [13:13:46.247] lapply(seq_along(...future.elements_ii), [13:13:46.247] FUN = function(jj) { [13:13:46.247] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:46.247] ...future.FUN(...future.X_jj, ...) [13:13:46.247] }) [13:13:46.247] } [13:13:46.247] }, args = future.call.arguments) [13:13:46.247] } [13:13:46.247] }, immediateCondition = function(cond) { [13:13:46.247] sendCondition <- ...future.makeSendCondition() [13:13:46.247] sendCondition(cond) [13:13:46.247] muffleCondition <- function (cond, pattern = "^muffle") [13:13:46.247] { [13:13:46.247] inherits <- base::inherits [13:13:46.247] invokeRestart <- base::invokeRestart [13:13:46.247] is.null <- base::is.null [13:13:46.247] muffled <- FALSE [13:13:46.247] if (inherits(cond, "message")) { [13:13:46.247] muffled <- grepl(pattern, "muffleMessage") [13:13:46.247] if (muffled) [13:13:46.247] invokeRestart("muffleMessage") [13:13:46.247] } [13:13:46.247] else if (inherits(cond, "warning")) { [13:13:46.247] muffled <- grepl(pattern, "muffleWarning") [13:13:46.247] if (muffled) [13:13:46.247] invokeRestart("muffleWarning") [13:13:46.247] } [13:13:46.247] else if (inherits(cond, "condition")) { [13:13:46.247] if (!is.null(pattern)) { [13:13:46.247] computeRestarts <- base::computeRestarts [13:13:46.247] grepl <- base::grepl [13:13:46.247] restarts <- computeRestarts(cond) [13:13:46.247] for (restart in restarts) { [13:13:46.247] name <- restart$name [13:13:46.247] if (is.null(name)) [13:13:46.247] next [13:13:46.247] if (!grepl(pattern, name)) [13:13:46.247] next [13:13:46.247] invokeRestart(restart) [13:13:46.247] muffled <- TRUE [13:13:46.247] break [13:13:46.247] } [13:13:46.247] } [13:13:46.247] } [13:13:46.247] invisible(muffled) [13:13:46.247] } [13:13:46.247] muffleCondition(cond) [13:13:46.247] }) [13:13:46.247] })) [13:13:46.247] future::FutureResult(value = ...future.value$value, [13:13:46.247] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:46.247] ...future.rng), globalenv = if (FALSE) [13:13:46.247] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:46.247] ...future.globalenv.names)) [13:13:46.247] else NULL, started = ...future.startTime, version = "1.8") [13:13:46.247] }, condition = base::local({ [13:13:46.247] c <- base::c [13:13:46.247] inherits <- base::inherits [13:13:46.247] invokeRestart <- base::invokeRestart [13:13:46.247] length <- base::length [13:13:46.247] list <- base::list [13:13:46.247] seq.int <- base::seq.int [13:13:46.247] signalCondition <- base::signalCondition [13:13:46.247] sys.calls <- base::sys.calls [13:13:46.247] `[[` <- base::`[[` [13:13:46.247] `+` <- base::`+` [13:13:46.247] `<<-` <- base::`<<-` [13:13:46.247] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:46.247] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:46.247] 3L)] [13:13:46.247] } [13:13:46.247] function(cond) { [13:13:46.247] is_error <- inherits(cond, "error") [13:13:46.247] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:46.247] NULL) [13:13:46.247] if (is_error) { [13:13:46.247] sessionInformation <- function() { [13:13:46.247] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:46.247] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:46.247] search = base::search(), system = base::Sys.info()) [13:13:46.247] } [13:13:46.247] ...future.conditions[[length(...future.conditions) + [13:13:46.247] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:46.247] cond$call), session = sessionInformation(), [13:13:46.247] timestamp = base::Sys.time(), signaled = 0L) [13:13:46.247] signalCondition(cond) [13:13:46.247] } [13:13:46.247] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:46.247] "immediateCondition"))) { [13:13:46.247] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:46.247] ...future.conditions[[length(...future.conditions) + [13:13:46.247] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:46.247] if (TRUE && !signal) { [13:13:46.247] muffleCondition <- function (cond, pattern = "^muffle") [13:13:46.247] { [13:13:46.247] inherits <- base::inherits [13:13:46.247] invokeRestart <- base::invokeRestart [13:13:46.247] is.null <- base::is.null [13:13:46.247] muffled <- FALSE [13:13:46.247] if (inherits(cond, "message")) { [13:13:46.247] muffled <- grepl(pattern, "muffleMessage") [13:13:46.247] if (muffled) [13:13:46.247] invokeRestart("muffleMessage") [13:13:46.247] } [13:13:46.247] else if (inherits(cond, "warning")) { [13:13:46.247] muffled <- grepl(pattern, "muffleWarning") [13:13:46.247] if (muffled) [13:13:46.247] invokeRestart("muffleWarning") [13:13:46.247] } [13:13:46.247] else if (inherits(cond, "condition")) { [13:13:46.247] if (!is.null(pattern)) { [13:13:46.247] computeRestarts <- base::computeRestarts [13:13:46.247] grepl <- base::grepl [13:13:46.247] restarts <- computeRestarts(cond) [13:13:46.247] for (restart in restarts) { [13:13:46.247] name <- restart$name [13:13:46.247] if (is.null(name)) [13:13:46.247] next [13:13:46.247] if (!grepl(pattern, name)) [13:13:46.247] next [13:13:46.247] invokeRestart(restart) [13:13:46.247] muffled <- TRUE [13:13:46.247] break [13:13:46.247] } [13:13:46.247] } [13:13:46.247] } [13:13:46.247] invisible(muffled) [13:13:46.247] } [13:13:46.247] muffleCondition(cond, pattern = "^muffle") [13:13:46.247] } [13:13:46.247] } [13:13:46.247] else { [13:13:46.247] if (TRUE) { [13:13:46.247] muffleCondition <- function (cond, pattern = "^muffle") [13:13:46.247] { [13:13:46.247] inherits <- base::inherits [13:13:46.247] invokeRestart <- base::invokeRestart [13:13:46.247] is.null <- base::is.null [13:13:46.247] muffled <- FALSE [13:13:46.247] if (inherits(cond, "message")) { [13:13:46.247] muffled <- grepl(pattern, "muffleMessage") [13:13:46.247] if (muffled) [13:13:46.247] invokeRestart("muffleMessage") [13:13:46.247] } [13:13:46.247] else if (inherits(cond, "warning")) { [13:13:46.247] muffled <- grepl(pattern, "muffleWarning") [13:13:46.247] if (muffled) [13:13:46.247] invokeRestart("muffleWarning") [13:13:46.247] } [13:13:46.247] else if (inherits(cond, "condition")) { [13:13:46.247] if (!is.null(pattern)) { [13:13:46.247] computeRestarts <- base::computeRestarts [13:13:46.247] grepl <- base::grepl [13:13:46.247] restarts <- computeRestarts(cond) [13:13:46.247] for (restart in restarts) { [13:13:46.247] name <- restart$name [13:13:46.247] if (is.null(name)) [13:13:46.247] next [13:13:46.247] if (!grepl(pattern, name)) [13:13:46.247] next [13:13:46.247] invokeRestart(restart) [13:13:46.247] muffled <- TRUE [13:13:46.247] break [13:13:46.247] } [13:13:46.247] } [13:13:46.247] } [13:13:46.247] invisible(muffled) [13:13:46.247] } [13:13:46.247] muffleCondition(cond, pattern = "^muffle") [13:13:46.247] } [13:13:46.247] } [13:13:46.247] } [13:13:46.247] })) [13:13:46.247] }, error = function(ex) { [13:13:46.247] base::structure(base::list(value = NULL, visible = NULL, [13:13:46.247] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:46.247] ...future.rng), started = ...future.startTime, [13:13:46.247] finished = Sys.time(), session_uuid = NA_character_, [13:13:46.247] version = "1.8"), class = "FutureResult") [13:13:46.247] }, finally = { [13:13:46.247] if (!identical(...future.workdir, getwd())) [13:13:46.247] setwd(...future.workdir) [13:13:46.247] { [13:13:46.247] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:46.247] ...future.oldOptions$nwarnings <- NULL [13:13:46.247] } [13:13:46.247] base::options(...future.oldOptions) [13:13:46.247] if (.Platform$OS.type == "windows") { [13:13:46.247] old_names <- names(...future.oldEnvVars) [13:13:46.247] envs <- base::Sys.getenv() [13:13:46.247] names <- names(envs) [13:13:46.247] common <- intersect(names, old_names) [13:13:46.247] added <- setdiff(names, old_names) [13:13:46.247] removed <- setdiff(old_names, names) [13:13:46.247] changed <- common[...future.oldEnvVars[common] != [13:13:46.247] envs[common]] [13:13:46.247] NAMES <- toupper(changed) [13:13:46.247] args <- list() [13:13:46.247] for (kk in seq_along(NAMES)) { [13:13:46.247] name <- changed[[kk]] [13:13:46.247] NAME <- NAMES[[kk]] [13:13:46.247] if (name != NAME && is.element(NAME, old_names)) [13:13:46.247] next [13:13:46.247] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:46.247] } [13:13:46.247] NAMES <- toupper(added) [13:13:46.247] for (kk in seq_along(NAMES)) { [13:13:46.247] name <- added[[kk]] [13:13:46.247] NAME <- NAMES[[kk]] [13:13:46.247] if (name != NAME && is.element(NAME, old_names)) [13:13:46.247] next [13:13:46.247] args[[name]] <- "" [13:13:46.247] } [13:13:46.247] NAMES <- toupper(removed) [13:13:46.247] for (kk in seq_along(NAMES)) { [13:13:46.247] name <- removed[[kk]] [13:13:46.247] NAME <- NAMES[[kk]] [13:13:46.247] if (name != NAME && is.element(NAME, old_names)) [13:13:46.247] next [13:13:46.247] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:46.247] } [13:13:46.247] if (length(args) > 0) [13:13:46.247] base::do.call(base::Sys.setenv, args = args) [13:13:46.247] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:46.247] } [13:13:46.247] else { [13:13:46.247] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:46.247] } [13:13:46.247] { [13:13:46.247] if (base::length(...future.futureOptionsAdded) > [13:13:46.247] 0L) { [13:13:46.247] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:46.247] base::names(opts) <- ...future.futureOptionsAdded [13:13:46.247] base::options(opts) [13:13:46.247] } [13:13:46.247] { [13:13:46.247] { [13:13:46.247] base::options(mc.cores = ...future.mc.cores.old) [13:13:46.247] NULL [13:13:46.247] } [13:13:46.247] options(future.plan = NULL) [13:13:46.247] if (is.na(NA_character_)) [13:13:46.247] Sys.unsetenv("R_FUTURE_PLAN") [13:13:46.247] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:46.247] future::plan(list(function (..., workers = availableCores(), [13:13:46.247] lazy = FALSE, rscript_libs = .libPaths(), [13:13:46.247] envir = parent.frame()) [13:13:46.247] { [13:13:46.247] if (is.function(workers)) [13:13:46.247] workers <- workers() [13:13:46.247] workers <- structure(as.integer(workers), [13:13:46.247] class = class(workers)) [13:13:46.247] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:46.247] workers >= 1) [13:13:46.247] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:46.247] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:46.247] } [13:13:46.247] future <- MultisessionFuture(..., workers = workers, [13:13:46.247] lazy = lazy, rscript_libs = rscript_libs, [13:13:46.247] envir = envir) [13:13:46.247] if (!future$lazy) [13:13:46.247] future <- run(future) [13:13:46.247] invisible(future) [13:13:46.247] }), .cleanup = FALSE, .init = FALSE) [13:13:46.247] } [13:13:46.247] } [13:13:46.247] } [13:13:46.247] }) [13:13:46.247] if (TRUE) { [13:13:46.247] base::sink(type = "output", split = FALSE) [13:13:46.247] if (TRUE) { [13:13:46.247] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:46.247] } [13:13:46.247] else { [13:13:46.247] ...future.result["stdout"] <- base::list(NULL) [13:13:46.247] } [13:13:46.247] base::close(...future.stdout) [13:13:46.247] ...future.stdout <- NULL [13:13:46.247] } [13:13:46.247] ...future.result$conditions <- ...future.conditions [13:13:46.247] ...future.result$finished <- base::Sys.time() [13:13:46.247] ...future.result [13:13:46.247] } [13:13:46.252] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... [13:13:46.252] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... [13:13:46.253] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... DONE [13:13:46.253] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... [13:13:46.253] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... DONE [13:13:46.254] Exporting '...future.elements_ii' (224 bytes) to cluster node #1 ... [13:13:46.254] Exporting '...future.elements_ii' (224 bytes) to cluster node #1 ... DONE [13:13:46.254] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:13:46.255] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:13:46.255] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:13:46.255] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:13:46.255] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... DONE [13:13:46.256] MultisessionFuture started [13:13:46.256] - Launch lazy future ... done [13:13:46.257] run() for 'MultisessionFuture' ... done [13:13:46.257] Created future: [13:13:46.273] receiveMessageFromWorker() for ClusterFuture ... [13:13:46.273] - Validating connection of MultisessionFuture [13:13:46.273] - received message: FutureResult [13:13:46.273] - Received FutureResult [13:13:46.274] - Erased future from FutureRegistry [13:13:46.274] result() for ClusterFuture ... [13:13:46.274] - result already collected: FutureResult [13:13:46.274] result() for ClusterFuture ... done [13:13:46.274] receiveMessageFromWorker() for ClusterFuture ... done [13:13:46.257] MultisessionFuture: [13:13:46.257] Label: 'future_lapply-1' [13:13:46.257] Expression: [13:13:46.257] { [13:13:46.257] do.call(function(...) { [13:13:46.257] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:46.257] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:46.257] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:46.257] on.exit(options(oopts), add = TRUE) [13:13:46.257] } [13:13:46.257] { [13:13:46.257] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:46.257] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:46.257] ...future.FUN(...future.X_jj, ...) [13:13:46.257] }) [13:13:46.257] } [13:13:46.257] }, args = future.call.arguments) [13:13:46.257] } [13:13:46.257] Lazy evaluation: FALSE [13:13:46.257] Asynchronous evaluation: TRUE [13:13:46.257] Local evaluation: TRUE [13:13:46.257] Environment: R_GlobalEnv [13:13:46.257] Capture standard output: TRUE [13:13:46.257] Capture condition classes: 'condition' (excluding 'nothing') [13:13:46.257] 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) [13:13:46.257] Packages: [13:13:46.257] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:46.257] Resolved: TRUE [13:13:46.257] Value: [13:13:46.257] Conditions captured: [13:13:46.257] Early signaling: FALSE [13:13:46.257] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:46.257] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:46.275] Chunk #1 of 2 ... DONE [13:13:46.275] Chunk #2 of 2 ... [13:13:46.275] - Finding globals in 'X' for chunk #2 ... [13:13:46.275] getGlobalsAndPackages() ... [13:13:46.275] Searching for globals... [13:13:46.276] [13:13:46.276] Searching for globals ... DONE [13:13:46.276] - globals: [0] [13:13:46.276] getGlobalsAndPackages() ... DONE [13:13:46.276] + additional globals found: [n=0] [13:13:46.276] + additional namespaces needed: [n=0] [13:13:46.277] - Finding globals in 'X' for chunk #2 ... DONE [13:13:46.277] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:13:46.277] - seeds: [13:13:46.277] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:46.277] getGlobalsAndPackages() ... [13:13:46.277] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:46.278] Resolving globals: FALSE [13:13:46.278] Tweak future expression to call with '...' arguments ... [13:13:46.278] { [13:13:46.278] do.call(function(...) { [13:13:46.278] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:46.278] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:46.278] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:46.278] on.exit(options(oopts), add = TRUE) [13:13:46.278] } [13:13:46.278] { [13:13:46.278] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:46.278] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:46.278] ...future.FUN(...future.X_jj, ...) [13:13:46.278] }) [13:13:46.278] } [13:13:46.278] }, args = future.call.arguments) [13:13:46.278] } [13:13:46.278] Tweak future expression to call with '...' arguments ... DONE [13:13:46.279] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:46.279] [13:13:46.279] getGlobalsAndPackages() ... DONE [13:13:46.279] run() for 'Future' ... [13:13:46.280] - state: 'created' [13:13:46.280] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:46.294] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:46.294] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:13:46.294] - Field: 'node' [13:13:46.294] - Field: 'label' [13:13:46.294] - Field: 'local' [13:13:46.295] - Field: 'owner' [13:13:46.295] - Field: 'envir' [13:13:46.295] - Field: 'workers' [13:13:46.295] - Field: 'packages' [13:13:46.295] - Field: 'gc' [13:13:46.295] - Field: 'conditions' [13:13:46.296] - Field: 'persistent' [13:13:46.296] - Field: 'expr' [13:13:46.296] - Field: 'uuid' [13:13:46.296] - Field: 'seed' [13:13:46.296] - Field: 'version' [13:13:46.296] - Field: 'result' [13:13:46.297] - Field: 'asynchronous' [13:13:46.297] - Field: 'calls' [13:13:46.297] - Field: 'globals' [13:13:46.297] - Field: 'stdout' [13:13:46.297] - Field: 'earlySignal' [13:13:46.297] - Field: 'lazy' [13:13:46.298] - Field: 'state' [13:13:46.298] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:13:46.298] - Launch lazy future ... [13:13:46.298] Packages needed by the future expression (n = 0): [13:13:46.298] Packages needed by future strategies (n = 0): [13:13:46.299] { [13:13:46.299] { [13:13:46.299] { [13:13:46.299] ...future.startTime <- base::Sys.time() [13:13:46.299] { [13:13:46.299] { [13:13:46.299] { [13:13:46.299] { [13:13:46.299] base::local({ [13:13:46.299] has_future <- base::requireNamespace("future", [13:13:46.299] quietly = TRUE) [13:13:46.299] if (has_future) { [13:13:46.299] ns <- base::getNamespace("future") [13:13:46.299] version <- ns[[".package"]][["version"]] [13:13:46.299] if (is.null(version)) [13:13:46.299] version <- utils::packageVersion("future") [13:13:46.299] } [13:13:46.299] else { [13:13:46.299] version <- NULL [13:13:46.299] } [13:13:46.299] if (!has_future || version < "1.8.0") { [13:13:46.299] info <- base::c(r_version = base::gsub("R version ", [13:13:46.299] "", base::R.version$version.string), [13:13:46.299] platform = base::sprintf("%s (%s-bit)", [13:13:46.299] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:46.299] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:46.299] "release", "version")], collapse = " "), [13:13:46.299] hostname = base::Sys.info()[["nodename"]]) [13:13:46.299] info <- base::sprintf("%s: %s", base::names(info), [13:13:46.299] info) [13:13:46.299] info <- base::paste(info, collapse = "; ") [13:13:46.299] if (!has_future) { [13:13:46.299] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:46.299] info) [13:13:46.299] } [13:13:46.299] else { [13:13:46.299] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:46.299] info, version) [13:13:46.299] } [13:13:46.299] base::stop(msg) [13:13:46.299] } [13:13:46.299] }) [13:13:46.299] } [13:13:46.299] ...future.mc.cores.old <- base::getOption("mc.cores") [13:13:46.299] base::options(mc.cores = 1L) [13:13:46.299] } [13:13:46.299] options(future.plan = NULL) [13:13:46.299] Sys.unsetenv("R_FUTURE_PLAN") [13:13:46.299] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:46.299] } [13:13:46.299] ...future.workdir <- getwd() [13:13:46.299] } [13:13:46.299] ...future.oldOptions <- base::as.list(base::.Options) [13:13:46.299] ...future.oldEnvVars <- base::Sys.getenv() [13:13:46.299] } [13:13:46.299] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:46.299] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:13:46.299] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:46.299] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:46.299] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:46.299] future.stdout.windows.reencode = NULL, width = 80L) [13:13:46.299] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:46.299] base::names(...future.oldOptions)) [13:13:46.299] } [13:13:46.299] if (FALSE) { [13:13:46.299] } [13:13:46.299] else { [13:13:46.299] if (TRUE) { [13:13:46.299] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:46.299] open = "w") [13:13:46.299] } [13:13:46.299] else { [13:13:46.299] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:46.299] windows = "NUL", "/dev/null"), open = "w") [13:13:46.299] } [13:13:46.299] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:46.299] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:46.299] base::sink(type = "output", split = FALSE) [13:13:46.299] base::close(...future.stdout) [13:13:46.299] }, add = TRUE) [13:13:46.299] } [13:13:46.299] ...future.frame <- base::sys.nframe() [13:13:46.299] ...future.conditions <- base::list() [13:13:46.299] ...future.rng <- base::globalenv()$.Random.seed [13:13:46.299] if (FALSE) { [13:13:46.299] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:46.299] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:46.299] } [13:13:46.299] ...future.result <- base::tryCatch({ [13:13:46.299] base::withCallingHandlers({ [13:13:46.299] ...future.value <- base::withVisible(base::local({ [13:13:46.299] ...future.makeSendCondition <- local({ [13:13:46.299] sendCondition <- NULL [13:13:46.299] function(frame = 1L) { [13:13:46.299] if (is.function(sendCondition)) [13:13:46.299] return(sendCondition) [13:13:46.299] ns <- getNamespace("parallel") [13:13:46.299] if (exists("sendData", mode = "function", [13:13:46.299] envir = ns)) { [13:13:46.299] parallel_sendData <- get("sendData", mode = "function", [13:13:46.299] envir = ns) [13:13:46.299] envir <- sys.frame(frame) [13:13:46.299] master <- NULL [13:13:46.299] while (!identical(envir, .GlobalEnv) && [13:13:46.299] !identical(envir, emptyenv())) { [13:13:46.299] if (exists("master", mode = "list", envir = envir, [13:13:46.299] inherits = FALSE)) { [13:13:46.299] master <- get("master", mode = "list", [13:13:46.299] envir = envir, inherits = FALSE) [13:13:46.299] if (inherits(master, c("SOCKnode", [13:13:46.299] "SOCK0node"))) { [13:13:46.299] sendCondition <<- function(cond) { [13:13:46.299] data <- list(type = "VALUE", value = cond, [13:13:46.299] success = TRUE) [13:13:46.299] parallel_sendData(master, data) [13:13:46.299] } [13:13:46.299] return(sendCondition) [13:13:46.299] } [13:13:46.299] } [13:13:46.299] frame <- frame + 1L [13:13:46.299] envir <- sys.frame(frame) [13:13:46.299] } [13:13:46.299] } [13:13:46.299] sendCondition <<- function(cond) NULL [13:13:46.299] } [13:13:46.299] }) [13:13:46.299] withCallingHandlers({ [13:13:46.299] { [13:13:46.299] do.call(function(...) { [13:13:46.299] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:46.299] if (!identical(...future.globals.maxSize.org, [13:13:46.299] ...future.globals.maxSize)) { [13:13:46.299] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:46.299] on.exit(options(oopts), add = TRUE) [13:13:46.299] } [13:13:46.299] { [13:13:46.299] lapply(seq_along(...future.elements_ii), [13:13:46.299] FUN = function(jj) { [13:13:46.299] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:46.299] ...future.FUN(...future.X_jj, ...) [13:13:46.299] }) [13:13:46.299] } [13:13:46.299] }, args = future.call.arguments) [13:13:46.299] } [13:13:46.299] }, immediateCondition = function(cond) { [13:13:46.299] sendCondition <- ...future.makeSendCondition() [13:13:46.299] sendCondition(cond) [13:13:46.299] muffleCondition <- function (cond, pattern = "^muffle") [13:13:46.299] { [13:13:46.299] inherits <- base::inherits [13:13:46.299] invokeRestart <- base::invokeRestart [13:13:46.299] is.null <- base::is.null [13:13:46.299] muffled <- FALSE [13:13:46.299] if (inherits(cond, "message")) { [13:13:46.299] muffled <- grepl(pattern, "muffleMessage") [13:13:46.299] if (muffled) [13:13:46.299] invokeRestart("muffleMessage") [13:13:46.299] } [13:13:46.299] else if (inherits(cond, "warning")) { [13:13:46.299] muffled <- grepl(pattern, "muffleWarning") [13:13:46.299] if (muffled) [13:13:46.299] invokeRestart("muffleWarning") [13:13:46.299] } [13:13:46.299] else if (inherits(cond, "condition")) { [13:13:46.299] if (!is.null(pattern)) { [13:13:46.299] computeRestarts <- base::computeRestarts [13:13:46.299] grepl <- base::grepl [13:13:46.299] restarts <- computeRestarts(cond) [13:13:46.299] for (restart in restarts) { [13:13:46.299] name <- restart$name [13:13:46.299] if (is.null(name)) [13:13:46.299] next [13:13:46.299] if (!grepl(pattern, name)) [13:13:46.299] next [13:13:46.299] invokeRestart(restart) [13:13:46.299] muffled <- TRUE [13:13:46.299] break [13:13:46.299] } [13:13:46.299] } [13:13:46.299] } [13:13:46.299] invisible(muffled) [13:13:46.299] } [13:13:46.299] muffleCondition(cond) [13:13:46.299] }) [13:13:46.299] })) [13:13:46.299] future::FutureResult(value = ...future.value$value, [13:13:46.299] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:46.299] ...future.rng), globalenv = if (FALSE) [13:13:46.299] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:46.299] ...future.globalenv.names)) [13:13:46.299] else NULL, started = ...future.startTime, version = "1.8") [13:13:46.299] }, condition = base::local({ [13:13:46.299] c <- base::c [13:13:46.299] inherits <- base::inherits [13:13:46.299] invokeRestart <- base::invokeRestart [13:13:46.299] length <- base::length [13:13:46.299] list <- base::list [13:13:46.299] seq.int <- base::seq.int [13:13:46.299] signalCondition <- base::signalCondition [13:13:46.299] sys.calls <- base::sys.calls [13:13:46.299] `[[` <- base::`[[` [13:13:46.299] `+` <- base::`+` [13:13:46.299] `<<-` <- base::`<<-` [13:13:46.299] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:46.299] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:46.299] 3L)] [13:13:46.299] } [13:13:46.299] function(cond) { [13:13:46.299] is_error <- inherits(cond, "error") [13:13:46.299] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:46.299] NULL) [13:13:46.299] if (is_error) { [13:13:46.299] sessionInformation <- function() { [13:13:46.299] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:46.299] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:46.299] search = base::search(), system = base::Sys.info()) [13:13:46.299] } [13:13:46.299] ...future.conditions[[length(...future.conditions) + [13:13:46.299] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:46.299] cond$call), session = sessionInformation(), [13:13:46.299] timestamp = base::Sys.time(), signaled = 0L) [13:13:46.299] signalCondition(cond) [13:13:46.299] } [13:13:46.299] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:46.299] "immediateCondition"))) { [13:13:46.299] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:46.299] ...future.conditions[[length(...future.conditions) + [13:13:46.299] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:46.299] if (TRUE && !signal) { [13:13:46.299] muffleCondition <- function (cond, pattern = "^muffle") [13:13:46.299] { [13:13:46.299] inherits <- base::inherits [13:13:46.299] invokeRestart <- base::invokeRestart [13:13:46.299] is.null <- base::is.null [13:13:46.299] muffled <- FALSE [13:13:46.299] if (inherits(cond, "message")) { [13:13:46.299] muffled <- grepl(pattern, "muffleMessage") [13:13:46.299] if (muffled) [13:13:46.299] invokeRestart("muffleMessage") [13:13:46.299] } [13:13:46.299] else if (inherits(cond, "warning")) { [13:13:46.299] muffled <- grepl(pattern, "muffleWarning") [13:13:46.299] if (muffled) [13:13:46.299] invokeRestart("muffleWarning") [13:13:46.299] } [13:13:46.299] else if (inherits(cond, "condition")) { [13:13:46.299] if (!is.null(pattern)) { [13:13:46.299] computeRestarts <- base::computeRestarts [13:13:46.299] grepl <- base::grepl [13:13:46.299] restarts <- computeRestarts(cond) [13:13:46.299] for (restart in restarts) { [13:13:46.299] name <- restart$name [13:13:46.299] if (is.null(name)) [13:13:46.299] next [13:13:46.299] if (!grepl(pattern, name)) [13:13:46.299] next [13:13:46.299] invokeRestart(restart) [13:13:46.299] muffled <- TRUE [13:13:46.299] break [13:13:46.299] } [13:13:46.299] } [13:13:46.299] } [13:13:46.299] invisible(muffled) [13:13:46.299] } [13:13:46.299] muffleCondition(cond, pattern = "^muffle") [13:13:46.299] } [13:13:46.299] } [13:13:46.299] else { [13:13:46.299] if (TRUE) { [13:13:46.299] muffleCondition <- function (cond, pattern = "^muffle") [13:13:46.299] { [13:13:46.299] inherits <- base::inherits [13:13:46.299] invokeRestart <- base::invokeRestart [13:13:46.299] is.null <- base::is.null [13:13:46.299] muffled <- FALSE [13:13:46.299] if (inherits(cond, "message")) { [13:13:46.299] muffled <- grepl(pattern, "muffleMessage") [13:13:46.299] if (muffled) [13:13:46.299] invokeRestart("muffleMessage") [13:13:46.299] } [13:13:46.299] else if (inherits(cond, "warning")) { [13:13:46.299] muffled <- grepl(pattern, "muffleWarning") [13:13:46.299] if (muffled) [13:13:46.299] invokeRestart("muffleWarning") [13:13:46.299] } [13:13:46.299] else if (inherits(cond, "condition")) { [13:13:46.299] if (!is.null(pattern)) { [13:13:46.299] computeRestarts <- base::computeRestarts [13:13:46.299] grepl <- base::grepl [13:13:46.299] restarts <- computeRestarts(cond) [13:13:46.299] for (restart in restarts) { [13:13:46.299] name <- restart$name [13:13:46.299] if (is.null(name)) [13:13:46.299] next [13:13:46.299] if (!grepl(pattern, name)) [13:13:46.299] next [13:13:46.299] invokeRestart(restart) [13:13:46.299] muffled <- TRUE [13:13:46.299] break [13:13:46.299] } [13:13:46.299] } [13:13:46.299] } [13:13:46.299] invisible(muffled) [13:13:46.299] } [13:13:46.299] muffleCondition(cond, pattern = "^muffle") [13:13:46.299] } [13:13:46.299] } [13:13:46.299] } [13:13:46.299] })) [13:13:46.299] }, error = function(ex) { [13:13:46.299] base::structure(base::list(value = NULL, visible = NULL, [13:13:46.299] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:46.299] ...future.rng), started = ...future.startTime, [13:13:46.299] finished = Sys.time(), session_uuid = NA_character_, [13:13:46.299] version = "1.8"), class = "FutureResult") [13:13:46.299] }, finally = { [13:13:46.299] if (!identical(...future.workdir, getwd())) [13:13:46.299] setwd(...future.workdir) [13:13:46.299] { [13:13:46.299] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:46.299] ...future.oldOptions$nwarnings <- NULL [13:13:46.299] } [13:13:46.299] base::options(...future.oldOptions) [13:13:46.299] if (.Platform$OS.type == "windows") { [13:13:46.299] old_names <- names(...future.oldEnvVars) [13:13:46.299] envs <- base::Sys.getenv() [13:13:46.299] names <- names(envs) [13:13:46.299] common <- intersect(names, old_names) [13:13:46.299] added <- setdiff(names, old_names) [13:13:46.299] removed <- setdiff(old_names, names) [13:13:46.299] changed <- common[...future.oldEnvVars[common] != [13:13:46.299] envs[common]] [13:13:46.299] NAMES <- toupper(changed) [13:13:46.299] args <- list() [13:13:46.299] for (kk in seq_along(NAMES)) { [13:13:46.299] name <- changed[[kk]] [13:13:46.299] NAME <- NAMES[[kk]] [13:13:46.299] if (name != NAME && is.element(NAME, old_names)) [13:13:46.299] next [13:13:46.299] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:46.299] } [13:13:46.299] NAMES <- toupper(added) [13:13:46.299] for (kk in seq_along(NAMES)) { [13:13:46.299] name <- added[[kk]] [13:13:46.299] NAME <- NAMES[[kk]] [13:13:46.299] if (name != NAME && is.element(NAME, old_names)) [13:13:46.299] next [13:13:46.299] args[[name]] <- "" [13:13:46.299] } [13:13:46.299] NAMES <- toupper(removed) [13:13:46.299] for (kk in seq_along(NAMES)) { [13:13:46.299] name <- removed[[kk]] [13:13:46.299] NAME <- NAMES[[kk]] [13:13:46.299] if (name != NAME && is.element(NAME, old_names)) [13:13:46.299] next [13:13:46.299] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:46.299] } [13:13:46.299] if (length(args) > 0) [13:13:46.299] base::do.call(base::Sys.setenv, args = args) [13:13:46.299] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:46.299] } [13:13:46.299] else { [13:13:46.299] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:46.299] } [13:13:46.299] { [13:13:46.299] if (base::length(...future.futureOptionsAdded) > [13:13:46.299] 0L) { [13:13:46.299] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:46.299] base::names(opts) <- ...future.futureOptionsAdded [13:13:46.299] base::options(opts) [13:13:46.299] } [13:13:46.299] { [13:13:46.299] { [13:13:46.299] base::options(mc.cores = ...future.mc.cores.old) [13:13:46.299] NULL [13:13:46.299] } [13:13:46.299] options(future.plan = NULL) [13:13:46.299] if (is.na(NA_character_)) [13:13:46.299] Sys.unsetenv("R_FUTURE_PLAN") [13:13:46.299] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:46.299] future::plan(list(function (..., workers = availableCores(), [13:13:46.299] lazy = FALSE, rscript_libs = .libPaths(), [13:13:46.299] envir = parent.frame()) [13:13:46.299] { [13:13:46.299] if (is.function(workers)) [13:13:46.299] workers <- workers() [13:13:46.299] workers <- structure(as.integer(workers), [13:13:46.299] class = class(workers)) [13:13:46.299] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:46.299] workers >= 1) [13:13:46.299] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:46.299] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:46.299] } [13:13:46.299] future <- MultisessionFuture(..., workers = workers, [13:13:46.299] lazy = lazy, rscript_libs = rscript_libs, [13:13:46.299] envir = envir) [13:13:46.299] if (!future$lazy) [13:13:46.299] future <- run(future) [13:13:46.299] invisible(future) [13:13:46.299] }), .cleanup = FALSE, .init = FALSE) [13:13:46.299] } [13:13:46.299] } [13:13:46.299] } [13:13:46.299] }) [13:13:46.299] if (TRUE) { [13:13:46.299] base::sink(type = "output", split = FALSE) [13:13:46.299] if (TRUE) { [13:13:46.299] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:46.299] } [13:13:46.299] else { [13:13:46.299] ...future.result["stdout"] <- base::list(NULL) [13:13:46.299] } [13:13:46.299] base::close(...future.stdout) [13:13:46.299] ...future.stdout <- NULL [13:13:46.299] } [13:13:46.299] ...future.result$conditions <- ...future.conditions [13:13:46.299] ...future.result$finished <- base::Sys.time() [13:13:46.299] ...future.result [13:13:46.299] } [13:13:46.304] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... [13:13:46.305] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... [13:13:46.305] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... DONE [13:13:46.305] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... [13:13:46.306] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... DONE [13:13:46.306] Exporting '...future.elements_ii' (232 bytes) to cluster node #1 ... [13:13:46.306] Exporting '...future.elements_ii' (232 bytes) to cluster node #1 ... DONE [13:13:46.307] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:13:46.307] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:13:46.307] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:13:46.308] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:13:46.308] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... DONE [13:13:46.308] MultisessionFuture started [13:13:46.309] - Launch lazy future ... done [13:13:46.309] run() for 'MultisessionFuture' ... done [13:13:46.309] Created future: [13:13:46.325] receiveMessageFromWorker() for ClusterFuture ... [13:13:46.325] - Validating connection of MultisessionFuture [13:13:46.325] - received message: FutureResult [13:13:46.326] - Received FutureResult [13:13:46.326] - Erased future from FutureRegistry [13:13:46.326] result() for ClusterFuture ... [13:13:46.326] - result already collected: FutureResult [13:13:46.326] result() for ClusterFuture ... done [13:13:46.326] receiveMessageFromWorker() for ClusterFuture ... done [13:13:46.309] MultisessionFuture: [13:13:46.309] Label: 'future_lapply-2' [13:13:46.309] Expression: [13:13:46.309] { [13:13:46.309] do.call(function(...) { [13:13:46.309] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:46.309] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:46.309] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:46.309] on.exit(options(oopts), add = TRUE) [13:13:46.309] } [13:13:46.309] { [13:13:46.309] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:46.309] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:46.309] ...future.FUN(...future.X_jj, ...) [13:13:46.309] }) [13:13:46.309] } [13:13:46.309] }, args = future.call.arguments) [13:13:46.309] } [13:13:46.309] Lazy evaluation: FALSE [13:13:46.309] Asynchronous evaluation: TRUE [13:13:46.309] Local evaluation: TRUE [13:13:46.309] Environment: R_GlobalEnv [13:13:46.309] Capture standard output: TRUE [13:13:46.309] Capture condition classes: 'condition' (excluding 'nothing') [13:13:46.309] 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) [13:13:46.309] Packages: [13:13:46.309] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:46.309] Resolved: TRUE [13:13:46.309] Value: [13:13:46.309] Conditions captured: [13:13:46.309] Early signaling: FALSE [13:13:46.309] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:46.309] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:46.327] Chunk #2 of 2 ... DONE [13:13:46.327] Launching 2 futures (chunks) ... DONE [13:13:46.327] Resolving 2 futures (chunks) ... [13:13:46.327] resolve() on list ... [13:13:46.328] recursive: 0 [13:13:46.328] length: 2 [13:13:46.328] [13:13:46.328] Future #1 [13:13:46.328] result() for ClusterFuture ... [13:13:46.328] - result already collected: FutureResult [13:13:46.328] result() for ClusterFuture ... done [13:13:46.329] result() for ClusterFuture ... [13:13:46.329] - result already collected: FutureResult [13:13:46.329] result() for ClusterFuture ... done [13:13:46.329] signalConditionsASAP(MultisessionFuture, pos=1) ... [13:13:46.329] - nx: 2 [13:13:46.329] - relay: TRUE [13:13:46.330] - stdout: TRUE [13:13:46.330] - signal: TRUE [13:13:46.330] - resignal: FALSE [13:13:46.330] - force: TRUE [13:13:46.330] - relayed: [n=2] FALSE, FALSE [13:13:46.330] - queued futures: [n=2] FALSE, FALSE [13:13:46.331] - until=1 [13:13:46.331] - relaying element #1 [13:13:46.331] result() for ClusterFuture ... [13:13:46.331] - result already collected: FutureResult [13:13:46.331] result() for ClusterFuture ... done [13:13:46.331] result() for ClusterFuture ... [13:13:46.331] - result already collected: FutureResult [13:13:46.332] result() for ClusterFuture ... done [13:13:46.332] result() for ClusterFuture ... [13:13:46.332] - result already collected: FutureResult [13:13:46.332] result() for ClusterFuture ... done [13:13:46.332] result() for ClusterFuture ... [13:13:46.332] - result already collected: FutureResult [13:13:46.333] result() for ClusterFuture ... done [13:13:46.333] - relayed: [n=2] TRUE, FALSE [13:13:46.333] - queued futures: [n=2] TRUE, FALSE [13:13:46.333] signalConditionsASAP(MultisessionFuture, pos=1) ... done [13:13:46.333] length: 1 (resolved future 1) [13:13:46.333] Future #2 [13:13:46.334] result() for ClusterFuture ... [13:13:46.334] - result already collected: FutureResult [13:13:46.334] result() for ClusterFuture ... done [13:13:46.334] result() for ClusterFuture ... [13:13:46.334] - result already collected: FutureResult [13:13:46.334] result() for ClusterFuture ... done [13:13:46.335] signalConditionsASAP(MultisessionFuture, pos=2) ... [13:13:46.335] - nx: 2 [13:13:46.335] - relay: TRUE [13:13:46.335] - stdout: TRUE [13:13:46.335] - signal: TRUE [13:13:46.335] - resignal: FALSE [13:13:46.335] - force: TRUE [13:13:46.336] - relayed: [n=2] TRUE, FALSE [13:13:46.336] - queued futures: [n=2] TRUE, FALSE [13:13:46.336] - until=2 [13:13:46.336] - relaying element #2 [13:13:46.336] result() for ClusterFuture ... [13:13:46.336] - result already collected: FutureResult [13:13:46.337] result() for ClusterFuture ... done [13:13:46.337] result() for ClusterFuture ... [13:13:46.337] - result already collected: FutureResult [13:13:46.337] result() for ClusterFuture ... done [13:13:46.337] result() for ClusterFuture ... [13:13:46.337] - result already collected: FutureResult [13:13:46.337] result() for ClusterFuture ... done [13:13:46.338] result() for ClusterFuture ... [13:13:46.338] - result already collected: FutureResult [13:13:46.338] result() for ClusterFuture ... done [13:13:46.338] - relayed: [n=2] TRUE, TRUE [13:13:46.338] - queued futures: [n=2] TRUE, TRUE [13:13:46.338] signalConditionsASAP(MultisessionFuture, pos=2) ... done [13:13:46.339] length: 0 (resolved future 2) [13:13:46.339] Relaying remaining futures [13:13:46.339] signalConditionsASAP(NULL, pos=0) ... [13:13:46.339] - nx: 2 [13:13:46.339] - relay: TRUE [13:13:46.339] - stdout: TRUE [13:13:46.339] - signal: TRUE [13:13:46.340] - resignal: FALSE [13:13:46.340] - force: TRUE [13:13:46.340] - relayed: [n=2] TRUE, TRUE [13:13:46.340] - queued futures: [n=2] TRUE, TRUE - flush all [13:13:46.340] - relayed: [n=2] TRUE, TRUE [13:13:46.340] - queued futures: [n=2] TRUE, TRUE [13:13:46.341] signalConditionsASAP(NULL, pos=0) ... done [13:13:46.341] resolve() on list ... DONE [13:13:46.341] result() for ClusterFuture ... [13:13:46.341] - result already collected: FutureResult [13:13:46.341] result() for ClusterFuture ... done [13:13:46.341] result() for ClusterFuture ... [13:13:46.342] - result already collected: FutureResult [13:13:46.342] result() for ClusterFuture ... done [13:13:46.342] result() for ClusterFuture ... [13:13:46.342] - result already collected: FutureResult [13:13:46.342] result() for ClusterFuture ... done [13:13:46.342] result() for ClusterFuture ... [13:13:46.343] - result already collected: FutureResult [13:13:46.343] result() for ClusterFuture ... done [13:13:46.343] - Number of value chunks collected: 2 [13:13:46.343] Resolving 2 futures (chunks) ... DONE [13:13:46.343] Reducing values from 2 chunks ... [13:13:46.343] - Number of values collected after concatenation: 4 [13:13:46.344] - Number of values expected: 4 [13:13:46.344] Reducing values from 2 chunks ... DONE [13:13:46.344] 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, ...) ... [13:13:46.346] future_lapply() ... [13:13:46.357] Number of chunks: 1 [13:13:46.357] getGlobalsAndPackagesXApply() ... [13:13:46.358] - future.globals: TRUE [13:13:46.358] getGlobalsAndPackages() ... [13:13:46.358] Searching for globals... [13:13:46.370] - globals found: [22] 'FUN', 'if', 'missing', 'is.finite', '{', 'is.null', '<-', 'paste', 'length', '==', 'return', '>', '+', '[', 'seq_len', 'rev', 'c', '&&', '!', ':', '(', '-' [13:13:46.370] Searching for globals ... DONE [13:13:46.370] Resolving globals: FALSE [13:13:46.371] The total size of the 1 globals is 69.62 KiB (71288 bytes) [13:13:46.372] 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') [13:13:46.372] - globals: [1] 'FUN' [13:13:46.372] - packages: [1] 'future' [13:13:46.372] getGlobalsAndPackages() ... DONE [13:13:46.373] - globals found/used: [n=1] 'FUN' [13:13:46.373] - needed namespaces: [n=1] 'future' [13:13:46.373] Finding globals ... DONE [13:13:46.373] - use_args: TRUE [13:13:46.373] - Getting '...' globals ... [13:13:46.374] resolve() on list ... [13:13:46.374] recursive: 0 [13:13:46.374] length: 1 [13:13:46.374] elements: '...' [13:13:46.374] length: 0 (resolved future 1) [13:13:46.374] resolve() on list ... DONE [13:13:46.375] - '...' content: [n=2] 'collapse', 'maxHead' [13:13:46.375] List of 1 [13:13:46.375] $ ...:List of 2 [13:13:46.375] ..$ collapse: chr "; " [13:13:46.375] ..$ maxHead : int 3 [13:13:46.375] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:46.375] - attr(*, "where")=List of 1 [13:13:46.375] ..$ ...: [13:13:46.375] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:46.375] - attr(*, "resolved")= logi TRUE [13:13:46.375] - attr(*, "total_size")= num NA [13:13:46.379] - Getting '...' globals ... DONE [13:13:46.379] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:46.379] List of 2 [13:13:46.379] $ ...future.FUN:function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [13:13:46.379] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [13:13:46.379] $ ... :List of 2 [13:13:46.379] ..$ collapse: chr "; " [13:13:46.379] ..$ maxHead : int 3 [13:13:46.379] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:46.379] - attr(*, "where")=List of 2 [13:13:46.379] ..$ ...future.FUN: [13:13:46.379] ..$ ... : [13:13:46.379] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:46.379] - attr(*, "resolved")= logi FALSE [13:13:46.379] - attr(*, "total_size")= num 71456 [13:13:46.383] Packages to be attached in all futures: [n=1] 'future' [13:13:46.384] getGlobalsAndPackagesXApply() ... DONE [13:13:46.384] Number of futures (= number of chunks): 1 [13:13:46.384] Launching 1 futures (chunks) ... [13:13:46.384] Chunk #1 of 1 ... [13:13:46.384] - Finding globals in 'X' for chunk #1 ... [13:13:46.385] getGlobalsAndPackages() ... [13:13:46.385] Searching for globals... [13:13:46.385] [13:13:46.385] Searching for globals ... DONE [13:13:46.385] - globals: [0] [13:13:46.385] getGlobalsAndPackages() ... DONE [13:13:46.386] + additional globals found: [n=0] [13:13:46.386] + additional namespaces needed: [n=0] [13:13:46.386] - Finding globals in 'X' for chunk #1 ... DONE [13:13:46.386] - seeds: [13:13:46.386] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:46.386] getGlobalsAndPackages() ... [13:13:46.387] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:46.387] Resolving globals: FALSE [13:13:46.387] Tweak future expression to call with '...' arguments ... [13:13:46.387] { [13:13:46.387] do.call(function(...) { [13:13:46.387] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:46.387] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:46.387] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:46.387] on.exit(options(oopts), add = TRUE) [13:13:46.387] } [13:13:46.387] { [13:13:46.387] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:46.387] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:46.387] ...future.FUN(...future.X_jj, ...) [13:13:46.387] }) [13:13:46.387] } [13:13:46.387] }, args = future.call.arguments) [13:13:46.387] } [13:13:46.388] Tweak future expression to call with '...' arguments ... DONE [13:13:46.388] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:46.388] - packages: [1] 'future' [13:13:46.388] getGlobalsAndPackages() ... DONE [13:13:46.389] run() for 'Future' ... [13:13:46.389] - state: 'created' [13:13:46.389] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:46.403] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:46.403] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:13:46.403] - Field: 'node' [13:13:46.403] - Field: 'label' [13:13:46.404] - Field: 'local' [13:13:46.404] - Field: 'owner' [13:13:46.404] - Field: 'envir' [13:13:46.404] - Field: 'workers' [13:13:46.404] - Field: 'packages' [13:13:46.405] - Field: 'gc' [13:13:46.405] - Field: 'conditions' [13:13:46.405] - Field: 'persistent' [13:13:46.405] - Field: 'expr' [13:13:46.405] - Field: 'uuid' [13:13:46.405] - Field: 'seed' [13:13:46.406] - Field: 'version' [13:13:46.406] - Field: 'result' [13:13:46.406] - Field: 'asynchronous' [13:13:46.406] - Field: 'calls' [13:13:46.406] - Field: 'globals' [13:13:46.406] - Field: 'stdout' [13:13:46.407] - Field: 'earlySignal' [13:13:46.407] - Field: 'lazy' [13:13:46.407] - Field: 'state' [13:13:46.407] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:13:46.407] - Launch lazy future ... [13:13:46.408] Packages needed by the future expression (n = 1): 'future' [13:13:46.408] Packages needed by future strategies (n = 0): [13:13:46.409] { [13:13:46.409] { [13:13:46.409] { [13:13:46.409] ...future.startTime <- base::Sys.time() [13:13:46.409] { [13:13:46.409] { [13:13:46.409] { [13:13:46.409] { [13:13:46.409] { [13:13:46.409] base::local({ [13:13:46.409] has_future <- base::requireNamespace("future", [13:13:46.409] quietly = TRUE) [13:13:46.409] if (has_future) { [13:13:46.409] ns <- base::getNamespace("future") [13:13:46.409] version <- ns[[".package"]][["version"]] [13:13:46.409] if (is.null(version)) [13:13:46.409] version <- utils::packageVersion("future") [13:13:46.409] } [13:13:46.409] else { [13:13:46.409] version <- NULL [13:13:46.409] } [13:13:46.409] if (!has_future || version < "1.8.0") { [13:13:46.409] info <- base::c(r_version = base::gsub("R version ", [13:13:46.409] "", base::R.version$version.string), [13:13:46.409] platform = base::sprintf("%s (%s-bit)", [13:13:46.409] base::R.version$platform, 8 * [13:13:46.409] base::.Machine$sizeof.pointer), [13:13:46.409] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:46.409] "release", "version")], collapse = " "), [13:13:46.409] hostname = base::Sys.info()[["nodename"]]) [13:13:46.409] info <- base::sprintf("%s: %s", base::names(info), [13:13:46.409] info) [13:13:46.409] info <- base::paste(info, collapse = "; ") [13:13:46.409] if (!has_future) { [13:13:46.409] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:46.409] info) [13:13:46.409] } [13:13:46.409] else { [13:13:46.409] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:46.409] info, version) [13:13:46.409] } [13:13:46.409] base::stop(msg) [13:13:46.409] } [13:13:46.409] }) [13:13:46.409] } [13:13:46.409] ...future.mc.cores.old <- base::getOption("mc.cores") [13:13:46.409] base::options(mc.cores = 1L) [13:13:46.409] } [13:13:46.409] base::local({ [13:13:46.409] for (pkg in "future") { [13:13:46.409] base::loadNamespace(pkg) [13:13:46.409] base::library(pkg, character.only = TRUE) [13:13:46.409] } [13:13:46.409] }) [13:13:46.409] } [13:13:46.409] options(future.plan = NULL) [13:13:46.409] Sys.unsetenv("R_FUTURE_PLAN") [13:13:46.409] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:46.409] } [13:13:46.409] ...future.workdir <- getwd() [13:13:46.409] } [13:13:46.409] ...future.oldOptions <- base::as.list(base::.Options) [13:13:46.409] ...future.oldEnvVars <- base::Sys.getenv() [13:13:46.409] } [13:13:46.409] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:46.409] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:46.409] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:46.409] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:46.409] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:46.409] future.stdout.windows.reencode = NULL, width = 80L) [13:13:46.409] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:46.409] base::names(...future.oldOptions)) [13:13:46.409] } [13:13:46.409] if (FALSE) { [13:13:46.409] } [13:13:46.409] else { [13:13:46.409] if (TRUE) { [13:13:46.409] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:46.409] open = "w") [13:13:46.409] } [13:13:46.409] else { [13:13:46.409] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:46.409] windows = "NUL", "/dev/null"), open = "w") [13:13:46.409] } [13:13:46.409] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:46.409] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:46.409] base::sink(type = "output", split = FALSE) [13:13:46.409] base::close(...future.stdout) [13:13:46.409] }, add = TRUE) [13:13:46.409] } [13:13:46.409] ...future.frame <- base::sys.nframe() [13:13:46.409] ...future.conditions <- base::list() [13:13:46.409] ...future.rng <- base::globalenv()$.Random.seed [13:13:46.409] if (FALSE) { [13:13:46.409] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:46.409] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:46.409] } [13:13:46.409] ...future.result <- base::tryCatch({ [13:13:46.409] base::withCallingHandlers({ [13:13:46.409] ...future.value <- base::withVisible(base::local({ [13:13:46.409] ...future.makeSendCondition <- local({ [13:13:46.409] sendCondition <- NULL [13:13:46.409] function(frame = 1L) { [13:13:46.409] if (is.function(sendCondition)) [13:13:46.409] return(sendCondition) [13:13:46.409] ns <- getNamespace("parallel") [13:13:46.409] if (exists("sendData", mode = "function", [13:13:46.409] envir = ns)) { [13:13:46.409] parallel_sendData <- get("sendData", mode = "function", [13:13:46.409] envir = ns) [13:13:46.409] envir <- sys.frame(frame) [13:13:46.409] master <- NULL [13:13:46.409] while (!identical(envir, .GlobalEnv) && [13:13:46.409] !identical(envir, emptyenv())) { [13:13:46.409] if (exists("master", mode = "list", envir = envir, [13:13:46.409] inherits = FALSE)) { [13:13:46.409] master <- get("master", mode = "list", [13:13:46.409] envir = envir, inherits = FALSE) [13:13:46.409] if (inherits(master, c("SOCKnode", [13:13:46.409] "SOCK0node"))) { [13:13:46.409] sendCondition <<- function(cond) { [13:13:46.409] data <- list(type = "VALUE", value = cond, [13:13:46.409] success = TRUE) [13:13:46.409] parallel_sendData(master, data) [13:13:46.409] } [13:13:46.409] return(sendCondition) [13:13:46.409] } [13:13:46.409] } [13:13:46.409] frame <- frame + 1L [13:13:46.409] envir <- sys.frame(frame) [13:13:46.409] } [13:13:46.409] } [13:13:46.409] sendCondition <<- function(cond) NULL [13:13:46.409] } [13:13:46.409] }) [13:13:46.409] withCallingHandlers({ [13:13:46.409] { [13:13:46.409] do.call(function(...) { [13:13:46.409] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:46.409] if (!identical(...future.globals.maxSize.org, [13:13:46.409] ...future.globals.maxSize)) { [13:13:46.409] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:46.409] on.exit(options(oopts), add = TRUE) [13:13:46.409] } [13:13:46.409] { [13:13:46.409] lapply(seq_along(...future.elements_ii), [13:13:46.409] FUN = function(jj) { [13:13:46.409] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:46.409] ...future.FUN(...future.X_jj, ...) [13:13:46.409] }) [13:13:46.409] } [13:13:46.409] }, args = future.call.arguments) [13:13:46.409] } [13:13:46.409] }, immediateCondition = function(cond) { [13:13:46.409] sendCondition <- ...future.makeSendCondition() [13:13:46.409] sendCondition(cond) [13:13:46.409] muffleCondition <- function (cond, pattern = "^muffle") [13:13:46.409] { [13:13:46.409] inherits <- base::inherits [13:13:46.409] invokeRestart <- base::invokeRestart [13:13:46.409] is.null <- base::is.null [13:13:46.409] muffled <- FALSE [13:13:46.409] if (inherits(cond, "message")) { [13:13:46.409] muffled <- grepl(pattern, "muffleMessage") [13:13:46.409] if (muffled) [13:13:46.409] invokeRestart("muffleMessage") [13:13:46.409] } [13:13:46.409] else if (inherits(cond, "warning")) { [13:13:46.409] muffled <- grepl(pattern, "muffleWarning") [13:13:46.409] if (muffled) [13:13:46.409] invokeRestart("muffleWarning") [13:13:46.409] } [13:13:46.409] else if (inherits(cond, "condition")) { [13:13:46.409] if (!is.null(pattern)) { [13:13:46.409] computeRestarts <- base::computeRestarts [13:13:46.409] grepl <- base::grepl [13:13:46.409] restarts <- computeRestarts(cond) [13:13:46.409] for (restart in restarts) { [13:13:46.409] name <- restart$name [13:13:46.409] if (is.null(name)) [13:13:46.409] next [13:13:46.409] if (!grepl(pattern, name)) [13:13:46.409] next [13:13:46.409] invokeRestart(restart) [13:13:46.409] muffled <- TRUE [13:13:46.409] break [13:13:46.409] } [13:13:46.409] } [13:13:46.409] } [13:13:46.409] invisible(muffled) [13:13:46.409] } [13:13:46.409] muffleCondition(cond) [13:13:46.409] }) [13:13:46.409] })) [13:13:46.409] future::FutureResult(value = ...future.value$value, [13:13:46.409] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:46.409] ...future.rng), globalenv = if (FALSE) [13:13:46.409] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:46.409] ...future.globalenv.names)) [13:13:46.409] else NULL, started = ...future.startTime, version = "1.8") [13:13:46.409] }, condition = base::local({ [13:13:46.409] c <- base::c [13:13:46.409] inherits <- base::inherits [13:13:46.409] invokeRestart <- base::invokeRestart [13:13:46.409] length <- base::length [13:13:46.409] list <- base::list [13:13:46.409] seq.int <- base::seq.int [13:13:46.409] signalCondition <- base::signalCondition [13:13:46.409] sys.calls <- base::sys.calls [13:13:46.409] `[[` <- base::`[[` [13:13:46.409] `+` <- base::`+` [13:13:46.409] `<<-` <- base::`<<-` [13:13:46.409] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:46.409] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:46.409] 3L)] [13:13:46.409] } [13:13:46.409] function(cond) { [13:13:46.409] is_error <- inherits(cond, "error") [13:13:46.409] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:46.409] NULL) [13:13:46.409] if (is_error) { [13:13:46.409] sessionInformation <- function() { [13:13:46.409] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:46.409] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:46.409] search = base::search(), system = base::Sys.info()) [13:13:46.409] } [13:13:46.409] ...future.conditions[[length(...future.conditions) + [13:13:46.409] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:46.409] cond$call), session = sessionInformation(), [13:13:46.409] timestamp = base::Sys.time(), signaled = 0L) [13:13:46.409] signalCondition(cond) [13:13:46.409] } [13:13:46.409] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:46.409] "immediateCondition"))) { [13:13:46.409] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:46.409] ...future.conditions[[length(...future.conditions) + [13:13:46.409] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:46.409] if (TRUE && !signal) { [13:13:46.409] muffleCondition <- function (cond, pattern = "^muffle") [13:13:46.409] { [13:13:46.409] inherits <- base::inherits [13:13:46.409] invokeRestart <- base::invokeRestart [13:13:46.409] is.null <- base::is.null [13:13:46.409] muffled <- FALSE [13:13:46.409] if (inherits(cond, "message")) { [13:13:46.409] muffled <- grepl(pattern, "muffleMessage") [13:13:46.409] if (muffled) [13:13:46.409] invokeRestart("muffleMessage") [13:13:46.409] } [13:13:46.409] else if (inherits(cond, "warning")) { [13:13:46.409] muffled <- grepl(pattern, "muffleWarning") [13:13:46.409] if (muffled) [13:13:46.409] invokeRestart("muffleWarning") [13:13:46.409] } [13:13:46.409] else if (inherits(cond, "condition")) { [13:13:46.409] if (!is.null(pattern)) { [13:13:46.409] computeRestarts <- base::computeRestarts [13:13:46.409] grepl <- base::grepl [13:13:46.409] restarts <- computeRestarts(cond) [13:13:46.409] for (restart in restarts) { [13:13:46.409] name <- restart$name [13:13:46.409] if (is.null(name)) [13:13:46.409] next [13:13:46.409] if (!grepl(pattern, name)) [13:13:46.409] next [13:13:46.409] invokeRestart(restart) [13:13:46.409] muffled <- TRUE [13:13:46.409] break [13:13:46.409] } [13:13:46.409] } [13:13:46.409] } [13:13:46.409] invisible(muffled) [13:13:46.409] } [13:13:46.409] muffleCondition(cond, pattern = "^muffle") [13:13:46.409] } [13:13:46.409] } [13:13:46.409] else { [13:13:46.409] if (TRUE) { [13:13:46.409] muffleCondition <- function (cond, pattern = "^muffle") [13:13:46.409] { [13:13:46.409] inherits <- base::inherits [13:13:46.409] invokeRestart <- base::invokeRestart [13:13:46.409] is.null <- base::is.null [13:13:46.409] muffled <- FALSE [13:13:46.409] if (inherits(cond, "message")) { [13:13:46.409] muffled <- grepl(pattern, "muffleMessage") [13:13:46.409] if (muffled) [13:13:46.409] invokeRestart("muffleMessage") [13:13:46.409] } [13:13:46.409] else if (inherits(cond, "warning")) { [13:13:46.409] muffled <- grepl(pattern, "muffleWarning") [13:13:46.409] if (muffled) [13:13:46.409] invokeRestart("muffleWarning") [13:13:46.409] } [13:13:46.409] else if (inherits(cond, "condition")) { [13:13:46.409] if (!is.null(pattern)) { [13:13:46.409] computeRestarts <- base::computeRestarts [13:13:46.409] grepl <- base::grepl [13:13:46.409] restarts <- computeRestarts(cond) [13:13:46.409] for (restart in restarts) { [13:13:46.409] name <- restart$name [13:13:46.409] if (is.null(name)) [13:13:46.409] next [13:13:46.409] if (!grepl(pattern, name)) [13:13:46.409] next [13:13:46.409] invokeRestart(restart) [13:13:46.409] muffled <- TRUE [13:13:46.409] break [13:13:46.409] } [13:13:46.409] } [13:13:46.409] } [13:13:46.409] invisible(muffled) [13:13:46.409] } [13:13:46.409] muffleCondition(cond, pattern = "^muffle") [13:13:46.409] } [13:13:46.409] } [13:13:46.409] } [13:13:46.409] })) [13:13:46.409] }, error = function(ex) { [13:13:46.409] base::structure(base::list(value = NULL, visible = NULL, [13:13:46.409] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:46.409] ...future.rng), started = ...future.startTime, [13:13:46.409] finished = Sys.time(), session_uuid = NA_character_, [13:13:46.409] version = "1.8"), class = "FutureResult") [13:13:46.409] }, finally = { [13:13:46.409] if (!identical(...future.workdir, getwd())) [13:13:46.409] setwd(...future.workdir) [13:13:46.409] { [13:13:46.409] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:46.409] ...future.oldOptions$nwarnings <- NULL [13:13:46.409] } [13:13:46.409] base::options(...future.oldOptions) [13:13:46.409] if (.Platform$OS.type == "windows") { [13:13:46.409] old_names <- names(...future.oldEnvVars) [13:13:46.409] envs <- base::Sys.getenv() [13:13:46.409] names <- names(envs) [13:13:46.409] common <- intersect(names, old_names) [13:13:46.409] added <- setdiff(names, old_names) [13:13:46.409] removed <- setdiff(old_names, names) [13:13:46.409] changed <- common[...future.oldEnvVars[common] != [13:13:46.409] envs[common]] [13:13:46.409] NAMES <- toupper(changed) [13:13:46.409] args <- list() [13:13:46.409] for (kk in seq_along(NAMES)) { [13:13:46.409] name <- changed[[kk]] [13:13:46.409] NAME <- NAMES[[kk]] [13:13:46.409] if (name != NAME && is.element(NAME, old_names)) [13:13:46.409] next [13:13:46.409] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:46.409] } [13:13:46.409] NAMES <- toupper(added) [13:13:46.409] for (kk in seq_along(NAMES)) { [13:13:46.409] name <- added[[kk]] [13:13:46.409] NAME <- NAMES[[kk]] [13:13:46.409] if (name != NAME && is.element(NAME, old_names)) [13:13:46.409] next [13:13:46.409] args[[name]] <- "" [13:13:46.409] } [13:13:46.409] NAMES <- toupper(removed) [13:13:46.409] for (kk in seq_along(NAMES)) { [13:13:46.409] name <- removed[[kk]] [13:13:46.409] NAME <- NAMES[[kk]] [13:13:46.409] if (name != NAME && is.element(NAME, old_names)) [13:13:46.409] next [13:13:46.409] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:46.409] } [13:13:46.409] if (length(args) > 0) [13:13:46.409] base::do.call(base::Sys.setenv, args = args) [13:13:46.409] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:46.409] } [13:13:46.409] else { [13:13:46.409] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:46.409] } [13:13:46.409] { [13:13:46.409] if (base::length(...future.futureOptionsAdded) > [13:13:46.409] 0L) { [13:13:46.409] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:46.409] base::names(opts) <- ...future.futureOptionsAdded [13:13:46.409] base::options(opts) [13:13:46.409] } [13:13:46.409] { [13:13:46.409] { [13:13:46.409] base::options(mc.cores = ...future.mc.cores.old) [13:13:46.409] NULL [13:13:46.409] } [13:13:46.409] options(future.plan = NULL) [13:13:46.409] if (is.na(NA_character_)) [13:13:46.409] Sys.unsetenv("R_FUTURE_PLAN") [13:13:46.409] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:46.409] future::plan(list(function (..., workers = availableCores(), [13:13:46.409] lazy = FALSE, rscript_libs = .libPaths(), [13:13:46.409] envir = parent.frame()) [13:13:46.409] { [13:13:46.409] if (is.function(workers)) [13:13:46.409] workers <- workers() [13:13:46.409] workers <- structure(as.integer(workers), [13:13:46.409] class = class(workers)) [13:13:46.409] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:46.409] workers >= 1) [13:13:46.409] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:46.409] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:46.409] } [13:13:46.409] future <- MultisessionFuture(..., workers = workers, [13:13:46.409] lazy = lazy, rscript_libs = rscript_libs, [13:13:46.409] envir = envir) [13:13:46.409] if (!future$lazy) [13:13:46.409] future <- run(future) [13:13:46.409] invisible(future) [13:13:46.409] }), .cleanup = FALSE, .init = FALSE) [13:13:46.409] } [13:13:46.409] } [13:13:46.409] } [13:13:46.409] }) [13:13:46.409] if (TRUE) { [13:13:46.409] base::sink(type = "output", split = FALSE) [13:13:46.409] if (TRUE) { [13:13:46.409] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:46.409] } [13:13:46.409] else { [13:13:46.409] ...future.result["stdout"] <- base::list(NULL) [13:13:46.409] } [13:13:46.409] base::close(...future.stdout) [13:13:46.409] ...future.stdout <- NULL [13:13:46.409] } [13:13:46.409] ...future.result$conditions <- ...future.conditions [13:13:46.409] ...future.result$finished <- base::Sys.time() [13:13:46.409] ...future.result [13:13:46.409] } [13:13:46.414] Exporting 5 global objects (69.78 KiB) to cluster node #1 ... [13:13:46.414] Exporting '...future.FUN' (69.62 KiB) to cluster node #1 ... [13:13:46.415] Exporting '...future.FUN' (69.62 KiB) to cluster node #1 ... DONE [13:13:46.415] Exporting 'future.call.arguments' (168 bytes) to cluster node #1 ... [13:13:46.416] Exporting 'future.call.arguments' (168 bytes) to cluster node #1 ... DONE [13:13:46.416] Exporting '...future.elements_ii' (12.83 KiB) to cluster node #1 ... [13:13:46.417] Exporting '...future.elements_ii' (12.83 KiB) to cluster node #1 ... DONE [13:13:46.417] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:13:46.417] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:13:46.418] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:13:46.418] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:13:46.418] Exporting 5 global objects (69.78 KiB) to cluster node #1 ... DONE [13:13:46.419] MultisessionFuture started [13:13:46.419] - Launch lazy future ... done [13:13:46.419] run() for 'MultisessionFuture' ... done [13:13:46.419] Created future: [13:13:46.435] receiveMessageFromWorker() for ClusterFuture ... [13:13:46.436] - Validating connection of MultisessionFuture [13:13:46.436] - received message: FutureResult [13:13:46.436] - Received FutureResult [13:13:46.436] - Erased future from FutureRegistry [13:13:46.436] result() for ClusterFuture ... [13:13:46.437] - result already collected: FutureResult [13:13:46.437] result() for ClusterFuture ... done [13:13:46.437] receiveMessageFromWorker() for ClusterFuture ... done [13:13:46.420] MultisessionFuture: [13:13:46.420] Label: 'future_lapply-1' [13:13:46.420] Expression: [13:13:46.420] { [13:13:46.420] do.call(function(...) { [13:13:46.420] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:46.420] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:46.420] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:46.420] on.exit(options(oopts), add = TRUE) [13:13:46.420] } [13:13:46.420] { [13:13:46.420] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:46.420] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:46.420] ...future.FUN(...future.X_jj, ...) [13:13:46.420] }) [13:13:46.420] } [13:13:46.420] }, args = future.call.arguments) [13:13:46.420] } [13:13:46.420] Lazy evaluation: FALSE [13:13:46.420] Asynchronous evaluation: TRUE [13:13:46.420] Local evaluation: TRUE [13:13:46.420] Environment: R_GlobalEnv [13:13:46.420] Capture standard output: TRUE [13:13:46.420] Capture condition classes: 'condition' (excluding 'nothing') [13:13:46.420] 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) [13:13:46.420] Packages: 1 packages ('future') [13:13:46.420] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:46.420] Resolved: TRUE [13:13:46.420] Value: [13:13:46.420] Conditions captured: [13:13:46.420] Early signaling: FALSE [13:13:46.420] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:46.420] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:46.437] Chunk #1 of 1 ... DONE [13:13:46.438] Launching 1 futures (chunks) ... DONE [13:13:46.438] Resolving 1 futures (chunks) ... [13:13:46.438] resolve() on list ... [13:13:46.438] recursive: 0 [13:13:46.438] length: 1 [13:13:46.438] [13:13:46.438] Future #1 [13:13:46.439] result() for ClusterFuture ... [13:13:46.439] - result already collected: FutureResult [13:13:46.439] result() for ClusterFuture ... done [13:13:46.439] result() for ClusterFuture ... [13:13:46.439] - result already collected: FutureResult [13:13:46.439] result() for ClusterFuture ... done [13:13:46.440] signalConditionsASAP(MultisessionFuture, pos=1) ... [13:13:46.440] - nx: 1 [13:13:46.440] - relay: TRUE [13:13:46.440] - stdout: TRUE [13:13:46.440] - signal: TRUE [13:13:46.440] - resignal: FALSE [13:13:46.440] - force: TRUE [13:13:46.441] - relayed: [n=1] FALSE [13:13:46.441] - queued futures: [n=1] FALSE [13:13:46.441] - until=1 [13:13:46.441] - relaying element #1 [13:13:46.441] result() for ClusterFuture ... [13:13:46.441] - result already collected: FutureResult [13:13:46.442] result() for ClusterFuture ... done [13:13:46.442] result() for ClusterFuture ... [13:13:46.442] - result already collected: FutureResult [13:13:46.442] result() for ClusterFuture ... done [13:13:46.442] result() for ClusterFuture ... [13:13:46.442] - result already collected: FutureResult [13:13:46.442] result() for ClusterFuture ... done [13:13:46.443] result() for ClusterFuture ... [13:13:46.443] - result already collected: FutureResult [13:13:46.443] result() for ClusterFuture ... done [13:13:46.443] - relayed: [n=1] TRUE [13:13:46.443] - queued futures: [n=1] TRUE [13:13:46.443] signalConditionsASAP(MultisessionFuture, pos=1) ... done [13:13:46.444] length: 0 (resolved future 1) [13:13:46.444] Relaying remaining futures [13:13:46.444] signalConditionsASAP(NULL, pos=0) ... [13:13:46.444] - nx: 1 [13:13:46.444] - relay: TRUE [13:13:46.444] - stdout: TRUE [13:13:46.444] - signal: TRUE [13:13:46.445] - resignal: FALSE [13:13:46.445] - force: TRUE [13:13:46.445] - relayed: [n=1] TRUE [13:13:46.445] - queued futures: [n=1] TRUE - flush all [13:13:46.445] - relayed: [n=1] TRUE [13:13:46.445] - queued futures: [n=1] TRUE [13:13:46.446] signalConditionsASAP(NULL, pos=0) ... done [13:13:46.446] resolve() on list ... DONE [13:13:46.446] result() for ClusterFuture ... [13:13:46.446] - result already collected: FutureResult [13:13:46.446] result() for ClusterFuture ... done [13:13:46.446] result() for ClusterFuture ... [13:13:46.447] - result already collected: FutureResult [13:13:46.447] result() for ClusterFuture ... done [13:13:46.447] - Number of value chunks collected: 1 [13:13:46.447] Resolving 1 futures (chunks) ... DONE [13:13:46.447] Reducing values from 1 chunks ... [13:13:46.447] - Number of values collected after concatenation: 1 [13:13:46.447] - Number of values expected: 1 [13:13:46.448] Reducing values from 1 chunks ... DONE [13:13:46.448] future_lapply() ... DONE List of 1 $ y:List of 1 ..$ a: chr "hello; 1; 2; ...; 100" - future_lapply(x, FUN = listenv::listenv, ...) ... [13:13:46.449] future_lapply() ... [13:13:46.452] Number of chunks: 2 [13:13:46.452] getGlobalsAndPackagesXApply() ... [13:13:46.452] - future.globals: TRUE [13:13:46.452] getGlobalsAndPackages() ... [13:13:46.453] Searching for globals... [13:13:46.454] - globals found: [4] 'FUN', '{', 'get', 'parent.env' [13:13:46.454] Searching for globals ... DONE [13:13:46.454] Resolving globals: FALSE [13:13:46.455] The total size of the 1 globals is 4.85 KiB (4968 bytes) [13:13:46.455] 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') [13:13:46.455] - globals: [1] 'FUN' [13:13:46.456] - packages: [1] 'listenv' [13:13:46.456] getGlobalsAndPackages() ... DONE [13:13:46.456] - globals found/used: [n=1] 'FUN' [13:13:46.456] - needed namespaces: [n=1] 'listenv' [13:13:46.456] Finding globals ... DONE [13:13:46.457] - use_args: TRUE [13:13:46.457] - Getting '...' globals ... [13:13:46.457] resolve() on list ... [13:13:46.457] recursive: 0 [13:13:46.457] length: 1 [13:13:46.458] elements: '...' [13:13:46.458] length: 0 (resolved future 1) [13:13:46.458] resolve() on list ... DONE [13:13:46.458] - '...' content: [n=0] [13:13:46.458] List of 1 [13:13:46.458] $ ...: list() [13:13:46.458] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:46.458] - attr(*, "where")=List of 1 [13:13:46.458] ..$ ...: [13:13:46.458] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:46.458] - attr(*, "resolved")= logi TRUE [13:13:46.458] - attr(*, "total_size")= num NA [13:13:46.461] - Getting '...' globals ... DONE [13:13:46.461] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:46.462] List of 2 [13:13:46.462] $ ...future.FUN:function (x, ...) [13:13:46.462] $ ... : list() [13:13:46.462] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:46.462] - attr(*, "where")=List of 2 [13:13:46.462] ..$ ...future.FUN: [13:13:46.462] ..$ ... : [13:13:46.462] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:46.462] - attr(*, "resolved")= logi FALSE [13:13:46.462] - attr(*, "total_size")= num 4968 [13:13:46.465] Packages to be attached in all futures: [n=1] 'listenv' [13:13:46.465] getGlobalsAndPackagesXApply() ... DONE [13:13:46.465] Number of futures (= number of chunks): 2 [13:13:46.466] Launching 2 futures (chunks) ... [13:13:46.466] Chunk #1 of 2 ... [13:13:46.466] - Finding globals in 'X' for chunk #1 ... [13:13:46.466] getGlobalsAndPackages() ... [13:13:46.466] Searching for globals... [13:13:46.467] [13:13:46.467] Searching for globals ... DONE [13:13:46.467] - globals: [0] [13:13:46.467] getGlobalsAndPackages() ... DONE [13:13:46.467] + additional globals found: [n=0] [13:13:46.467] + additional namespaces needed: [n=0] [13:13:46.468] - Finding globals in 'X' for chunk #1 ... DONE [13:13:46.468] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:13:46.468] - seeds: [13:13:46.468] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:46.468] getGlobalsAndPackages() ... [13:13:46.468] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:46.469] Resolving globals: FALSE [13:13:46.469] Tweak future expression to call with '...' arguments ... [13:13:46.469] { [13:13:46.469] do.call(function(...) { [13:13:46.469] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:46.469] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:46.469] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:46.469] on.exit(options(oopts), add = TRUE) [13:13:46.469] } [13:13:46.469] { [13:13:46.469] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:46.469] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:46.469] ...future.FUN(...future.X_jj, ...) [13:13:46.469] }) [13:13:46.469] } [13:13:46.469] }, args = future.call.arguments) [13:13:46.469] } [13:13:46.469] Tweak future expression to call with '...' arguments ... DONE [13:13:46.470] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:46.470] - packages: [1] 'listenv' [13:13:46.470] getGlobalsAndPackages() ... DONE [13:13:46.471] run() for 'Future' ... [13:13:46.471] - state: 'created' [13:13:46.471] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:46.486] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:46.486] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:13:46.486] - Field: 'node' [13:13:46.486] - Field: 'label' [13:13:46.486] - Field: 'local' [13:13:46.487] - Field: 'owner' [13:13:46.487] - Field: 'envir' [13:13:46.487] - Field: 'workers' [13:13:46.487] - Field: 'packages' [13:13:46.487] - Field: 'gc' [13:13:46.487] - Field: 'conditions' [13:13:46.488] - Field: 'persistent' [13:13:46.488] - Field: 'expr' [13:13:46.488] - Field: 'uuid' [13:13:46.488] - Field: 'seed' [13:13:46.488] - Field: 'version' [13:13:46.488] - Field: 'result' [13:13:46.489] - Field: 'asynchronous' [13:13:46.489] - Field: 'calls' [13:13:46.489] - Field: 'globals' [13:13:46.489] - Field: 'stdout' [13:13:46.489] - Field: 'earlySignal' [13:13:46.489] - Field: 'lazy' [13:13:46.490] - Field: 'state' [13:13:46.490] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:13:46.490] - Launch lazy future ... [13:13:46.490] Packages needed by the future expression (n = 1): 'listenv' [13:13:46.491] Packages needed by future strategies (n = 0): [13:13:46.491] { [13:13:46.491] { [13:13:46.491] { [13:13:46.491] ...future.startTime <- base::Sys.time() [13:13:46.491] { [13:13:46.491] { [13:13:46.491] { [13:13:46.491] { [13:13:46.491] { [13:13:46.491] base::local({ [13:13:46.491] has_future <- base::requireNamespace("future", [13:13:46.491] quietly = TRUE) [13:13:46.491] if (has_future) { [13:13:46.491] ns <- base::getNamespace("future") [13:13:46.491] version <- ns[[".package"]][["version"]] [13:13:46.491] if (is.null(version)) [13:13:46.491] version <- utils::packageVersion("future") [13:13:46.491] } [13:13:46.491] else { [13:13:46.491] version <- NULL [13:13:46.491] } [13:13:46.491] if (!has_future || version < "1.8.0") { [13:13:46.491] info <- base::c(r_version = base::gsub("R version ", [13:13:46.491] "", base::R.version$version.string), [13:13:46.491] platform = base::sprintf("%s (%s-bit)", [13:13:46.491] base::R.version$platform, 8 * [13:13:46.491] base::.Machine$sizeof.pointer), [13:13:46.491] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:46.491] "release", "version")], collapse = " "), [13:13:46.491] hostname = base::Sys.info()[["nodename"]]) [13:13:46.491] info <- base::sprintf("%s: %s", base::names(info), [13:13:46.491] info) [13:13:46.491] info <- base::paste(info, collapse = "; ") [13:13:46.491] if (!has_future) { [13:13:46.491] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:46.491] info) [13:13:46.491] } [13:13:46.491] else { [13:13:46.491] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:46.491] info, version) [13:13:46.491] } [13:13:46.491] base::stop(msg) [13:13:46.491] } [13:13:46.491] }) [13:13:46.491] } [13:13:46.491] ...future.mc.cores.old <- base::getOption("mc.cores") [13:13:46.491] base::options(mc.cores = 1L) [13:13:46.491] } [13:13:46.491] base::local({ [13:13:46.491] for (pkg in "listenv") { [13:13:46.491] base::loadNamespace(pkg) [13:13:46.491] base::library(pkg, character.only = TRUE) [13:13:46.491] } [13:13:46.491] }) [13:13:46.491] } [13:13:46.491] options(future.plan = NULL) [13:13:46.491] Sys.unsetenv("R_FUTURE_PLAN") [13:13:46.491] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:46.491] } [13:13:46.491] ...future.workdir <- getwd() [13:13:46.491] } [13:13:46.491] ...future.oldOptions <- base::as.list(base::.Options) [13:13:46.491] ...future.oldEnvVars <- base::Sys.getenv() [13:13:46.491] } [13:13:46.491] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:46.491] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:13:46.491] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:46.491] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:46.491] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:46.491] future.stdout.windows.reencode = NULL, width = 80L) [13:13:46.491] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:46.491] base::names(...future.oldOptions)) [13:13:46.491] } [13:13:46.491] if (FALSE) { [13:13:46.491] } [13:13:46.491] else { [13:13:46.491] if (TRUE) { [13:13:46.491] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:46.491] open = "w") [13:13:46.491] } [13:13:46.491] else { [13:13:46.491] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:46.491] windows = "NUL", "/dev/null"), open = "w") [13:13:46.491] } [13:13:46.491] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:46.491] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:46.491] base::sink(type = "output", split = FALSE) [13:13:46.491] base::close(...future.stdout) [13:13:46.491] }, add = TRUE) [13:13:46.491] } [13:13:46.491] ...future.frame <- base::sys.nframe() [13:13:46.491] ...future.conditions <- base::list() [13:13:46.491] ...future.rng <- base::globalenv()$.Random.seed [13:13:46.491] if (FALSE) { [13:13:46.491] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:46.491] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:46.491] } [13:13:46.491] ...future.result <- base::tryCatch({ [13:13:46.491] base::withCallingHandlers({ [13:13:46.491] ...future.value <- base::withVisible(base::local({ [13:13:46.491] ...future.makeSendCondition <- local({ [13:13:46.491] sendCondition <- NULL [13:13:46.491] function(frame = 1L) { [13:13:46.491] if (is.function(sendCondition)) [13:13:46.491] return(sendCondition) [13:13:46.491] ns <- getNamespace("parallel") [13:13:46.491] if (exists("sendData", mode = "function", [13:13:46.491] envir = ns)) { [13:13:46.491] parallel_sendData <- get("sendData", mode = "function", [13:13:46.491] envir = ns) [13:13:46.491] envir <- sys.frame(frame) [13:13:46.491] master <- NULL [13:13:46.491] while (!identical(envir, .GlobalEnv) && [13:13:46.491] !identical(envir, emptyenv())) { [13:13:46.491] if (exists("master", mode = "list", envir = envir, [13:13:46.491] inherits = FALSE)) { [13:13:46.491] master <- get("master", mode = "list", [13:13:46.491] envir = envir, inherits = FALSE) [13:13:46.491] if (inherits(master, c("SOCKnode", [13:13:46.491] "SOCK0node"))) { [13:13:46.491] sendCondition <<- function(cond) { [13:13:46.491] data <- list(type = "VALUE", value = cond, [13:13:46.491] success = TRUE) [13:13:46.491] parallel_sendData(master, data) [13:13:46.491] } [13:13:46.491] return(sendCondition) [13:13:46.491] } [13:13:46.491] } [13:13:46.491] frame <- frame + 1L [13:13:46.491] envir <- sys.frame(frame) [13:13:46.491] } [13:13:46.491] } [13:13:46.491] sendCondition <<- function(cond) NULL [13:13:46.491] } [13:13:46.491] }) [13:13:46.491] withCallingHandlers({ [13:13:46.491] { [13:13:46.491] do.call(function(...) { [13:13:46.491] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:46.491] if (!identical(...future.globals.maxSize.org, [13:13:46.491] ...future.globals.maxSize)) { [13:13:46.491] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:46.491] on.exit(options(oopts), add = TRUE) [13:13:46.491] } [13:13:46.491] { [13:13:46.491] lapply(seq_along(...future.elements_ii), [13:13:46.491] FUN = function(jj) { [13:13:46.491] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:46.491] ...future.FUN(...future.X_jj, ...) [13:13:46.491] }) [13:13:46.491] } [13:13:46.491] }, args = future.call.arguments) [13:13:46.491] } [13:13:46.491] }, immediateCondition = function(cond) { [13:13:46.491] sendCondition <- ...future.makeSendCondition() [13:13:46.491] sendCondition(cond) [13:13:46.491] muffleCondition <- function (cond, pattern = "^muffle") [13:13:46.491] { [13:13:46.491] inherits <- base::inherits [13:13:46.491] invokeRestart <- base::invokeRestart [13:13:46.491] is.null <- base::is.null [13:13:46.491] muffled <- FALSE [13:13:46.491] if (inherits(cond, "message")) { [13:13:46.491] muffled <- grepl(pattern, "muffleMessage") [13:13:46.491] if (muffled) [13:13:46.491] invokeRestart("muffleMessage") [13:13:46.491] } [13:13:46.491] else if (inherits(cond, "warning")) { [13:13:46.491] muffled <- grepl(pattern, "muffleWarning") [13:13:46.491] if (muffled) [13:13:46.491] invokeRestart("muffleWarning") [13:13:46.491] } [13:13:46.491] else if (inherits(cond, "condition")) { [13:13:46.491] if (!is.null(pattern)) { [13:13:46.491] computeRestarts <- base::computeRestarts [13:13:46.491] grepl <- base::grepl [13:13:46.491] restarts <- computeRestarts(cond) [13:13:46.491] for (restart in restarts) { [13:13:46.491] name <- restart$name [13:13:46.491] if (is.null(name)) [13:13:46.491] next [13:13:46.491] if (!grepl(pattern, name)) [13:13:46.491] next [13:13:46.491] invokeRestart(restart) [13:13:46.491] muffled <- TRUE [13:13:46.491] break [13:13:46.491] } [13:13:46.491] } [13:13:46.491] } [13:13:46.491] invisible(muffled) [13:13:46.491] } [13:13:46.491] muffleCondition(cond) [13:13:46.491] }) [13:13:46.491] })) [13:13:46.491] future::FutureResult(value = ...future.value$value, [13:13:46.491] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:46.491] ...future.rng), globalenv = if (FALSE) [13:13:46.491] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:46.491] ...future.globalenv.names)) [13:13:46.491] else NULL, started = ...future.startTime, version = "1.8") [13:13:46.491] }, condition = base::local({ [13:13:46.491] c <- base::c [13:13:46.491] inherits <- base::inherits [13:13:46.491] invokeRestart <- base::invokeRestart [13:13:46.491] length <- base::length [13:13:46.491] list <- base::list [13:13:46.491] seq.int <- base::seq.int [13:13:46.491] signalCondition <- base::signalCondition [13:13:46.491] sys.calls <- base::sys.calls [13:13:46.491] `[[` <- base::`[[` [13:13:46.491] `+` <- base::`+` [13:13:46.491] `<<-` <- base::`<<-` [13:13:46.491] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:46.491] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:46.491] 3L)] [13:13:46.491] } [13:13:46.491] function(cond) { [13:13:46.491] is_error <- inherits(cond, "error") [13:13:46.491] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:46.491] NULL) [13:13:46.491] if (is_error) { [13:13:46.491] sessionInformation <- function() { [13:13:46.491] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:46.491] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:46.491] search = base::search(), system = base::Sys.info()) [13:13:46.491] } [13:13:46.491] ...future.conditions[[length(...future.conditions) + [13:13:46.491] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:46.491] cond$call), session = sessionInformation(), [13:13:46.491] timestamp = base::Sys.time(), signaled = 0L) [13:13:46.491] signalCondition(cond) [13:13:46.491] } [13:13:46.491] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:46.491] "immediateCondition"))) { [13:13:46.491] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:46.491] ...future.conditions[[length(...future.conditions) + [13:13:46.491] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:46.491] if (TRUE && !signal) { [13:13:46.491] muffleCondition <- function (cond, pattern = "^muffle") [13:13:46.491] { [13:13:46.491] inherits <- base::inherits [13:13:46.491] invokeRestart <- base::invokeRestart [13:13:46.491] is.null <- base::is.null [13:13:46.491] muffled <- FALSE [13:13:46.491] if (inherits(cond, "message")) { [13:13:46.491] muffled <- grepl(pattern, "muffleMessage") [13:13:46.491] if (muffled) [13:13:46.491] invokeRestart("muffleMessage") [13:13:46.491] } [13:13:46.491] else if (inherits(cond, "warning")) { [13:13:46.491] muffled <- grepl(pattern, "muffleWarning") [13:13:46.491] if (muffled) [13:13:46.491] invokeRestart("muffleWarning") [13:13:46.491] } [13:13:46.491] else if (inherits(cond, "condition")) { [13:13:46.491] if (!is.null(pattern)) { [13:13:46.491] computeRestarts <- base::computeRestarts [13:13:46.491] grepl <- base::grepl [13:13:46.491] restarts <- computeRestarts(cond) [13:13:46.491] for (restart in restarts) { [13:13:46.491] name <- restart$name [13:13:46.491] if (is.null(name)) [13:13:46.491] next [13:13:46.491] if (!grepl(pattern, name)) [13:13:46.491] next [13:13:46.491] invokeRestart(restart) [13:13:46.491] muffled <- TRUE [13:13:46.491] break [13:13:46.491] } [13:13:46.491] } [13:13:46.491] } [13:13:46.491] invisible(muffled) [13:13:46.491] } [13:13:46.491] muffleCondition(cond, pattern = "^muffle") [13:13:46.491] } [13:13:46.491] } [13:13:46.491] else { [13:13:46.491] if (TRUE) { [13:13:46.491] muffleCondition <- function (cond, pattern = "^muffle") [13:13:46.491] { [13:13:46.491] inherits <- base::inherits [13:13:46.491] invokeRestart <- base::invokeRestart [13:13:46.491] is.null <- base::is.null [13:13:46.491] muffled <- FALSE [13:13:46.491] if (inherits(cond, "message")) { [13:13:46.491] muffled <- grepl(pattern, "muffleMessage") [13:13:46.491] if (muffled) [13:13:46.491] invokeRestart("muffleMessage") [13:13:46.491] } [13:13:46.491] else if (inherits(cond, "warning")) { [13:13:46.491] muffled <- grepl(pattern, "muffleWarning") [13:13:46.491] if (muffled) [13:13:46.491] invokeRestart("muffleWarning") [13:13:46.491] } [13:13:46.491] else if (inherits(cond, "condition")) { [13:13:46.491] if (!is.null(pattern)) { [13:13:46.491] computeRestarts <- base::computeRestarts [13:13:46.491] grepl <- base::grepl [13:13:46.491] restarts <- computeRestarts(cond) [13:13:46.491] for (restart in restarts) { [13:13:46.491] name <- restart$name [13:13:46.491] if (is.null(name)) [13:13:46.491] next [13:13:46.491] if (!grepl(pattern, name)) [13:13:46.491] next [13:13:46.491] invokeRestart(restart) [13:13:46.491] muffled <- TRUE [13:13:46.491] break [13:13:46.491] } [13:13:46.491] } [13:13:46.491] } [13:13:46.491] invisible(muffled) [13:13:46.491] } [13:13:46.491] muffleCondition(cond, pattern = "^muffle") [13:13:46.491] } [13:13:46.491] } [13:13:46.491] } [13:13:46.491] })) [13:13:46.491] }, error = function(ex) { [13:13:46.491] base::structure(base::list(value = NULL, visible = NULL, [13:13:46.491] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:46.491] ...future.rng), started = ...future.startTime, [13:13:46.491] finished = Sys.time(), session_uuid = NA_character_, [13:13:46.491] version = "1.8"), class = "FutureResult") [13:13:46.491] }, finally = { [13:13:46.491] if (!identical(...future.workdir, getwd())) [13:13:46.491] setwd(...future.workdir) [13:13:46.491] { [13:13:46.491] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:46.491] ...future.oldOptions$nwarnings <- NULL [13:13:46.491] } [13:13:46.491] base::options(...future.oldOptions) [13:13:46.491] if (.Platform$OS.type == "windows") { [13:13:46.491] old_names <- names(...future.oldEnvVars) [13:13:46.491] envs <- base::Sys.getenv() [13:13:46.491] names <- names(envs) [13:13:46.491] common <- intersect(names, old_names) [13:13:46.491] added <- setdiff(names, old_names) [13:13:46.491] removed <- setdiff(old_names, names) [13:13:46.491] changed <- common[...future.oldEnvVars[common] != [13:13:46.491] envs[common]] [13:13:46.491] NAMES <- toupper(changed) [13:13:46.491] args <- list() [13:13:46.491] for (kk in seq_along(NAMES)) { [13:13:46.491] name <- changed[[kk]] [13:13:46.491] NAME <- NAMES[[kk]] [13:13:46.491] if (name != NAME && is.element(NAME, old_names)) [13:13:46.491] next [13:13:46.491] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:46.491] } [13:13:46.491] NAMES <- toupper(added) [13:13:46.491] for (kk in seq_along(NAMES)) { [13:13:46.491] name <- added[[kk]] [13:13:46.491] NAME <- NAMES[[kk]] [13:13:46.491] if (name != NAME && is.element(NAME, old_names)) [13:13:46.491] next [13:13:46.491] args[[name]] <- "" [13:13:46.491] } [13:13:46.491] NAMES <- toupper(removed) [13:13:46.491] for (kk in seq_along(NAMES)) { [13:13:46.491] name <- removed[[kk]] [13:13:46.491] NAME <- NAMES[[kk]] [13:13:46.491] if (name != NAME && is.element(NAME, old_names)) [13:13:46.491] next [13:13:46.491] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:46.491] } [13:13:46.491] if (length(args) > 0) [13:13:46.491] base::do.call(base::Sys.setenv, args = args) [13:13:46.491] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:46.491] } [13:13:46.491] else { [13:13:46.491] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:46.491] } [13:13:46.491] { [13:13:46.491] if (base::length(...future.futureOptionsAdded) > [13:13:46.491] 0L) { [13:13:46.491] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:46.491] base::names(opts) <- ...future.futureOptionsAdded [13:13:46.491] base::options(opts) [13:13:46.491] } [13:13:46.491] { [13:13:46.491] { [13:13:46.491] base::options(mc.cores = ...future.mc.cores.old) [13:13:46.491] NULL [13:13:46.491] } [13:13:46.491] options(future.plan = NULL) [13:13:46.491] if (is.na(NA_character_)) [13:13:46.491] Sys.unsetenv("R_FUTURE_PLAN") [13:13:46.491] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:46.491] future::plan(list(function (..., workers = availableCores(), [13:13:46.491] lazy = FALSE, rscript_libs = .libPaths(), [13:13:46.491] envir = parent.frame()) [13:13:46.491] { [13:13:46.491] if (is.function(workers)) [13:13:46.491] workers <- workers() [13:13:46.491] workers <- structure(as.integer(workers), [13:13:46.491] class = class(workers)) [13:13:46.491] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:46.491] workers >= 1) [13:13:46.491] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:46.491] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:46.491] } [13:13:46.491] future <- MultisessionFuture(..., workers = workers, [13:13:46.491] lazy = lazy, rscript_libs = rscript_libs, [13:13:46.491] envir = envir) [13:13:46.491] if (!future$lazy) [13:13:46.491] future <- run(future) [13:13:46.491] invisible(future) [13:13:46.491] }), .cleanup = FALSE, .init = FALSE) [13:13:46.491] } [13:13:46.491] } [13:13:46.491] } [13:13:46.491] }) [13:13:46.491] if (TRUE) { [13:13:46.491] base::sink(type = "output", split = FALSE) [13:13:46.491] if (TRUE) { [13:13:46.491] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:46.491] } [13:13:46.491] else { [13:13:46.491] ...future.result["stdout"] <- base::list(NULL) [13:13:46.491] } [13:13:46.491] base::close(...future.stdout) [13:13:46.491] ...future.stdout <- NULL [13:13:46.491] } [13:13:46.491] ...future.result$conditions <- ...future.conditions [13:13:46.491] ...future.result$finished <- base::Sys.time() [13:13:46.491] ...future.result [13:13:46.491] } [13:13:46.497] Exporting 5 global objects (4.85 KiB) to cluster node #1 ... [13:13:46.497] Exporting '...future.FUN' (4.85 KiB) to cluster node #1 ... [13:13:46.497] Exporting '...future.FUN' (4.85 KiB) to cluster node #1 ... DONE [13:13:46.498] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... [13:13:46.498] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... DONE [13:13:46.498] Exporting '...future.elements_ii' (112 bytes) to cluster node #1 ... [13:13:46.499] Exporting '...future.elements_ii' (112 bytes) to cluster node #1 ... DONE [13:13:46.499] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:13:46.499] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:13:46.500] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:13:46.500] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:13:46.500] Exporting 5 global objects (4.85 KiB) to cluster node #1 ... DONE [13:13:46.501] MultisessionFuture started [13:13:46.501] - Launch lazy future ... done [13:13:46.501] run() for 'MultisessionFuture' ... done [13:13:46.501] Created future: [13:13:46.517] receiveMessageFromWorker() for ClusterFuture ... [13:13:46.517] - Validating connection of MultisessionFuture [13:13:46.517] - received message: FutureResult [13:13:46.517] - Received FutureResult [13:13:46.518] - Erased future from FutureRegistry [13:13:46.518] result() for ClusterFuture ... [13:13:46.518] - result already collected: FutureResult [13:13:46.518] result() for ClusterFuture ... done [13:13:46.518] receiveMessageFromWorker() for ClusterFuture ... done [13:13:46.502] MultisessionFuture: [13:13:46.502] Label: 'future_lapply-1' [13:13:46.502] Expression: [13:13:46.502] { [13:13:46.502] do.call(function(...) { [13:13:46.502] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:46.502] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:46.502] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:46.502] on.exit(options(oopts), add = TRUE) [13:13:46.502] } [13:13:46.502] { [13:13:46.502] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:46.502] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:46.502] ...future.FUN(...future.X_jj, ...) [13:13:46.502] }) [13:13:46.502] } [13:13:46.502] }, args = future.call.arguments) [13:13:46.502] } [13:13:46.502] Lazy evaluation: FALSE [13:13:46.502] Asynchronous evaluation: TRUE [13:13:46.502] Local evaluation: TRUE [13:13:46.502] Environment: R_GlobalEnv [13:13:46.502] Capture standard output: TRUE [13:13:46.502] Capture condition classes: 'condition' (excluding 'nothing') [13:13:46.502] 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) [13:13:46.502] Packages: 1 packages ('listenv') [13:13:46.502] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:46.502] Resolved: TRUE [13:13:46.502] Value: [13:13:46.502] Conditions captured: [13:13:46.502] Early signaling: FALSE [13:13:46.502] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:46.502] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:46.519] Chunk #1 of 2 ... DONE [13:13:46.519] Chunk #2 of 2 ... [13:13:46.519] - Finding globals in 'X' for chunk #2 ... [13:13:46.519] getGlobalsAndPackages() ... [13:13:46.519] Searching for globals... [13:13:46.520] [13:13:46.520] Searching for globals ... DONE [13:13:46.520] - globals: [0] [13:13:46.520] getGlobalsAndPackages() ... DONE [13:13:46.520] + additional globals found: [n=0] [13:13:46.521] + additional namespaces needed: [n=0] [13:13:46.521] - Finding globals in 'X' for chunk #2 ... DONE [13:13:46.521] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:13:46.521] - seeds: [13:13:46.521] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:46.521] getGlobalsAndPackages() ... [13:13:46.522] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:46.522] Resolving globals: FALSE [13:13:46.522] Tweak future expression to call with '...' arguments ... [13:13:46.522] { [13:13:46.522] do.call(function(...) { [13:13:46.522] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:46.522] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:46.522] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:46.522] on.exit(options(oopts), add = TRUE) [13:13:46.522] } [13:13:46.522] { [13:13:46.522] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:46.522] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:46.522] ...future.FUN(...future.X_jj, ...) [13:13:46.522] }) [13:13:46.522] } [13:13:46.522] }, args = future.call.arguments) [13:13:46.522] } [13:13:46.523] Tweak future expression to call with '...' arguments ... DONE [13:13:46.523] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:46.523] - packages: [1] 'listenv' [13:13:46.523] getGlobalsAndPackages() ... DONE [13:13:46.524] run() for 'Future' ... [13:13:46.524] - state: 'created' [13:13:46.524] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:46.540] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:46.540] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:13:46.541] - Field: 'node' [13:13:46.541] - Field: 'label' [13:13:46.541] - Field: 'local' [13:13:46.541] - Field: 'owner' [13:13:46.541] - Field: 'envir' [13:13:46.541] - Field: 'workers' [13:13:46.542] - Field: 'packages' [13:13:46.542] - Field: 'gc' [13:13:46.542] - Field: 'conditions' [13:13:46.542] - Field: 'persistent' [13:13:46.542] - Field: 'expr' [13:13:46.542] - Field: 'uuid' [13:13:46.543] - Field: 'seed' [13:13:46.543] - Field: 'version' [13:13:46.543] - Field: 'result' [13:13:46.543] - Field: 'asynchronous' [13:13:46.543] - Field: 'calls' [13:13:46.544] - Field: 'globals' [13:13:46.544] - Field: 'stdout' [13:13:46.544] - Field: 'earlySignal' [13:13:46.544] - Field: 'lazy' [13:13:46.544] - Field: 'state' [13:13:46.544] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:13:46.545] - Launch lazy future ... [13:13:46.545] Packages needed by the future expression (n = 1): 'listenv' [13:13:46.545] Packages needed by future strategies (n = 0): [13:13:46.546] { [13:13:46.546] { [13:13:46.546] { [13:13:46.546] ...future.startTime <- base::Sys.time() [13:13:46.546] { [13:13:46.546] { [13:13:46.546] { [13:13:46.546] { [13:13:46.546] { [13:13:46.546] base::local({ [13:13:46.546] has_future <- base::requireNamespace("future", [13:13:46.546] quietly = TRUE) [13:13:46.546] if (has_future) { [13:13:46.546] ns <- base::getNamespace("future") [13:13:46.546] version <- ns[[".package"]][["version"]] [13:13:46.546] if (is.null(version)) [13:13:46.546] version <- utils::packageVersion("future") [13:13:46.546] } [13:13:46.546] else { [13:13:46.546] version <- NULL [13:13:46.546] } [13:13:46.546] if (!has_future || version < "1.8.0") { [13:13:46.546] info <- base::c(r_version = base::gsub("R version ", [13:13:46.546] "", base::R.version$version.string), [13:13:46.546] platform = base::sprintf("%s (%s-bit)", [13:13:46.546] base::R.version$platform, 8 * [13:13:46.546] base::.Machine$sizeof.pointer), [13:13:46.546] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:46.546] "release", "version")], collapse = " "), [13:13:46.546] hostname = base::Sys.info()[["nodename"]]) [13:13:46.546] info <- base::sprintf("%s: %s", base::names(info), [13:13:46.546] info) [13:13:46.546] info <- base::paste(info, collapse = "; ") [13:13:46.546] if (!has_future) { [13:13:46.546] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:46.546] info) [13:13:46.546] } [13:13:46.546] else { [13:13:46.546] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:46.546] info, version) [13:13:46.546] } [13:13:46.546] base::stop(msg) [13:13:46.546] } [13:13:46.546] }) [13:13:46.546] } [13:13:46.546] ...future.mc.cores.old <- base::getOption("mc.cores") [13:13:46.546] base::options(mc.cores = 1L) [13:13:46.546] } [13:13:46.546] base::local({ [13:13:46.546] for (pkg in "listenv") { [13:13:46.546] base::loadNamespace(pkg) [13:13:46.546] base::library(pkg, character.only = TRUE) [13:13:46.546] } [13:13:46.546] }) [13:13:46.546] } [13:13:46.546] options(future.plan = NULL) [13:13:46.546] Sys.unsetenv("R_FUTURE_PLAN") [13:13:46.546] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:46.546] } [13:13:46.546] ...future.workdir <- getwd() [13:13:46.546] } [13:13:46.546] ...future.oldOptions <- base::as.list(base::.Options) [13:13:46.546] ...future.oldEnvVars <- base::Sys.getenv() [13:13:46.546] } [13:13:46.546] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:46.546] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:13:46.546] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:46.546] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:46.546] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:46.546] future.stdout.windows.reencode = NULL, width = 80L) [13:13:46.546] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:46.546] base::names(...future.oldOptions)) [13:13:46.546] } [13:13:46.546] if (FALSE) { [13:13:46.546] } [13:13:46.546] else { [13:13:46.546] if (TRUE) { [13:13:46.546] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:46.546] open = "w") [13:13:46.546] } [13:13:46.546] else { [13:13:46.546] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:46.546] windows = "NUL", "/dev/null"), open = "w") [13:13:46.546] } [13:13:46.546] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:46.546] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:46.546] base::sink(type = "output", split = FALSE) [13:13:46.546] base::close(...future.stdout) [13:13:46.546] }, add = TRUE) [13:13:46.546] } [13:13:46.546] ...future.frame <- base::sys.nframe() [13:13:46.546] ...future.conditions <- base::list() [13:13:46.546] ...future.rng <- base::globalenv()$.Random.seed [13:13:46.546] if (FALSE) { [13:13:46.546] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:46.546] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:46.546] } [13:13:46.546] ...future.result <- base::tryCatch({ [13:13:46.546] base::withCallingHandlers({ [13:13:46.546] ...future.value <- base::withVisible(base::local({ [13:13:46.546] ...future.makeSendCondition <- local({ [13:13:46.546] sendCondition <- NULL [13:13:46.546] function(frame = 1L) { [13:13:46.546] if (is.function(sendCondition)) [13:13:46.546] return(sendCondition) [13:13:46.546] ns <- getNamespace("parallel") [13:13:46.546] if (exists("sendData", mode = "function", [13:13:46.546] envir = ns)) { [13:13:46.546] parallel_sendData <- get("sendData", mode = "function", [13:13:46.546] envir = ns) [13:13:46.546] envir <- sys.frame(frame) [13:13:46.546] master <- NULL [13:13:46.546] while (!identical(envir, .GlobalEnv) && [13:13:46.546] !identical(envir, emptyenv())) { [13:13:46.546] if (exists("master", mode = "list", envir = envir, [13:13:46.546] inherits = FALSE)) { [13:13:46.546] master <- get("master", mode = "list", [13:13:46.546] envir = envir, inherits = FALSE) [13:13:46.546] if (inherits(master, c("SOCKnode", [13:13:46.546] "SOCK0node"))) { [13:13:46.546] sendCondition <<- function(cond) { [13:13:46.546] data <- list(type = "VALUE", value = cond, [13:13:46.546] success = TRUE) [13:13:46.546] parallel_sendData(master, data) [13:13:46.546] } [13:13:46.546] return(sendCondition) [13:13:46.546] } [13:13:46.546] } [13:13:46.546] frame <- frame + 1L [13:13:46.546] envir <- sys.frame(frame) [13:13:46.546] } [13:13:46.546] } [13:13:46.546] sendCondition <<- function(cond) NULL [13:13:46.546] } [13:13:46.546] }) [13:13:46.546] withCallingHandlers({ [13:13:46.546] { [13:13:46.546] do.call(function(...) { [13:13:46.546] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:46.546] if (!identical(...future.globals.maxSize.org, [13:13:46.546] ...future.globals.maxSize)) { [13:13:46.546] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:46.546] on.exit(options(oopts), add = TRUE) [13:13:46.546] } [13:13:46.546] { [13:13:46.546] lapply(seq_along(...future.elements_ii), [13:13:46.546] FUN = function(jj) { [13:13:46.546] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:46.546] ...future.FUN(...future.X_jj, ...) [13:13:46.546] }) [13:13:46.546] } [13:13:46.546] }, args = future.call.arguments) [13:13:46.546] } [13:13:46.546] }, immediateCondition = function(cond) { [13:13:46.546] sendCondition <- ...future.makeSendCondition() [13:13:46.546] sendCondition(cond) [13:13:46.546] muffleCondition <- function (cond, pattern = "^muffle") [13:13:46.546] { [13:13:46.546] inherits <- base::inherits [13:13:46.546] invokeRestart <- base::invokeRestart [13:13:46.546] is.null <- base::is.null [13:13:46.546] muffled <- FALSE [13:13:46.546] if (inherits(cond, "message")) { [13:13:46.546] muffled <- grepl(pattern, "muffleMessage") [13:13:46.546] if (muffled) [13:13:46.546] invokeRestart("muffleMessage") [13:13:46.546] } [13:13:46.546] else if (inherits(cond, "warning")) { [13:13:46.546] muffled <- grepl(pattern, "muffleWarning") [13:13:46.546] if (muffled) [13:13:46.546] invokeRestart("muffleWarning") [13:13:46.546] } [13:13:46.546] else if (inherits(cond, "condition")) { [13:13:46.546] if (!is.null(pattern)) { [13:13:46.546] computeRestarts <- base::computeRestarts [13:13:46.546] grepl <- base::grepl [13:13:46.546] restarts <- computeRestarts(cond) [13:13:46.546] for (restart in restarts) { [13:13:46.546] name <- restart$name [13:13:46.546] if (is.null(name)) [13:13:46.546] next [13:13:46.546] if (!grepl(pattern, name)) [13:13:46.546] next [13:13:46.546] invokeRestart(restart) [13:13:46.546] muffled <- TRUE [13:13:46.546] break [13:13:46.546] } [13:13:46.546] } [13:13:46.546] } [13:13:46.546] invisible(muffled) [13:13:46.546] } [13:13:46.546] muffleCondition(cond) [13:13:46.546] }) [13:13:46.546] })) [13:13:46.546] future::FutureResult(value = ...future.value$value, [13:13:46.546] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:46.546] ...future.rng), globalenv = if (FALSE) [13:13:46.546] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:46.546] ...future.globalenv.names)) [13:13:46.546] else NULL, started = ...future.startTime, version = "1.8") [13:13:46.546] }, condition = base::local({ [13:13:46.546] c <- base::c [13:13:46.546] inherits <- base::inherits [13:13:46.546] invokeRestart <- base::invokeRestart [13:13:46.546] length <- base::length [13:13:46.546] list <- base::list [13:13:46.546] seq.int <- base::seq.int [13:13:46.546] signalCondition <- base::signalCondition [13:13:46.546] sys.calls <- base::sys.calls [13:13:46.546] `[[` <- base::`[[` [13:13:46.546] `+` <- base::`+` [13:13:46.546] `<<-` <- base::`<<-` [13:13:46.546] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:46.546] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:46.546] 3L)] [13:13:46.546] } [13:13:46.546] function(cond) { [13:13:46.546] is_error <- inherits(cond, "error") [13:13:46.546] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:46.546] NULL) [13:13:46.546] if (is_error) { [13:13:46.546] sessionInformation <- function() { [13:13:46.546] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:46.546] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:46.546] search = base::search(), system = base::Sys.info()) [13:13:46.546] } [13:13:46.546] ...future.conditions[[length(...future.conditions) + [13:13:46.546] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:46.546] cond$call), session = sessionInformation(), [13:13:46.546] timestamp = base::Sys.time(), signaled = 0L) [13:13:46.546] signalCondition(cond) [13:13:46.546] } [13:13:46.546] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:46.546] "immediateCondition"))) { [13:13:46.546] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:46.546] ...future.conditions[[length(...future.conditions) + [13:13:46.546] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:46.546] if (TRUE && !signal) { [13:13:46.546] muffleCondition <- function (cond, pattern = "^muffle") [13:13:46.546] { [13:13:46.546] inherits <- base::inherits [13:13:46.546] invokeRestart <- base::invokeRestart [13:13:46.546] is.null <- base::is.null [13:13:46.546] muffled <- FALSE [13:13:46.546] if (inherits(cond, "message")) { [13:13:46.546] muffled <- grepl(pattern, "muffleMessage") [13:13:46.546] if (muffled) [13:13:46.546] invokeRestart("muffleMessage") [13:13:46.546] } [13:13:46.546] else if (inherits(cond, "warning")) { [13:13:46.546] muffled <- grepl(pattern, "muffleWarning") [13:13:46.546] if (muffled) [13:13:46.546] invokeRestart("muffleWarning") [13:13:46.546] } [13:13:46.546] else if (inherits(cond, "condition")) { [13:13:46.546] if (!is.null(pattern)) { [13:13:46.546] computeRestarts <- base::computeRestarts [13:13:46.546] grepl <- base::grepl [13:13:46.546] restarts <- computeRestarts(cond) [13:13:46.546] for (restart in restarts) { [13:13:46.546] name <- restart$name [13:13:46.546] if (is.null(name)) [13:13:46.546] next [13:13:46.546] if (!grepl(pattern, name)) [13:13:46.546] next [13:13:46.546] invokeRestart(restart) [13:13:46.546] muffled <- TRUE [13:13:46.546] break [13:13:46.546] } [13:13:46.546] } [13:13:46.546] } [13:13:46.546] invisible(muffled) [13:13:46.546] } [13:13:46.546] muffleCondition(cond, pattern = "^muffle") [13:13:46.546] } [13:13:46.546] } [13:13:46.546] else { [13:13:46.546] if (TRUE) { [13:13:46.546] muffleCondition <- function (cond, pattern = "^muffle") [13:13:46.546] { [13:13:46.546] inherits <- base::inherits [13:13:46.546] invokeRestart <- base::invokeRestart [13:13:46.546] is.null <- base::is.null [13:13:46.546] muffled <- FALSE [13:13:46.546] if (inherits(cond, "message")) { [13:13:46.546] muffled <- grepl(pattern, "muffleMessage") [13:13:46.546] if (muffled) [13:13:46.546] invokeRestart("muffleMessage") [13:13:46.546] } [13:13:46.546] else if (inherits(cond, "warning")) { [13:13:46.546] muffled <- grepl(pattern, "muffleWarning") [13:13:46.546] if (muffled) [13:13:46.546] invokeRestart("muffleWarning") [13:13:46.546] } [13:13:46.546] else if (inherits(cond, "condition")) { [13:13:46.546] if (!is.null(pattern)) { [13:13:46.546] computeRestarts <- base::computeRestarts [13:13:46.546] grepl <- base::grepl [13:13:46.546] restarts <- computeRestarts(cond) [13:13:46.546] for (restart in restarts) { [13:13:46.546] name <- restart$name [13:13:46.546] if (is.null(name)) [13:13:46.546] next [13:13:46.546] if (!grepl(pattern, name)) [13:13:46.546] next [13:13:46.546] invokeRestart(restart) [13:13:46.546] muffled <- TRUE [13:13:46.546] break [13:13:46.546] } [13:13:46.546] } [13:13:46.546] } [13:13:46.546] invisible(muffled) [13:13:46.546] } [13:13:46.546] muffleCondition(cond, pattern = "^muffle") [13:13:46.546] } [13:13:46.546] } [13:13:46.546] } [13:13:46.546] })) [13:13:46.546] }, error = function(ex) { [13:13:46.546] base::structure(base::list(value = NULL, visible = NULL, [13:13:46.546] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:46.546] ...future.rng), started = ...future.startTime, [13:13:46.546] finished = Sys.time(), session_uuid = NA_character_, [13:13:46.546] version = "1.8"), class = "FutureResult") [13:13:46.546] }, finally = { [13:13:46.546] if (!identical(...future.workdir, getwd())) [13:13:46.546] setwd(...future.workdir) [13:13:46.546] { [13:13:46.546] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:46.546] ...future.oldOptions$nwarnings <- NULL [13:13:46.546] } [13:13:46.546] base::options(...future.oldOptions) [13:13:46.546] if (.Platform$OS.type == "windows") { [13:13:46.546] old_names <- names(...future.oldEnvVars) [13:13:46.546] envs <- base::Sys.getenv() [13:13:46.546] names <- names(envs) [13:13:46.546] common <- intersect(names, old_names) [13:13:46.546] added <- setdiff(names, old_names) [13:13:46.546] removed <- setdiff(old_names, names) [13:13:46.546] changed <- common[...future.oldEnvVars[common] != [13:13:46.546] envs[common]] [13:13:46.546] NAMES <- toupper(changed) [13:13:46.546] args <- list() [13:13:46.546] for (kk in seq_along(NAMES)) { [13:13:46.546] name <- changed[[kk]] [13:13:46.546] NAME <- NAMES[[kk]] [13:13:46.546] if (name != NAME && is.element(NAME, old_names)) [13:13:46.546] next [13:13:46.546] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:46.546] } [13:13:46.546] NAMES <- toupper(added) [13:13:46.546] for (kk in seq_along(NAMES)) { [13:13:46.546] name <- added[[kk]] [13:13:46.546] NAME <- NAMES[[kk]] [13:13:46.546] if (name != NAME && is.element(NAME, old_names)) [13:13:46.546] next [13:13:46.546] args[[name]] <- "" [13:13:46.546] } [13:13:46.546] NAMES <- toupper(removed) [13:13:46.546] for (kk in seq_along(NAMES)) { [13:13:46.546] name <- removed[[kk]] [13:13:46.546] NAME <- NAMES[[kk]] [13:13:46.546] if (name != NAME && is.element(NAME, old_names)) [13:13:46.546] next [13:13:46.546] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:46.546] } [13:13:46.546] if (length(args) > 0) [13:13:46.546] base::do.call(base::Sys.setenv, args = args) [13:13:46.546] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:46.546] } [13:13:46.546] else { [13:13:46.546] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:46.546] } [13:13:46.546] { [13:13:46.546] if (base::length(...future.futureOptionsAdded) > [13:13:46.546] 0L) { [13:13:46.546] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:46.546] base::names(opts) <- ...future.futureOptionsAdded [13:13:46.546] base::options(opts) [13:13:46.546] } [13:13:46.546] { [13:13:46.546] { [13:13:46.546] base::options(mc.cores = ...future.mc.cores.old) [13:13:46.546] NULL [13:13:46.546] } [13:13:46.546] options(future.plan = NULL) [13:13:46.546] if (is.na(NA_character_)) [13:13:46.546] Sys.unsetenv("R_FUTURE_PLAN") [13:13:46.546] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:46.546] future::plan(list(function (..., workers = availableCores(), [13:13:46.546] lazy = FALSE, rscript_libs = .libPaths(), [13:13:46.546] envir = parent.frame()) [13:13:46.546] { [13:13:46.546] if (is.function(workers)) [13:13:46.546] workers <- workers() [13:13:46.546] workers <- structure(as.integer(workers), [13:13:46.546] class = class(workers)) [13:13:46.546] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:46.546] workers >= 1) [13:13:46.546] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:46.546] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:46.546] } [13:13:46.546] future <- MultisessionFuture(..., workers = workers, [13:13:46.546] lazy = lazy, rscript_libs = rscript_libs, [13:13:46.546] envir = envir) [13:13:46.546] if (!future$lazy) [13:13:46.546] future <- run(future) [13:13:46.546] invisible(future) [13:13:46.546] }), .cleanup = FALSE, .init = FALSE) [13:13:46.546] } [13:13:46.546] } [13:13:46.546] } [13:13:46.546] }) [13:13:46.546] if (TRUE) { [13:13:46.546] base::sink(type = "output", split = FALSE) [13:13:46.546] if (TRUE) { [13:13:46.546] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:46.546] } [13:13:46.546] else { [13:13:46.546] ...future.result["stdout"] <- base::list(NULL) [13:13:46.546] } [13:13:46.546] base::close(...future.stdout) [13:13:46.546] ...future.stdout <- NULL [13:13:46.546] } [13:13:46.546] ...future.result$conditions <- ...future.conditions [13:13:46.546] ...future.result$finished <- base::Sys.time() [13:13:46.546] ...future.result [13:13:46.546] } [13:13:46.551] Exporting 5 global objects (4.85 KiB) to cluster node #1 ... [13:13:46.551] Exporting '...future.FUN' (4.85 KiB) to cluster node #1 ... [13:13:46.552] Exporting '...future.FUN' (4.85 KiB) to cluster node #1 ... DONE [13:13:46.552] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... [13:13:46.553] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... DONE [13:13:46.553] Exporting '...future.elements_ii' (12.94 KiB) to cluster node #1 ... [13:13:46.553] Exporting '...future.elements_ii' (12.94 KiB) to cluster node #1 ... DONE [13:13:46.554] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:13:46.554] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:13:46.554] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:13:46.555] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:13:46.555] Exporting 5 global objects (4.85 KiB) to cluster node #1 ... DONE [13:13:46.556] MultisessionFuture started [13:13:46.556] - Launch lazy future ... done [13:13:46.556] run() for 'MultisessionFuture' ... done [13:13:46.556] Created future: [13:13:46.573] receiveMessageFromWorker() for ClusterFuture ... [13:13:46.573] - Validating connection of MultisessionFuture [13:13:46.573] - received message: FutureResult [13:13:46.573] - Received FutureResult [13:13:46.573] - Erased future from FutureRegistry [13:13:46.574] result() for ClusterFuture ... [13:13:46.574] - result already collected: FutureResult [13:13:46.574] result() for ClusterFuture ... done [13:13:46.574] receiveMessageFromWorker() for ClusterFuture ... done [13:13:46.556] MultisessionFuture: [13:13:46.556] Label: 'future_lapply-2' [13:13:46.556] Expression: [13:13:46.556] { [13:13:46.556] do.call(function(...) { [13:13:46.556] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:46.556] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:46.556] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:46.556] on.exit(options(oopts), add = TRUE) [13:13:46.556] } [13:13:46.556] { [13:13:46.556] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:46.556] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:46.556] ...future.FUN(...future.X_jj, ...) [13:13:46.556] }) [13:13:46.556] } [13:13:46.556] }, args = future.call.arguments) [13:13:46.556] } [13:13:46.556] Lazy evaluation: FALSE [13:13:46.556] Asynchronous evaluation: TRUE [13:13:46.556] Local evaluation: TRUE [13:13:46.556] Environment: R_GlobalEnv [13:13:46.556] Capture standard output: TRUE [13:13:46.556] Capture condition classes: 'condition' (excluding 'nothing') [13:13:46.556] 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) [13:13:46.556] Packages: 1 packages ('listenv') [13:13:46.556] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:46.556] Resolved: TRUE [13:13:46.556] Value: [13:13:46.556] Conditions captured: [13:13:46.556] Early signaling: FALSE [13:13:46.556] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:46.556] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:46.575] Chunk #2 of 2 ... DONE [13:13:46.575] Launching 2 futures (chunks) ... DONE [13:13:46.575] Resolving 2 futures (chunks) ... [13:13:46.575] resolve() on list ... [13:13:46.575] recursive: 0 [13:13:46.575] length: 2 [13:13:46.575] [13:13:46.576] Future #1 [13:13:46.576] result() for ClusterFuture ... [13:13:46.576] - result already collected: FutureResult [13:13:46.576] result() for ClusterFuture ... done [13:13:46.576] result() for ClusterFuture ... [13:13:46.576] - result already collected: FutureResult [13:13:46.577] result() for ClusterFuture ... done [13:13:46.577] signalConditionsASAP(MultisessionFuture, pos=1) ... [13:13:46.577] - nx: 2 [13:13:46.577] - relay: TRUE [13:13:46.577] - stdout: TRUE [13:13:46.577] - signal: TRUE [13:13:46.577] - resignal: FALSE [13:13:46.578] - force: TRUE [13:13:46.578] - relayed: [n=2] FALSE, FALSE [13:13:46.578] - queued futures: [n=2] FALSE, FALSE [13:13:46.578] - until=1 [13:13:46.578] - relaying element #1 [13:13:46.578] result() for ClusterFuture ... [13:13:46.579] - result already collected: FutureResult [13:13:46.579] result() for ClusterFuture ... done [13:13:46.579] result() for ClusterFuture ... [13:13:46.579] - result already collected: FutureResult [13:13:46.579] result() for ClusterFuture ... done [13:13:46.579] result() for ClusterFuture ... [13:13:46.580] - result already collected: FutureResult [13:13:46.580] result() for ClusterFuture ... done [13:13:46.580] result() for ClusterFuture ... [13:13:46.580] - result already collected: FutureResult [13:13:46.580] result() for ClusterFuture ... done [13:13:46.580] - relayed: [n=2] TRUE, FALSE [13:13:46.580] - queued futures: [n=2] TRUE, FALSE [13:13:46.581] signalConditionsASAP(MultisessionFuture, pos=1) ... done [13:13:46.581] length: 1 (resolved future 1) [13:13:46.581] Future #2 [13:13:46.581] result() for ClusterFuture ... [13:13:46.581] - result already collected: FutureResult [13:13:46.581] result() for ClusterFuture ... done [13:13:46.582] result() for ClusterFuture ... [13:13:46.582] - result already collected: FutureResult [13:13:46.582] result() for ClusterFuture ... done [13:13:46.582] signalConditionsASAP(MultisessionFuture, pos=2) ... [13:13:46.582] - nx: 2 [13:13:46.582] - relay: TRUE [13:13:46.583] - stdout: TRUE [13:13:46.583] - signal: TRUE [13:13:46.583] - resignal: FALSE [13:13:46.583] - force: TRUE [13:13:46.583] - relayed: [n=2] TRUE, FALSE [13:13:46.583] - queued futures: [n=2] TRUE, FALSE [13:13:46.583] - until=2 [13:13:46.584] - relaying element #2 [13:13:46.584] result() for ClusterFuture ... [13:13:46.584] - result already collected: FutureResult [13:13:46.584] result() for ClusterFuture ... done [13:13:46.584] result() for ClusterFuture ... [13:13:46.584] - result already collected: FutureResult [13:13:46.585] result() for ClusterFuture ... done [13:13:46.585] result() for ClusterFuture ... [13:13:46.585] - result already collected: FutureResult [13:13:46.585] result() for ClusterFuture ... done [13:13:46.585] result() for ClusterFuture ... [13:13:46.585] - result already collected: FutureResult [13:13:46.586] result() for ClusterFuture ... done [13:13:46.586] - relayed: [n=2] TRUE, TRUE [13:13:46.586] - queued futures: [n=2] TRUE, TRUE [13:13:46.586] signalConditionsASAP(MultisessionFuture, pos=2) ... done [13:13:46.586] length: 0 (resolved future 2) [13:13:46.586] Relaying remaining futures [13:13:46.587] signalConditionsASAP(NULL, pos=0) ... [13:13:46.587] - nx: 2 [13:13:46.587] - relay: TRUE [13:13:46.587] - stdout: TRUE [13:13:46.587] - signal: TRUE [13:13:46.587] - resignal: FALSE [13:13:46.587] - force: TRUE [13:13:46.588] - relayed: [n=2] TRUE, TRUE [13:13:46.588] - queued futures: [n=2] TRUE, TRUE - flush all [13:13:46.588] - relayed: [n=2] TRUE, TRUE [13:13:46.588] - queued futures: [n=2] TRUE, TRUE [13:13:46.588] signalConditionsASAP(NULL, pos=0) ... done [13:13:46.588] resolve() on list ... DONE [13:13:46.589] result() for ClusterFuture ... [13:13:46.589] - result already collected: FutureResult [13:13:46.589] result() for ClusterFuture ... done [13:13:46.589] result() for ClusterFuture ... [13:13:46.589] - result already collected: FutureResult [13:13:46.589] result() for ClusterFuture ... done [13:13:46.590] result() for ClusterFuture ... [13:13:46.590] - result already collected: FutureResult [13:13:46.590] result() for ClusterFuture ... done [13:13:46.590] result() for ClusterFuture ... [13:13:46.590] - result already collected: FutureResult [13:13:46.590] result() for ClusterFuture ... done [13:13:46.590] - Number of value chunks collected: 2 [13:13:46.591] Resolving 2 futures (chunks) ... DONE [13:13:46.591] Reducing values from 2 chunks ... [13:13:46.591] - Number of values collected after concatenation: 2 [13:13:46.591] - Number of values expected: 2 [13:13:46.591] Reducing values from 2 chunks ... DONE [13:13:46.591] 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, ...) ... [13:13:46.593] future_lapply() ... [13:13:46.596] Number of chunks: 2 [13:13:46.597] Index remapping (attribute 'ordering'): [n = 4] 1, 3, 4, 2 [13:13:46.597] getGlobalsAndPackagesXApply() ... [13:13:46.597] - future.globals: TRUE [13:13:46.597] getGlobalsAndPackages() ... [13:13:46.597] Searching for globals... [13:13:46.599] - globals found: [2] 'FUN', '.Internal' [13:13:46.599] Searching for globals ... DONE [13:13:46.599] Resolving globals: FALSE [13:13:46.599] The total size of the 1 globals is 2.13 KiB (2184 bytes) [13:13:46.600] 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') [13:13:46.600] - globals: [1] 'FUN' [13:13:46.600] [13:13:46.600] getGlobalsAndPackages() ... DONE [13:13:46.601] - globals found/used: [n=1] 'FUN' [13:13:46.601] - needed namespaces: [n=0] [13:13:46.601] Finding globals ... DONE [13:13:46.601] - use_args: TRUE [13:13:46.601] - Getting '...' globals ... [13:13:46.602] resolve() on list ... [13:13:46.602] recursive: 0 [13:13:46.602] length: 1 [13:13:46.602] elements: '...' [13:13:46.602] length: 0 (resolved future 1) [13:13:46.602] resolve() on list ... DONE [13:13:46.603] - '...' content: [n=1] 'length' [13:13:46.603] List of 1 [13:13:46.603] $ ...:List of 1 [13:13:46.603] ..$ length: int 2 [13:13:46.603] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:46.603] - attr(*, "where")=List of 1 [13:13:46.603] ..$ ...: [13:13:46.603] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:46.603] - attr(*, "resolved")= logi TRUE [13:13:46.603] - attr(*, "total_size")= num NA [13:13:46.606] - Getting '...' globals ... DONE [13:13:46.606] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:46.607] List of 2 [13:13:46.607] $ ...future.FUN:function (mode = "logical", length = 0L) [13:13:46.607] $ ... :List of 1 [13:13:46.607] ..$ length: int 2 [13:13:46.607] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:46.607] - attr(*, "where")=List of 2 [13:13:46.607] ..$ ...future.FUN: [13:13:46.607] ..$ ... : [13:13:46.607] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:46.607] - attr(*, "resolved")= logi FALSE [13:13:46.607] - attr(*, "total_size")= num 2240 [13:13:46.610] Packages to be attached in all futures: [n=0] [13:13:46.611] getGlobalsAndPackagesXApply() ... DONE [13:13:46.611] Number of futures (= number of chunks): 2 [13:13:46.611] Launching 2 futures (chunks) ... [13:13:46.611] Chunk #1 of 2 ... [13:13:46.611] - Finding globals in 'X' for chunk #1 ... [13:13:46.612] getGlobalsAndPackages() ... [13:13:46.612] Searching for globals... [13:13:46.612] [13:13:46.612] Searching for globals ... DONE [13:13:46.612] - globals: [0] [13:13:46.612] getGlobalsAndPackages() ... DONE [13:13:46.613] + additional globals found: [n=0] [13:13:46.613] + additional namespaces needed: [n=0] [13:13:46.613] - Finding globals in 'X' for chunk #1 ... DONE [13:13:46.613] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:13:46.613] - seeds: [13:13:46.613] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:46.614] getGlobalsAndPackages() ... [13:13:46.614] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:46.614] Resolving globals: FALSE [13:13:46.614] Tweak future expression to call with '...' arguments ... [13:13:46.614] { [13:13:46.614] do.call(function(...) { [13:13:46.614] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:46.614] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:46.614] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:46.614] on.exit(options(oopts), add = TRUE) [13:13:46.614] } [13:13:46.614] { [13:13:46.614] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:46.614] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:46.614] ...future.FUN(...future.X_jj, ...) [13:13:46.614] }) [13:13:46.614] } [13:13:46.614] }, args = future.call.arguments) [13:13:46.614] } [13:13:46.615] Tweak future expression to call with '...' arguments ... DONE [13:13:46.615] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:46.615] [13:13:46.616] getGlobalsAndPackages() ... DONE [13:13:46.616] run() for 'Future' ... [13:13:46.616] - state: 'created' [13:13:46.616] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:46.630] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:46.630] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:13:46.630] - Field: 'node' [13:13:46.630] - Field: 'label' [13:13:46.631] - Field: 'local' [13:13:46.631] - Field: 'owner' [13:13:46.631] - Field: 'envir' [13:13:46.631] - Field: 'workers' [13:13:46.631] - Field: 'packages' [13:13:46.632] - Field: 'gc' [13:13:46.632] - Field: 'conditions' [13:13:46.632] - Field: 'persistent' [13:13:46.632] - Field: 'expr' [13:13:46.632] - Field: 'uuid' [13:13:46.633] - Field: 'seed' [13:13:46.633] - Field: 'version' [13:13:46.633] - Field: 'result' [13:13:46.633] - Field: 'asynchronous' [13:13:46.633] - Field: 'calls' [13:13:46.633] - Field: 'globals' [13:13:46.634] - Field: 'stdout' [13:13:46.634] - Field: 'earlySignal' [13:13:46.634] - Field: 'lazy' [13:13:46.634] - Field: 'state' [13:13:46.634] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:13:46.634] - Launch lazy future ... [13:13:46.635] Packages needed by the future expression (n = 0): [13:13:46.635] Packages needed by future strategies (n = 0): [13:13:46.636] { [13:13:46.636] { [13:13:46.636] { [13:13:46.636] ...future.startTime <- base::Sys.time() [13:13:46.636] { [13:13:46.636] { [13:13:46.636] { [13:13:46.636] { [13:13:46.636] base::local({ [13:13:46.636] has_future <- base::requireNamespace("future", [13:13:46.636] quietly = TRUE) [13:13:46.636] if (has_future) { [13:13:46.636] ns <- base::getNamespace("future") [13:13:46.636] version <- ns[[".package"]][["version"]] [13:13:46.636] if (is.null(version)) [13:13:46.636] version <- utils::packageVersion("future") [13:13:46.636] } [13:13:46.636] else { [13:13:46.636] version <- NULL [13:13:46.636] } [13:13:46.636] if (!has_future || version < "1.8.0") { [13:13:46.636] info <- base::c(r_version = base::gsub("R version ", [13:13:46.636] "", base::R.version$version.string), [13:13:46.636] platform = base::sprintf("%s (%s-bit)", [13:13:46.636] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:46.636] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:46.636] "release", "version")], collapse = " "), [13:13:46.636] hostname = base::Sys.info()[["nodename"]]) [13:13:46.636] info <- base::sprintf("%s: %s", base::names(info), [13:13:46.636] info) [13:13:46.636] info <- base::paste(info, collapse = "; ") [13:13:46.636] if (!has_future) { [13:13:46.636] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:46.636] info) [13:13:46.636] } [13:13:46.636] else { [13:13:46.636] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:46.636] info, version) [13:13:46.636] } [13:13:46.636] base::stop(msg) [13:13:46.636] } [13:13:46.636] }) [13:13:46.636] } [13:13:46.636] ...future.mc.cores.old <- base::getOption("mc.cores") [13:13:46.636] base::options(mc.cores = 1L) [13:13:46.636] } [13:13:46.636] options(future.plan = NULL) [13:13:46.636] Sys.unsetenv("R_FUTURE_PLAN") [13:13:46.636] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:46.636] } [13:13:46.636] ...future.workdir <- getwd() [13:13:46.636] } [13:13:46.636] ...future.oldOptions <- base::as.list(base::.Options) [13:13:46.636] ...future.oldEnvVars <- base::Sys.getenv() [13:13:46.636] } [13:13:46.636] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:46.636] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:13:46.636] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:46.636] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:46.636] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:46.636] future.stdout.windows.reencode = NULL, width = 80L) [13:13:46.636] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:46.636] base::names(...future.oldOptions)) [13:13:46.636] } [13:13:46.636] if (FALSE) { [13:13:46.636] } [13:13:46.636] else { [13:13:46.636] if (TRUE) { [13:13:46.636] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:46.636] open = "w") [13:13:46.636] } [13:13:46.636] else { [13:13:46.636] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:46.636] windows = "NUL", "/dev/null"), open = "w") [13:13:46.636] } [13:13:46.636] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:46.636] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:46.636] base::sink(type = "output", split = FALSE) [13:13:46.636] base::close(...future.stdout) [13:13:46.636] }, add = TRUE) [13:13:46.636] } [13:13:46.636] ...future.frame <- base::sys.nframe() [13:13:46.636] ...future.conditions <- base::list() [13:13:46.636] ...future.rng <- base::globalenv()$.Random.seed [13:13:46.636] if (FALSE) { [13:13:46.636] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:46.636] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:46.636] } [13:13:46.636] ...future.result <- base::tryCatch({ [13:13:46.636] base::withCallingHandlers({ [13:13:46.636] ...future.value <- base::withVisible(base::local({ [13:13:46.636] ...future.makeSendCondition <- local({ [13:13:46.636] sendCondition <- NULL [13:13:46.636] function(frame = 1L) { [13:13:46.636] if (is.function(sendCondition)) [13:13:46.636] return(sendCondition) [13:13:46.636] ns <- getNamespace("parallel") [13:13:46.636] if (exists("sendData", mode = "function", [13:13:46.636] envir = ns)) { [13:13:46.636] parallel_sendData <- get("sendData", mode = "function", [13:13:46.636] envir = ns) [13:13:46.636] envir <- sys.frame(frame) [13:13:46.636] master <- NULL [13:13:46.636] while (!identical(envir, .GlobalEnv) && [13:13:46.636] !identical(envir, emptyenv())) { [13:13:46.636] if (exists("master", mode = "list", envir = envir, [13:13:46.636] inherits = FALSE)) { [13:13:46.636] master <- get("master", mode = "list", [13:13:46.636] envir = envir, inherits = FALSE) [13:13:46.636] if (inherits(master, c("SOCKnode", [13:13:46.636] "SOCK0node"))) { [13:13:46.636] sendCondition <<- function(cond) { [13:13:46.636] data <- list(type = "VALUE", value = cond, [13:13:46.636] success = TRUE) [13:13:46.636] parallel_sendData(master, data) [13:13:46.636] } [13:13:46.636] return(sendCondition) [13:13:46.636] } [13:13:46.636] } [13:13:46.636] frame <- frame + 1L [13:13:46.636] envir <- sys.frame(frame) [13:13:46.636] } [13:13:46.636] } [13:13:46.636] sendCondition <<- function(cond) NULL [13:13:46.636] } [13:13:46.636] }) [13:13:46.636] withCallingHandlers({ [13:13:46.636] { [13:13:46.636] do.call(function(...) { [13:13:46.636] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:46.636] if (!identical(...future.globals.maxSize.org, [13:13:46.636] ...future.globals.maxSize)) { [13:13:46.636] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:46.636] on.exit(options(oopts), add = TRUE) [13:13:46.636] } [13:13:46.636] { [13:13:46.636] lapply(seq_along(...future.elements_ii), [13:13:46.636] FUN = function(jj) { [13:13:46.636] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:46.636] ...future.FUN(...future.X_jj, ...) [13:13:46.636] }) [13:13:46.636] } [13:13:46.636] }, args = future.call.arguments) [13:13:46.636] } [13:13:46.636] }, immediateCondition = function(cond) { [13:13:46.636] sendCondition <- ...future.makeSendCondition() [13:13:46.636] sendCondition(cond) [13:13:46.636] muffleCondition <- function (cond, pattern = "^muffle") [13:13:46.636] { [13:13:46.636] inherits <- base::inherits [13:13:46.636] invokeRestart <- base::invokeRestart [13:13:46.636] is.null <- base::is.null [13:13:46.636] muffled <- FALSE [13:13:46.636] if (inherits(cond, "message")) { [13:13:46.636] muffled <- grepl(pattern, "muffleMessage") [13:13:46.636] if (muffled) [13:13:46.636] invokeRestart("muffleMessage") [13:13:46.636] } [13:13:46.636] else if (inherits(cond, "warning")) { [13:13:46.636] muffled <- grepl(pattern, "muffleWarning") [13:13:46.636] if (muffled) [13:13:46.636] invokeRestart("muffleWarning") [13:13:46.636] } [13:13:46.636] else if (inherits(cond, "condition")) { [13:13:46.636] if (!is.null(pattern)) { [13:13:46.636] computeRestarts <- base::computeRestarts [13:13:46.636] grepl <- base::grepl [13:13:46.636] restarts <- computeRestarts(cond) [13:13:46.636] for (restart in restarts) { [13:13:46.636] name <- restart$name [13:13:46.636] if (is.null(name)) [13:13:46.636] next [13:13:46.636] if (!grepl(pattern, name)) [13:13:46.636] next [13:13:46.636] invokeRestart(restart) [13:13:46.636] muffled <- TRUE [13:13:46.636] break [13:13:46.636] } [13:13:46.636] } [13:13:46.636] } [13:13:46.636] invisible(muffled) [13:13:46.636] } [13:13:46.636] muffleCondition(cond) [13:13:46.636] }) [13:13:46.636] })) [13:13:46.636] future::FutureResult(value = ...future.value$value, [13:13:46.636] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:46.636] ...future.rng), globalenv = if (FALSE) [13:13:46.636] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:46.636] ...future.globalenv.names)) [13:13:46.636] else NULL, started = ...future.startTime, version = "1.8") [13:13:46.636] }, condition = base::local({ [13:13:46.636] c <- base::c [13:13:46.636] inherits <- base::inherits [13:13:46.636] invokeRestart <- base::invokeRestart [13:13:46.636] length <- base::length [13:13:46.636] list <- base::list [13:13:46.636] seq.int <- base::seq.int [13:13:46.636] signalCondition <- base::signalCondition [13:13:46.636] sys.calls <- base::sys.calls [13:13:46.636] `[[` <- base::`[[` [13:13:46.636] `+` <- base::`+` [13:13:46.636] `<<-` <- base::`<<-` [13:13:46.636] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:46.636] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:46.636] 3L)] [13:13:46.636] } [13:13:46.636] function(cond) { [13:13:46.636] is_error <- inherits(cond, "error") [13:13:46.636] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:46.636] NULL) [13:13:46.636] if (is_error) { [13:13:46.636] sessionInformation <- function() { [13:13:46.636] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:46.636] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:46.636] search = base::search(), system = base::Sys.info()) [13:13:46.636] } [13:13:46.636] ...future.conditions[[length(...future.conditions) + [13:13:46.636] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:46.636] cond$call), session = sessionInformation(), [13:13:46.636] timestamp = base::Sys.time(), signaled = 0L) [13:13:46.636] signalCondition(cond) [13:13:46.636] } [13:13:46.636] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:46.636] "immediateCondition"))) { [13:13:46.636] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:46.636] ...future.conditions[[length(...future.conditions) + [13:13:46.636] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:46.636] if (TRUE && !signal) { [13:13:46.636] muffleCondition <- function (cond, pattern = "^muffle") [13:13:46.636] { [13:13:46.636] inherits <- base::inherits [13:13:46.636] invokeRestart <- base::invokeRestart [13:13:46.636] is.null <- base::is.null [13:13:46.636] muffled <- FALSE [13:13:46.636] if (inherits(cond, "message")) { [13:13:46.636] muffled <- grepl(pattern, "muffleMessage") [13:13:46.636] if (muffled) [13:13:46.636] invokeRestart("muffleMessage") [13:13:46.636] } [13:13:46.636] else if (inherits(cond, "warning")) { [13:13:46.636] muffled <- grepl(pattern, "muffleWarning") [13:13:46.636] if (muffled) [13:13:46.636] invokeRestart("muffleWarning") [13:13:46.636] } [13:13:46.636] else if (inherits(cond, "condition")) { [13:13:46.636] if (!is.null(pattern)) { [13:13:46.636] computeRestarts <- base::computeRestarts [13:13:46.636] grepl <- base::grepl [13:13:46.636] restarts <- computeRestarts(cond) [13:13:46.636] for (restart in restarts) { [13:13:46.636] name <- restart$name [13:13:46.636] if (is.null(name)) [13:13:46.636] next [13:13:46.636] if (!grepl(pattern, name)) [13:13:46.636] next [13:13:46.636] invokeRestart(restart) [13:13:46.636] muffled <- TRUE [13:13:46.636] break [13:13:46.636] } [13:13:46.636] } [13:13:46.636] } [13:13:46.636] invisible(muffled) [13:13:46.636] } [13:13:46.636] muffleCondition(cond, pattern = "^muffle") [13:13:46.636] } [13:13:46.636] } [13:13:46.636] else { [13:13:46.636] if (TRUE) { [13:13:46.636] muffleCondition <- function (cond, pattern = "^muffle") [13:13:46.636] { [13:13:46.636] inherits <- base::inherits [13:13:46.636] invokeRestart <- base::invokeRestart [13:13:46.636] is.null <- base::is.null [13:13:46.636] muffled <- FALSE [13:13:46.636] if (inherits(cond, "message")) { [13:13:46.636] muffled <- grepl(pattern, "muffleMessage") [13:13:46.636] if (muffled) [13:13:46.636] invokeRestart("muffleMessage") [13:13:46.636] } [13:13:46.636] else if (inherits(cond, "warning")) { [13:13:46.636] muffled <- grepl(pattern, "muffleWarning") [13:13:46.636] if (muffled) [13:13:46.636] invokeRestart("muffleWarning") [13:13:46.636] } [13:13:46.636] else if (inherits(cond, "condition")) { [13:13:46.636] if (!is.null(pattern)) { [13:13:46.636] computeRestarts <- base::computeRestarts [13:13:46.636] grepl <- base::grepl [13:13:46.636] restarts <- computeRestarts(cond) [13:13:46.636] for (restart in restarts) { [13:13:46.636] name <- restart$name [13:13:46.636] if (is.null(name)) [13:13:46.636] next [13:13:46.636] if (!grepl(pattern, name)) [13:13:46.636] next [13:13:46.636] invokeRestart(restart) [13:13:46.636] muffled <- TRUE [13:13:46.636] break [13:13:46.636] } [13:13:46.636] } [13:13:46.636] } [13:13:46.636] invisible(muffled) [13:13:46.636] } [13:13:46.636] muffleCondition(cond, pattern = "^muffle") [13:13:46.636] } [13:13:46.636] } [13:13:46.636] } [13:13:46.636] })) [13:13:46.636] }, error = function(ex) { [13:13:46.636] base::structure(base::list(value = NULL, visible = NULL, [13:13:46.636] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:46.636] ...future.rng), started = ...future.startTime, [13:13:46.636] finished = Sys.time(), session_uuid = NA_character_, [13:13:46.636] version = "1.8"), class = "FutureResult") [13:13:46.636] }, finally = { [13:13:46.636] if (!identical(...future.workdir, getwd())) [13:13:46.636] setwd(...future.workdir) [13:13:46.636] { [13:13:46.636] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:46.636] ...future.oldOptions$nwarnings <- NULL [13:13:46.636] } [13:13:46.636] base::options(...future.oldOptions) [13:13:46.636] if (.Platform$OS.type == "windows") { [13:13:46.636] old_names <- names(...future.oldEnvVars) [13:13:46.636] envs <- base::Sys.getenv() [13:13:46.636] names <- names(envs) [13:13:46.636] common <- intersect(names, old_names) [13:13:46.636] added <- setdiff(names, old_names) [13:13:46.636] removed <- setdiff(old_names, names) [13:13:46.636] changed <- common[...future.oldEnvVars[common] != [13:13:46.636] envs[common]] [13:13:46.636] NAMES <- toupper(changed) [13:13:46.636] args <- list() [13:13:46.636] for (kk in seq_along(NAMES)) { [13:13:46.636] name <- changed[[kk]] [13:13:46.636] NAME <- NAMES[[kk]] [13:13:46.636] if (name != NAME && is.element(NAME, old_names)) [13:13:46.636] next [13:13:46.636] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:46.636] } [13:13:46.636] NAMES <- toupper(added) [13:13:46.636] for (kk in seq_along(NAMES)) { [13:13:46.636] name <- added[[kk]] [13:13:46.636] NAME <- NAMES[[kk]] [13:13:46.636] if (name != NAME && is.element(NAME, old_names)) [13:13:46.636] next [13:13:46.636] args[[name]] <- "" [13:13:46.636] } [13:13:46.636] NAMES <- toupper(removed) [13:13:46.636] for (kk in seq_along(NAMES)) { [13:13:46.636] name <- removed[[kk]] [13:13:46.636] NAME <- NAMES[[kk]] [13:13:46.636] if (name != NAME && is.element(NAME, old_names)) [13:13:46.636] next [13:13:46.636] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:46.636] } [13:13:46.636] if (length(args) > 0) [13:13:46.636] base::do.call(base::Sys.setenv, args = args) [13:13:46.636] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:46.636] } [13:13:46.636] else { [13:13:46.636] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:46.636] } [13:13:46.636] { [13:13:46.636] if (base::length(...future.futureOptionsAdded) > [13:13:46.636] 0L) { [13:13:46.636] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:46.636] base::names(opts) <- ...future.futureOptionsAdded [13:13:46.636] base::options(opts) [13:13:46.636] } [13:13:46.636] { [13:13:46.636] { [13:13:46.636] base::options(mc.cores = ...future.mc.cores.old) [13:13:46.636] NULL [13:13:46.636] } [13:13:46.636] options(future.plan = NULL) [13:13:46.636] if (is.na(NA_character_)) [13:13:46.636] Sys.unsetenv("R_FUTURE_PLAN") [13:13:46.636] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:46.636] future::plan(list(function (..., workers = availableCores(), [13:13:46.636] lazy = FALSE, rscript_libs = .libPaths(), [13:13:46.636] envir = parent.frame()) [13:13:46.636] { [13:13:46.636] if (is.function(workers)) [13:13:46.636] workers <- workers() [13:13:46.636] workers <- structure(as.integer(workers), [13:13:46.636] class = class(workers)) [13:13:46.636] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:46.636] workers >= 1) [13:13:46.636] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:46.636] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:46.636] } [13:13:46.636] future <- MultisessionFuture(..., workers = workers, [13:13:46.636] lazy = lazy, rscript_libs = rscript_libs, [13:13:46.636] envir = envir) [13:13:46.636] if (!future$lazy) [13:13:46.636] future <- run(future) [13:13:46.636] invisible(future) [13:13:46.636] }), .cleanup = FALSE, .init = FALSE) [13:13:46.636] } [13:13:46.636] } [13:13:46.636] } [13:13:46.636] }) [13:13:46.636] if (TRUE) { [13:13:46.636] base::sink(type = "output", split = FALSE) [13:13:46.636] if (TRUE) { [13:13:46.636] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:46.636] } [13:13:46.636] else { [13:13:46.636] ...future.result["stdout"] <- base::list(NULL) [13:13:46.636] } [13:13:46.636] base::close(...future.stdout) [13:13:46.636] ...future.stdout <- NULL [13:13:46.636] } [13:13:46.636] ...future.result$conditions <- ...future.conditions [13:13:46.636] ...future.result$finished <- base::Sys.time() [13:13:46.636] ...future.result [13:13:46.636] } [13:13:46.641] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... [13:13:46.641] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... [13:13:46.642] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... DONE [13:13:46.642] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... [13:13:46.642] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... DONE [13:13:46.643] Exporting '...future.elements_ii' (232 bytes) to cluster node #1 ... [13:13:46.643] Exporting '...future.elements_ii' (232 bytes) to cluster node #1 ... DONE [13:13:46.643] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:13:46.644] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:13:46.644] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:13:46.644] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:13:46.645] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... DONE [13:13:46.645] MultisessionFuture started [13:13:46.645] - Launch lazy future ... done [13:13:46.646] run() for 'MultisessionFuture' ... done [13:13:46.646] Created future: [13:13:46.683] receiveMessageFromWorker() for ClusterFuture ... [13:13:46.683] - Validating connection of MultisessionFuture [13:13:46.683] - received message: FutureResult [13:13:46.684] - Received FutureResult [13:13:46.684] - Erased future from FutureRegistry [13:13:46.684] result() for ClusterFuture ... [13:13:46.684] - result already collected: FutureResult [13:13:46.684] result() for ClusterFuture ... done [13:13:46.684] receiveMessageFromWorker() for ClusterFuture ... done [13:13:46.646] MultisessionFuture: [13:13:46.646] Label: 'future_lapply-1' [13:13:46.646] Expression: [13:13:46.646] { [13:13:46.646] do.call(function(...) { [13:13:46.646] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:46.646] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:46.646] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:46.646] on.exit(options(oopts), add = TRUE) [13:13:46.646] } [13:13:46.646] { [13:13:46.646] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:46.646] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:46.646] ...future.FUN(...future.X_jj, ...) [13:13:46.646] }) [13:13:46.646] } [13:13:46.646] }, args = future.call.arguments) [13:13:46.646] } [13:13:46.646] Lazy evaluation: FALSE [13:13:46.646] Asynchronous evaluation: TRUE [13:13:46.646] Local evaluation: TRUE [13:13:46.646] Environment: R_GlobalEnv [13:13:46.646] Capture standard output: TRUE [13:13:46.646] Capture condition classes: 'condition' (excluding 'nothing') [13:13:46.646] 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) [13:13:46.646] Packages: [13:13:46.646] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:46.646] Resolved: TRUE [13:13:46.646] Value: [13:13:46.646] Conditions captured: [13:13:46.646] Early signaling: FALSE [13:13:46.646] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:46.646] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:46.685] Chunk #1 of 2 ... DONE [13:13:46.685] Chunk #2 of 2 ... [13:13:46.685] - Finding globals in 'X' for chunk #2 ... [13:13:46.685] getGlobalsAndPackages() ... [13:13:46.686] Searching for globals... [13:13:46.686] [13:13:46.686] Searching for globals ... DONE [13:13:46.686] - globals: [0] [13:13:46.686] getGlobalsAndPackages() ... DONE [13:13:46.687] + additional globals found: [n=0] [13:13:46.687] + additional namespaces needed: [n=0] [13:13:46.687] - Finding globals in 'X' for chunk #2 ... DONE [13:13:46.687] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:13:46.687] - seeds: [13:13:46.687] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:46.688] getGlobalsAndPackages() ... [13:13:46.688] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:46.688] Resolving globals: FALSE [13:13:46.688] Tweak future expression to call with '...' arguments ... [13:13:46.688] { [13:13:46.688] do.call(function(...) { [13:13:46.688] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:46.688] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:46.688] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:46.688] on.exit(options(oopts), add = TRUE) [13:13:46.688] } [13:13:46.688] { [13:13:46.688] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:46.688] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:46.688] ...future.FUN(...future.X_jj, ...) [13:13:46.688] }) [13:13:46.688] } [13:13:46.688] }, args = future.call.arguments) [13:13:46.688] } [13:13:46.689] Tweak future expression to call with '...' arguments ... DONE [13:13:46.689] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:46.689] [13:13:46.689] getGlobalsAndPackages() ... DONE [13:13:46.690] run() for 'Future' ... [13:13:46.690] - state: 'created' [13:13:46.690] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:46.704] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:46.704] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:13:46.704] - Field: 'node' [13:13:46.705] - Field: 'label' [13:13:46.705] - Field: 'local' [13:13:46.705] - Field: 'owner' [13:13:46.705] - Field: 'envir' [13:13:46.705] - Field: 'workers' [13:13:46.705] - Field: 'packages' [13:13:46.706] - Field: 'gc' [13:13:46.706] - Field: 'conditions' [13:13:46.706] - Field: 'persistent' [13:13:46.706] - Field: 'expr' [13:13:46.706] - Field: 'uuid' [13:13:46.707] - Field: 'seed' [13:13:46.707] - Field: 'version' [13:13:46.707] - Field: 'result' [13:13:46.707] - Field: 'asynchronous' [13:13:46.707] - Field: 'calls' [13:13:46.707] - Field: 'globals' [13:13:46.708] - Field: 'stdout' [13:13:46.708] - Field: 'earlySignal' [13:13:46.708] - Field: 'lazy' [13:13:46.708] - Field: 'state' [13:13:46.708] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:13:46.708] - Launch lazy future ... [13:13:46.709] Packages needed by the future expression (n = 0): [13:13:46.709] Packages needed by future strategies (n = 0): [13:13:46.710] { [13:13:46.710] { [13:13:46.710] { [13:13:46.710] ...future.startTime <- base::Sys.time() [13:13:46.710] { [13:13:46.710] { [13:13:46.710] { [13:13:46.710] { [13:13:46.710] base::local({ [13:13:46.710] has_future <- base::requireNamespace("future", [13:13:46.710] quietly = TRUE) [13:13:46.710] if (has_future) { [13:13:46.710] ns <- base::getNamespace("future") [13:13:46.710] version <- ns[[".package"]][["version"]] [13:13:46.710] if (is.null(version)) [13:13:46.710] version <- utils::packageVersion("future") [13:13:46.710] } [13:13:46.710] else { [13:13:46.710] version <- NULL [13:13:46.710] } [13:13:46.710] if (!has_future || version < "1.8.0") { [13:13:46.710] info <- base::c(r_version = base::gsub("R version ", [13:13:46.710] "", base::R.version$version.string), [13:13:46.710] platform = base::sprintf("%s (%s-bit)", [13:13:46.710] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:46.710] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:46.710] "release", "version")], collapse = " "), [13:13:46.710] hostname = base::Sys.info()[["nodename"]]) [13:13:46.710] info <- base::sprintf("%s: %s", base::names(info), [13:13:46.710] info) [13:13:46.710] info <- base::paste(info, collapse = "; ") [13:13:46.710] if (!has_future) { [13:13:46.710] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:46.710] info) [13:13:46.710] } [13:13:46.710] else { [13:13:46.710] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:46.710] info, version) [13:13:46.710] } [13:13:46.710] base::stop(msg) [13:13:46.710] } [13:13:46.710] }) [13:13:46.710] } [13:13:46.710] ...future.mc.cores.old <- base::getOption("mc.cores") [13:13:46.710] base::options(mc.cores = 1L) [13:13:46.710] } [13:13:46.710] options(future.plan = NULL) [13:13:46.710] Sys.unsetenv("R_FUTURE_PLAN") [13:13:46.710] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:46.710] } [13:13:46.710] ...future.workdir <- getwd() [13:13:46.710] } [13:13:46.710] ...future.oldOptions <- base::as.list(base::.Options) [13:13:46.710] ...future.oldEnvVars <- base::Sys.getenv() [13:13:46.710] } [13:13:46.710] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:46.710] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:13:46.710] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:46.710] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:46.710] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:46.710] future.stdout.windows.reencode = NULL, width = 80L) [13:13:46.710] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:46.710] base::names(...future.oldOptions)) [13:13:46.710] } [13:13:46.710] if (FALSE) { [13:13:46.710] } [13:13:46.710] else { [13:13:46.710] if (TRUE) { [13:13:46.710] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:46.710] open = "w") [13:13:46.710] } [13:13:46.710] else { [13:13:46.710] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:46.710] windows = "NUL", "/dev/null"), open = "w") [13:13:46.710] } [13:13:46.710] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:46.710] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:46.710] base::sink(type = "output", split = FALSE) [13:13:46.710] base::close(...future.stdout) [13:13:46.710] }, add = TRUE) [13:13:46.710] } [13:13:46.710] ...future.frame <- base::sys.nframe() [13:13:46.710] ...future.conditions <- base::list() [13:13:46.710] ...future.rng <- base::globalenv()$.Random.seed [13:13:46.710] if (FALSE) { [13:13:46.710] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:46.710] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:46.710] } [13:13:46.710] ...future.result <- base::tryCatch({ [13:13:46.710] base::withCallingHandlers({ [13:13:46.710] ...future.value <- base::withVisible(base::local({ [13:13:46.710] ...future.makeSendCondition <- local({ [13:13:46.710] sendCondition <- NULL [13:13:46.710] function(frame = 1L) { [13:13:46.710] if (is.function(sendCondition)) [13:13:46.710] return(sendCondition) [13:13:46.710] ns <- getNamespace("parallel") [13:13:46.710] if (exists("sendData", mode = "function", [13:13:46.710] envir = ns)) { [13:13:46.710] parallel_sendData <- get("sendData", mode = "function", [13:13:46.710] envir = ns) [13:13:46.710] envir <- sys.frame(frame) [13:13:46.710] master <- NULL [13:13:46.710] while (!identical(envir, .GlobalEnv) && [13:13:46.710] !identical(envir, emptyenv())) { [13:13:46.710] if (exists("master", mode = "list", envir = envir, [13:13:46.710] inherits = FALSE)) { [13:13:46.710] master <- get("master", mode = "list", [13:13:46.710] envir = envir, inherits = FALSE) [13:13:46.710] if (inherits(master, c("SOCKnode", [13:13:46.710] "SOCK0node"))) { [13:13:46.710] sendCondition <<- function(cond) { [13:13:46.710] data <- list(type = "VALUE", value = cond, [13:13:46.710] success = TRUE) [13:13:46.710] parallel_sendData(master, data) [13:13:46.710] } [13:13:46.710] return(sendCondition) [13:13:46.710] } [13:13:46.710] } [13:13:46.710] frame <- frame + 1L [13:13:46.710] envir <- sys.frame(frame) [13:13:46.710] } [13:13:46.710] } [13:13:46.710] sendCondition <<- function(cond) NULL [13:13:46.710] } [13:13:46.710] }) [13:13:46.710] withCallingHandlers({ [13:13:46.710] { [13:13:46.710] do.call(function(...) { [13:13:46.710] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:46.710] if (!identical(...future.globals.maxSize.org, [13:13:46.710] ...future.globals.maxSize)) { [13:13:46.710] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:46.710] on.exit(options(oopts), add = TRUE) [13:13:46.710] } [13:13:46.710] { [13:13:46.710] lapply(seq_along(...future.elements_ii), [13:13:46.710] FUN = function(jj) { [13:13:46.710] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:46.710] ...future.FUN(...future.X_jj, ...) [13:13:46.710] }) [13:13:46.710] } [13:13:46.710] }, args = future.call.arguments) [13:13:46.710] } [13:13:46.710] }, immediateCondition = function(cond) { [13:13:46.710] sendCondition <- ...future.makeSendCondition() [13:13:46.710] sendCondition(cond) [13:13:46.710] muffleCondition <- function (cond, pattern = "^muffle") [13:13:46.710] { [13:13:46.710] inherits <- base::inherits [13:13:46.710] invokeRestart <- base::invokeRestart [13:13:46.710] is.null <- base::is.null [13:13:46.710] muffled <- FALSE [13:13:46.710] if (inherits(cond, "message")) { [13:13:46.710] muffled <- grepl(pattern, "muffleMessage") [13:13:46.710] if (muffled) [13:13:46.710] invokeRestart("muffleMessage") [13:13:46.710] } [13:13:46.710] else if (inherits(cond, "warning")) { [13:13:46.710] muffled <- grepl(pattern, "muffleWarning") [13:13:46.710] if (muffled) [13:13:46.710] invokeRestart("muffleWarning") [13:13:46.710] } [13:13:46.710] else if (inherits(cond, "condition")) { [13:13:46.710] if (!is.null(pattern)) { [13:13:46.710] computeRestarts <- base::computeRestarts [13:13:46.710] grepl <- base::grepl [13:13:46.710] restarts <- computeRestarts(cond) [13:13:46.710] for (restart in restarts) { [13:13:46.710] name <- restart$name [13:13:46.710] if (is.null(name)) [13:13:46.710] next [13:13:46.710] if (!grepl(pattern, name)) [13:13:46.710] next [13:13:46.710] invokeRestart(restart) [13:13:46.710] muffled <- TRUE [13:13:46.710] break [13:13:46.710] } [13:13:46.710] } [13:13:46.710] } [13:13:46.710] invisible(muffled) [13:13:46.710] } [13:13:46.710] muffleCondition(cond) [13:13:46.710] }) [13:13:46.710] })) [13:13:46.710] future::FutureResult(value = ...future.value$value, [13:13:46.710] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:46.710] ...future.rng), globalenv = if (FALSE) [13:13:46.710] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:46.710] ...future.globalenv.names)) [13:13:46.710] else NULL, started = ...future.startTime, version = "1.8") [13:13:46.710] }, condition = base::local({ [13:13:46.710] c <- base::c [13:13:46.710] inherits <- base::inherits [13:13:46.710] invokeRestart <- base::invokeRestart [13:13:46.710] length <- base::length [13:13:46.710] list <- base::list [13:13:46.710] seq.int <- base::seq.int [13:13:46.710] signalCondition <- base::signalCondition [13:13:46.710] sys.calls <- base::sys.calls [13:13:46.710] `[[` <- base::`[[` [13:13:46.710] `+` <- base::`+` [13:13:46.710] `<<-` <- base::`<<-` [13:13:46.710] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:46.710] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:46.710] 3L)] [13:13:46.710] } [13:13:46.710] function(cond) { [13:13:46.710] is_error <- inherits(cond, "error") [13:13:46.710] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:46.710] NULL) [13:13:46.710] if (is_error) { [13:13:46.710] sessionInformation <- function() { [13:13:46.710] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:46.710] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:46.710] search = base::search(), system = base::Sys.info()) [13:13:46.710] } [13:13:46.710] ...future.conditions[[length(...future.conditions) + [13:13:46.710] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:46.710] cond$call), session = sessionInformation(), [13:13:46.710] timestamp = base::Sys.time(), signaled = 0L) [13:13:46.710] signalCondition(cond) [13:13:46.710] } [13:13:46.710] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:46.710] "immediateCondition"))) { [13:13:46.710] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:46.710] ...future.conditions[[length(...future.conditions) + [13:13:46.710] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:46.710] if (TRUE && !signal) { [13:13:46.710] muffleCondition <- function (cond, pattern = "^muffle") [13:13:46.710] { [13:13:46.710] inherits <- base::inherits [13:13:46.710] invokeRestart <- base::invokeRestart [13:13:46.710] is.null <- base::is.null [13:13:46.710] muffled <- FALSE [13:13:46.710] if (inherits(cond, "message")) { [13:13:46.710] muffled <- grepl(pattern, "muffleMessage") [13:13:46.710] if (muffled) [13:13:46.710] invokeRestart("muffleMessage") [13:13:46.710] } [13:13:46.710] else if (inherits(cond, "warning")) { [13:13:46.710] muffled <- grepl(pattern, "muffleWarning") [13:13:46.710] if (muffled) [13:13:46.710] invokeRestart("muffleWarning") [13:13:46.710] } [13:13:46.710] else if (inherits(cond, "condition")) { [13:13:46.710] if (!is.null(pattern)) { [13:13:46.710] computeRestarts <- base::computeRestarts [13:13:46.710] grepl <- base::grepl [13:13:46.710] restarts <- computeRestarts(cond) [13:13:46.710] for (restart in restarts) { [13:13:46.710] name <- restart$name [13:13:46.710] if (is.null(name)) [13:13:46.710] next [13:13:46.710] if (!grepl(pattern, name)) [13:13:46.710] next [13:13:46.710] invokeRestart(restart) [13:13:46.710] muffled <- TRUE [13:13:46.710] break [13:13:46.710] } [13:13:46.710] } [13:13:46.710] } [13:13:46.710] invisible(muffled) [13:13:46.710] } [13:13:46.710] muffleCondition(cond, pattern = "^muffle") [13:13:46.710] } [13:13:46.710] } [13:13:46.710] else { [13:13:46.710] if (TRUE) { [13:13:46.710] muffleCondition <- function (cond, pattern = "^muffle") [13:13:46.710] { [13:13:46.710] inherits <- base::inherits [13:13:46.710] invokeRestart <- base::invokeRestart [13:13:46.710] is.null <- base::is.null [13:13:46.710] muffled <- FALSE [13:13:46.710] if (inherits(cond, "message")) { [13:13:46.710] muffled <- grepl(pattern, "muffleMessage") [13:13:46.710] if (muffled) [13:13:46.710] invokeRestart("muffleMessage") [13:13:46.710] } [13:13:46.710] else if (inherits(cond, "warning")) { [13:13:46.710] muffled <- grepl(pattern, "muffleWarning") [13:13:46.710] if (muffled) [13:13:46.710] invokeRestart("muffleWarning") [13:13:46.710] } [13:13:46.710] else if (inherits(cond, "condition")) { [13:13:46.710] if (!is.null(pattern)) { [13:13:46.710] computeRestarts <- base::computeRestarts [13:13:46.710] grepl <- base::grepl [13:13:46.710] restarts <- computeRestarts(cond) [13:13:46.710] for (restart in restarts) { [13:13:46.710] name <- restart$name [13:13:46.710] if (is.null(name)) [13:13:46.710] next [13:13:46.710] if (!grepl(pattern, name)) [13:13:46.710] next [13:13:46.710] invokeRestart(restart) [13:13:46.710] muffled <- TRUE [13:13:46.710] break [13:13:46.710] } [13:13:46.710] } [13:13:46.710] } [13:13:46.710] invisible(muffled) [13:13:46.710] } [13:13:46.710] muffleCondition(cond, pattern = "^muffle") [13:13:46.710] } [13:13:46.710] } [13:13:46.710] } [13:13:46.710] })) [13:13:46.710] }, error = function(ex) { [13:13:46.710] base::structure(base::list(value = NULL, visible = NULL, [13:13:46.710] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:46.710] ...future.rng), started = ...future.startTime, [13:13:46.710] finished = Sys.time(), session_uuid = NA_character_, [13:13:46.710] version = "1.8"), class = "FutureResult") [13:13:46.710] }, finally = { [13:13:46.710] if (!identical(...future.workdir, getwd())) [13:13:46.710] setwd(...future.workdir) [13:13:46.710] { [13:13:46.710] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:46.710] ...future.oldOptions$nwarnings <- NULL [13:13:46.710] } [13:13:46.710] base::options(...future.oldOptions) [13:13:46.710] if (.Platform$OS.type == "windows") { [13:13:46.710] old_names <- names(...future.oldEnvVars) [13:13:46.710] envs <- base::Sys.getenv() [13:13:46.710] names <- names(envs) [13:13:46.710] common <- intersect(names, old_names) [13:13:46.710] added <- setdiff(names, old_names) [13:13:46.710] removed <- setdiff(old_names, names) [13:13:46.710] changed <- common[...future.oldEnvVars[common] != [13:13:46.710] envs[common]] [13:13:46.710] NAMES <- toupper(changed) [13:13:46.710] args <- list() [13:13:46.710] for (kk in seq_along(NAMES)) { [13:13:46.710] name <- changed[[kk]] [13:13:46.710] NAME <- NAMES[[kk]] [13:13:46.710] if (name != NAME && is.element(NAME, old_names)) [13:13:46.710] next [13:13:46.710] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:46.710] } [13:13:46.710] NAMES <- toupper(added) [13:13:46.710] for (kk in seq_along(NAMES)) { [13:13:46.710] name <- added[[kk]] [13:13:46.710] NAME <- NAMES[[kk]] [13:13:46.710] if (name != NAME && is.element(NAME, old_names)) [13:13:46.710] next [13:13:46.710] args[[name]] <- "" [13:13:46.710] } [13:13:46.710] NAMES <- toupper(removed) [13:13:46.710] for (kk in seq_along(NAMES)) { [13:13:46.710] name <- removed[[kk]] [13:13:46.710] NAME <- NAMES[[kk]] [13:13:46.710] if (name != NAME && is.element(NAME, old_names)) [13:13:46.710] next [13:13:46.710] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:46.710] } [13:13:46.710] if (length(args) > 0) [13:13:46.710] base::do.call(base::Sys.setenv, args = args) [13:13:46.710] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:46.710] } [13:13:46.710] else { [13:13:46.710] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:46.710] } [13:13:46.710] { [13:13:46.710] if (base::length(...future.futureOptionsAdded) > [13:13:46.710] 0L) { [13:13:46.710] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:46.710] base::names(opts) <- ...future.futureOptionsAdded [13:13:46.710] base::options(opts) [13:13:46.710] } [13:13:46.710] { [13:13:46.710] { [13:13:46.710] base::options(mc.cores = ...future.mc.cores.old) [13:13:46.710] NULL [13:13:46.710] } [13:13:46.710] options(future.plan = NULL) [13:13:46.710] if (is.na(NA_character_)) [13:13:46.710] Sys.unsetenv("R_FUTURE_PLAN") [13:13:46.710] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:46.710] future::plan(list(function (..., workers = availableCores(), [13:13:46.710] lazy = FALSE, rscript_libs = .libPaths(), [13:13:46.710] envir = parent.frame()) [13:13:46.710] { [13:13:46.710] if (is.function(workers)) [13:13:46.710] workers <- workers() [13:13:46.710] workers <- structure(as.integer(workers), [13:13:46.710] class = class(workers)) [13:13:46.710] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:46.710] workers >= 1) [13:13:46.710] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:46.710] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:46.710] } [13:13:46.710] future <- MultisessionFuture(..., workers = workers, [13:13:46.710] lazy = lazy, rscript_libs = rscript_libs, [13:13:46.710] envir = envir) [13:13:46.710] if (!future$lazy) [13:13:46.710] future <- run(future) [13:13:46.710] invisible(future) [13:13:46.710] }), .cleanup = FALSE, .init = FALSE) [13:13:46.710] } [13:13:46.710] } [13:13:46.710] } [13:13:46.710] }) [13:13:46.710] if (TRUE) { [13:13:46.710] base::sink(type = "output", split = FALSE) [13:13:46.710] if (TRUE) { [13:13:46.710] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:46.710] } [13:13:46.710] else { [13:13:46.710] ...future.result["stdout"] <- base::list(NULL) [13:13:46.710] } [13:13:46.710] base::close(...future.stdout) [13:13:46.710] ...future.stdout <- NULL [13:13:46.710] } [13:13:46.710] ...future.result$conditions <- ...future.conditions [13:13:46.710] ...future.result$finished <- base::Sys.time() [13:13:46.710] ...future.result [13:13:46.710] } [13:13:46.715] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... [13:13:46.715] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... [13:13:46.716] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... DONE [13:13:46.716] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... [13:13:46.716] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... DONE [13:13:46.717] Exporting '...future.elements_ii' (224 bytes) to cluster node #1 ... [13:13:46.717] Exporting '...future.elements_ii' (224 bytes) to cluster node #1 ... DONE [13:13:46.717] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:13:46.718] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:13:46.718] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:13:46.718] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:13:46.719] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... DONE [13:13:46.719] MultisessionFuture started [13:13:46.719] - Launch lazy future ... done [13:13:46.720] run() for 'MultisessionFuture' ... done [13:13:46.720] Created future: [13:13:46.736] receiveMessageFromWorker() for ClusterFuture ... [13:13:46.737] - Validating connection of MultisessionFuture [13:13:46.737] - received message: FutureResult [13:13:46.737] - Received FutureResult [13:13:46.737] - Erased future from FutureRegistry [13:13:46.737] result() for ClusterFuture ... [13:13:46.738] - result already collected: FutureResult [13:13:46.738] result() for ClusterFuture ... done [13:13:46.738] receiveMessageFromWorker() for ClusterFuture ... done [13:13:46.720] MultisessionFuture: [13:13:46.720] Label: 'future_lapply-2' [13:13:46.720] Expression: [13:13:46.720] { [13:13:46.720] do.call(function(...) { [13:13:46.720] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:46.720] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:46.720] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:46.720] on.exit(options(oopts), add = TRUE) [13:13:46.720] } [13:13:46.720] { [13:13:46.720] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:46.720] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:46.720] ...future.FUN(...future.X_jj, ...) [13:13:46.720] }) [13:13:46.720] } [13:13:46.720] }, args = future.call.arguments) [13:13:46.720] } [13:13:46.720] Lazy evaluation: FALSE [13:13:46.720] Asynchronous evaluation: TRUE [13:13:46.720] Local evaluation: TRUE [13:13:46.720] Environment: R_GlobalEnv [13:13:46.720] Capture standard output: TRUE [13:13:46.720] Capture condition classes: 'condition' (excluding 'nothing') [13:13:46.720] 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) [13:13:46.720] Packages: [13:13:46.720] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:46.720] Resolved: TRUE [13:13:46.720] Value: [13:13:46.720] Conditions captured: [13:13:46.720] Early signaling: FALSE [13:13:46.720] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:46.720] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:46.738] Chunk #2 of 2 ... DONE [13:13:46.738] Launching 2 futures (chunks) ... DONE [13:13:46.739] Resolving 2 futures (chunks) ... [13:13:46.739] resolve() on list ... [13:13:46.739] recursive: 0 [13:13:46.739] length: 2 [13:13:46.739] [13:13:46.739] Future #1 [13:13:46.740] result() for ClusterFuture ... [13:13:46.740] - result already collected: FutureResult [13:13:46.740] result() for ClusterFuture ... done [13:13:46.740] result() for ClusterFuture ... [13:13:46.740] - result already collected: FutureResult [13:13:46.740] result() for ClusterFuture ... done [13:13:46.741] signalConditionsASAP(MultisessionFuture, pos=1) ... [13:13:46.741] - nx: 2 [13:13:46.741] - relay: TRUE [13:13:46.741] - stdout: TRUE [13:13:46.741] - signal: TRUE [13:13:46.741] - resignal: FALSE [13:13:46.741] - force: TRUE [13:13:46.742] - relayed: [n=2] FALSE, FALSE [13:13:46.742] - queued futures: [n=2] FALSE, FALSE [13:13:46.742] - until=1 [13:13:46.742] - relaying element #1 [13:13:46.742] result() for ClusterFuture ... [13:13:46.742] - result already collected: FutureResult [13:13:46.743] result() for ClusterFuture ... done [13:13:46.743] result() for ClusterFuture ... [13:13:46.743] - result already collected: FutureResult [13:13:46.743] result() for ClusterFuture ... done [13:13:46.743] result() for ClusterFuture ... [13:13:46.743] - result already collected: FutureResult [13:13:46.744] result() for ClusterFuture ... done [13:13:46.744] result() for ClusterFuture ... [13:13:46.744] - result already collected: FutureResult [13:13:46.744] result() for ClusterFuture ... done [13:13:46.744] - relayed: [n=2] TRUE, FALSE [13:13:46.744] - queued futures: [n=2] TRUE, FALSE [13:13:46.744] signalConditionsASAP(MultisessionFuture, pos=1) ... done [13:13:46.745] length: 1 (resolved future 1) [13:13:46.745] Future #2 [13:13:46.745] result() for ClusterFuture ... [13:13:46.745] - result already collected: FutureResult [13:13:46.745] result() for ClusterFuture ... done [13:13:46.745] result() for ClusterFuture ... [13:13:46.746] - result already collected: FutureResult [13:13:46.746] result() for ClusterFuture ... done [13:13:46.746] signalConditionsASAP(MultisessionFuture, pos=2) ... [13:13:46.746] - nx: 2 [13:13:46.746] - relay: TRUE [13:13:46.746] - stdout: TRUE [13:13:46.747] - signal: TRUE [13:13:46.747] - resignal: FALSE [13:13:46.747] - force: TRUE [13:13:46.747] - relayed: [n=2] TRUE, FALSE [13:13:46.747] - queued futures: [n=2] TRUE, FALSE [13:13:46.747] - until=2 [13:13:46.747] - relaying element #2 [13:13:46.748] result() for ClusterFuture ... [13:13:46.748] - result already collected: FutureResult [13:13:46.748] result() for ClusterFuture ... done [13:13:46.748] result() for ClusterFuture ... [13:13:46.748] - result already collected: FutureResult [13:13:46.748] result() for ClusterFuture ... done [13:13:46.749] result() for ClusterFuture ... [13:13:46.749] - result already collected: FutureResult [13:13:46.749] result() for ClusterFuture ... done [13:13:46.749] result() for ClusterFuture ... [13:13:46.749] - result already collected: FutureResult [13:13:46.749] result() for ClusterFuture ... done [13:13:46.750] - relayed: [n=2] TRUE, TRUE [13:13:46.750] - queued futures: [n=2] TRUE, TRUE [13:13:46.750] signalConditionsASAP(MultisessionFuture, pos=2) ... done [13:13:46.750] length: 0 (resolved future 2) [13:13:46.750] Relaying remaining futures [13:13:46.750] signalConditionsASAP(NULL, pos=0) ... [13:13:46.751] - nx: 2 [13:13:46.753] - relay: TRUE [13:13:46.753] - stdout: TRUE [13:13:46.753] - signal: TRUE [13:13:46.754] - resignal: FALSE [13:13:46.754] - force: TRUE [13:13:46.754] - relayed: [n=2] TRUE, TRUE [13:13:46.754] - queued futures: [n=2] TRUE, TRUE - flush all [13:13:46.754] - relayed: [n=2] TRUE, TRUE [13:13:46.754] - queued futures: [n=2] TRUE, TRUE [13:13:46.755] signalConditionsASAP(NULL, pos=0) ... done [13:13:46.755] resolve() on list ... DONE [13:13:46.755] result() for ClusterFuture ... [13:13:46.755] - result already collected: FutureResult [13:13:46.755] result() for ClusterFuture ... done [13:13:46.755] result() for ClusterFuture ... [13:13:46.756] - result already collected: FutureResult [13:13:46.756] result() for ClusterFuture ... done [13:13:46.756] result() for ClusterFuture ... [13:13:46.756] - result already collected: FutureResult [13:13:46.756] result() for ClusterFuture ... done [13:13:46.756] result() for ClusterFuture ... [13:13:46.756] - result already collected: FutureResult [13:13:46.757] result() for ClusterFuture ... done [13:13:46.757] - Number of value chunks collected: 2 [13:13:46.757] Resolving 2 futures (chunks) ... DONE [13:13:46.757] Reducing values from 2 chunks ... [13:13:46.757] - Number of values collected after concatenation: 4 [13:13:46.758] - Number of values expected: 4 [13:13:46.758] Reverse index remapping (attribute 'ordering'): [n = 4] 1, 4, 2, 3 [13:13:46.758] Reducing values from 2 chunks ... DONE [13:13:46.758] 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 [13:13:46.761] future_lapply() ... [13:13:46.764] Number of chunks: 2 [13:13:46.764] Index remapping (attribute 'ordering'): [n = 4] 3, 2, 4, 1 [13:13:46.764] getGlobalsAndPackagesXApply() ... [13:13:46.764] - future.globals: TRUE [13:13:46.764] getGlobalsAndPackages() ... [13:13:46.765] Searching for globals... [13:13:46.766] - globals found: [2] 'FUN', '.Internal' [13:13:46.766] Searching for globals ... DONE [13:13:46.766] Resolving globals: FALSE [13:13:46.767] The total size of the 1 globals is 2.13 KiB (2184 bytes) [13:13:46.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') [13:13:46.767] - globals: [1] 'FUN' [13:13:46.767] [13:13:46.768] getGlobalsAndPackages() ... DONE [13:13:46.768] - globals found/used: [n=1] 'FUN' [13:13:46.768] - needed namespaces: [n=0] [13:13:46.768] Finding globals ... DONE [13:13:46.768] - use_args: TRUE [13:13:46.768] - Getting '...' globals ... [13:13:46.769] resolve() on list ... [13:13:46.769] recursive: 0 [13:13:46.769] length: 1 [13:13:46.769] elements: '...' [13:13:46.769] length: 0 (resolved future 1) [13:13:46.770] resolve() on list ... DONE [13:13:46.770] - '...' content: [n=1] 'length' [13:13:46.770] List of 1 [13:13:46.770] $ ...:List of 1 [13:13:46.770] ..$ length: int 2 [13:13:46.770] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:46.770] - attr(*, "where")=List of 1 [13:13:46.770] ..$ ...: [13:13:46.770] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:46.770] - attr(*, "resolved")= logi TRUE [13:13:46.770] - attr(*, "total_size")= num NA [13:13:46.774] - Getting '...' globals ... DONE [13:13:46.774] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:46.774] List of 2 [13:13:46.774] $ ...future.FUN:function (mode = "logical", length = 0L) [13:13:46.774] $ ... :List of 1 [13:13:46.774] ..$ length: int 2 [13:13:46.774] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:46.774] - attr(*, "where")=List of 2 [13:13:46.774] ..$ ...future.FUN: [13:13:46.774] ..$ ... : [13:13:46.774] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:46.774] - attr(*, "resolved")= logi FALSE [13:13:46.774] - attr(*, "total_size")= num 2240 [13:13:46.778] Packages to be attached in all futures: [n=0] [13:13:46.778] getGlobalsAndPackagesXApply() ... DONE [13:13:46.778] Number of futures (= number of chunks): 2 [13:13:46.778] Launching 2 futures (chunks) ... [13:13:46.779] Chunk #1 of 2 ... [13:13:46.779] - Finding globals in 'X' for chunk #1 ... [13:13:46.779] getGlobalsAndPackages() ... [13:13:46.779] Searching for globals... [13:13:46.779] [13:13:46.780] Searching for globals ... DONE [13:13:46.780] - globals: [0] [13:13:46.780] getGlobalsAndPackages() ... DONE [13:13:46.780] + additional globals found: [n=0] [13:13:46.780] + additional namespaces needed: [n=0] [13:13:46.780] - Finding globals in 'X' for chunk #1 ... DONE [13:13:46.781] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:13:46.781] - seeds: [13:13:46.781] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:46.781] getGlobalsAndPackages() ... [13:13:46.781] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:46.781] Resolving globals: FALSE [13:13:46.782] Tweak future expression to call with '...' arguments ... [13:13:46.782] { [13:13:46.782] do.call(function(...) { [13:13:46.782] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:46.782] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:46.782] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:46.782] on.exit(options(oopts), add = TRUE) [13:13:46.782] } [13:13:46.782] { [13:13:46.782] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:46.782] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:46.782] ...future.FUN(...future.X_jj, ...) [13:13:46.782] }) [13:13:46.782] } [13:13:46.782] }, args = future.call.arguments) [13:13:46.782] } [13:13:46.782] Tweak future expression to call with '...' arguments ... DONE [13:13:46.783] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:46.783] [13:13:46.783] getGlobalsAndPackages() ... DONE [13:13:46.783] run() for 'Future' ... [13:13:46.783] - state: 'created' [13:13:46.784] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:46.797] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:46.798] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:13:46.798] - Field: 'node' [13:13:46.798] - Field: 'label' [13:13:46.798] - Field: 'local' [13:13:46.798] - Field: 'owner' [13:13:46.799] - Field: 'envir' [13:13:46.799] - Field: 'workers' [13:13:46.799] - Field: 'packages' [13:13:46.799] - Field: 'gc' [13:13:46.799] - Field: 'conditions' [13:13:46.799] - Field: 'persistent' [13:13:46.800] - Field: 'expr' [13:13:46.800] - Field: 'uuid' [13:13:46.800] - Field: 'seed' [13:13:46.800] - Field: 'version' [13:13:46.800] - Field: 'result' [13:13:46.800] - Field: 'asynchronous' [13:13:46.801] - Field: 'calls' [13:13:46.801] - Field: 'globals' [13:13:46.801] - Field: 'stdout' [13:13:46.801] - Field: 'earlySignal' [13:13:46.801] - Field: 'lazy' [13:13:46.802] - Field: 'state' [13:13:46.802] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:13:46.802] - Launch lazy future ... [13:13:46.802] Packages needed by the future expression (n = 0): [13:13:46.802] Packages needed by future strategies (n = 0): [13:13:46.803] { [13:13:46.803] { [13:13:46.803] { [13:13:46.803] ...future.startTime <- base::Sys.time() [13:13:46.803] { [13:13:46.803] { [13:13:46.803] { [13:13:46.803] { [13:13:46.803] base::local({ [13:13:46.803] has_future <- base::requireNamespace("future", [13:13:46.803] quietly = TRUE) [13:13:46.803] if (has_future) { [13:13:46.803] ns <- base::getNamespace("future") [13:13:46.803] version <- ns[[".package"]][["version"]] [13:13:46.803] if (is.null(version)) [13:13:46.803] version <- utils::packageVersion("future") [13:13:46.803] } [13:13:46.803] else { [13:13:46.803] version <- NULL [13:13:46.803] } [13:13:46.803] if (!has_future || version < "1.8.0") { [13:13:46.803] info <- base::c(r_version = base::gsub("R version ", [13:13:46.803] "", base::R.version$version.string), [13:13:46.803] platform = base::sprintf("%s (%s-bit)", [13:13:46.803] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:46.803] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:46.803] "release", "version")], collapse = " "), [13:13:46.803] hostname = base::Sys.info()[["nodename"]]) [13:13:46.803] info <- base::sprintf("%s: %s", base::names(info), [13:13:46.803] info) [13:13:46.803] info <- base::paste(info, collapse = "; ") [13:13:46.803] if (!has_future) { [13:13:46.803] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:46.803] info) [13:13:46.803] } [13:13:46.803] else { [13:13:46.803] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:46.803] info, version) [13:13:46.803] } [13:13:46.803] base::stop(msg) [13:13:46.803] } [13:13:46.803] }) [13:13:46.803] } [13:13:46.803] ...future.mc.cores.old <- base::getOption("mc.cores") [13:13:46.803] base::options(mc.cores = 1L) [13:13:46.803] } [13:13:46.803] options(future.plan = NULL) [13:13:46.803] Sys.unsetenv("R_FUTURE_PLAN") [13:13:46.803] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:46.803] } [13:13:46.803] ...future.workdir <- getwd() [13:13:46.803] } [13:13:46.803] ...future.oldOptions <- base::as.list(base::.Options) [13:13:46.803] ...future.oldEnvVars <- base::Sys.getenv() [13:13:46.803] } [13:13:46.803] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:46.803] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:13:46.803] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:46.803] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:46.803] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:46.803] future.stdout.windows.reencode = NULL, width = 80L) [13:13:46.803] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:46.803] base::names(...future.oldOptions)) [13:13:46.803] } [13:13:46.803] if (FALSE) { [13:13:46.803] } [13:13:46.803] else { [13:13:46.803] if (TRUE) { [13:13:46.803] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:46.803] open = "w") [13:13:46.803] } [13:13:46.803] else { [13:13:46.803] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:46.803] windows = "NUL", "/dev/null"), open = "w") [13:13:46.803] } [13:13:46.803] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:46.803] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:46.803] base::sink(type = "output", split = FALSE) [13:13:46.803] base::close(...future.stdout) [13:13:46.803] }, add = TRUE) [13:13:46.803] } [13:13:46.803] ...future.frame <- base::sys.nframe() [13:13:46.803] ...future.conditions <- base::list() [13:13:46.803] ...future.rng <- base::globalenv()$.Random.seed [13:13:46.803] if (FALSE) { [13:13:46.803] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:46.803] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:46.803] } [13:13:46.803] ...future.result <- base::tryCatch({ [13:13:46.803] base::withCallingHandlers({ [13:13:46.803] ...future.value <- base::withVisible(base::local({ [13:13:46.803] ...future.makeSendCondition <- local({ [13:13:46.803] sendCondition <- NULL [13:13:46.803] function(frame = 1L) { [13:13:46.803] if (is.function(sendCondition)) [13:13:46.803] return(sendCondition) [13:13:46.803] ns <- getNamespace("parallel") [13:13:46.803] if (exists("sendData", mode = "function", [13:13:46.803] envir = ns)) { [13:13:46.803] parallel_sendData <- get("sendData", mode = "function", [13:13:46.803] envir = ns) [13:13:46.803] envir <- sys.frame(frame) [13:13:46.803] master <- NULL [13:13:46.803] while (!identical(envir, .GlobalEnv) && [13:13:46.803] !identical(envir, emptyenv())) { [13:13:46.803] if (exists("master", mode = "list", envir = envir, [13:13:46.803] inherits = FALSE)) { [13:13:46.803] master <- get("master", mode = "list", [13:13:46.803] envir = envir, inherits = FALSE) [13:13:46.803] if (inherits(master, c("SOCKnode", [13:13:46.803] "SOCK0node"))) { [13:13:46.803] sendCondition <<- function(cond) { [13:13:46.803] data <- list(type = "VALUE", value = cond, [13:13:46.803] success = TRUE) [13:13:46.803] parallel_sendData(master, data) [13:13:46.803] } [13:13:46.803] return(sendCondition) [13:13:46.803] } [13:13:46.803] } [13:13:46.803] frame <- frame + 1L [13:13:46.803] envir <- sys.frame(frame) [13:13:46.803] } [13:13:46.803] } [13:13:46.803] sendCondition <<- function(cond) NULL [13:13:46.803] } [13:13:46.803] }) [13:13:46.803] withCallingHandlers({ [13:13:46.803] { [13:13:46.803] do.call(function(...) { [13:13:46.803] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:46.803] if (!identical(...future.globals.maxSize.org, [13:13:46.803] ...future.globals.maxSize)) { [13:13:46.803] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:46.803] on.exit(options(oopts), add = TRUE) [13:13:46.803] } [13:13:46.803] { [13:13:46.803] lapply(seq_along(...future.elements_ii), [13:13:46.803] FUN = function(jj) { [13:13:46.803] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:46.803] ...future.FUN(...future.X_jj, ...) [13:13:46.803] }) [13:13:46.803] } [13:13:46.803] }, args = future.call.arguments) [13:13:46.803] } [13:13:46.803] }, immediateCondition = function(cond) { [13:13:46.803] sendCondition <- ...future.makeSendCondition() [13:13:46.803] sendCondition(cond) [13:13:46.803] muffleCondition <- function (cond, pattern = "^muffle") [13:13:46.803] { [13:13:46.803] inherits <- base::inherits [13:13:46.803] invokeRestart <- base::invokeRestart [13:13:46.803] is.null <- base::is.null [13:13:46.803] muffled <- FALSE [13:13:46.803] if (inherits(cond, "message")) { [13:13:46.803] muffled <- grepl(pattern, "muffleMessage") [13:13:46.803] if (muffled) [13:13:46.803] invokeRestart("muffleMessage") [13:13:46.803] } [13:13:46.803] else if (inherits(cond, "warning")) { [13:13:46.803] muffled <- grepl(pattern, "muffleWarning") [13:13:46.803] if (muffled) [13:13:46.803] invokeRestart("muffleWarning") [13:13:46.803] } [13:13:46.803] else if (inherits(cond, "condition")) { [13:13:46.803] if (!is.null(pattern)) { [13:13:46.803] computeRestarts <- base::computeRestarts [13:13:46.803] grepl <- base::grepl [13:13:46.803] restarts <- computeRestarts(cond) [13:13:46.803] for (restart in restarts) { [13:13:46.803] name <- restart$name [13:13:46.803] if (is.null(name)) [13:13:46.803] next [13:13:46.803] if (!grepl(pattern, name)) [13:13:46.803] next [13:13:46.803] invokeRestart(restart) [13:13:46.803] muffled <- TRUE [13:13:46.803] break [13:13:46.803] } [13:13:46.803] } [13:13:46.803] } [13:13:46.803] invisible(muffled) [13:13:46.803] } [13:13:46.803] muffleCondition(cond) [13:13:46.803] }) [13:13:46.803] })) [13:13:46.803] future::FutureResult(value = ...future.value$value, [13:13:46.803] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:46.803] ...future.rng), globalenv = if (FALSE) [13:13:46.803] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:46.803] ...future.globalenv.names)) [13:13:46.803] else NULL, started = ...future.startTime, version = "1.8") [13:13:46.803] }, condition = base::local({ [13:13:46.803] c <- base::c [13:13:46.803] inherits <- base::inherits [13:13:46.803] invokeRestart <- base::invokeRestart [13:13:46.803] length <- base::length [13:13:46.803] list <- base::list [13:13:46.803] seq.int <- base::seq.int [13:13:46.803] signalCondition <- base::signalCondition [13:13:46.803] sys.calls <- base::sys.calls [13:13:46.803] `[[` <- base::`[[` [13:13:46.803] `+` <- base::`+` [13:13:46.803] `<<-` <- base::`<<-` [13:13:46.803] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:46.803] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:46.803] 3L)] [13:13:46.803] } [13:13:46.803] function(cond) { [13:13:46.803] is_error <- inherits(cond, "error") [13:13:46.803] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:46.803] NULL) [13:13:46.803] if (is_error) { [13:13:46.803] sessionInformation <- function() { [13:13:46.803] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:46.803] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:46.803] search = base::search(), system = base::Sys.info()) [13:13:46.803] } [13:13:46.803] ...future.conditions[[length(...future.conditions) + [13:13:46.803] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:46.803] cond$call), session = sessionInformation(), [13:13:46.803] timestamp = base::Sys.time(), signaled = 0L) [13:13:46.803] signalCondition(cond) [13:13:46.803] } [13:13:46.803] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:46.803] "immediateCondition"))) { [13:13:46.803] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:46.803] ...future.conditions[[length(...future.conditions) + [13:13:46.803] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:46.803] if (TRUE && !signal) { [13:13:46.803] muffleCondition <- function (cond, pattern = "^muffle") [13:13:46.803] { [13:13:46.803] inherits <- base::inherits [13:13:46.803] invokeRestart <- base::invokeRestart [13:13:46.803] is.null <- base::is.null [13:13:46.803] muffled <- FALSE [13:13:46.803] if (inherits(cond, "message")) { [13:13:46.803] muffled <- grepl(pattern, "muffleMessage") [13:13:46.803] if (muffled) [13:13:46.803] invokeRestart("muffleMessage") [13:13:46.803] } [13:13:46.803] else if (inherits(cond, "warning")) { [13:13:46.803] muffled <- grepl(pattern, "muffleWarning") [13:13:46.803] if (muffled) [13:13:46.803] invokeRestart("muffleWarning") [13:13:46.803] } [13:13:46.803] else if (inherits(cond, "condition")) { [13:13:46.803] if (!is.null(pattern)) { [13:13:46.803] computeRestarts <- base::computeRestarts [13:13:46.803] grepl <- base::grepl [13:13:46.803] restarts <- computeRestarts(cond) [13:13:46.803] for (restart in restarts) { [13:13:46.803] name <- restart$name [13:13:46.803] if (is.null(name)) [13:13:46.803] next [13:13:46.803] if (!grepl(pattern, name)) [13:13:46.803] next [13:13:46.803] invokeRestart(restart) [13:13:46.803] muffled <- TRUE [13:13:46.803] break [13:13:46.803] } [13:13:46.803] } [13:13:46.803] } [13:13:46.803] invisible(muffled) [13:13:46.803] } [13:13:46.803] muffleCondition(cond, pattern = "^muffle") [13:13:46.803] } [13:13:46.803] } [13:13:46.803] else { [13:13:46.803] if (TRUE) { [13:13:46.803] muffleCondition <- function (cond, pattern = "^muffle") [13:13:46.803] { [13:13:46.803] inherits <- base::inherits [13:13:46.803] invokeRestart <- base::invokeRestart [13:13:46.803] is.null <- base::is.null [13:13:46.803] muffled <- FALSE [13:13:46.803] if (inherits(cond, "message")) { [13:13:46.803] muffled <- grepl(pattern, "muffleMessage") [13:13:46.803] if (muffled) [13:13:46.803] invokeRestart("muffleMessage") [13:13:46.803] } [13:13:46.803] else if (inherits(cond, "warning")) { [13:13:46.803] muffled <- grepl(pattern, "muffleWarning") [13:13:46.803] if (muffled) [13:13:46.803] invokeRestart("muffleWarning") [13:13:46.803] } [13:13:46.803] else if (inherits(cond, "condition")) { [13:13:46.803] if (!is.null(pattern)) { [13:13:46.803] computeRestarts <- base::computeRestarts [13:13:46.803] grepl <- base::grepl [13:13:46.803] restarts <- computeRestarts(cond) [13:13:46.803] for (restart in restarts) { [13:13:46.803] name <- restart$name [13:13:46.803] if (is.null(name)) [13:13:46.803] next [13:13:46.803] if (!grepl(pattern, name)) [13:13:46.803] next [13:13:46.803] invokeRestart(restart) [13:13:46.803] muffled <- TRUE [13:13:46.803] break [13:13:46.803] } [13:13:46.803] } [13:13:46.803] } [13:13:46.803] invisible(muffled) [13:13:46.803] } [13:13:46.803] muffleCondition(cond, pattern = "^muffle") [13:13:46.803] } [13:13:46.803] } [13:13:46.803] } [13:13:46.803] })) [13:13:46.803] }, error = function(ex) { [13:13:46.803] base::structure(base::list(value = NULL, visible = NULL, [13:13:46.803] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:46.803] ...future.rng), started = ...future.startTime, [13:13:46.803] finished = Sys.time(), session_uuid = NA_character_, [13:13:46.803] version = "1.8"), class = "FutureResult") [13:13:46.803] }, finally = { [13:13:46.803] if (!identical(...future.workdir, getwd())) [13:13:46.803] setwd(...future.workdir) [13:13:46.803] { [13:13:46.803] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:46.803] ...future.oldOptions$nwarnings <- NULL [13:13:46.803] } [13:13:46.803] base::options(...future.oldOptions) [13:13:46.803] if (.Platform$OS.type == "windows") { [13:13:46.803] old_names <- names(...future.oldEnvVars) [13:13:46.803] envs <- base::Sys.getenv() [13:13:46.803] names <- names(envs) [13:13:46.803] common <- intersect(names, old_names) [13:13:46.803] added <- setdiff(names, old_names) [13:13:46.803] removed <- setdiff(old_names, names) [13:13:46.803] changed <- common[...future.oldEnvVars[common] != [13:13:46.803] envs[common]] [13:13:46.803] NAMES <- toupper(changed) [13:13:46.803] args <- list() [13:13:46.803] for (kk in seq_along(NAMES)) { [13:13:46.803] name <- changed[[kk]] [13:13:46.803] NAME <- NAMES[[kk]] [13:13:46.803] if (name != NAME && is.element(NAME, old_names)) [13:13:46.803] next [13:13:46.803] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:46.803] } [13:13:46.803] NAMES <- toupper(added) [13:13:46.803] for (kk in seq_along(NAMES)) { [13:13:46.803] name <- added[[kk]] [13:13:46.803] NAME <- NAMES[[kk]] [13:13:46.803] if (name != NAME && is.element(NAME, old_names)) [13:13:46.803] next [13:13:46.803] args[[name]] <- "" [13:13:46.803] } [13:13:46.803] NAMES <- toupper(removed) [13:13:46.803] for (kk in seq_along(NAMES)) { [13:13:46.803] name <- removed[[kk]] [13:13:46.803] NAME <- NAMES[[kk]] [13:13:46.803] if (name != NAME && is.element(NAME, old_names)) [13:13:46.803] next [13:13:46.803] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:46.803] } [13:13:46.803] if (length(args) > 0) [13:13:46.803] base::do.call(base::Sys.setenv, args = args) [13:13:46.803] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:46.803] } [13:13:46.803] else { [13:13:46.803] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:46.803] } [13:13:46.803] { [13:13:46.803] if (base::length(...future.futureOptionsAdded) > [13:13:46.803] 0L) { [13:13:46.803] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:46.803] base::names(opts) <- ...future.futureOptionsAdded [13:13:46.803] base::options(opts) [13:13:46.803] } [13:13:46.803] { [13:13:46.803] { [13:13:46.803] base::options(mc.cores = ...future.mc.cores.old) [13:13:46.803] NULL [13:13:46.803] } [13:13:46.803] options(future.plan = NULL) [13:13:46.803] if (is.na(NA_character_)) [13:13:46.803] Sys.unsetenv("R_FUTURE_PLAN") [13:13:46.803] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:46.803] future::plan(list(function (..., workers = availableCores(), [13:13:46.803] lazy = FALSE, rscript_libs = .libPaths(), [13:13:46.803] envir = parent.frame()) [13:13:46.803] { [13:13:46.803] if (is.function(workers)) [13:13:46.803] workers <- workers() [13:13:46.803] workers <- structure(as.integer(workers), [13:13:46.803] class = class(workers)) [13:13:46.803] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:46.803] workers >= 1) [13:13:46.803] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:46.803] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:46.803] } [13:13:46.803] future <- MultisessionFuture(..., workers = workers, [13:13:46.803] lazy = lazy, rscript_libs = rscript_libs, [13:13:46.803] envir = envir) [13:13:46.803] if (!future$lazy) [13:13:46.803] future <- run(future) [13:13:46.803] invisible(future) [13:13:46.803] }), .cleanup = FALSE, .init = FALSE) [13:13:46.803] } [13:13:46.803] } [13:13:46.803] } [13:13:46.803] }) [13:13:46.803] if (TRUE) { [13:13:46.803] base::sink(type = "output", split = FALSE) [13:13:46.803] if (TRUE) { [13:13:46.803] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:46.803] } [13:13:46.803] else { [13:13:46.803] ...future.result["stdout"] <- base::list(NULL) [13:13:46.803] } [13:13:46.803] base::close(...future.stdout) [13:13:46.803] ...future.stdout <- NULL [13:13:46.803] } [13:13:46.803] ...future.result$conditions <- ...future.conditions [13:13:46.803] ...future.result$finished <- base::Sys.time() [13:13:46.803] ...future.result [13:13:46.803] } [13:13:46.808] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... [13:13:46.809] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... [13:13:46.809] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... DONE [13:13:46.809] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... [13:13:46.810] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... DONE [13:13:46.810] Exporting '...future.elements_ii' (232 bytes) to cluster node #1 ... [13:13:46.811] Exporting '...future.elements_ii' (232 bytes) to cluster node #1 ... DONE [13:13:46.811] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:13:46.811] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:13:46.811] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:13:46.812] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:13:46.812] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... DONE [13:13:46.813] MultisessionFuture started [13:13:46.813] - Launch lazy future ... done [13:13:46.813] run() for 'MultisessionFuture' ... done [13:13:46.813] Created future: [13:13:46.829] receiveMessageFromWorker() for ClusterFuture ... [13:13:46.829] - Validating connection of MultisessionFuture [13:13:46.829] - received message: FutureResult [13:13:46.829] - Received FutureResult [13:13:46.830] - Erased future from FutureRegistry [13:13:46.830] result() for ClusterFuture ... [13:13:46.830] - result already collected: FutureResult [13:13:46.830] result() for ClusterFuture ... done [13:13:46.830] receiveMessageFromWorker() for ClusterFuture ... done [13:13:46.813] MultisessionFuture: [13:13:46.813] Label: 'future_lapply-1' [13:13:46.813] Expression: [13:13:46.813] { [13:13:46.813] do.call(function(...) { [13:13:46.813] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:46.813] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:46.813] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:46.813] on.exit(options(oopts), add = TRUE) [13:13:46.813] } [13:13:46.813] { [13:13:46.813] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:46.813] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:46.813] ...future.FUN(...future.X_jj, ...) [13:13:46.813] }) [13:13:46.813] } [13:13:46.813] }, args = future.call.arguments) [13:13:46.813] } [13:13:46.813] Lazy evaluation: FALSE [13:13:46.813] Asynchronous evaluation: TRUE [13:13:46.813] Local evaluation: TRUE [13:13:46.813] Environment: R_GlobalEnv [13:13:46.813] Capture standard output: TRUE [13:13:46.813] Capture condition classes: 'condition' (excluding 'nothing') [13:13:46.813] 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) [13:13:46.813] Packages: [13:13:46.813] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:46.813] Resolved: TRUE [13:13:46.813] Value: [13:13:46.813] Conditions captured: [13:13:46.813] Early signaling: FALSE [13:13:46.813] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:46.813] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:46.831] Chunk #1 of 2 ... DONE [13:13:46.831] Chunk #2 of 2 ... [13:13:46.831] - Finding globals in 'X' for chunk #2 ... [13:13:46.831] getGlobalsAndPackages() ... [13:13:46.831] Searching for globals... [13:13:46.832] [13:13:46.832] Searching for globals ... DONE [13:13:46.832] - globals: [0] [13:13:46.832] getGlobalsAndPackages() ... DONE [13:13:46.832] + additional globals found: [n=0] [13:13:46.832] + additional namespaces needed: [n=0] [13:13:46.833] - Finding globals in 'X' for chunk #2 ... DONE [13:13:46.833] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:13:46.833] - seeds: [13:13:46.833] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:46.833] getGlobalsAndPackages() ... [13:13:46.833] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:46.834] Resolving globals: FALSE [13:13:46.834] Tweak future expression to call with '...' arguments ... [13:13:46.834] { [13:13:46.834] do.call(function(...) { [13:13:46.834] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:46.834] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:46.834] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:46.834] on.exit(options(oopts), add = TRUE) [13:13:46.834] } [13:13:46.834] { [13:13:46.834] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:46.834] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:46.834] ...future.FUN(...future.X_jj, ...) [13:13:46.834] }) [13:13:46.834] } [13:13:46.834] }, args = future.call.arguments) [13:13:46.834] } [13:13:46.834] Tweak future expression to call with '...' arguments ... DONE [13:13:46.835] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:46.835] [13:13:46.835] getGlobalsAndPackages() ... DONE [13:13:46.836] run() for 'Future' ... [13:13:46.836] - state: 'created' [13:13:46.836] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:46.849] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:46.850] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:13:46.850] - Field: 'node' [13:13:46.850] - Field: 'label' [13:13:46.850] - Field: 'local' [13:13:46.850] - Field: 'owner' [13:13:46.851] - Field: 'envir' [13:13:46.851] - Field: 'workers' [13:13:46.851] - Field: 'packages' [13:13:46.851] - Field: 'gc' [13:13:46.851] - Field: 'conditions' [13:13:46.851] - Field: 'persistent' [13:13:46.852] - Field: 'expr' [13:13:46.852] - Field: 'uuid' [13:13:46.852] - Field: 'seed' [13:13:46.852] - Field: 'version' [13:13:46.852] - Field: 'result' [13:13:46.852] - Field: 'asynchronous' [13:13:46.853] - Field: 'calls' [13:13:46.853] - Field: 'globals' [13:13:46.853] - Field: 'stdout' [13:13:46.853] - Field: 'earlySignal' [13:13:46.853] - Field: 'lazy' [13:13:46.853] - Field: 'state' [13:13:46.854] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:13:46.854] - Launch lazy future ... [13:13:46.854] Packages needed by the future expression (n = 0): [13:13:46.854] Packages needed by future strategies (n = 0): [13:13:46.855] { [13:13:46.855] { [13:13:46.855] { [13:13:46.855] ...future.startTime <- base::Sys.time() [13:13:46.855] { [13:13:46.855] { [13:13:46.855] { [13:13:46.855] { [13:13:46.855] base::local({ [13:13:46.855] has_future <- base::requireNamespace("future", [13:13:46.855] quietly = TRUE) [13:13:46.855] if (has_future) { [13:13:46.855] ns <- base::getNamespace("future") [13:13:46.855] version <- ns[[".package"]][["version"]] [13:13:46.855] if (is.null(version)) [13:13:46.855] version <- utils::packageVersion("future") [13:13:46.855] } [13:13:46.855] else { [13:13:46.855] version <- NULL [13:13:46.855] } [13:13:46.855] if (!has_future || version < "1.8.0") { [13:13:46.855] info <- base::c(r_version = base::gsub("R version ", [13:13:46.855] "", base::R.version$version.string), [13:13:46.855] platform = base::sprintf("%s (%s-bit)", [13:13:46.855] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:46.855] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:46.855] "release", "version")], collapse = " "), [13:13:46.855] hostname = base::Sys.info()[["nodename"]]) [13:13:46.855] info <- base::sprintf("%s: %s", base::names(info), [13:13:46.855] info) [13:13:46.855] info <- base::paste(info, collapse = "; ") [13:13:46.855] if (!has_future) { [13:13:46.855] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:46.855] info) [13:13:46.855] } [13:13:46.855] else { [13:13:46.855] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:46.855] info, version) [13:13:46.855] } [13:13:46.855] base::stop(msg) [13:13:46.855] } [13:13:46.855] }) [13:13:46.855] } [13:13:46.855] ...future.mc.cores.old <- base::getOption("mc.cores") [13:13:46.855] base::options(mc.cores = 1L) [13:13:46.855] } [13:13:46.855] options(future.plan = NULL) [13:13:46.855] Sys.unsetenv("R_FUTURE_PLAN") [13:13:46.855] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:46.855] } [13:13:46.855] ...future.workdir <- getwd() [13:13:46.855] } [13:13:46.855] ...future.oldOptions <- base::as.list(base::.Options) [13:13:46.855] ...future.oldEnvVars <- base::Sys.getenv() [13:13:46.855] } [13:13:46.855] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:46.855] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:13:46.855] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:46.855] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:46.855] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:46.855] future.stdout.windows.reencode = NULL, width = 80L) [13:13:46.855] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:46.855] base::names(...future.oldOptions)) [13:13:46.855] } [13:13:46.855] if (FALSE) { [13:13:46.855] } [13:13:46.855] else { [13:13:46.855] if (TRUE) { [13:13:46.855] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:46.855] open = "w") [13:13:46.855] } [13:13:46.855] else { [13:13:46.855] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:46.855] windows = "NUL", "/dev/null"), open = "w") [13:13:46.855] } [13:13:46.855] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:46.855] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:46.855] base::sink(type = "output", split = FALSE) [13:13:46.855] base::close(...future.stdout) [13:13:46.855] }, add = TRUE) [13:13:46.855] } [13:13:46.855] ...future.frame <- base::sys.nframe() [13:13:46.855] ...future.conditions <- base::list() [13:13:46.855] ...future.rng <- base::globalenv()$.Random.seed [13:13:46.855] if (FALSE) { [13:13:46.855] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:46.855] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:46.855] } [13:13:46.855] ...future.result <- base::tryCatch({ [13:13:46.855] base::withCallingHandlers({ [13:13:46.855] ...future.value <- base::withVisible(base::local({ [13:13:46.855] ...future.makeSendCondition <- local({ [13:13:46.855] sendCondition <- NULL [13:13:46.855] function(frame = 1L) { [13:13:46.855] if (is.function(sendCondition)) [13:13:46.855] return(sendCondition) [13:13:46.855] ns <- getNamespace("parallel") [13:13:46.855] if (exists("sendData", mode = "function", [13:13:46.855] envir = ns)) { [13:13:46.855] parallel_sendData <- get("sendData", mode = "function", [13:13:46.855] envir = ns) [13:13:46.855] envir <- sys.frame(frame) [13:13:46.855] master <- NULL [13:13:46.855] while (!identical(envir, .GlobalEnv) && [13:13:46.855] !identical(envir, emptyenv())) { [13:13:46.855] if (exists("master", mode = "list", envir = envir, [13:13:46.855] inherits = FALSE)) { [13:13:46.855] master <- get("master", mode = "list", [13:13:46.855] envir = envir, inherits = FALSE) [13:13:46.855] if (inherits(master, c("SOCKnode", [13:13:46.855] "SOCK0node"))) { [13:13:46.855] sendCondition <<- function(cond) { [13:13:46.855] data <- list(type = "VALUE", value = cond, [13:13:46.855] success = TRUE) [13:13:46.855] parallel_sendData(master, data) [13:13:46.855] } [13:13:46.855] return(sendCondition) [13:13:46.855] } [13:13:46.855] } [13:13:46.855] frame <- frame + 1L [13:13:46.855] envir <- sys.frame(frame) [13:13:46.855] } [13:13:46.855] } [13:13:46.855] sendCondition <<- function(cond) NULL [13:13:46.855] } [13:13:46.855] }) [13:13:46.855] withCallingHandlers({ [13:13:46.855] { [13:13:46.855] do.call(function(...) { [13:13:46.855] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:46.855] if (!identical(...future.globals.maxSize.org, [13:13:46.855] ...future.globals.maxSize)) { [13:13:46.855] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:46.855] on.exit(options(oopts), add = TRUE) [13:13:46.855] } [13:13:46.855] { [13:13:46.855] lapply(seq_along(...future.elements_ii), [13:13:46.855] FUN = function(jj) { [13:13:46.855] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:46.855] ...future.FUN(...future.X_jj, ...) [13:13:46.855] }) [13:13:46.855] } [13:13:46.855] }, args = future.call.arguments) [13:13:46.855] } [13:13:46.855] }, immediateCondition = function(cond) { [13:13:46.855] sendCondition <- ...future.makeSendCondition() [13:13:46.855] sendCondition(cond) [13:13:46.855] muffleCondition <- function (cond, pattern = "^muffle") [13:13:46.855] { [13:13:46.855] inherits <- base::inherits [13:13:46.855] invokeRestart <- base::invokeRestart [13:13:46.855] is.null <- base::is.null [13:13:46.855] muffled <- FALSE [13:13:46.855] if (inherits(cond, "message")) { [13:13:46.855] muffled <- grepl(pattern, "muffleMessage") [13:13:46.855] if (muffled) [13:13:46.855] invokeRestart("muffleMessage") [13:13:46.855] } [13:13:46.855] else if (inherits(cond, "warning")) { [13:13:46.855] muffled <- grepl(pattern, "muffleWarning") [13:13:46.855] if (muffled) [13:13:46.855] invokeRestart("muffleWarning") [13:13:46.855] } [13:13:46.855] else if (inherits(cond, "condition")) { [13:13:46.855] if (!is.null(pattern)) { [13:13:46.855] computeRestarts <- base::computeRestarts [13:13:46.855] grepl <- base::grepl [13:13:46.855] restarts <- computeRestarts(cond) [13:13:46.855] for (restart in restarts) { [13:13:46.855] name <- restart$name [13:13:46.855] if (is.null(name)) [13:13:46.855] next [13:13:46.855] if (!grepl(pattern, name)) [13:13:46.855] next [13:13:46.855] invokeRestart(restart) [13:13:46.855] muffled <- TRUE [13:13:46.855] break [13:13:46.855] } [13:13:46.855] } [13:13:46.855] } [13:13:46.855] invisible(muffled) [13:13:46.855] } [13:13:46.855] muffleCondition(cond) [13:13:46.855] }) [13:13:46.855] })) [13:13:46.855] future::FutureResult(value = ...future.value$value, [13:13:46.855] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:46.855] ...future.rng), globalenv = if (FALSE) [13:13:46.855] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:46.855] ...future.globalenv.names)) [13:13:46.855] else NULL, started = ...future.startTime, version = "1.8") [13:13:46.855] }, condition = base::local({ [13:13:46.855] c <- base::c [13:13:46.855] inherits <- base::inherits [13:13:46.855] invokeRestart <- base::invokeRestart [13:13:46.855] length <- base::length [13:13:46.855] list <- base::list [13:13:46.855] seq.int <- base::seq.int [13:13:46.855] signalCondition <- base::signalCondition [13:13:46.855] sys.calls <- base::sys.calls [13:13:46.855] `[[` <- base::`[[` [13:13:46.855] `+` <- base::`+` [13:13:46.855] `<<-` <- base::`<<-` [13:13:46.855] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:46.855] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:46.855] 3L)] [13:13:46.855] } [13:13:46.855] function(cond) { [13:13:46.855] is_error <- inherits(cond, "error") [13:13:46.855] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:46.855] NULL) [13:13:46.855] if (is_error) { [13:13:46.855] sessionInformation <- function() { [13:13:46.855] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:46.855] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:46.855] search = base::search(), system = base::Sys.info()) [13:13:46.855] } [13:13:46.855] ...future.conditions[[length(...future.conditions) + [13:13:46.855] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:46.855] cond$call), session = sessionInformation(), [13:13:46.855] timestamp = base::Sys.time(), signaled = 0L) [13:13:46.855] signalCondition(cond) [13:13:46.855] } [13:13:46.855] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:46.855] "immediateCondition"))) { [13:13:46.855] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:46.855] ...future.conditions[[length(...future.conditions) + [13:13:46.855] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:46.855] if (TRUE && !signal) { [13:13:46.855] muffleCondition <- function (cond, pattern = "^muffle") [13:13:46.855] { [13:13:46.855] inherits <- base::inherits [13:13:46.855] invokeRestart <- base::invokeRestart [13:13:46.855] is.null <- base::is.null [13:13:46.855] muffled <- FALSE [13:13:46.855] if (inherits(cond, "message")) { [13:13:46.855] muffled <- grepl(pattern, "muffleMessage") [13:13:46.855] if (muffled) [13:13:46.855] invokeRestart("muffleMessage") [13:13:46.855] } [13:13:46.855] else if (inherits(cond, "warning")) { [13:13:46.855] muffled <- grepl(pattern, "muffleWarning") [13:13:46.855] if (muffled) [13:13:46.855] invokeRestart("muffleWarning") [13:13:46.855] } [13:13:46.855] else if (inherits(cond, "condition")) { [13:13:46.855] if (!is.null(pattern)) { [13:13:46.855] computeRestarts <- base::computeRestarts [13:13:46.855] grepl <- base::grepl [13:13:46.855] restarts <- computeRestarts(cond) [13:13:46.855] for (restart in restarts) { [13:13:46.855] name <- restart$name [13:13:46.855] if (is.null(name)) [13:13:46.855] next [13:13:46.855] if (!grepl(pattern, name)) [13:13:46.855] next [13:13:46.855] invokeRestart(restart) [13:13:46.855] muffled <- TRUE [13:13:46.855] break [13:13:46.855] } [13:13:46.855] } [13:13:46.855] } [13:13:46.855] invisible(muffled) [13:13:46.855] } [13:13:46.855] muffleCondition(cond, pattern = "^muffle") [13:13:46.855] } [13:13:46.855] } [13:13:46.855] else { [13:13:46.855] if (TRUE) { [13:13:46.855] muffleCondition <- function (cond, pattern = "^muffle") [13:13:46.855] { [13:13:46.855] inherits <- base::inherits [13:13:46.855] invokeRestart <- base::invokeRestart [13:13:46.855] is.null <- base::is.null [13:13:46.855] muffled <- FALSE [13:13:46.855] if (inherits(cond, "message")) { [13:13:46.855] muffled <- grepl(pattern, "muffleMessage") [13:13:46.855] if (muffled) [13:13:46.855] invokeRestart("muffleMessage") [13:13:46.855] } [13:13:46.855] else if (inherits(cond, "warning")) { [13:13:46.855] muffled <- grepl(pattern, "muffleWarning") [13:13:46.855] if (muffled) [13:13:46.855] invokeRestart("muffleWarning") [13:13:46.855] } [13:13:46.855] else if (inherits(cond, "condition")) { [13:13:46.855] if (!is.null(pattern)) { [13:13:46.855] computeRestarts <- base::computeRestarts [13:13:46.855] grepl <- base::grepl [13:13:46.855] restarts <- computeRestarts(cond) [13:13:46.855] for (restart in restarts) { [13:13:46.855] name <- restart$name [13:13:46.855] if (is.null(name)) [13:13:46.855] next [13:13:46.855] if (!grepl(pattern, name)) [13:13:46.855] next [13:13:46.855] invokeRestart(restart) [13:13:46.855] muffled <- TRUE [13:13:46.855] break [13:13:46.855] } [13:13:46.855] } [13:13:46.855] } [13:13:46.855] invisible(muffled) [13:13:46.855] } [13:13:46.855] muffleCondition(cond, pattern = "^muffle") [13:13:46.855] } [13:13:46.855] } [13:13:46.855] } [13:13:46.855] })) [13:13:46.855] }, error = function(ex) { [13:13:46.855] base::structure(base::list(value = NULL, visible = NULL, [13:13:46.855] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:46.855] ...future.rng), started = ...future.startTime, [13:13:46.855] finished = Sys.time(), session_uuid = NA_character_, [13:13:46.855] version = "1.8"), class = "FutureResult") [13:13:46.855] }, finally = { [13:13:46.855] if (!identical(...future.workdir, getwd())) [13:13:46.855] setwd(...future.workdir) [13:13:46.855] { [13:13:46.855] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:46.855] ...future.oldOptions$nwarnings <- NULL [13:13:46.855] } [13:13:46.855] base::options(...future.oldOptions) [13:13:46.855] if (.Platform$OS.type == "windows") { [13:13:46.855] old_names <- names(...future.oldEnvVars) [13:13:46.855] envs <- base::Sys.getenv() [13:13:46.855] names <- names(envs) [13:13:46.855] common <- intersect(names, old_names) [13:13:46.855] added <- setdiff(names, old_names) [13:13:46.855] removed <- setdiff(old_names, names) [13:13:46.855] changed <- common[...future.oldEnvVars[common] != [13:13:46.855] envs[common]] [13:13:46.855] NAMES <- toupper(changed) [13:13:46.855] args <- list() [13:13:46.855] for (kk in seq_along(NAMES)) { [13:13:46.855] name <- changed[[kk]] [13:13:46.855] NAME <- NAMES[[kk]] [13:13:46.855] if (name != NAME && is.element(NAME, old_names)) [13:13:46.855] next [13:13:46.855] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:46.855] } [13:13:46.855] NAMES <- toupper(added) [13:13:46.855] for (kk in seq_along(NAMES)) { [13:13:46.855] name <- added[[kk]] [13:13:46.855] NAME <- NAMES[[kk]] [13:13:46.855] if (name != NAME && is.element(NAME, old_names)) [13:13:46.855] next [13:13:46.855] args[[name]] <- "" [13:13:46.855] } [13:13:46.855] NAMES <- toupper(removed) [13:13:46.855] for (kk in seq_along(NAMES)) { [13:13:46.855] name <- removed[[kk]] [13:13:46.855] NAME <- NAMES[[kk]] [13:13:46.855] if (name != NAME && is.element(NAME, old_names)) [13:13:46.855] next [13:13:46.855] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:46.855] } [13:13:46.855] if (length(args) > 0) [13:13:46.855] base::do.call(base::Sys.setenv, args = args) [13:13:46.855] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:46.855] } [13:13:46.855] else { [13:13:46.855] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:46.855] } [13:13:46.855] { [13:13:46.855] if (base::length(...future.futureOptionsAdded) > [13:13:46.855] 0L) { [13:13:46.855] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:46.855] base::names(opts) <- ...future.futureOptionsAdded [13:13:46.855] base::options(opts) [13:13:46.855] } [13:13:46.855] { [13:13:46.855] { [13:13:46.855] base::options(mc.cores = ...future.mc.cores.old) [13:13:46.855] NULL [13:13:46.855] } [13:13:46.855] options(future.plan = NULL) [13:13:46.855] if (is.na(NA_character_)) [13:13:46.855] Sys.unsetenv("R_FUTURE_PLAN") [13:13:46.855] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:46.855] future::plan(list(function (..., workers = availableCores(), [13:13:46.855] lazy = FALSE, rscript_libs = .libPaths(), [13:13:46.855] envir = parent.frame()) [13:13:46.855] { [13:13:46.855] if (is.function(workers)) [13:13:46.855] workers <- workers() [13:13:46.855] workers <- structure(as.integer(workers), [13:13:46.855] class = class(workers)) [13:13:46.855] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:46.855] workers >= 1) [13:13:46.855] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:46.855] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:46.855] } [13:13:46.855] future <- MultisessionFuture(..., workers = workers, [13:13:46.855] lazy = lazy, rscript_libs = rscript_libs, [13:13:46.855] envir = envir) [13:13:46.855] if (!future$lazy) [13:13:46.855] future <- run(future) [13:13:46.855] invisible(future) [13:13:46.855] }), .cleanup = FALSE, .init = FALSE) [13:13:46.855] } [13:13:46.855] } [13:13:46.855] } [13:13:46.855] }) [13:13:46.855] if (TRUE) { [13:13:46.855] base::sink(type = "output", split = FALSE) [13:13:46.855] if (TRUE) { [13:13:46.855] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:46.855] } [13:13:46.855] else { [13:13:46.855] ...future.result["stdout"] <- base::list(NULL) [13:13:46.855] } [13:13:46.855] base::close(...future.stdout) [13:13:46.855] ...future.stdout <- NULL [13:13:46.855] } [13:13:46.855] ...future.result$conditions <- ...future.conditions [13:13:46.855] ...future.result$finished <- base::Sys.time() [13:13:46.855] ...future.result [13:13:46.855] } [13:13:46.860] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... [13:13:46.860] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... [13:13:46.861] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... DONE [13:13:46.861] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... [13:13:46.862] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... DONE [13:13:46.862] Exporting '...future.elements_ii' (224 bytes) to cluster node #1 ... [13:13:46.862] Exporting '...future.elements_ii' (224 bytes) to cluster node #1 ... DONE [13:13:46.862] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:13:46.863] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:13:46.863] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:13:46.863] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:13:46.864] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... DONE [13:13:46.864] MultisessionFuture started [13:13:46.864] - Launch lazy future ... done [13:13:46.865] run() for 'MultisessionFuture' ... done [13:13:46.865] Created future: [13:13:46.881] receiveMessageFromWorker() for ClusterFuture ... [13:13:46.881] - Validating connection of MultisessionFuture [13:13:46.881] - received message: FutureResult [13:13:46.882] - Received FutureResult [13:13:46.882] - Erased future from FutureRegistry [13:13:46.882] result() for ClusterFuture ... [13:13:46.882] - result already collected: FutureResult [13:13:46.882] result() for ClusterFuture ... done [13:13:46.883] receiveMessageFromWorker() for ClusterFuture ... done [13:13:46.865] MultisessionFuture: [13:13:46.865] Label: 'future_lapply-2' [13:13:46.865] Expression: [13:13:46.865] { [13:13:46.865] do.call(function(...) { [13:13:46.865] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:46.865] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:46.865] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:46.865] on.exit(options(oopts), add = TRUE) [13:13:46.865] } [13:13:46.865] { [13:13:46.865] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:46.865] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:46.865] ...future.FUN(...future.X_jj, ...) [13:13:46.865] }) [13:13:46.865] } [13:13:46.865] }, args = future.call.arguments) [13:13:46.865] } [13:13:46.865] Lazy evaluation: FALSE [13:13:46.865] Asynchronous evaluation: TRUE [13:13:46.865] Local evaluation: TRUE [13:13:46.865] Environment: R_GlobalEnv [13:13:46.865] Capture standard output: TRUE [13:13:46.865] Capture condition classes: 'condition' (excluding 'nothing') [13:13:46.865] 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) [13:13:46.865] Packages: [13:13:46.865] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:46.865] Resolved: TRUE [13:13:46.865] Value: [13:13:46.865] Conditions captured: [13:13:46.865] Early signaling: FALSE [13:13:46.865] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:46.865] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:46.883] Chunk #2 of 2 ... DONE [13:13:46.883] Launching 2 futures (chunks) ... DONE [13:13:46.883] Resolving 2 futures (chunks) ... [13:13:46.883] resolve() on list ... [13:13:46.884] recursive: 0 [13:13:46.884] length: 2 [13:13:46.884] [13:13:46.884] Future #1 [13:13:46.884] result() for ClusterFuture ... [13:13:46.884] - result already collected: FutureResult [13:13:46.885] result() for ClusterFuture ... done [13:13:46.885] result() for ClusterFuture ... [13:13:46.885] - result already collected: FutureResult [13:13:46.885] result() for ClusterFuture ... done [13:13:46.885] signalConditionsASAP(MultisessionFuture, pos=1) ... [13:13:46.885] - nx: 2 [13:13:46.886] - relay: TRUE [13:13:46.886] - stdout: TRUE [13:13:46.886] - signal: TRUE [13:13:46.886] - resignal: FALSE [13:13:46.886] - force: TRUE [13:13:46.886] - relayed: [n=2] FALSE, FALSE [13:13:46.886] - queued futures: [n=2] FALSE, FALSE [13:13:46.887] - until=1 [13:13:46.887] - relaying element #1 [13:13:46.887] result() for ClusterFuture ... [13:13:46.887] - result already collected: FutureResult [13:13:46.887] result() for ClusterFuture ... done [13:13:46.887] result() for ClusterFuture ... [13:13:46.888] - result already collected: FutureResult [13:13:46.888] result() for ClusterFuture ... done [13:13:46.888] result() for ClusterFuture ... [13:13:46.888] - result already collected: FutureResult [13:13:46.888] result() for ClusterFuture ... done [13:13:46.888] result() for ClusterFuture ... [13:13:46.888] - result already collected: FutureResult [13:13:46.889] result() for ClusterFuture ... done [13:13:46.889] - relayed: [n=2] TRUE, FALSE [13:13:46.889] - queued futures: [n=2] TRUE, FALSE [13:13:46.889] signalConditionsASAP(MultisessionFuture, pos=1) ... done [13:13:46.889] length: 1 (resolved future 1) [13:13:46.889] Future #2 [13:13:46.890] result() for ClusterFuture ... [13:13:46.890] - result already collected: FutureResult [13:13:46.890] result() for ClusterFuture ... done [13:13:46.890] result() for ClusterFuture ... [13:13:46.890] - result already collected: FutureResult [13:13:46.891] result() for ClusterFuture ... done [13:13:46.891] signalConditionsASAP(MultisessionFuture, pos=2) ... [13:13:46.891] - nx: 2 [13:13:46.891] - relay: TRUE [13:13:46.891] - stdout: TRUE [13:13:46.891] - signal: TRUE [13:13:46.891] - resignal: FALSE [13:13:46.892] - force: TRUE [13:13:46.892] - relayed: [n=2] TRUE, FALSE [13:13:46.892] - queued futures: [n=2] TRUE, FALSE [13:13:46.892] - until=2 [13:13:46.892] - relaying element #2 [13:13:46.892] result() for ClusterFuture ... [13:13:46.893] - result already collected: FutureResult [13:13:46.893] result() for ClusterFuture ... done [13:13:46.893] result() for ClusterFuture ... [13:13:46.893] - result already collected: FutureResult [13:13:46.893] result() for ClusterFuture ... done [13:13:46.893] result() for ClusterFuture ... [13:13:46.894] - result already collected: FutureResult [13:13:46.894] result() for ClusterFuture ... done [13:13:46.894] result() for ClusterFuture ... [13:13:46.894] - result already collected: FutureResult [13:13:46.894] result() for ClusterFuture ... done [13:13:46.894] - relayed: [n=2] TRUE, TRUE [13:13:46.894] - queued futures: [n=2] TRUE, TRUE [13:13:46.895] signalConditionsASAP(MultisessionFuture, pos=2) ... done [13:13:46.895] length: 0 (resolved future 2) [13:13:46.895] Relaying remaining futures [13:13:46.895] signalConditionsASAP(NULL, pos=0) ... [13:13:46.895] - nx: 2 [13:13:46.895] - relay: TRUE [13:13:46.896] - stdout: TRUE [13:13:46.896] - signal: TRUE [13:13:46.896] - resignal: FALSE [13:13:46.896] - force: TRUE [13:13:46.896] - relayed: [n=2] TRUE, TRUE [13:13:46.896] - queued futures: [n=2] TRUE, TRUE - flush all [13:13:46.897] - relayed: [n=2] TRUE, TRUE [13:13:46.897] - queued futures: [n=2] TRUE, TRUE [13:13:46.897] signalConditionsASAP(NULL, pos=0) ... done [13:13:46.897] resolve() on list ... DONE [13:13:46.897] result() for ClusterFuture ... [13:13:46.897] - result already collected: FutureResult [13:13:46.897] result() for ClusterFuture ... done [13:13:46.898] result() for ClusterFuture ... [13:13:46.898] - result already collected: FutureResult [13:13:46.898] result() for ClusterFuture ... done [13:13:46.898] result() for ClusterFuture ... [13:13:46.898] - result already collected: FutureResult [13:13:46.898] result() for ClusterFuture ... done [13:13:46.899] result() for ClusterFuture ... [13:13:46.899] - result already collected: FutureResult [13:13:46.899] result() for ClusterFuture ... done [13:13:46.899] - Number of value chunks collected: 2 [13:13:46.899] Resolving 2 futures (chunks) ... DONE [13:13:46.899] Reducing values from 2 chunks ... [13:13:46.900] - Number of values collected after concatenation: 4 [13:13:46.900] - Number of values expected: 4 [13:13:46.900] Reverse index remapping (attribute 'ordering'): [n = 4] 4, 2, 1, 3 [13:13:46.900] Reducing values from 2 chunks ... DONE [13:13:46.900] 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, ...) ... [13:13:46.903] future_lapply() ... [13:13:46.906] Number of chunks: 2 [13:13:46.906] Index remapping (attribute 'ordering'): [n = 4] 3, 4, 2, 1 [13:13:46.906] getGlobalsAndPackagesXApply() ... [13:13:46.906] - future.globals: TRUE [13:13:46.907] getGlobalsAndPackages() ... [13:13:46.907] Searching for globals... [13:13:46.908] - globals found: [2] 'FUN', '.Internal' [13:13:46.908] Searching for globals ... DONE [13:13:46.908] Resolving globals: FALSE [13:13:46.909] The total size of the 1 globals is 2.13 KiB (2184 bytes) [13:13:46.909] 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') [13:13:46.910] - globals: [1] 'FUN' [13:13:46.910] [13:13:46.910] getGlobalsAndPackages() ... DONE [13:13:46.910] - globals found/used: [n=1] 'FUN' [13:13:46.910] - needed namespaces: [n=0] [13:13:46.910] Finding globals ... DONE [13:13:46.911] - use_args: TRUE [13:13:46.911] - Getting '...' globals ... [13:13:46.911] resolve() on list ... [13:13:46.911] recursive: 0 [13:13:46.911] length: 1 [13:13:46.912] elements: '...' [13:13:46.912] length: 0 (resolved future 1) [13:13:46.912] resolve() on list ... DONE [13:13:46.912] - '...' content: [n=1] 'length' [13:13:46.912] List of 1 [13:13:46.912] $ ...:List of 1 [13:13:46.912] ..$ length: int 2 [13:13:46.912] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:46.912] - attr(*, "where")=List of 1 [13:13:46.912] ..$ ...: [13:13:46.912] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:46.912] - attr(*, "resolved")= logi TRUE [13:13:46.912] - attr(*, "total_size")= num NA [13:13:46.916] - Getting '...' globals ... DONE [13:13:46.916] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:46.916] List of 2 [13:13:46.916] $ ...future.FUN:function (mode = "logical", length = 0L) [13:13:46.916] $ ... :List of 1 [13:13:46.916] ..$ length: int 2 [13:13:46.916] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:46.916] - attr(*, "where")=List of 2 [13:13:46.916] ..$ ...future.FUN: [13:13:46.916] ..$ ... : [13:13:46.916] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:46.916] - attr(*, "resolved")= logi FALSE [13:13:46.916] - attr(*, "total_size")= num 2240 [13:13:46.922] Packages to be attached in all futures: [n=0] [13:13:46.923] getGlobalsAndPackagesXApply() ... DONE [13:13:46.923] Number of futures (= number of chunks): 2 [13:13:46.923] Launching 2 futures (chunks) ... [13:13:46.923] Chunk #1 of 2 ... [13:13:46.923] - Finding globals in 'X' for chunk #1 ... [13:13:46.924] getGlobalsAndPackages() ... [13:13:46.924] Searching for globals... [13:13:46.924] [13:13:46.924] Searching for globals ... DONE [13:13:46.924] - globals: [0] [13:13:46.925] getGlobalsAndPackages() ... DONE [13:13:46.925] + additional globals found: [n=0] [13:13:46.925] + additional namespaces needed: [n=0] [13:13:46.925] - Finding globals in 'X' for chunk #1 ... DONE [13:13:46.925] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:13:46.925] - seeds: [13:13:46.926] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:46.926] getGlobalsAndPackages() ... [13:13:46.926] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:46.926] Resolving globals: FALSE [13:13:46.926] Tweak future expression to call with '...' arguments ... [13:13:46.926] { [13:13:46.926] do.call(function(...) { [13:13:46.926] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:46.926] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:46.926] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:46.926] on.exit(options(oopts), add = TRUE) [13:13:46.926] } [13:13:46.926] { [13:13:46.926] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:46.926] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:46.926] ...future.FUN(...future.X_jj, ...) [13:13:46.926] }) [13:13:46.926] } [13:13:46.926] }, args = future.call.arguments) [13:13:46.926] } [13:13:46.927] Tweak future expression to call with '...' arguments ... DONE [13:13:46.927] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:46.928] [13:13:46.928] getGlobalsAndPackages() ... DONE [13:13:46.928] run() for 'Future' ... [13:13:46.928] - state: 'created' [13:13:46.928] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:46.942] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:46.943] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:13:46.943] - Field: 'node' [13:13:46.943] - Field: 'label' [13:13:46.943] - Field: 'local' [13:13:46.943] - Field: 'owner' [13:13:46.943] - Field: 'envir' [13:13:46.944] - Field: 'workers' [13:13:46.944] - Field: 'packages' [13:13:46.944] - Field: 'gc' [13:13:46.944] - Field: 'conditions' [13:13:46.944] - Field: 'persistent' [13:13:46.944] - Field: 'expr' [13:13:46.945] - Field: 'uuid' [13:13:46.945] - Field: 'seed' [13:13:46.945] - Field: 'version' [13:13:46.945] - Field: 'result' [13:13:46.945] - Field: 'asynchronous' [13:13:46.946] - Field: 'calls' [13:13:46.946] - Field: 'globals' [13:13:46.946] - Field: 'stdout' [13:13:46.946] - Field: 'earlySignal' [13:13:46.946] - Field: 'lazy' [13:13:46.946] - Field: 'state' [13:13:46.947] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:13:46.947] - Launch lazy future ... [13:13:46.947] Packages needed by the future expression (n = 0): [13:13:46.947] Packages needed by future strategies (n = 0): [13:13:46.948] { [13:13:46.948] { [13:13:46.948] { [13:13:46.948] ...future.startTime <- base::Sys.time() [13:13:46.948] { [13:13:46.948] { [13:13:46.948] { [13:13:46.948] { [13:13:46.948] base::local({ [13:13:46.948] has_future <- base::requireNamespace("future", [13:13:46.948] quietly = TRUE) [13:13:46.948] if (has_future) { [13:13:46.948] ns <- base::getNamespace("future") [13:13:46.948] version <- ns[[".package"]][["version"]] [13:13:46.948] if (is.null(version)) [13:13:46.948] version <- utils::packageVersion("future") [13:13:46.948] } [13:13:46.948] else { [13:13:46.948] version <- NULL [13:13:46.948] } [13:13:46.948] if (!has_future || version < "1.8.0") { [13:13:46.948] info <- base::c(r_version = base::gsub("R version ", [13:13:46.948] "", base::R.version$version.string), [13:13:46.948] platform = base::sprintf("%s (%s-bit)", [13:13:46.948] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:46.948] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:46.948] "release", "version")], collapse = " "), [13:13:46.948] hostname = base::Sys.info()[["nodename"]]) [13:13:46.948] info <- base::sprintf("%s: %s", base::names(info), [13:13:46.948] info) [13:13:46.948] info <- base::paste(info, collapse = "; ") [13:13:46.948] if (!has_future) { [13:13:46.948] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:46.948] info) [13:13:46.948] } [13:13:46.948] else { [13:13:46.948] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:46.948] info, version) [13:13:46.948] } [13:13:46.948] base::stop(msg) [13:13:46.948] } [13:13:46.948] }) [13:13:46.948] } [13:13:46.948] ...future.mc.cores.old <- base::getOption("mc.cores") [13:13:46.948] base::options(mc.cores = 1L) [13:13:46.948] } [13:13:46.948] options(future.plan = NULL) [13:13:46.948] Sys.unsetenv("R_FUTURE_PLAN") [13:13:46.948] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:46.948] } [13:13:46.948] ...future.workdir <- getwd() [13:13:46.948] } [13:13:46.948] ...future.oldOptions <- base::as.list(base::.Options) [13:13:46.948] ...future.oldEnvVars <- base::Sys.getenv() [13:13:46.948] } [13:13:46.948] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:46.948] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:13:46.948] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:46.948] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:46.948] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:46.948] future.stdout.windows.reencode = NULL, width = 80L) [13:13:46.948] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:46.948] base::names(...future.oldOptions)) [13:13:46.948] } [13:13:46.948] if (FALSE) { [13:13:46.948] } [13:13:46.948] else { [13:13:46.948] if (TRUE) { [13:13:46.948] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:46.948] open = "w") [13:13:46.948] } [13:13:46.948] else { [13:13:46.948] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:46.948] windows = "NUL", "/dev/null"), open = "w") [13:13:46.948] } [13:13:46.948] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:46.948] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:46.948] base::sink(type = "output", split = FALSE) [13:13:46.948] base::close(...future.stdout) [13:13:46.948] }, add = TRUE) [13:13:46.948] } [13:13:46.948] ...future.frame <- base::sys.nframe() [13:13:46.948] ...future.conditions <- base::list() [13:13:46.948] ...future.rng <- base::globalenv()$.Random.seed [13:13:46.948] if (FALSE) { [13:13:46.948] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:46.948] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:46.948] } [13:13:46.948] ...future.result <- base::tryCatch({ [13:13:46.948] base::withCallingHandlers({ [13:13:46.948] ...future.value <- base::withVisible(base::local({ [13:13:46.948] ...future.makeSendCondition <- local({ [13:13:46.948] sendCondition <- NULL [13:13:46.948] function(frame = 1L) { [13:13:46.948] if (is.function(sendCondition)) [13:13:46.948] return(sendCondition) [13:13:46.948] ns <- getNamespace("parallel") [13:13:46.948] if (exists("sendData", mode = "function", [13:13:46.948] envir = ns)) { [13:13:46.948] parallel_sendData <- get("sendData", mode = "function", [13:13:46.948] envir = ns) [13:13:46.948] envir <- sys.frame(frame) [13:13:46.948] master <- NULL [13:13:46.948] while (!identical(envir, .GlobalEnv) && [13:13:46.948] !identical(envir, emptyenv())) { [13:13:46.948] if (exists("master", mode = "list", envir = envir, [13:13:46.948] inherits = FALSE)) { [13:13:46.948] master <- get("master", mode = "list", [13:13:46.948] envir = envir, inherits = FALSE) [13:13:46.948] if (inherits(master, c("SOCKnode", [13:13:46.948] "SOCK0node"))) { [13:13:46.948] sendCondition <<- function(cond) { [13:13:46.948] data <- list(type = "VALUE", value = cond, [13:13:46.948] success = TRUE) [13:13:46.948] parallel_sendData(master, data) [13:13:46.948] } [13:13:46.948] return(sendCondition) [13:13:46.948] } [13:13:46.948] } [13:13:46.948] frame <- frame + 1L [13:13:46.948] envir <- sys.frame(frame) [13:13:46.948] } [13:13:46.948] } [13:13:46.948] sendCondition <<- function(cond) NULL [13:13:46.948] } [13:13:46.948] }) [13:13:46.948] withCallingHandlers({ [13:13:46.948] { [13:13:46.948] do.call(function(...) { [13:13:46.948] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:46.948] if (!identical(...future.globals.maxSize.org, [13:13:46.948] ...future.globals.maxSize)) { [13:13:46.948] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:46.948] on.exit(options(oopts), add = TRUE) [13:13:46.948] } [13:13:46.948] { [13:13:46.948] lapply(seq_along(...future.elements_ii), [13:13:46.948] FUN = function(jj) { [13:13:46.948] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:46.948] ...future.FUN(...future.X_jj, ...) [13:13:46.948] }) [13:13:46.948] } [13:13:46.948] }, args = future.call.arguments) [13:13:46.948] } [13:13:46.948] }, immediateCondition = function(cond) { [13:13:46.948] sendCondition <- ...future.makeSendCondition() [13:13:46.948] sendCondition(cond) [13:13:46.948] muffleCondition <- function (cond, pattern = "^muffle") [13:13:46.948] { [13:13:46.948] inherits <- base::inherits [13:13:46.948] invokeRestart <- base::invokeRestart [13:13:46.948] is.null <- base::is.null [13:13:46.948] muffled <- FALSE [13:13:46.948] if (inherits(cond, "message")) { [13:13:46.948] muffled <- grepl(pattern, "muffleMessage") [13:13:46.948] if (muffled) [13:13:46.948] invokeRestart("muffleMessage") [13:13:46.948] } [13:13:46.948] else if (inherits(cond, "warning")) { [13:13:46.948] muffled <- grepl(pattern, "muffleWarning") [13:13:46.948] if (muffled) [13:13:46.948] invokeRestart("muffleWarning") [13:13:46.948] } [13:13:46.948] else if (inherits(cond, "condition")) { [13:13:46.948] if (!is.null(pattern)) { [13:13:46.948] computeRestarts <- base::computeRestarts [13:13:46.948] grepl <- base::grepl [13:13:46.948] restarts <- computeRestarts(cond) [13:13:46.948] for (restart in restarts) { [13:13:46.948] name <- restart$name [13:13:46.948] if (is.null(name)) [13:13:46.948] next [13:13:46.948] if (!grepl(pattern, name)) [13:13:46.948] next [13:13:46.948] invokeRestart(restart) [13:13:46.948] muffled <- TRUE [13:13:46.948] break [13:13:46.948] } [13:13:46.948] } [13:13:46.948] } [13:13:46.948] invisible(muffled) [13:13:46.948] } [13:13:46.948] muffleCondition(cond) [13:13:46.948] }) [13:13:46.948] })) [13:13:46.948] future::FutureResult(value = ...future.value$value, [13:13:46.948] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:46.948] ...future.rng), globalenv = if (FALSE) [13:13:46.948] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:46.948] ...future.globalenv.names)) [13:13:46.948] else NULL, started = ...future.startTime, version = "1.8") [13:13:46.948] }, condition = base::local({ [13:13:46.948] c <- base::c [13:13:46.948] inherits <- base::inherits [13:13:46.948] invokeRestart <- base::invokeRestart [13:13:46.948] length <- base::length [13:13:46.948] list <- base::list [13:13:46.948] seq.int <- base::seq.int [13:13:46.948] signalCondition <- base::signalCondition [13:13:46.948] sys.calls <- base::sys.calls [13:13:46.948] `[[` <- base::`[[` [13:13:46.948] `+` <- base::`+` [13:13:46.948] `<<-` <- base::`<<-` [13:13:46.948] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:46.948] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:46.948] 3L)] [13:13:46.948] } [13:13:46.948] function(cond) { [13:13:46.948] is_error <- inherits(cond, "error") [13:13:46.948] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:46.948] NULL) [13:13:46.948] if (is_error) { [13:13:46.948] sessionInformation <- function() { [13:13:46.948] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:46.948] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:46.948] search = base::search(), system = base::Sys.info()) [13:13:46.948] } [13:13:46.948] ...future.conditions[[length(...future.conditions) + [13:13:46.948] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:46.948] cond$call), session = sessionInformation(), [13:13:46.948] timestamp = base::Sys.time(), signaled = 0L) [13:13:46.948] signalCondition(cond) [13:13:46.948] } [13:13:46.948] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:46.948] "immediateCondition"))) { [13:13:46.948] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:46.948] ...future.conditions[[length(...future.conditions) + [13:13:46.948] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:46.948] if (TRUE && !signal) { [13:13:46.948] muffleCondition <- function (cond, pattern = "^muffle") [13:13:46.948] { [13:13:46.948] inherits <- base::inherits [13:13:46.948] invokeRestart <- base::invokeRestart [13:13:46.948] is.null <- base::is.null [13:13:46.948] muffled <- FALSE [13:13:46.948] if (inherits(cond, "message")) { [13:13:46.948] muffled <- grepl(pattern, "muffleMessage") [13:13:46.948] if (muffled) [13:13:46.948] invokeRestart("muffleMessage") [13:13:46.948] } [13:13:46.948] else if (inherits(cond, "warning")) { [13:13:46.948] muffled <- grepl(pattern, "muffleWarning") [13:13:46.948] if (muffled) [13:13:46.948] invokeRestart("muffleWarning") [13:13:46.948] } [13:13:46.948] else if (inherits(cond, "condition")) { [13:13:46.948] if (!is.null(pattern)) { [13:13:46.948] computeRestarts <- base::computeRestarts [13:13:46.948] grepl <- base::grepl [13:13:46.948] restarts <- computeRestarts(cond) [13:13:46.948] for (restart in restarts) { [13:13:46.948] name <- restart$name [13:13:46.948] if (is.null(name)) [13:13:46.948] next [13:13:46.948] if (!grepl(pattern, name)) [13:13:46.948] next [13:13:46.948] invokeRestart(restart) [13:13:46.948] muffled <- TRUE [13:13:46.948] break [13:13:46.948] } [13:13:46.948] } [13:13:46.948] } [13:13:46.948] invisible(muffled) [13:13:46.948] } [13:13:46.948] muffleCondition(cond, pattern = "^muffle") [13:13:46.948] } [13:13:46.948] } [13:13:46.948] else { [13:13:46.948] if (TRUE) { [13:13:46.948] muffleCondition <- function (cond, pattern = "^muffle") [13:13:46.948] { [13:13:46.948] inherits <- base::inherits [13:13:46.948] invokeRestart <- base::invokeRestart [13:13:46.948] is.null <- base::is.null [13:13:46.948] muffled <- FALSE [13:13:46.948] if (inherits(cond, "message")) { [13:13:46.948] muffled <- grepl(pattern, "muffleMessage") [13:13:46.948] if (muffled) [13:13:46.948] invokeRestart("muffleMessage") [13:13:46.948] } [13:13:46.948] else if (inherits(cond, "warning")) { [13:13:46.948] muffled <- grepl(pattern, "muffleWarning") [13:13:46.948] if (muffled) [13:13:46.948] invokeRestart("muffleWarning") [13:13:46.948] } [13:13:46.948] else if (inherits(cond, "condition")) { [13:13:46.948] if (!is.null(pattern)) { [13:13:46.948] computeRestarts <- base::computeRestarts [13:13:46.948] grepl <- base::grepl [13:13:46.948] restarts <- computeRestarts(cond) [13:13:46.948] for (restart in restarts) { [13:13:46.948] name <- restart$name [13:13:46.948] if (is.null(name)) [13:13:46.948] next [13:13:46.948] if (!grepl(pattern, name)) [13:13:46.948] next [13:13:46.948] invokeRestart(restart) [13:13:46.948] muffled <- TRUE [13:13:46.948] break [13:13:46.948] } [13:13:46.948] } [13:13:46.948] } [13:13:46.948] invisible(muffled) [13:13:46.948] } [13:13:46.948] muffleCondition(cond, pattern = "^muffle") [13:13:46.948] } [13:13:46.948] } [13:13:46.948] } [13:13:46.948] })) [13:13:46.948] }, error = function(ex) { [13:13:46.948] base::structure(base::list(value = NULL, visible = NULL, [13:13:46.948] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:46.948] ...future.rng), started = ...future.startTime, [13:13:46.948] finished = Sys.time(), session_uuid = NA_character_, [13:13:46.948] version = "1.8"), class = "FutureResult") [13:13:46.948] }, finally = { [13:13:46.948] if (!identical(...future.workdir, getwd())) [13:13:46.948] setwd(...future.workdir) [13:13:46.948] { [13:13:46.948] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:46.948] ...future.oldOptions$nwarnings <- NULL [13:13:46.948] } [13:13:46.948] base::options(...future.oldOptions) [13:13:46.948] if (.Platform$OS.type == "windows") { [13:13:46.948] old_names <- names(...future.oldEnvVars) [13:13:46.948] envs <- base::Sys.getenv() [13:13:46.948] names <- names(envs) [13:13:46.948] common <- intersect(names, old_names) [13:13:46.948] added <- setdiff(names, old_names) [13:13:46.948] removed <- setdiff(old_names, names) [13:13:46.948] changed <- common[...future.oldEnvVars[common] != [13:13:46.948] envs[common]] [13:13:46.948] NAMES <- toupper(changed) [13:13:46.948] args <- list() [13:13:46.948] for (kk in seq_along(NAMES)) { [13:13:46.948] name <- changed[[kk]] [13:13:46.948] NAME <- NAMES[[kk]] [13:13:46.948] if (name != NAME && is.element(NAME, old_names)) [13:13:46.948] next [13:13:46.948] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:46.948] } [13:13:46.948] NAMES <- toupper(added) [13:13:46.948] for (kk in seq_along(NAMES)) { [13:13:46.948] name <- added[[kk]] [13:13:46.948] NAME <- NAMES[[kk]] [13:13:46.948] if (name != NAME && is.element(NAME, old_names)) [13:13:46.948] next [13:13:46.948] args[[name]] <- "" [13:13:46.948] } [13:13:46.948] NAMES <- toupper(removed) [13:13:46.948] for (kk in seq_along(NAMES)) { [13:13:46.948] name <- removed[[kk]] [13:13:46.948] NAME <- NAMES[[kk]] [13:13:46.948] if (name != NAME && is.element(NAME, old_names)) [13:13:46.948] next [13:13:46.948] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:46.948] } [13:13:46.948] if (length(args) > 0) [13:13:46.948] base::do.call(base::Sys.setenv, args = args) [13:13:46.948] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:46.948] } [13:13:46.948] else { [13:13:46.948] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:46.948] } [13:13:46.948] { [13:13:46.948] if (base::length(...future.futureOptionsAdded) > [13:13:46.948] 0L) { [13:13:46.948] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:46.948] base::names(opts) <- ...future.futureOptionsAdded [13:13:46.948] base::options(opts) [13:13:46.948] } [13:13:46.948] { [13:13:46.948] { [13:13:46.948] base::options(mc.cores = ...future.mc.cores.old) [13:13:46.948] NULL [13:13:46.948] } [13:13:46.948] options(future.plan = NULL) [13:13:46.948] if (is.na(NA_character_)) [13:13:46.948] Sys.unsetenv("R_FUTURE_PLAN") [13:13:46.948] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:46.948] future::plan(list(function (..., workers = availableCores(), [13:13:46.948] lazy = FALSE, rscript_libs = .libPaths(), [13:13:46.948] envir = parent.frame()) [13:13:46.948] { [13:13:46.948] if (is.function(workers)) [13:13:46.948] workers <- workers() [13:13:46.948] workers <- structure(as.integer(workers), [13:13:46.948] class = class(workers)) [13:13:46.948] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:46.948] workers >= 1) [13:13:46.948] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:46.948] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:46.948] } [13:13:46.948] future <- MultisessionFuture(..., workers = workers, [13:13:46.948] lazy = lazy, rscript_libs = rscript_libs, [13:13:46.948] envir = envir) [13:13:46.948] if (!future$lazy) [13:13:46.948] future <- run(future) [13:13:46.948] invisible(future) [13:13:46.948] }), .cleanup = FALSE, .init = FALSE) [13:13:46.948] } [13:13:46.948] } [13:13:46.948] } [13:13:46.948] }) [13:13:46.948] if (TRUE) { [13:13:46.948] base::sink(type = "output", split = FALSE) [13:13:46.948] if (TRUE) { [13:13:46.948] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:46.948] } [13:13:46.948] else { [13:13:46.948] ...future.result["stdout"] <- base::list(NULL) [13:13:46.948] } [13:13:46.948] base::close(...future.stdout) [13:13:46.948] ...future.stdout <- NULL [13:13:46.948] } [13:13:46.948] ...future.result$conditions <- ...future.conditions [13:13:46.948] ...future.result$finished <- base::Sys.time() [13:13:46.948] ...future.result [13:13:46.948] } [13:13:46.953] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... [13:13:46.953] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... [13:13:46.954] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... DONE [13:13:46.954] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... [13:13:46.955] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... DONE [13:13:46.955] Exporting '...future.elements_ii' (232 bytes) to cluster node #1 ... [13:13:46.955] Exporting '...future.elements_ii' (232 bytes) to cluster node #1 ... DONE [13:13:46.955] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:13:46.956] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:13:46.956] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:13:46.957] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:13:46.957] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... DONE [13:13:46.957] MultisessionFuture started [13:13:46.958] - Launch lazy future ... done [13:13:46.958] run() for 'MultisessionFuture' ... done [13:13:46.958] Created future: [13:13:46.974] receiveMessageFromWorker() for ClusterFuture ... [13:13:46.974] - Validating connection of MultisessionFuture [13:13:46.974] - received message: FutureResult [13:13:46.975] - Received FutureResult [13:13:46.975] - Erased future from FutureRegistry [13:13:46.975] result() for ClusterFuture ... [13:13:46.975] - result already collected: FutureResult [13:13:46.975] result() for ClusterFuture ... done [13:13:46.975] receiveMessageFromWorker() for ClusterFuture ... done [13:13:46.958] MultisessionFuture: [13:13:46.958] Label: 'future_lapply-1' [13:13:46.958] Expression: [13:13:46.958] { [13:13:46.958] do.call(function(...) { [13:13:46.958] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:46.958] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:46.958] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:46.958] on.exit(options(oopts), add = TRUE) [13:13:46.958] } [13:13:46.958] { [13:13:46.958] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:46.958] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:46.958] ...future.FUN(...future.X_jj, ...) [13:13:46.958] }) [13:13:46.958] } [13:13:46.958] }, args = future.call.arguments) [13:13:46.958] } [13:13:46.958] Lazy evaluation: FALSE [13:13:46.958] Asynchronous evaluation: TRUE [13:13:46.958] Local evaluation: TRUE [13:13:46.958] Environment: R_GlobalEnv [13:13:46.958] Capture standard output: TRUE [13:13:46.958] Capture condition classes: 'condition' (excluding 'nothing') [13:13:46.958] 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) [13:13:46.958] Packages: [13:13:46.958] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:46.958] Resolved: TRUE [13:13:46.958] Value: [13:13:46.958] Conditions captured: [13:13:46.958] Early signaling: FALSE [13:13:46.958] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:46.958] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:46.976] Chunk #1 of 2 ... DONE [13:13:46.976] Chunk #2 of 2 ... [13:13:46.976] - Finding globals in 'X' for chunk #2 ... [13:13:46.976] getGlobalsAndPackages() ... [13:13:46.977] Searching for globals... [13:13:46.977] [13:13:46.977] Searching for globals ... DONE [13:13:46.977] - globals: [0] [13:13:46.977] getGlobalsAndPackages() ... DONE [13:13:46.978] + additional globals found: [n=0] [13:13:46.978] + additional namespaces needed: [n=0] [13:13:46.978] - Finding globals in 'X' for chunk #2 ... DONE [13:13:46.978] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:13:46.978] - seeds: [13:13:46.978] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:46.979] getGlobalsAndPackages() ... [13:13:46.979] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:46.979] Resolving globals: FALSE [13:13:46.979] Tweak future expression to call with '...' arguments ... [13:13:46.979] { [13:13:46.979] do.call(function(...) { [13:13:46.979] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:46.979] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:46.979] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:46.979] on.exit(options(oopts), add = TRUE) [13:13:46.979] } [13:13:46.979] { [13:13:46.979] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:46.979] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:46.979] ...future.FUN(...future.X_jj, ...) [13:13:46.979] }) [13:13:46.979] } [13:13:46.979] }, args = future.call.arguments) [13:13:46.979] } [13:13:46.980] Tweak future expression to call with '...' arguments ... DONE [13:13:46.980] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:46.980] [13:13:46.980] getGlobalsAndPackages() ... DONE [13:13:46.981] run() for 'Future' ... [13:13:46.981] - state: 'created' [13:13:46.981] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:46.995] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:46.995] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:13:46.995] - Field: 'node' [13:13:46.995] - Field: 'label' [13:13:46.996] - Field: 'local' [13:13:46.996] - Field: 'owner' [13:13:46.996] - Field: 'envir' [13:13:46.996] - Field: 'workers' [13:13:46.996] - Field: 'packages' [13:13:46.997] - Field: 'gc' [13:13:46.997] - Field: 'conditions' [13:13:46.997] - Field: 'persistent' [13:13:46.997] - Field: 'expr' [13:13:46.997] - Field: 'uuid' [13:13:46.997] - Field: 'seed' [13:13:46.998] - Field: 'version' [13:13:46.998] - Field: 'result' [13:13:46.998] - Field: 'asynchronous' [13:13:46.998] - Field: 'calls' [13:13:46.998] - Field: 'globals' [13:13:46.998] - Field: 'stdout' [13:13:46.999] - Field: 'earlySignal' [13:13:46.999] - Field: 'lazy' [13:13:46.999] - Field: 'state' [13:13:46.999] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:13:46.999] - Launch lazy future ... [13:13:47.000] Packages needed by the future expression (n = 0): [13:13:47.000] Packages needed by future strategies (n = 0): [13:13:47.000] { [13:13:47.000] { [13:13:47.000] { [13:13:47.000] ...future.startTime <- base::Sys.time() [13:13:47.000] { [13:13:47.000] { [13:13:47.000] { [13:13:47.000] { [13:13:47.000] base::local({ [13:13:47.000] has_future <- base::requireNamespace("future", [13:13:47.000] quietly = TRUE) [13:13:47.000] if (has_future) { [13:13:47.000] ns <- base::getNamespace("future") [13:13:47.000] version <- ns[[".package"]][["version"]] [13:13:47.000] if (is.null(version)) [13:13:47.000] version <- utils::packageVersion("future") [13:13:47.000] } [13:13:47.000] else { [13:13:47.000] version <- NULL [13:13:47.000] } [13:13:47.000] if (!has_future || version < "1.8.0") { [13:13:47.000] info <- base::c(r_version = base::gsub("R version ", [13:13:47.000] "", base::R.version$version.string), [13:13:47.000] platform = base::sprintf("%s (%s-bit)", [13:13:47.000] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:47.000] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:47.000] "release", "version")], collapse = " "), [13:13:47.000] hostname = base::Sys.info()[["nodename"]]) [13:13:47.000] info <- base::sprintf("%s: %s", base::names(info), [13:13:47.000] info) [13:13:47.000] info <- base::paste(info, collapse = "; ") [13:13:47.000] if (!has_future) { [13:13:47.000] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:47.000] info) [13:13:47.000] } [13:13:47.000] else { [13:13:47.000] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:47.000] info, version) [13:13:47.000] } [13:13:47.000] base::stop(msg) [13:13:47.000] } [13:13:47.000] }) [13:13:47.000] } [13:13:47.000] ...future.mc.cores.old <- base::getOption("mc.cores") [13:13:47.000] base::options(mc.cores = 1L) [13:13:47.000] } [13:13:47.000] options(future.plan = NULL) [13:13:47.000] Sys.unsetenv("R_FUTURE_PLAN") [13:13:47.000] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:47.000] } [13:13:47.000] ...future.workdir <- getwd() [13:13:47.000] } [13:13:47.000] ...future.oldOptions <- base::as.list(base::.Options) [13:13:47.000] ...future.oldEnvVars <- base::Sys.getenv() [13:13:47.000] } [13:13:47.000] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:47.000] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:13:47.000] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:47.000] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:47.000] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:47.000] future.stdout.windows.reencode = NULL, width = 80L) [13:13:47.000] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:47.000] base::names(...future.oldOptions)) [13:13:47.000] } [13:13:47.000] if (FALSE) { [13:13:47.000] } [13:13:47.000] else { [13:13:47.000] if (TRUE) { [13:13:47.000] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:47.000] open = "w") [13:13:47.000] } [13:13:47.000] else { [13:13:47.000] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:47.000] windows = "NUL", "/dev/null"), open = "w") [13:13:47.000] } [13:13:47.000] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:47.000] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:47.000] base::sink(type = "output", split = FALSE) [13:13:47.000] base::close(...future.stdout) [13:13:47.000] }, add = TRUE) [13:13:47.000] } [13:13:47.000] ...future.frame <- base::sys.nframe() [13:13:47.000] ...future.conditions <- base::list() [13:13:47.000] ...future.rng <- base::globalenv()$.Random.seed [13:13:47.000] if (FALSE) { [13:13:47.000] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:47.000] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:47.000] } [13:13:47.000] ...future.result <- base::tryCatch({ [13:13:47.000] base::withCallingHandlers({ [13:13:47.000] ...future.value <- base::withVisible(base::local({ [13:13:47.000] ...future.makeSendCondition <- local({ [13:13:47.000] sendCondition <- NULL [13:13:47.000] function(frame = 1L) { [13:13:47.000] if (is.function(sendCondition)) [13:13:47.000] return(sendCondition) [13:13:47.000] ns <- getNamespace("parallel") [13:13:47.000] if (exists("sendData", mode = "function", [13:13:47.000] envir = ns)) { [13:13:47.000] parallel_sendData <- get("sendData", mode = "function", [13:13:47.000] envir = ns) [13:13:47.000] envir <- sys.frame(frame) [13:13:47.000] master <- NULL [13:13:47.000] while (!identical(envir, .GlobalEnv) && [13:13:47.000] !identical(envir, emptyenv())) { [13:13:47.000] if (exists("master", mode = "list", envir = envir, [13:13:47.000] inherits = FALSE)) { [13:13:47.000] master <- get("master", mode = "list", [13:13:47.000] envir = envir, inherits = FALSE) [13:13:47.000] if (inherits(master, c("SOCKnode", [13:13:47.000] "SOCK0node"))) { [13:13:47.000] sendCondition <<- function(cond) { [13:13:47.000] data <- list(type = "VALUE", value = cond, [13:13:47.000] success = TRUE) [13:13:47.000] parallel_sendData(master, data) [13:13:47.000] } [13:13:47.000] return(sendCondition) [13:13:47.000] } [13:13:47.000] } [13:13:47.000] frame <- frame + 1L [13:13:47.000] envir <- sys.frame(frame) [13:13:47.000] } [13:13:47.000] } [13:13:47.000] sendCondition <<- function(cond) NULL [13:13:47.000] } [13:13:47.000] }) [13:13:47.000] withCallingHandlers({ [13:13:47.000] { [13:13:47.000] do.call(function(...) { [13:13:47.000] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:47.000] if (!identical(...future.globals.maxSize.org, [13:13:47.000] ...future.globals.maxSize)) { [13:13:47.000] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:47.000] on.exit(options(oopts), add = TRUE) [13:13:47.000] } [13:13:47.000] { [13:13:47.000] lapply(seq_along(...future.elements_ii), [13:13:47.000] FUN = function(jj) { [13:13:47.000] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:47.000] ...future.FUN(...future.X_jj, ...) [13:13:47.000] }) [13:13:47.000] } [13:13:47.000] }, args = future.call.arguments) [13:13:47.000] } [13:13:47.000] }, immediateCondition = function(cond) { [13:13:47.000] sendCondition <- ...future.makeSendCondition() [13:13:47.000] sendCondition(cond) [13:13:47.000] muffleCondition <- function (cond, pattern = "^muffle") [13:13:47.000] { [13:13:47.000] inherits <- base::inherits [13:13:47.000] invokeRestart <- base::invokeRestart [13:13:47.000] is.null <- base::is.null [13:13:47.000] muffled <- FALSE [13:13:47.000] if (inherits(cond, "message")) { [13:13:47.000] muffled <- grepl(pattern, "muffleMessage") [13:13:47.000] if (muffled) [13:13:47.000] invokeRestart("muffleMessage") [13:13:47.000] } [13:13:47.000] else if (inherits(cond, "warning")) { [13:13:47.000] muffled <- grepl(pattern, "muffleWarning") [13:13:47.000] if (muffled) [13:13:47.000] invokeRestart("muffleWarning") [13:13:47.000] } [13:13:47.000] else if (inherits(cond, "condition")) { [13:13:47.000] if (!is.null(pattern)) { [13:13:47.000] computeRestarts <- base::computeRestarts [13:13:47.000] grepl <- base::grepl [13:13:47.000] restarts <- computeRestarts(cond) [13:13:47.000] for (restart in restarts) { [13:13:47.000] name <- restart$name [13:13:47.000] if (is.null(name)) [13:13:47.000] next [13:13:47.000] if (!grepl(pattern, name)) [13:13:47.000] next [13:13:47.000] invokeRestart(restart) [13:13:47.000] muffled <- TRUE [13:13:47.000] break [13:13:47.000] } [13:13:47.000] } [13:13:47.000] } [13:13:47.000] invisible(muffled) [13:13:47.000] } [13:13:47.000] muffleCondition(cond) [13:13:47.000] }) [13:13:47.000] })) [13:13:47.000] future::FutureResult(value = ...future.value$value, [13:13:47.000] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:47.000] ...future.rng), globalenv = if (FALSE) [13:13:47.000] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:47.000] ...future.globalenv.names)) [13:13:47.000] else NULL, started = ...future.startTime, version = "1.8") [13:13:47.000] }, condition = base::local({ [13:13:47.000] c <- base::c [13:13:47.000] inherits <- base::inherits [13:13:47.000] invokeRestart <- base::invokeRestart [13:13:47.000] length <- base::length [13:13:47.000] list <- base::list [13:13:47.000] seq.int <- base::seq.int [13:13:47.000] signalCondition <- base::signalCondition [13:13:47.000] sys.calls <- base::sys.calls [13:13:47.000] `[[` <- base::`[[` [13:13:47.000] `+` <- base::`+` [13:13:47.000] `<<-` <- base::`<<-` [13:13:47.000] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:47.000] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:47.000] 3L)] [13:13:47.000] } [13:13:47.000] function(cond) { [13:13:47.000] is_error <- inherits(cond, "error") [13:13:47.000] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:47.000] NULL) [13:13:47.000] if (is_error) { [13:13:47.000] sessionInformation <- function() { [13:13:47.000] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:47.000] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:47.000] search = base::search(), system = base::Sys.info()) [13:13:47.000] } [13:13:47.000] ...future.conditions[[length(...future.conditions) + [13:13:47.000] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:47.000] cond$call), session = sessionInformation(), [13:13:47.000] timestamp = base::Sys.time(), signaled = 0L) [13:13:47.000] signalCondition(cond) [13:13:47.000] } [13:13:47.000] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:47.000] "immediateCondition"))) { [13:13:47.000] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:47.000] ...future.conditions[[length(...future.conditions) + [13:13:47.000] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:47.000] if (TRUE && !signal) { [13:13:47.000] muffleCondition <- function (cond, pattern = "^muffle") [13:13:47.000] { [13:13:47.000] inherits <- base::inherits [13:13:47.000] invokeRestart <- base::invokeRestart [13:13:47.000] is.null <- base::is.null [13:13:47.000] muffled <- FALSE [13:13:47.000] if (inherits(cond, "message")) { [13:13:47.000] muffled <- grepl(pattern, "muffleMessage") [13:13:47.000] if (muffled) [13:13:47.000] invokeRestart("muffleMessage") [13:13:47.000] } [13:13:47.000] else if (inherits(cond, "warning")) { [13:13:47.000] muffled <- grepl(pattern, "muffleWarning") [13:13:47.000] if (muffled) [13:13:47.000] invokeRestart("muffleWarning") [13:13:47.000] } [13:13:47.000] else if (inherits(cond, "condition")) { [13:13:47.000] if (!is.null(pattern)) { [13:13:47.000] computeRestarts <- base::computeRestarts [13:13:47.000] grepl <- base::grepl [13:13:47.000] restarts <- computeRestarts(cond) [13:13:47.000] for (restart in restarts) { [13:13:47.000] name <- restart$name [13:13:47.000] if (is.null(name)) [13:13:47.000] next [13:13:47.000] if (!grepl(pattern, name)) [13:13:47.000] next [13:13:47.000] invokeRestart(restart) [13:13:47.000] muffled <- TRUE [13:13:47.000] break [13:13:47.000] } [13:13:47.000] } [13:13:47.000] } [13:13:47.000] invisible(muffled) [13:13:47.000] } [13:13:47.000] muffleCondition(cond, pattern = "^muffle") [13:13:47.000] } [13:13:47.000] } [13:13:47.000] else { [13:13:47.000] if (TRUE) { [13:13:47.000] muffleCondition <- function (cond, pattern = "^muffle") [13:13:47.000] { [13:13:47.000] inherits <- base::inherits [13:13:47.000] invokeRestart <- base::invokeRestart [13:13:47.000] is.null <- base::is.null [13:13:47.000] muffled <- FALSE [13:13:47.000] if (inherits(cond, "message")) { [13:13:47.000] muffled <- grepl(pattern, "muffleMessage") [13:13:47.000] if (muffled) [13:13:47.000] invokeRestart("muffleMessage") [13:13:47.000] } [13:13:47.000] else if (inherits(cond, "warning")) { [13:13:47.000] muffled <- grepl(pattern, "muffleWarning") [13:13:47.000] if (muffled) [13:13:47.000] invokeRestart("muffleWarning") [13:13:47.000] } [13:13:47.000] else if (inherits(cond, "condition")) { [13:13:47.000] if (!is.null(pattern)) { [13:13:47.000] computeRestarts <- base::computeRestarts [13:13:47.000] grepl <- base::grepl [13:13:47.000] restarts <- computeRestarts(cond) [13:13:47.000] for (restart in restarts) { [13:13:47.000] name <- restart$name [13:13:47.000] if (is.null(name)) [13:13:47.000] next [13:13:47.000] if (!grepl(pattern, name)) [13:13:47.000] next [13:13:47.000] invokeRestart(restart) [13:13:47.000] muffled <- TRUE [13:13:47.000] break [13:13:47.000] } [13:13:47.000] } [13:13:47.000] } [13:13:47.000] invisible(muffled) [13:13:47.000] } [13:13:47.000] muffleCondition(cond, pattern = "^muffle") [13:13:47.000] } [13:13:47.000] } [13:13:47.000] } [13:13:47.000] })) [13:13:47.000] }, error = function(ex) { [13:13:47.000] base::structure(base::list(value = NULL, visible = NULL, [13:13:47.000] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:47.000] ...future.rng), started = ...future.startTime, [13:13:47.000] finished = Sys.time(), session_uuid = NA_character_, [13:13:47.000] version = "1.8"), class = "FutureResult") [13:13:47.000] }, finally = { [13:13:47.000] if (!identical(...future.workdir, getwd())) [13:13:47.000] setwd(...future.workdir) [13:13:47.000] { [13:13:47.000] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:47.000] ...future.oldOptions$nwarnings <- NULL [13:13:47.000] } [13:13:47.000] base::options(...future.oldOptions) [13:13:47.000] if (.Platform$OS.type == "windows") { [13:13:47.000] old_names <- names(...future.oldEnvVars) [13:13:47.000] envs <- base::Sys.getenv() [13:13:47.000] names <- names(envs) [13:13:47.000] common <- intersect(names, old_names) [13:13:47.000] added <- setdiff(names, old_names) [13:13:47.000] removed <- setdiff(old_names, names) [13:13:47.000] changed <- common[...future.oldEnvVars[common] != [13:13:47.000] envs[common]] [13:13:47.000] NAMES <- toupper(changed) [13:13:47.000] args <- list() [13:13:47.000] for (kk in seq_along(NAMES)) { [13:13:47.000] name <- changed[[kk]] [13:13:47.000] NAME <- NAMES[[kk]] [13:13:47.000] if (name != NAME && is.element(NAME, old_names)) [13:13:47.000] next [13:13:47.000] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:47.000] } [13:13:47.000] NAMES <- toupper(added) [13:13:47.000] for (kk in seq_along(NAMES)) { [13:13:47.000] name <- added[[kk]] [13:13:47.000] NAME <- NAMES[[kk]] [13:13:47.000] if (name != NAME && is.element(NAME, old_names)) [13:13:47.000] next [13:13:47.000] args[[name]] <- "" [13:13:47.000] } [13:13:47.000] NAMES <- toupper(removed) [13:13:47.000] for (kk in seq_along(NAMES)) { [13:13:47.000] name <- removed[[kk]] [13:13:47.000] NAME <- NAMES[[kk]] [13:13:47.000] if (name != NAME && is.element(NAME, old_names)) [13:13:47.000] next [13:13:47.000] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:47.000] } [13:13:47.000] if (length(args) > 0) [13:13:47.000] base::do.call(base::Sys.setenv, args = args) [13:13:47.000] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:47.000] } [13:13:47.000] else { [13:13:47.000] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:47.000] } [13:13:47.000] { [13:13:47.000] if (base::length(...future.futureOptionsAdded) > [13:13:47.000] 0L) { [13:13:47.000] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:47.000] base::names(opts) <- ...future.futureOptionsAdded [13:13:47.000] base::options(opts) [13:13:47.000] } [13:13:47.000] { [13:13:47.000] { [13:13:47.000] base::options(mc.cores = ...future.mc.cores.old) [13:13:47.000] NULL [13:13:47.000] } [13:13:47.000] options(future.plan = NULL) [13:13:47.000] if (is.na(NA_character_)) [13:13:47.000] Sys.unsetenv("R_FUTURE_PLAN") [13:13:47.000] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:47.000] future::plan(list(function (..., workers = availableCores(), [13:13:47.000] lazy = FALSE, rscript_libs = .libPaths(), [13:13:47.000] envir = parent.frame()) [13:13:47.000] { [13:13:47.000] if (is.function(workers)) [13:13:47.000] workers <- workers() [13:13:47.000] workers <- structure(as.integer(workers), [13:13:47.000] class = class(workers)) [13:13:47.000] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:47.000] workers >= 1) [13:13:47.000] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:47.000] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:47.000] } [13:13:47.000] future <- MultisessionFuture(..., workers = workers, [13:13:47.000] lazy = lazy, rscript_libs = rscript_libs, [13:13:47.000] envir = envir) [13:13:47.000] if (!future$lazy) [13:13:47.000] future <- run(future) [13:13:47.000] invisible(future) [13:13:47.000] }), .cleanup = FALSE, .init = FALSE) [13:13:47.000] } [13:13:47.000] } [13:13:47.000] } [13:13:47.000] }) [13:13:47.000] if (TRUE) { [13:13:47.000] base::sink(type = "output", split = FALSE) [13:13:47.000] if (TRUE) { [13:13:47.000] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:47.000] } [13:13:47.000] else { [13:13:47.000] ...future.result["stdout"] <- base::list(NULL) [13:13:47.000] } [13:13:47.000] base::close(...future.stdout) [13:13:47.000] ...future.stdout <- NULL [13:13:47.000] } [13:13:47.000] ...future.result$conditions <- ...future.conditions [13:13:47.000] ...future.result$finished <- base::Sys.time() [13:13:47.000] ...future.result [13:13:47.000] } [13:13:47.006] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... [13:13:47.006] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... [13:13:47.006] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... DONE [13:13:47.007] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... [13:13:47.007] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... DONE [13:13:47.007] Exporting '...future.elements_ii' (224 bytes) to cluster node #1 ... [13:13:47.008] Exporting '...future.elements_ii' (224 bytes) to cluster node #1 ... DONE [13:13:47.008] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:13:47.008] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:13:47.009] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:13:47.009] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:13:47.009] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... DONE [13:13:47.010] MultisessionFuture started [13:13:47.010] - Launch lazy future ... done [13:13:47.010] run() for 'MultisessionFuture' ... done [13:13:47.010] Created future: [13:13:47.026] receiveMessageFromWorker() for ClusterFuture ... [13:13:47.026] - Validating connection of MultisessionFuture [13:13:47.026] - received message: FutureResult [13:13:47.026] - Received FutureResult [13:13:47.027] - Erased future from FutureRegistry [13:13:47.027] result() for ClusterFuture ... [13:13:47.027] - result already collected: FutureResult [13:13:47.027] result() for ClusterFuture ... done [13:13:47.027] receiveMessageFromWorker() for ClusterFuture ... done [13:13:47.011] MultisessionFuture: [13:13:47.011] Label: 'future_lapply-2' [13:13:47.011] Expression: [13:13:47.011] { [13:13:47.011] do.call(function(...) { [13:13:47.011] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:47.011] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:47.011] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:47.011] on.exit(options(oopts), add = TRUE) [13:13:47.011] } [13:13:47.011] { [13:13:47.011] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:47.011] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:47.011] ...future.FUN(...future.X_jj, ...) [13:13:47.011] }) [13:13:47.011] } [13:13:47.011] }, args = future.call.arguments) [13:13:47.011] } [13:13:47.011] Lazy evaluation: FALSE [13:13:47.011] Asynchronous evaluation: TRUE [13:13:47.011] Local evaluation: TRUE [13:13:47.011] Environment: R_GlobalEnv [13:13:47.011] Capture standard output: TRUE [13:13:47.011] Capture condition classes: 'condition' (excluding 'nothing') [13:13:47.011] 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) [13:13:47.011] Packages: [13:13:47.011] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:47.011] Resolved: TRUE [13:13:47.011] Value: [13:13:47.011] Conditions captured: [13:13:47.011] Early signaling: FALSE [13:13:47.011] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:47.011] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:47.028] Chunk #2 of 2 ... DONE [13:13:47.028] Launching 2 futures (chunks) ... DONE [13:13:47.028] Resolving 2 futures (chunks) ... [13:13:47.028] resolve() on list ... [13:13:47.028] recursive: 0 [13:13:47.029] length: 2 [13:13:47.029] [13:13:47.029] Future #1 [13:13:47.029] result() for ClusterFuture ... [13:13:47.029] - result already collected: FutureResult [13:13:47.029] result() for ClusterFuture ... done [13:13:47.029] result() for ClusterFuture ... [13:13:47.030] - result already collected: FutureResult [13:13:47.030] result() for ClusterFuture ... done [13:13:47.030] signalConditionsASAP(MultisessionFuture, pos=1) ... [13:13:47.030] - nx: 2 [13:13:47.030] - relay: TRUE [13:13:47.030] - stdout: TRUE [13:13:47.031] - signal: TRUE [13:13:47.031] - resignal: FALSE [13:13:47.031] - force: TRUE [13:13:47.031] - relayed: [n=2] FALSE, FALSE [13:13:47.031] - queued futures: [n=2] FALSE, FALSE [13:13:47.031] - until=1 [13:13:47.031] - relaying element #1 [13:13:47.032] result() for ClusterFuture ... [13:13:47.032] - result already collected: FutureResult [13:13:47.032] result() for ClusterFuture ... done [13:13:47.032] result() for ClusterFuture ... [13:13:47.032] - result already collected: FutureResult [13:13:47.032] result() for ClusterFuture ... done [13:13:47.033] result() for ClusterFuture ... [13:13:47.033] - result already collected: FutureResult [13:13:47.033] result() for ClusterFuture ... done [13:13:47.033] result() for ClusterFuture ... [13:13:47.033] - result already collected: FutureResult [13:13:47.033] result() for ClusterFuture ... done [13:13:47.034] - relayed: [n=2] TRUE, FALSE [13:13:47.034] - queued futures: [n=2] TRUE, FALSE [13:13:47.034] signalConditionsASAP(MultisessionFuture, pos=1) ... done [13:13:47.034] length: 1 (resolved future 1) [13:13:47.034] Future #2 [13:13:47.034] result() for ClusterFuture ... [13:13:47.035] - result already collected: FutureResult [13:13:47.035] result() for ClusterFuture ... done [13:13:47.035] result() for ClusterFuture ... [13:13:47.035] - result already collected: FutureResult [13:13:47.035] result() for ClusterFuture ... done [13:13:47.035] signalConditionsASAP(MultisessionFuture, pos=2) ... [13:13:47.035] - nx: 2 [13:13:47.036] - relay: TRUE [13:13:47.036] - stdout: TRUE [13:13:47.036] - signal: TRUE [13:13:47.036] - resignal: FALSE [13:13:47.036] - force: TRUE [13:13:47.036] - relayed: [n=2] TRUE, FALSE [13:13:47.036] - queued futures: [n=2] TRUE, FALSE [13:13:47.037] - until=2 [13:13:47.037] - relaying element #2 [13:13:47.037] result() for ClusterFuture ... [13:13:47.037] - result already collected: FutureResult [13:13:47.037] result() for ClusterFuture ... done [13:13:47.037] result() for ClusterFuture ... [13:13:47.038] - result already collected: FutureResult [13:13:47.038] result() for ClusterFuture ... done [13:13:47.038] result() for ClusterFuture ... [13:13:47.038] - result already collected: FutureResult [13:13:47.038] result() for ClusterFuture ... done [13:13:47.038] result() for ClusterFuture ... [13:13:47.039] - result already collected: FutureResult [13:13:47.039] result() for ClusterFuture ... done [13:13:47.039] - relayed: [n=2] TRUE, TRUE [13:13:47.039] - queued futures: [n=2] TRUE, TRUE [13:13:47.039] signalConditionsASAP(MultisessionFuture, pos=2) ... done [13:13:47.039] length: 0 (resolved future 2) [13:13:47.039] Relaying remaining futures [13:13:47.040] signalConditionsASAP(NULL, pos=0) ... [13:13:47.040] - nx: 2 [13:13:47.040] - relay: TRUE [13:13:47.040] - stdout: TRUE [13:13:47.040] - signal: TRUE [13:13:47.040] - resignal: FALSE [13:13:47.041] - force: TRUE [13:13:47.041] - relayed: [n=2] TRUE, TRUE [13:13:47.041] - queued futures: [n=2] TRUE, TRUE - flush all [13:13:47.041] - relayed: [n=2] TRUE, TRUE [13:13:47.041] - queued futures: [n=2] TRUE, TRUE [13:13:47.041] signalConditionsASAP(NULL, pos=0) ... done [13:13:47.042] resolve() on list ... DONE [13:13:47.042] result() for ClusterFuture ... [13:13:47.042] - result already collected: FutureResult [13:13:47.042] result() for ClusterFuture ... done [13:13:47.042] result() for ClusterFuture ... [13:13:47.042] - result already collected: FutureResult [13:13:47.042] result() for ClusterFuture ... done [13:13:47.043] result() for ClusterFuture ... [13:13:47.043] - result already collected: FutureResult [13:13:47.043] result() for ClusterFuture ... done [13:13:47.043] result() for ClusterFuture ... [13:13:47.043] - result already collected: FutureResult [13:13:47.043] result() for ClusterFuture ... done [13:13:47.044] - Number of value chunks collected: 2 [13:13:47.044] Resolving 2 futures (chunks) ... DONE [13:13:47.044] Reducing values from 2 chunks ... [13:13:47.044] - Number of values collected after concatenation: 4 [13:13:47.044] - Number of values expected: 4 [13:13:47.044] Reverse index remapping (attribute 'ordering'): [n = 4] 4, 3, 1, 2 [13:13:47.045] Reducing values from 2 chunks ... DONE [13:13:47.045] 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, ...) ... [13:13:47.047] future_lapply() ... [13:13:47.058] Number of chunks: 1 [13:13:47.058] getGlobalsAndPackagesXApply() ... [13:13:47.058] - future.globals: TRUE [13:13:47.058] getGlobalsAndPackages() ... [13:13:47.059] Searching for globals... [13:13:47.068] - globals found: [22] 'FUN', 'if', 'missing', 'is.finite', '{', 'is.null', '<-', 'paste', 'length', '==', 'return', '>', '+', '[', 'seq_len', 'rev', 'c', '&&', '!', ':', '(', '-' [13:13:47.069] Searching for globals ... DONE [13:13:47.069] Resolving globals: FALSE [13:13:47.070] The total size of the 1 globals is 69.62 KiB (71288 bytes) [13:13:47.070] 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') [13:13:47.071] - globals: [1] 'FUN' [13:13:47.071] - packages: [1] 'future' [13:13:47.071] getGlobalsAndPackages() ... DONE [13:13:47.071] - globals found/used: [n=1] 'FUN' [13:13:47.071] - needed namespaces: [n=1] 'future' [13:13:47.072] Finding globals ... DONE [13:13:47.072] - use_args: TRUE [13:13:47.072] - Getting '...' globals ... [13:13:47.072] resolve() on list ... [13:13:47.072] recursive: 0 [13:13:47.073] length: 1 [13:13:47.073] elements: '...' [13:13:47.073] length: 0 (resolved future 1) [13:13:47.073] resolve() on list ... DONE [13:13:47.073] - '...' content: [n=2] 'collapse', 'maxHead' [13:13:47.073] List of 1 [13:13:47.073] $ ...:List of 2 [13:13:47.073] ..$ collapse: chr "; " [13:13:47.073] ..$ maxHead : int 3 [13:13:47.073] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:47.073] - attr(*, "where")=List of 1 [13:13:47.073] ..$ ...: [13:13:47.073] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:47.073] - attr(*, "resolved")= logi TRUE [13:13:47.073] - attr(*, "total_size")= num NA [13:13:47.077] - Getting '...' globals ... DONE [13:13:47.078] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:47.078] List of 2 [13:13:47.078] $ ...future.FUN:function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [13:13:47.078] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [13:13:47.078] $ ... :List of 2 [13:13:47.078] ..$ collapse: chr "; " [13:13:47.078] ..$ maxHead : int 3 [13:13:47.078] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:47.078] - attr(*, "where")=List of 2 [13:13:47.078] ..$ ...future.FUN: [13:13:47.078] ..$ ... : [13:13:47.078] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:47.078] - attr(*, "resolved")= logi FALSE [13:13:47.078] - attr(*, "total_size")= num 71456 [13:13:47.084] Packages to be attached in all futures: [n=1] 'future' [13:13:47.084] getGlobalsAndPackagesXApply() ... DONE [13:13:47.085] Number of futures (= number of chunks): 1 [13:13:47.085] Launching 1 futures (chunks) ... [13:13:47.085] Chunk #1 of 1 ... [13:13:47.085] - Finding globals in 'X' for chunk #1 ... [13:13:47.085] getGlobalsAndPackages() ... [13:13:47.086] Searching for globals... [13:13:47.086] [13:13:47.086] Searching for globals ... DONE [13:13:47.086] - globals: [0] [13:13:47.086] getGlobalsAndPackages() ... DONE [13:13:47.087] + additional globals found: [n=0] [13:13:47.087] + additional namespaces needed: [n=0] [13:13:47.087] - Finding globals in 'X' for chunk #1 ... DONE [13:13:47.087] - seeds: [13:13:47.087] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:47.087] getGlobalsAndPackages() ... [13:13:47.088] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:47.088] Resolving globals: FALSE [13:13:47.088] Tweak future expression to call with '...' arguments ... [13:13:47.088] { [13:13:47.088] do.call(function(...) { [13:13:47.088] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:47.088] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:47.088] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:47.088] on.exit(options(oopts), add = TRUE) [13:13:47.088] } [13:13:47.088] { [13:13:47.088] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:47.088] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:47.088] ...future.FUN(...future.X_jj, ...) [13:13:47.088] }) [13:13:47.088] } [13:13:47.088] }, args = future.call.arguments) [13:13:47.088] } [13:13:47.089] Tweak future expression to call with '...' arguments ... DONE [13:13:47.089] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:47.089] - packages: [1] 'future' [13:13:47.090] getGlobalsAndPackages() ... DONE [13:13:47.090] run() for 'Future' ... [13:13:47.090] - state: 'created' [13:13:47.090] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:47.104] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:47.104] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:13:47.104] - Field: 'node' [13:13:47.105] - Field: 'label' [13:13:47.105] - Field: 'local' [13:13:47.105] - Field: 'owner' [13:13:47.105] - Field: 'envir' [13:13:47.105] - Field: 'workers' [13:13:47.105] - Field: 'packages' [13:13:47.106] - Field: 'gc' [13:13:47.106] - Field: 'conditions' [13:13:47.106] - Field: 'persistent' [13:13:47.106] - Field: 'expr' [13:13:47.106] - Field: 'uuid' [13:13:47.106] - Field: 'seed' [13:13:47.107] - Field: 'version' [13:13:47.107] - Field: 'result' [13:13:47.107] - Field: 'asynchronous' [13:13:47.107] - Field: 'calls' [13:13:47.107] - Field: 'globals' [13:13:47.108] - Field: 'stdout' [13:13:47.108] - Field: 'earlySignal' [13:13:47.108] - Field: 'lazy' [13:13:47.108] - Field: 'state' [13:13:47.108] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:13:47.108] - Launch lazy future ... [13:13:47.109] Packages needed by the future expression (n = 1): 'future' [13:13:47.109] Packages needed by future strategies (n = 0): [13:13:47.110] { [13:13:47.110] { [13:13:47.110] { [13:13:47.110] ...future.startTime <- base::Sys.time() [13:13:47.110] { [13:13:47.110] { [13:13:47.110] { [13:13:47.110] { [13:13:47.110] { [13:13:47.110] base::local({ [13:13:47.110] has_future <- base::requireNamespace("future", [13:13:47.110] quietly = TRUE) [13:13:47.110] if (has_future) { [13:13:47.110] ns <- base::getNamespace("future") [13:13:47.110] version <- ns[[".package"]][["version"]] [13:13:47.110] if (is.null(version)) [13:13:47.110] version <- utils::packageVersion("future") [13:13:47.110] } [13:13:47.110] else { [13:13:47.110] version <- NULL [13:13:47.110] } [13:13:47.110] if (!has_future || version < "1.8.0") { [13:13:47.110] info <- base::c(r_version = base::gsub("R version ", [13:13:47.110] "", base::R.version$version.string), [13:13:47.110] platform = base::sprintf("%s (%s-bit)", [13:13:47.110] base::R.version$platform, 8 * [13:13:47.110] base::.Machine$sizeof.pointer), [13:13:47.110] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:47.110] "release", "version")], collapse = " "), [13:13:47.110] hostname = base::Sys.info()[["nodename"]]) [13:13:47.110] info <- base::sprintf("%s: %s", base::names(info), [13:13:47.110] info) [13:13:47.110] info <- base::paste(info, collapse = "; ") [13:13:47.110] if (!has_future) { [13:13:47.110] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:47.110] info) [13:13:47.110] } [13:13:47.110] else { [13:13:47.110] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:47.110] info, version) [13:13:47.110] } [13:13:47.110] base::stop(msg) [13:13:47.110] } [13:13:47.110] }) [13:13:47.110] } [13:13:47.110] ...future.mc.cores.old <- base::getOption("mc.cores") [13:13:47.110] base::options(mc.cores = 1L) [13:13:47.110] } [13:13:47.110] base::local({ [13:13:47.110] for (pkg in "future") { [13:13:47.110] base::loadNamespace(pkg) [13:13:47.110] base::library(pkg, character.only = TRUE) [13:13:47.110] } [13:13:47.110] }) [13:13:47.110] } [13:13:47.110] options(future.plan = NULL) [13:13:47.110] Sys.unsetenv("R_FUTURE_PLAN") [13:13:47.110] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:47.110] } [13:13:47.110] ...future.workdir <- getwd() [13:13:47.110] } [13:13:47.110] ...future.oldOptions <- base::as.list(base::.Options) [13:13:47.110] ...future.oldEnvVars <- base::Sys.getenv() [13:13:47.110] } [13:13:47.110] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:47.110] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:47.110] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:47.110] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:47.110] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:47.110] future.stdout.windows.reencode = NULL, width = 80L) [13:13:47.110] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:47.110] base::names(...future.oldOptions)) [13:13:47.110] } [13:13:47.110] if (FALSE) { [13:13:47.110] } [13:13:47.110] else { [13:13:47.110] if (TRUE) { [13:13:47.110] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:47.110] open = "w") [13:13:47.110] } [13:13:47.110] else { [13:13:47.110] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:47.110] windows = "NUL", "/dev/null"), open = "w") [13:13:47.110] } [13:13:47.110] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:47.110] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:47.110] base::sink(type = "output", split = FALSE) [13:13:47.110] base::close(...future.stdout) [13:13:47.110] }, add = TRUE) [13:13:47.110] } [13:13:47.110] ...future.frame <- base::sys.nframe() [13:13:47.110] ...future.conditions <- base::list() [13:13:47.110] ...future.rng <- base::globalenv()$.Random.seed [13:13:47.110] if (FALSE) { [13:13:47.110] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:47.110] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:47.110] } [13:13:47.110] ...future.result <- base::tryCatch({ [13:13:47.110] base::withCallingHandlers({ [13:13:47.110] ...future.value <- base::withVisible(base::local({ [13:13:47.110] ...future.makeSendCondition <- local({ [13:13:47.110] sendCondition <- NULL [13:13:47.110] function(frame = 1L) { [13:13:47.110] if (is.function(sendCondition)) [13:13:47.110] return(sendCondition) [13:13:47.110] ns <- getNamespace("parallel") [13:13:47.110] if (exists("sendData", mode = "function", [13:13:47.110] envir = ns)) { [13:13:47.110] parallel_sendData <- get("sendData", mode = "function", [13:13:47.110] envir = ns) [13:13:47.110] envir <- sys.frame(frame) [13:13:47.110] master <- NULL [13:13:47.110] while (!identical(envir, .GlobalEnv) && [13:13:47.110] !identical(envir, emptyenv())) { [13:13:47.110] if (exists("master", mode = "list", envir = envir, [13:13:47.110] inherits = FALSE)) { [13:13:47.110] master <- get("master", mode = "list", [13:13:47.110] envir = envir, inherits = FALSE) [13:13:47.110] if (inherits(master, c("SOCKnode", [13:13:47.110] "SOCK0node"))) { [13:13:47.110] sendCondition <<- function(cond) { [13:13:47.110] data <- list(type = "VALUE", value = cond, [13:13:47.110] success = TRUE) [13:13:47.110] parallel_sendData(master, data) [13:13:47.110] } [13:13:47.110] return(sendCondition) [13:13:47.110] } [13:13:47.110] } [13:13:47.110] frame <- frame + 1L [13:13:47.110] envir <- sys.frame(frame) [13:13:47.110] } [13:13:47.110] } [13:13:47.110] sendCondition <<- function(cond) NULL [13:13:47.110] } [13:13:47.110] }) [13:13:47.110] withCallingHandlers({ [13:13:47.110] { [13:13:47.110] do.call(function(...) { [13:13:47.110] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:47.110] if (!identical(...future.globals.maxSize.org, [13:13:47.110] ...future.globals.maxSize)) { [13:13:47.110] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:47.110] on.exit(options(oopts), add = TRUE) [13:13:47.110] } [13:13:47.110] { [13:13:47.110] lapply(seq_along(...future.elements_ii), [13:13:47.110] FUN = function(jj) { [13:13:47.110] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:47.110] ...future.FUN(...future.X_jj, ...) [13:13:47.110] }) [13:13:47.110] } [13:13:47.110] }, args = future.call.arguments) [13:13:47.110] } [13:13:47.110] }, immediateCondition = function(cond) { [13:13:47.110] sendCondition <- ...future.makeSendCondition() [13:13:47.110] sendCondition(cond) [13:13:47.110] muffleCondition <- function (cond, pattern = "^muffle") [13:13:47.110] { [13:13:47.110] inherits <- base::inherits [13:13:47.110] invokeRestart <- base::invokeRestart [13:13:47.110] is.null <- base::is.null [13:13:47.110] muffled <- FALSE [13:13:47.110] if (inherits(cond, "message")) { [13:13:47.110] muffled <- grepl(pattern, "muffleMessage") [13:13:47.110] if (muffled) [13:13:47.110] invokeRestart("muffleMessage") [13:13:47.110] } [13:13:47.110] else if (inherits(cond, "warning")) { [13:13:47.110] muffled <- grepl(pattern, "muffleWarning") [13:13:47.110] if (muffled) [13:13:47.110] invokeRestart("muffleWarning") [13:13:47.110] } [13:13:47.110] else if (inherits(cond, "condition")) { [13:13:47.110] if (!is.null(pattern)) { [13:13:47.110] computeRestarts <- base::computeRestarts [13:13:47.110] grepl <- base::grepl [13:13:47.110] restarts <- computeRestarts(cond) [13:13:47.110] for (restart in restarts) { [13:13:47.110] name <- restart$name [13:13:47.110] if (is.null(name)) [13:13:47.110] next [13:13:47.110] if (!grepl(pattern, name)) [13:13:47.110] next [13:13:47.110] invokeRestart(restart) [13:13:47.110] muffled <- TRUE [13:13:47.110] break [13:13:47.110] } [13:13:47.110] } [13:13:47.110] } [13:13:47.110] invisible(muffled) [13:13:47.110] } [13:13:47.110] muffleCondition(cond) [13:13:47.110] }) [13:13:47.110] })) [13:13:47.110] future::FutureResult(value = ...future.value$value, [13:13:47.110] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:47.110] ...future.rng), globalenv = if (FALSE) [13:13:47.110] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:47.110] ...future.globalenv.names)) [13:13:47.110] else NULL, started = ...future.startTime, version = "1.8") [13:13:47.110] }, condition = base::local({ [13:13:47.110] c <- base::c [13:13:47.110] inherits <- base::inherits [13:13:47.110] invokeRestart <- base::invokeRestart [13:13:47.110] length <- base::length [13:13:47.110] list <- base::list [13:13:47.110] seq.int <- base::seq.int [13:13:47.110] signalCondition <- base::signalCondition [13:13:47.110] sys.calls <- base::sys.calls [13:13:47.110] `[[` <- base::`[[` [13:13:47.110] `+` <- base::`+` [13:13:47.110] `<<-` <- base::`<<-` [13:13:47.110] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:47.110] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:47.110] 3L)] [13:13:47.110] } [13:13:47.110] function(cond) { [13:13:47.110] is_error <- inherits(cond, "error") [13:13:47.110] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:47.110] NULL) [13:13:47.110] if (is_error) { [13:13:47.110] sessionInformation <- function() { [13:13:47.110] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:47.110] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:47.110] search = base::search(), system = base::Sys.info()) [13:13:47.110] } [13:13:47.110] ...future.conditions[[length(...future.conditions) + [13:13:47.110] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:47.110] cond$call), session = sessionInformation(), [13:13:47.110] timestamp = base::Sys.time(), signaled = 0L) [13:13:47.110] signalCondition(cond) [13:13:47.110] } [13:13:47.110] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:47.110] "immediateCondition"))) { [13:13:47.110] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:47.110] ...future.conditions[[length(...future.conditions) + [13:13:47.110] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:47.110] if (TRUE && !signal) { [13:13:47.110] muffleCondition <- function (cond, pattern = "^muffle") [13:13:47.110] { [13:13:47.110] inherits <- base::inherits [13:13:47.110] invokeRestart <- base::invokeRestart [13:13:47.110] is.null <- base::is.null [13:13:47.110] muffled <- FALSE [13:13:47.110] if (inherits(cond, "message")) { [13:13:47.110] muffled <- grepl(pattern, "muffleMessage") [13:13:47.110] if (muffled) [13:13:47.110] invokeRestart("muffleMessage") [13:13:47.110] } [13:13:47.110] else if (inherits(cond, "warning")) { [13:13:47.110] muffled <- grepl(pattern, "muffleWarning") [13:13:47.110] if (muffled) [13:13:47.110] invokeRestart("muffleWarning") [13:13:47.110] } [13:13:47.110] else if (inherits(cond, "condition")) { [13:13:47.110] if (!is.null(pattern)) { [13:13:47.110] computeRestarts <- base::computeRestarts [13:13:47.110] grepl <- base::grepl [13:13:47.110] restarts <- computeRestarts(cond) [13:13:47.110] for (restart in restarts) { [13:13:47.110] name <- restart$name [13:13:47.110] if (is.null(name)) [13:13:47.110] next [13:13:47.110] if (!grepl(pattern, name)) [13:13:47.110] next [13:13:47.110] invokeRestart(restart) [13:13:47.110] muffled <- TRUE [13:13:47.110] break [13:13:47.110] } [13:13:47.110] } [13:13:47.110] } [13:13:47.110] invisible(muffled) [13:13:47.110] } [13:13:47.110] muffleCondition(cond, pattern = "^muffle") [13:13:47.110] } [13:13:47.110] } [13:13:47.110] else { [13:13:47.110] if (TRUE) { [13:13:47.110] muffleCondition <- function (cond, pattern = "^muffle") [13:13:47.110] { [13:13:47.110] inherits <- base::inherits [13:13:47.110] invokeRestart <- base::invokeRestart [13:13:47.110] is.null <- base::is.null [13:13:47.110] muffled <- FALSE [13:13:47.110] if (inherits(cond, "message")) { [13:13:47.110] muffled <- grepl(pattern, "muffleMessage") [13:13:47.110] if (muffled) [13:13:47.110] invokeRestart("muffleMessage") [13:13:47.110] } [13:13:47.110] else if (inherits(cond, "warning")) { [13:13:47.110] muffled <- grepl(pattern, "muffleWarning") [13:13:47.110] if (muffled) [13:13:47.110] invokeRestart("muffleWarning") [13:13:47.110] } [13:13:47.110] else if (inherits(cond, "condition")) { [13:13:47.110] if (!is.null(pattern)) { [13:13:47.110] computeRestarts <- base::computeRestarts [13:13:47.110] grepl <- base::grepl [13:13:47.110] restarts <- computeRestarts(cond) [13:13:47.110] for (restart in restarts) { [13:13:47.110] name <- restart$name [13:13:47.110] if (is.null(name)) [13:13:47.110] next [13:13:47.110] if (!grepl(pattern, name)) [13:13:47.110] next [13:13:47.110] invokeRestart(restart) [13:13:47.110] muffled <- TRUE [13:13:47.110] break [13:13:47.110] } [13:13:47.110] } [13:13:47.110] } [13:13:47.110] invisible(muffled) [13:13:47.110] } [13:13:47.110] muffleCondition(cond, pattern = "^muffle") [13:13:47.110] } [13:13:47.110] } [13:13:47.110] } [13:13:47.110] })) [13:13:47.110] }, error = function(ex) { [13:13:47.110] base::structure(base::list(value = NULL, visible = NULL, [13:13:47.110] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:47.110] ...future.rng), started = ...future.startTime, [13:13:47.110] finished = Sys.time(), session_uuid = NA_character_, [13:13:47.110] version = "1.8"), class = "FutureResult") [13:13:47.110] }, finally = { [13:13:47.110] if (!identical(...future.workdir, getwd())) [13:13:47.110] setwd(...future.workdir) [13:13:47.110] { [13:13:47.110] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:47.110] ...future.oldOptions$nwarnings <- NULL [13:13:47.110] } [13:13:47.110] base::options(...future.oldOptions) [13:13:47.110] if (.Platform$OS.type == "windows") { [13:13:47.110] old_names <- names(...future.oldEnvVars) [13:13:47.110] envs <- base::Sys.getenv() [13:13:47.110] names <- names(envs) [13:13:47.110] common <- intersect(names, old_names) [13:13:47.110] added <- setdiff(names, old_names) [13:13:47.110] removed <- setdiff(old_names, names) [13:13:47.110] changed <- common[...future.oldEnvVars[common] != [13:13:47.110] envs[common]] [13:13:47.110] NAMES <- toupper(changed) [13:13:47.110] args <- list() [13:13:47.110] for (kk in seq_along(NAMES)) { [13:13:47.110] name <- changed[[kk]] [13:13:47.110] NAME <- NAMES[[kk]] [13:13:47.110] if (name != NAME && is.element(NAME, old_names)) [13:13:47.110] next [13:13:47.110] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:47.110] } [13:13:47.110] NAMES <- toupper(added) [13:13:47.110] for (kk in seq_along(NAMES)) { [13:13:47.110] name <- added[[kk]] [13:13:47.110] NAME <- NAMES[[kk]] [13:13:47.110] if (name != NAME && is.element(NAME, old_names)) [13:13:47.110] next [13:13:47.110] args[[name]] <- "" [13:13:47.110] } [13:13:47.110] NAMES <- toupper(removed) [13:13:47.110] for (kk in seq_along(NAMES)) { [13:13:47.110] name <- removed[[kk]] [13:13:47.110] NAME <- NAMES[[kk]] [13:13:47.110] if (name != NAME && is.element(NAME, old_names)) [13:13:47.110] next [13:13:47.110] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:47.110] } [13:13:47.110] if (length(args) > 0) [13:13:47.110] base::do.call(base::Sys.setenv, args = args) [13:13:47.110] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:47.110] } [13:13:47.110] else { [13:13:47.110] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:47.110] } [13:13:47.110] { [13:13:47.110] if (base::length(...future.futureOptionsAdded) > [13:13:47.110] 0L) { [13:13:47.110] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:47.110] base::names(opts) <- ...future.futureOptionsAdded [13:13:47.110] base::options(opts) [13:13:47.110] } [13:13:47.110] { [13:13:47.110] { [13:13:47.110] base::options(mc.cores = ...future.mc.cores.old) [13:13:47.110] NULL [13:13:47.110] } [13:13:47.110] options(future.plan = NULL) [13:13:47.110] if (is.na(NA_character_)) [13:13:47.110] Sys.unsetenv("R_FUTURE_PLAN") [13:13:47.110] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:47.110] future::plan(list(function (..., workers = availableCores(), [13:13:47.110] lazy = FALSE, rscript_libs = .libPaths(), [13:13:47.110] envir = parent.frame()) [13:13:47.110] { [13:13:47.110] if (is.function(workers)) [13:13:47.110] workers <- workers() [13:13:47.110] workers <- structure(as.integer(workers), [13:13:47.110] class = class(workers)) [13:13:47.110] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:47.110] workers >= 1) [13:13:47.110] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:47.110] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:47.110] } [13:13:47.110] future <- MultisessionFuture(..., workers = workers, [13:13:47.110] lazy = lazy, rscript_libs = rscript_libs, [13:13:47.110] envir = envir) [13:13:47.110] if (!future$lazy) [13:13:47.110] future <- run(future) [13:13:47.110] invisible(future) [13:13:47.110] }), .cleanup = FALSE, .init = FALSE) [13:13:47.110] } [13:13:47.110] } [13:13:47.110] } [13:13:47.110] }) [13:13:47.110] if (TRUE) { [13:13:47.110] base::sink(type = "output", split = FALSE) [13:13:47.110] if (TRUE) { [13:13:47.110] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:47.110] } [13:13:47.110] else { [13:13:47.110] ...future.result["stdout"] <- base::list(NULL) [13:13:47.110] } [13:13:47.110] base::close(...future.stdout) [13:13:47.110] ...future.stdout <- NULL [13:13:47.110] } [13:13:47.110] ...future.result$conditions <- ...future.conditions [13:13:47.110] ...future.result$finished <- base::Sys.time() [13:13:47.110] ...future.result [13:13:47.110] } [13:13:47.115] Exporting 5 global objects (69.78 KiB) to cluster node #1 ... [13:13:47.115] Exporting '...future.FUN' (69.62 KiB) to cluster node #1 ... [13:13:47.116] Exporting '...future.FUN' (69.62 KiB) to cluster node #1 ... DONE [13:13:47.116] Exporting 'future.call.arguments' (168 bytes) to cluster node #1 ... [13:13:47.117] Exporting 'future.call.arguments' (168 bytes) to cluster node #1 ... DONE [13:13:47.117] Exporting '...future.elements_ii' (12.83 KiB) to cluster node #1 ... [13:13:47.117] Exporting '...future.elements_ii' (12.83 KiB) to cluster node #1 ... DONE [13:13:47.118] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:13:47.118] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:13:47.118] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:13:47.119] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:13:47.119] Exporting 5 global objects (69.78 KiB) to cluster node #1 ... DONE [13:13:47.120] MultisessionFuture started [13:13:47.120] - Launch lazy future ... done [13:13:47.120] run() for 'MultisessionFuture' ... done [13:13:47.120] Created future: [13:13:47.137] receiveMessageFromWorker() for ClusterFuture ... [13:13:47.137] - Validating connection of MultisessionFuture [13:13:47.138] - received message: FutureResult [13:13:47.138] - Received FutureResult [13:13:47.138] - Erased future from FutureRegistry [13:13:47.138] result() for ClusterFuture ... [13:13:47.138] - result already collected: FutureResult [13:13:47.139] result() for ClusterFuture ... done [13:13:47.139] receiveMessageFromWorker() for ClusterFuture ... done [13:13:47.121] MultisessionFuture: [13:13:47.121] Label: 'future_lapply-1' [13:13:47.121] Expression: [13:13:47.121] { [13:13:47.121] do.call(function(...) { [13:13:47.121] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:47.121] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:47.121] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:47.121] on.exit(options(oopts), add = TRUE) [13:13:47.121] } [13:13:47.121] { [13:13:47.121] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:47.121] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:47.121] ...future.FUN(...future.X_jj, ...) [13:13:47.121] }) [13:13:47.121] } [13:13:47.121] }, args = future.call.arguments) [13:13:47.121] } [13:13:47.121] Lazy evaluation: FALSE [13:13:47.121] Asynchronous evaluation: TRUE [13:13:47.121] Local evaluation: TRUE [13:13:47.121] Environment: R_GlobalEnv [13:13:47.121] Capture standard output: TRUE [13:13:47.121] Capture condition classes: 'condition' (excluding 'nothing') [13:13:47.121] 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) [13:13:47.121] Packages: 1 packages ('future') [13:13:47.121] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:47.121] Resolved: TRUE [13:13:47.121] Value: [13:13:47.121] Conditions captured: [13:13:47.121] Early signaling: FALSE [13:13:47.121] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:47.121] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:47.139] Chunk #1 of 1 ... DONE [13:13:47.139] Launching 1 futures (chunks) ... DONE [13:13:47.139] Resolving 1 futures (chunks) ... [13:13:47.140] resolve() on list ... [13:13:47.140] recursive: 0 [13:13:47.140] length: 1 [13:13:47.140] [13:13:47.140] Future #1 [13:13:47.140] result() for ClusterFuture ... [13:13:47.141] - result already collected: FutureResult [13:13:47.141] result() for ClusterFuture ... done [13:13:47.141] result() for ClusterFuture ... [13:13:47.141] - result already collected: FutureResult [13:13:47.141] result() for ClusterFuture ... done [13:13:47.141] signalConditionsASAP(MultisessionFuture, pos=1) ... [13:13:47.142] - nx: 1 [13:13:47.142] - relay: TRUE [13:13:47.142] - stdout: TRUE [13:13:47.142] - signal: TRUE [13:13:47.142] - resignal: FALSE [13:13:47.142] - force: TRUE [13:13:47.142] - relayed: [n=1] FALSE [13:13:47.143] - queued futures: [n=1] FALSE [13:13:47.143] - until=1 [13:13:47.143] - relaying element #1 [13:13:47.143] result() for ClusterFuture ... [13:13:47.143] - result already collected: FutureResult [13:13:47.143] result() for ClusterFuture ... done [13:13:47.144] result() for ClusterFuture ... [13:13:47.144] - result already collected: FutureResult [13:13:47.144] result() for ClusterFuture ... done [13:13:47.144] result() for ClusterFuture ... [13:13:47.144] - result already collected: FutureResult [13:13:47.144] result() for ClusterFuture ... done [13:13:47.144] result() for ClusterFuture ... [13:13:47.145] - result already collected: FutureResult [13:13:47.145] result() for ClusterFuture ... done [13:13:47.145] - relayed: [n=1] TRUE [13:13:47.145] - queued futures: [n=1] TRUE [13:13:47.145] signalConditionsASAP(MultisessionFuture, pos=1) ... done [13:13:47.145] length: 0 (resolved future 1) [13:13:47.146] Relaying remaining futures [13:13:47.146] signalConditionsASAP(NULL, pos=0) ... [13:13:47.146] - nx: 1 [13:13:47.146] - relay: TRUE [13:13:47.146] - stdout: TRUE [13:13:47.146] - signal: TRUE [13:13:47.146] - resignal: FALSE [13:13:47.147] - force: TRUE [13:13:47.147] - relayed: [n=1] TRUE [13:13:47.147] - queued futures: [n=1] TRUE - flush all [13:13:47.147] - relayed: [n=1] TRUE [13:13:47.147] - queued futures: [n=1] TRUE [13:13:47.147] signalConditionsASAP(NULL, pos=0) ... done [13:13:47.148] resolve() on list ... DONE [13:13:47.148] result() for ClusterFuture ... [13:13:47.148] - result already collected: FutureResult [13:13:47.148] result() for ClusterFuture ... done [13:13:47.148] result() for ClusterFuture ... [13:13:47.148] - result already collected: FutureResult [13:13:47.149] result() for ClusterFuture ... done [13:13:47.149] - Number of value chunks collected: 1 [13:13:47.149] Resolving 1 futures (chunks) ... DONE [13:13:47.149] Reducing values from 1 chunks ... [13:13:47.149] - Number of values collected after concatenation: 1 [13:13:47.149] - Number of values expected: 1 [13:13:47.149] Reducing values from 1 chunks ... DONE [13:13:47.150] future_lapply() ... DONE List of 1 $ y:List of 1 ..$ a: chr "hello; 1; 2; ...; 100" - future_lapply(x, FUN = listenv::listenv, ...) ... [13:13:47.151] future_lapply() ... [13:13:47.154] Number of chunks: 2 [13:13:47.154] Index remapping (attribute 'ordering'): [n = 2] 2, 1 [13:13:47.154] getGlobalsAndPackagesXApply() ... [13:13:47.154] - future.globals: TRUE [13:13:47.154] getGlobalsAndPackages() ... [13:13:47.155] Searching for globals... [13:13:47.156] - globals found: [4] 'FUN', '{', 'get', 'parent.env' [13:13:47.156] Searching for globals ... DONE [13:13:47.156] Resolving globals: FALSE [13:13:47.157] The total size of the 1 globals is 4.85 KiB (4968 bytes) [13:13:47.157] 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') [13:13:47.158] - globals: [1] 'FUN' [13:13:47.158] - packages: [1] 'listenv' [13:13:47.158] getGlobalsAndPackages() ... DONE [13:13:47.158] - globals found/used: [n=1] 'FUN' [13:13:47.158] - needed namespaces: [n=1] 'listenv' [13:13:47.158] Finding globals ... DONE [13:13:47.159] - use_args: TRUE [13:13:47.159] - Getting '...' globals ... [13:13:47.159] resolve() on list ... [13:13:47.159] recursive: 0 [13:13:47.159] length: 1 [13:13:47.160] elements: '...' [13:13:47.160] length: 0 (resolved future 1) [13:13:47.160] resolve() on list ... DONE [13:13:47.160] - '...' content: [n=0] [13:13:47.160] List of 1 [13:13:47.160] $ ...: list() [13:13:47.160] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:47.160] - attr(*, "where")=List of 1 [13:13:47.160] ..$ ...: [13:13:47.160] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:47.160] - attr(*, "resolved")= logi TRUE [13:13:47.160] - attr(*, "total_size")= num NA [13:13:47.163] - Getting '...' globals ... DONE [13:13:47.163] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:47.164] List of 2 [13:13:47.164] $ ...future.FUN:function (x, ...) [13:13:47.164] $ ... : list() [13:13:47.164] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:47.164] - attr(*, "where")=List of 2 [13:13:47.164] ..$ ...future.FUN: [13:13:47.164] ..$ ... : [13:13:47.164] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:47.164] - attr(*, "resolved")= logi FALSE [13:13:47.164] - attr(*, "total_size")= num 4968 [13:13:47.167] Packages to be attached in all futures: [n=1] 'listenv' [13:13:47.167] getGlobalsAndPackagesXApply() ... DONE [13:13:47.167] Number of futures (= number of chunks): 2 [13:13:47.168] Launching 2 futures (chunks) ... [13:13:47.168] Chunk #1 of 2 ... [13:13:47.168] - Finding globals in 'X' for chunk #1 ... [13:13:47.168] getGlobalsAndPackages() ... [13:13:47.168] Searching for globals... [13:13:47.169] [13:13:47.169] Searching for globals ... DONE [13:13:47.169] - globals: [0] [13:13:47.169] getGlobalsAndPackages() ... DONE [13:13:47.169] + additional globals found: [n=0] [13:13:47.170] + additional namespaces needed: [n=0] [13:13:47.170] - Finding globals in 'X' for chunk #1 ... DONE [13:13:47.170] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:13:47.170] - seeds: [13:13:47.170] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:47.170] getGlobalsAndPackages() ... [13:13:47.170] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:47.171] Resolving globals: FALSE [13:13:47.171] Tweak future expression to call with '...' arguments ... [13:13:47.171] { [13:13:47.171] do.call(function(...) { [13:13:47.171] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:47.171] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:47.171] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:47.171] on.exit(options(oopts), add = TRUE) [13:13:47.171] } [13:13:47.171] { [13:13:47.171] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:47.171] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:47.171] ...future.FUN(...future.X_jj, ...) [13:13:47.171] }) [13:13:47.171] } [13:13:47.171] }, args = future.call.arguments) [13:13:47.171] } [13:13:47.171] Tweak future expression to call with '...' arguments ... DONE [13:13:47.172] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:47.172] - packages: [1] 'listenv' [13:13:47.172] getGlobalsAndPackages() ... DONE [13:13:47.173] run() for 'Future' ... [13:13:47.173] - state: 'created' [13:13:47.173] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:47.187] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:47.187] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:13:47.187] - Field: 'node' [13:13:47.187] - Field: 'label' [13:13:47.188] - Field: 'local' [13:13:47.188] - Field: 'owner' [13:13:47.188] - Field: 'envir' [13:13:47.188] - Field: 'workers' [13:13:47.188] - Field: 'packages' [13:13:47.189] - Field: 'gc' [13:13:47.189] - Field: 'conditions' [13:13:47.189] - Field: 'persistent' [13:13:47.189] - Field: 'expr' [13:13:47.189] - Field: 'uuid' [13:13:47.189] - Field: 'seed' [13:13:47.190] - Field: 'version' [13:13:47.190] - Field: 'result' [13:13:47.190] - Field: 'asynchronous' [13:13:47.190] - Field: 'calls' [13:13:47.190] - Field: 'globals' [13:13:47.190] - Field: 'stdout' [13:13:47.191] - Field: 'earlySignal' [13:13:47.191] - Field: 'lazy' [13:13:47.191] - Field: 'state' [13:13:47.191] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:13:47.191] - Launch lazy future ... [13:13:47.192] Packages needed by the future expression (n = 1): 'listenv' [13:13:47.192] Packages needed by future strategies (n = 0): [13:13:47.193] { [13:13:47.193] { [13:13:47.193] { [13:13:47.193] ...future.startTime <- base::Sys.time() [13:13:47.193] { [13:13:47.193] { [13:13:47.193] { [13:13:47.193] { [13:13:47.193] { [13:13:47.193] base::local({ [13:13:47.193] has_future <- base::requireNamespace("future", [13:13:47.193] quietly = TRUE) [13:13:47.193] if (has_future) { [13:13:47.193] ns <- base::getNamespace("future") [13:13:47.193] version <- ns[[".package"]][["version"]] [13:13:47.193] if (is.null(version)) [13:13:47.193] version <- utils::packageVersion("future") [13:13:47.193] } [13:13:47.193] else { [13:13:47.193] version <- NULL [13:13:47.193] } [13:13:47.193] if (!has_future || version < "1.8.0") { [13:13:47.193] info <- base::c(r_version = base::gsub("R version ", [13:13:47.193] "", base::R.version$version.string), [13:13:47.193] platform = base::sprintf("%s (%s-bit)", [13:13:47.193] base::R.version$platform, 8 * [13:13:47.193] base::.Machine$sizeof.pointer), [13:13:47.193] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:47.193] "release", "version")], collapse = " "), [13:13:47.193] hostname = base::Sys.info()[["nodename"]]) [13:13:47.193] info <- base::sprintf("%s: %s", base::names(info), [13:13:47.193] info) [13:13:47.193] info <- base::paste(info, collapse = "; ") [13:13:47.193] if (!has_future) { [13:13:47.193] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:47.193] info) [13:13:47.193] } [13:13:47.193] else { [13:13:47.193] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:47.193] info, version) [13:13:47.193] } [13:13:47.193] base::stop(msg) [13:13:47.193] } [13:13:47.193] }) [13:13:47.193] } [13:13:47.193] ...future.mc.cores.old <- base::getOption("mc.cores") [13:13:47.193] base::options(mc.cores = 1L) [13:13:47.193] } [13:13:47.193] base::local({ [13:13:47.193] for (pkg in "listenv") { [13:13:47.193] base::loadNamespace(pkg) [13:13:47.193] base::library(pkg, character.only = TRUE) [13:13:47.193] } [13:13:47.193] }) [13:13:47.193] } [13:13:47.193] options(future.plan = NULL) [13:13:47.193] Sys.unsetenv("R_FUTURE_PLAN") [13:13:47.193] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:47.193] } [13:13:47.193] ...future.workdir <- getwd() [13:13:47.193] } [13:13:47.193] ...future.oldOptions <- base::as.list(base::.Options) [13:13:47.193] ...future.oldEnvVars <- base::Sys.getenv() [13:13:47.193] } [13:13:47.193] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:47.193] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:13:47.193] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:47.193] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:47.193] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:47.193] future.stdout.windows.reencode = NULL, width = 80L) [13:13:47.193] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:47.193] base::names(...future.oldOptions)) [13:13:47.193] } [13:13:47.193] if (FALSE) { [13:13:47.193] } [13:13:47.193] else { [13:13:47.193] if (TRUE) { [13:13:47.193] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:47.193] open = "w") [13:13:47.193] } [13:13:47.193] else { [13:13:47.193] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:47.193] windows = "NUL", "/dev/null"), open = "w") [13:13:47.193] } [13:13:47.193] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:47.193] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:47.193] base::sink(type = "output", split = FALSE) [13:13:47.193] base::close(...future.stdout) [13:13:47.193] }, add = TRUE) [13:13:47.193] } [13:13:47.193] ...future.frame <- base::sys.nframe() [13:13:47.193] ...future.conditions <- base::list() [13:13:47.193] ...future.rng <- base::globalenv()$.Random.seed [13:13:47.193] if (FALSE) { [13:13:47.193] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:47.193] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:47.193] } [13:13:47.193] ...future.result <- base::tryCatch({ [13:13:47.193] base::withCallingHandlers({ [13:13:47.193] ...future.value <- base::withVisible(base::local({ [13:13:47.193] ...future.makeSendCondition <- local({ [13:13:47.193] sendCondition <- NULL [13:13:47.193] function(frame = 1L) { [13:13:47.193] if (is.function(sendCondition)) [13:13:47.193] return(sendCondition) [13:13:47.193] ns <- getNamespace("parallel") [13:13:47.193] if (exists("sendData", mode = "function", [13:13:47.193] envir = ns)) { [13:13:47.193] parallel_sendData <- get("sendData", mode = "function", [13:13:47.193] envir = ns) [13:13:47.193] envir <- sys.frame(frame) [13:13:47.193] master <- NULL [13:13:47.193] while (!identical(envir, .GlobalEnv) && [13:13:47.193] !identical(envir, emptyenv())) { [13:13:47.193] if (exists("master", mode = "list", envir = envir, [13:13:47.193] inherits = FALSE)) { [13:13:47.193] master <- get("master", mode = "list", [13:13:47.193] envir = envir, inherits = FALSE) [13:13:47.193] if (inherits(master, c("SOCKnode", [13:13:47.193] "SOCK0node"))) { [13:13:47.193] sendCondition <<- function(cond) { [13:13:47.193] data <- list(type = "VALUE", value = cond, [13:13:47.193] success = TRUE) [13:13:47.193] parallel_sendData(master, data) [13:13:47.193] } [13:13:47.193] return(sendCondition) [13:13:47.193] } [13:13:47.193] } [13:13:47.193] frame <- frame + 1L [13:13:47.193] envir <- sys.frame(frame) [13:13:47.193] } [13:13:47.193] } [13:13:47.193] sendCondition <<- function(cond) NULL [13:13:47.193] } [13:13:47.193] }) [13:13:47.193] withCallingHandlers({ [13:13:47.193] { [13:13:47.193] do.call(function(...) { [13:13:47.193] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:47.193] if (!identical(...future.globals.maxSize.org, [13:13:47.193] ...future.globals.maxSize)) { [13:13:47.193] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:47.193] on.exit(options(oopts), add = TRUE) [13:13:47.193] } [13:13:47.193] { [13:13:47.193] lapply(seq_along(...future.elements_ii), [13:13:47.193] FUN = function(jj) { [13:13:47.193] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:47.193] ...future.FUN(...future.X_jj, ...) [13:13:47.193] }) [13:13:47.193] } [13:13:47.193] }, args = future.call.arguments) [13:13:47.193] } [13:13:47.193] }, immediateCondition = function(cond) { [13:13:47.193] sendCondition <- ...future.makeSendCondition() [13:13:47.193] sendCondition(cond) [13:13:47.193] muffleCondition <- function (cond, pattern = "^muffle") [13:13:47.193] { [13:13:47.193] inherits <- base::inherits [13:13:47.193] invokeRestart <- base::invokeRestart [13:13:47.193] is.null <- base::is.null [13:13:47.193] muffled <- FALSE [13:13:47.193] if (inherits(cond, "message")) { [13:13:47.193] muffled <- grepl(pattern, "muffleMessage") [13:13:47.193] if (muffled) [13:13:47.193] invokeRestart("muffleMessage") [13:13:47.193] } [13:13:47.193] else if (inherits(cond, "warning")) { [13:13:47.193] muffled <- grepl(pattern, "muffleWarning") [13:13:47.193] if (muffled) [13:13:47.193] invokeRestart("muffleWarning") [13:13:47.193] } [13:13:47.193] else if (inherits(cond, "condition")) { [13:13:47.193] if (!is.null(pattern)) { [13:13:47.193] computeRestarts <- base::computeRestarts [13:13:47.193] grepl <- base::grepl [13:13:47.193] restarts <- computeRestarts(cond) [13:13:47.193] for (restart in restarts) { [13:13:47.193] name <- restart$name [13:13:47.193] if (is.null(name)) [13:13:47.193] next [13:13:47.193] if (!grepl(pattern, name)) [13:13:47.193] next [13:13:47.193] invokeRestart(restart) [13:13:47.193] muffled <- TRUE [13:13:47.193] break [13:13:47.193] } [13:13:47.193] } [13:13:47.193] } [13:13:47.193] invisible(muffled) [13:13:47.193] } [13:13:47.193] muffleCondition(cond) [13:13:47.193] }) [13:13:47.193] })) [13:13:47.193] future::FutureResult(value = ...future.value$value, [13:13:47.193] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:47.193] ...future.rng), globalenv = if (FALSE) [13:13:47.193] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:47.193] ...future.globalenv.names)) [13:13:47.193] else NULL, started = ...future.startTime, version = "1.8") [13:13:47.193] }, condition = base::local({ [13:13:47.193] c <- base::c [13:13:47.193] inherits <- base::inherits [13:13:47.193] invokeRestart <- base::invokeRestart [13:13:47.193] length <- base::length [13:13:47.193] list <- base::list [13:13:47.193] seq.int <- base::seq.int [13:13:47.193] signalCondition <- base::signalCondition [13:13:47.193] sys.calls <- base::sys.calls [13:13:47.193] `[[` <- base::`[[` [13:13:47.193] `+` <- base::`+` [13:13:47.193] `<<-` <- base::`<<-` [13:13:47.193] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:47.193] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:47.193] 3L)] [13:13:47.193] } [13:13:47.193] function(cond) { [13:13:47.193] is_error <- inherits(cond, "error") [13:13:47.193] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:47.193] NULL) [13:13:47.193] if (is_error) { [13:13:47.193] sessionInformation <- function() { [13:13:47.193] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:47.193] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:47.193] search = base::search(), system = base::Sys.info()) [13:13:47.193] } [13:13:47.193] ...future.conditions[[length(...future.conditions) + [13:13:47.193] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:47.193] cond$call), session = sessionInformation(), [13:13:47.193] timestamp = base::Sys.time(), signaled = 0L) [13:13:47.193] signalCondition(cond) [13:13:47.193] } [13:13:47.193] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:47.193] "immediateCondition"))) { [13:13:47.193] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:47.193] ...future.conditions[[length(...future.conditions) + [13:13:47.193] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:47.193] if (TRUE && !signal) { [13:13:47.193] muffleCondition <- function (cond, pattern = "^muffle") [13:13:47.193] { [13:13:47.193] inherits <- base::inherits [13:13:47.193] invokeRestart <- base::invokeRestart [13:13:47.193] is.null <- base::is.null [13:13:47.193] muffled <- FALSE [13:13:47.193] if (inherits(cond, "message")) { [13:13:47.193] muffled <- grepl(pattern, "muffleMessage") [13:13:47.193] if (muffled) [13:13:47.193] invokeRestart("muffleMessage") [13:13:47.193] } [13:13:47.193] else if (inherits(cond, "warning")) { [13:13:47.193] muffled <- grepl(pattern, "muffleWarning") [13:13:47.193] if (muffled) [13:13:47.193] invokeRestart("muffleWarning") [13:13:47.193] } [13:13:47.193] else if (inherits(cond, "condition")) { [13:13:47.193] if (!is.null(pattern)) { [13:13:47.193] computeRestarts <- base::computeRestarts [13:13:47.193] grepl <- base::grepl [13:13:47.193] restarts <- computeRestarts(cond) [13:13:47.193] for (restart in restarts) { [13:13:47.193] name <- restart$name [13:13:47.193] if (is.null(name)) [13:13:47.193] next [13:13:47.193] if (!grepl(pattern, name)) [13:13:47.193] next [13:13:47.193] invokeRestart(restart) [13:13:47.193] muffled <- TRUE [13:13:47.193] break [13:13:47.193] } [13:13:47.193] } [13:13:47.193] } [13:13:47.193] invisible(muffled) [13:13:47.193] } [13:13:47.193] muffleCondition(cond, pattern = "^muffle") [13:13:47.193] } [13:13:47.193] } [13:13:47.193] else { [13:13:47.193] if (TRUE) { [13:13:47.193] muffleCondition <- function (cond, pattern = "^muffle") [13:13:47.193] { [13:13:47.193] inherits <- base::inherits [13:13:47.193] invokeRestart <- base::invokeRestart [13:13:47.193] is.null <- base::is.null [13:13:47.193] muffled <- FALSE [13:13:47.193] if (inherits(cond, "message")) { [13:13:47.193] muffled <- grepl(pattern, "muffleMessage") [13:13:47.193] if (muffled) [13:13:47.193] invokeRestart("muffleMessage") [13:13:47.193] } [13:13:47.193] else if (inherits(cond, "warning")) { [13:13:47.193] muffled <- grepl(pattern, "muffleWarning") [13:13:47.193] if (muffled) [13:13:47.193] invokeRestart("muffleWarning") [13:13:47.193] } [13:13:47.193] else if (inherits(cond, "condition")) { [13:13:47.193] if (!is.null(pattern)) { [13:13:47.193] computeRestarts <- base::computeRestarts [13:13:47.193] grepl <- base::grepl [13:13:47.193] restarts <- computeRestarts(cond) [13:13:47.193] for (restart in restarts) { [13:13:47.193] name <- restart$name [13:13:47.193] if (is.null(name)) [13:13:47.193] next [13:13:47.193] if (!grepl(pattern, name)) [13:13:47.193] next [13:13:47.193] invokeRestart(restart) [13:13:47.193] muffled <- TRUE [13:13:47.193] break [13:13:47.193] } [13:13:47.193] } [13:13:47.193] } [13:13:47.193] invisible(muffled) [13:13:47.193] } [13:13:47.193] muffleCondition(cond, pattern = "^muffle") [13:13:47.193] } [13:13:47.193] } [13:13:47.193] } [13:13:47.193] })) [13:13:47.193] }, error = function(ex) { [13:13:47.193] base::structure(base::list(value = NULL, visible = NULL, [13:13:47.193] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:47.193] ...future.rng), started = ...future.startTime, [13:13:47.193] finished = Sys.time(), session_uuid = NA_character_, [13:13:47.193] version = "1.8"), class = "FutureResult") [13:13:47.193] }, finally = { [13:13:47.193] if (!identical(...future.workdir, getwd())) [13:13:47.193] setwd(...future.workdir) [13:13:47.193] { [13:13:47.193] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:47.193] ...future.oldOptions$nwarnings <- NULL [13:13:47.193] } [13:13:47.193] base::options(...future.oldOptions) [13:13:47.193] if (.Platform$OS.type == "windows") { [13:13:47.193] old_names <- names(...future.oldEnvVars) [13:13:47.193] envs <- base::Sys.getenv() [13:13:47.193] names <- names(envs) [13:13:47.193] common <- intersect(names, old_names) [13:13:47.193] added <- setdiff(names, old_names) [13:13:47.193] removed <- setdiff(old_names, names) [13:13:47.193] changed <- common[...future.oldEnvVars[common] != [13:13:47.193] envs[common]] [13:13:47.193] NAMES <- toupper(changed) [13:13:47.193] args <- list() [13:13:47.193] for (kk in seq_along(NAMES)) { [13:13:47.193] name <- changed[[kk]] [13:13:47.193] NAME <- NAMES[[kk]] [13:13:47.193] if (name != NAME && is.element(NAME, old_names)) [13:13:47.193] next [13:13:47.193] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:47.193] } [13:13:47.193] NAMES <- toupper(added) [13:13:47.193] for (kk in seq_along(NAMES)) { [13:13:47.193] name <- added[[kk]] [13:13:47.193] NAME <- NAMES[[kk]] [13:13:47.193] if (name != NAME && is.element(NAME, old_names)) [13:13:47.193] next [13:13:47.193] args[[name]] <- "" [13:13:47.193] } [13:13:47.193] NAMES <- toupper(removed) [13:13:47.193] for (kk in seq_along(NAMES)) { [13:13:47.193] name <- removed[[kk]] [13:13:47.193] NAME <- NAMES[[kk]] [13:13:47.193] if (name != NAME && is.element(NAME, old_names)) [13:13:47.193] next [13:13:47.193] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:47.193] } [13:13:47.193] if (length(args) > 0) [13:13:47.193] base::do.call(base::Sys.setenv, args = args) [13:13:47.193] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:47.193] } [13:13:47.193] else { [13:13:47.193] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:47.193] } [13:13:47.193] { [13:13:47.193] if (base::length(...future.futureOptionsAdded) > [13:13:47.193] 0L) { [13:13:47.193] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:47.193] base::names(opts) <- ...future.futureOptionsAdded [13:13:47.193] base::options(opts) [13:13:47.193] } [13:13:47.193] { [13:13:47.193] { [13:13:47.193] base::options(mc.cores = ...future.mc.cores.old) [13:13:47.193] NULL [13:13:47.193] } [13:13:47.193] options(future.plan = NULL) [13:13:47.193] if (is.na(NA_character_)) [13:13:47.193] Sys.unsetenv("R_FUTURE_PLAN") [13:13:47.193] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:47.193] future::plan(list(function (..., workers = availableCores(), [13:13:47.193] lazy = FALSE, rscript_libs = .libPaths(), [13:13:47.193] envir = parent.frame()) [13:13:47.193] { [13:13:47.193] if (is.function(workers)) [13:13:47.193] workers <- workers() [13:13:47.193] workers <- structure(as.integer(workers), [13:13:47.193] class = class(workers)) [13:13:47.193] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:47.193] workers >= 1) [13:13:47.193] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:47.193] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:47.193] } [13:13:47.193] future <- MultisessionFuture(..., workers = workers, [13:13:47.193] lazy = lazy, rscript_libs = rscript_libs, [13:13:47.193] envir = envir) [13:13:47.193] if (!future$lazy) [13:13:47.193] future <- run(future) [13:13:47.193] invisible(future) [13:13:47.193] }), .cleanup = FALSE, .init = FALSE) [13:13:47.193] } [13:13:47.193] } [13:13:47.193] } [13:13:47.193] }) [13:13:47.193] if (TRUE) { [13:13:47.193] base::sink(type = "output", split = FALSE) [13:13:47.193] if (TRUE) { [13:13:47.193] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:47.193] } [13:13:47.193] else { [13:13:47.193] ...future.result["stdout"] <- base::list(NULL) [13:13:47.193] } [13:13:47.193] base::close(...future.stdout) [13:13:47.193] ...future.stdout <- NULL [13:13:47.193] } [13:13:47.193] ...future.result$conditions <- ...future.conditions [13:13:47.193] ...future.result$finished <- base::Sys.time() [13:13:47.193] ...future.result [13:13:47.193] } [13:13:47.198] Exporting 5 global objects (4.85 KiB) to cluster node #1 ... [13:13:47.198] Exporting '...future.FUN' (4.85 KiB) to cluster node #1 ... [13:13:47.199] Exporting '...future.FUN' (4.85 KiB) to cluster node #1 ... DONE [13:13:47.199] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... [13:13:47.199] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... DONE [13:13:47.200] Exporting '...future.elements_ii' (12.94 KiB) to cluster node #1 ... [13:13:47.200] Exporting '...future.elements_ii' (12.94 KiB) to cluster node #1 ... DONE [13:13:47.200] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:13:47.201] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:13:47.201] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:13:47.201] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:13:47.202] Exporting 5 global objects (4.85 KiB) to cluster node #1 ... DONE [13:13:47.202] MultisessionFuture started [13:13:47.203] - Launch lazy future ... done [13:13:47.203] run() for 'MultisessionFuture' ... done [13:13:47.203] Created future: [13:13:47.219] receiveMessageFromWorker() for ClusterFuture ... [13:13:47.219] - Validating connection of MultisessionFuture [13:13:47.220] - received message: FutureResult [13:13:47.220] - Received FutureResult [13:13:47.220] - Erased future from FutureRegistry [13:13:47.220] result() for ClusterFuture ... [13:13:47.220] - result already collected: FutureResult [13:13:47.220] result() for ClusterFuture ... done [13:13:47.221] receiveMessageFromWorker() for ClusterFuture ... done [13:13:47.203] MultisessionFuture: [13:13:47.203] Label: 'future_lapply-1' [13:13:47.203] Expression: [13:13:47.203] { [13:13:47.203] do.call(function(...) { [13:13:47.203] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:47.203] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:47.203] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:47.203] on.exit(options(oopts), add = TRUE) [13:13:47.203] } [13:13:47.203] { [13:13:47.203] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:47.203] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:47.203] ...future.FUN(...future.X_jj, ...) [13:13:47.203] }) [13:13:47.203] } [13:13:47.203] }, args = future.call.arguments) [13:13:47.203] } [13:13:47.203] Lazy evaluation: FALSE [13:13:47.203] Asynchronous evaluation: TRUE [13:13:47.203] Local evaluation: TRUE [13:13:47.203] Environment: R_GlobalEnv [13:13:47.203] Capture standard output: TRUE [13:13:47.203] Capture condition classes: 'condition' (excluding 'nothing') [13:13:47.203] 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) [13:13:47.203] Packages: 1 packages ('listenv') [13:13:47.203] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:47.203] Resolved: TRUE [13:13:47.203] Value: [13:13:47.203] Conditions captured: [13:13:47.203] Early signaling: FALSE [13:13:47.203] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:47.203] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:47.221] Chunk #1 of 2 ... DONE [13:13:47.221] Chunk #2 of 2 ... [13:13:47.221] - Finding globals in 'X' for chunk #2 ... [13:13:47.222] getGlobalsAndPackages() ... [13:13:47.222] Searching for globals... [13:13:47.222] [13:13:47.222] Searching for globals ... DONE [13:13:47.223] - globals: [0] [13:13:47.223] getGlobalsAndPackages() ... DONE [13:13:47.223] + additional globals found: [n=0] [13:13:47.223] + additional namespaces needed: [n=0] [13:13:47.223] - Finding globals in 'X' for chunk #2 ... DONE [13:13:47.223] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:13:47.224] - seeds: [13:13:47.224] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:47.224] getGlobalsAndPackages() ... [13:13:47.224] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:47.224] Resolving globals: FALSE [13:13:47.224] Tweak future expression to call with '...' arguments ... [13:13:47.225] { [13:13:47.225] do.call(function(...) { [13:13:47.225] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:47.225] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:47.225] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:47.225] on.exit(options(oopts), add = TRUE) [13:13:47.225] } [13:13:47.225] { [13:13:47.225] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:47.225] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:47.225] ...future.FUN(...future.X_jj, ...) [13:13:47.225] }) [13:13:47.225] } [13:13:47.225] }, args = future.call.arguments) [13:13:47.225] } [13:13:47.225] Tweak future expression to call with '...' arguments ... DONE [13:13:47.225] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:47.226] - packages: [1] 'listenv' [13:13:47.226] getGlobalsAndPackages() ... DONE [13:13:47.226] run() for 'Future' ... [13:13:47.227] - state: 'created' [13:13:47.227] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:47.241] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:47.241] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:13:47.241] - Field: 'node' [13:13:47.242] - Field: 'label' [13:13:47.242] - Field: 'local' [13:13:47.242] - Field: 'owner' [13:13:47.242] - Field: 'envir' [13:13:47.242] - Field: 'workers' [13:13:47.243] - Field: 'packages' [13:13:47.243] - Field: 'gc' [13:13:47.243] - Field: 'conditions' [13:13:47.243] - Field: 'persistent' [13:13:47.243] - Field: 'expr' [13:13:47.243] - Field: 'uuid' [13:13:47.244] - Field: 'seed' [13:13:47.244] - Field: 'version' [13:13:47.244] - Field: 'result' [13:13:47.244] - Field: 'asynchronous' [13:13:47.244] - Field: 'calls' [13:13:47.244] - Field: 'globals' [13:13:47.245] - Field: 'stdout' [13:13:47.245] - Field: 'earlySignal' [13:13:47.245] - Field: 'lazy' [13:13:47.245] - Field: 'state' [13:13:47.245] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:13:47.246] - Launch lazy future ... [13:13:47.246] Packages needed by the future expression (n = 1): 'listenv' [13:13:47.246] Packages needed by future strategies (n = 0): [13:13:47.247] { [13:13:47.247] { [13:13:47.247] { [13:13:47.247] ...future.startTime <- base::Sys.time() [13:13:47.247] { [13:13:47.247] { [13:13:47.247] { [13:13:47.247] { [13:13:47.247] { [13:13:47.247] base::local({ [13:13:47.247] has_future <- base::requireNamespace("future", [13:13:47.247] quietly = TRUE) [13:13:47.247] if (has_future) { [13:13:47.247] ns <- base::getNamespace("future") [13:13:47.247] version <- ns[[".package"]][["version"]] [13:13:47.247] if (is.null(version)) [13:13:47.247] version <- utils::packageVersion("future") [13:13:47.247] } [13:13:47.247] else { [13:13:47.247] version <- NULL [13:13:47.247] } [13:13:47.247] if (!has_future || version < "1.8.0") { [13:13:47.247] info <- base::c(r_version = base::gsub("R version ", [13:13:47.247] "", base::R.version$version.string), [13:13:47.247] platform = base::sprintf("%s (%s-bit)", [13:13:47.247] base::R.version$platform, 8 * [13:13:47.247] base::.Machine$sizeof.pointer), [13:13:47.247] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:47.247] "release", "version")], collapse = " "), [13:13:47.247] hostname = base::Sys.info()[["nodename"]]) [13:13:47.247] info <- base::sprintf("%s: %s", base::names(info), [13:13:47.247] info) [13:13:47.247] info <- base::paste(info, collapse = "; ") [13:13:47.247] if (!has_future) { [13:13:47.247] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:47.247] info) [13:13:47.247] } [13:13:47.247] else { [13:13:47.247] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:47.247] info, version) [13:13:47.247] } [13:13:47.247] base::stop(msg) [13:13:47.247] } [13:13:47.247] }) [13:13:47.247] } [13:13:47.247] ...future.mc.cores.old <- base::getOption("mc.cores") [13:13:47.247] base::options(mc.cores = 1L) [13:13:47.247] } [13:13:47.247] base::local({ [13:13:47.247] for (pkg in "listenv") { [13:13:47.247] base::loadNamespace(pkg) [13:13:47.247] base::library(pkg, character.only = TRUE) [13:13:47.247] } [13:13:47.247] }) [13:13:47.247] } [13:13:47.247] options(future.plan = NULL) [13:13:47.247] Sys.unsetenv("R_FUTURE_PLAN") [13:13:47.247] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:47.247] } [13:13:47.247] ...future.workdir <- getwd() [13:13:47.247] } [13:13:47.247] ...future.oldOptions <- base::as.list(base::.Options) [13:13:47.247] ...future.oldEnvVars <- base::Sys.getenv() [13:13:47.247] } [13:13:47.247] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:47.247] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:13:47.247] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:47.247] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:47.247] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:47.247] future.stdout.windows.reencode = NULL, width = 80L) [13:13:47.247] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:47.247] base::names(...future.oldOptions)) [13:13:47.247] } [13:13:47.247] if (FALSE) { [13:13:47.247] } [13:13:47.247] else { [13:13:47.247] if (TRUE) { [13:13:47.247] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:47.247] open = "w") [13:13:47.247] } [13:13:47.247] else { [13:13:47.247] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:47.247] windows = "NUL", "/dev/null"), open = "w") [13:13:47.247] } [13:13:47.247] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:47.247] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:47.247] base::sink(type = "output", split = FALSE) [13:13:47.247] base::close(...future.stdout) [13:13:47.247] }, add = TRUE) [13:13:47.247] } [13:13:47.247] ...future.frame <- base::sys.nframe() [13:13:47.247] ...future.conditions <- base::list() [13:13:47.247] ...future.rng <- base::globalenv()$.Random.seed [13:13:47.247] if (FALSE) { [13:13:47.247] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:47.247] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:47.247] } [13:13:47.247] ...future.result <- base::tryCatch({ [13:13:47.247] base::withCallingHandlers({ [13:13:47.247] ...future.value <- base::withVisible(base::local({ [13:13:47.247] ...future.makeSendCondition <- local({ [13:13:47.247] sendCondition <- NULL [13:13:47.247] function(frame = 1L) { [13:13:47.247] if (is.function(sendCondition)) [13:13:47.247] return(sendCondition) [13:13:47.247] ns <- getNamespace("parallel") [13:13:47.247] if (exists("sendData", mode = "function", [13:13:47.247] envir = ns)) { [13:13:47.247] parallel_sendData <- get("sendData", mode = "function", [13:13:47.247] envir = ns) [13:13:47.247] envir <- sys.frame(frame) [13:13:47.247] master <- NULL [13:13:47.247] while (!identical(envir, .GlobalEnv) && [13:13:47.247] !identical(envir, emptyenv())) { [13:13:47.247] if (exists("master", mode = "list", envir = envir, [13:13:47.247] inherits = FALSE)) { [13:13:47.247] master <- get("master", mode = "list", [13:13:47.247] envir = envir, inherits = FALSE) [13:13:47.247] if (inherits(master, c("SOCKnode", [13:13:47.247] "SOCK0node"))) { [13:13:47.247] sendCondition <<- function(cond) { [13:13:47.247] data <- list(type = "VALUE", value = cond, [13:13:47.247] success = TRUE) [13:13:47.247] parallel_sendData(master, data) [13:13:47.247] } [13:13:47.247] return(sendCondition) [13:13:47.247] } [13:13:47.247] } [13:13:47.247] frame <- frame + 1L [13:13:47.247] envir <- sys.frame(frame) [13:13:47.247] } [13:13:47.247] } [13:13:47.247] sendCondition <<- function(cond) NULL [13:13:47.247] } [13:13:47.247] }) [13:13:47.247] withCallingHandlers({ [13:13:47.247] { [13:13:47.247] do.call(function(...) { [13:13:47.247] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:47.247] if (!identical(...future.globals.maxSize.org, [13:13:47.247] ...future.globals.maxSize)) { [13:13:47.247] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:47.247] on.exit(options(oopts), add = TRUE) [13:13:47.247] } [13:13:47.247] { [13:13:47.247] lapply(seq_along(...future.elements_ii), [13:13:47.247] FUN = function(jj) { [13:13:47.247] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:47.247] ...future.FUN(...future.X_jj, ...) [13:13:47.247] }) [13:13:47.247] } [13:13:47.247] }, args = future.call.arguments) [13:13:47.247] } [13:13:47.247] }, immediateCondition = function(cond) { [13:13:47.247] sendCondition <- ...future.makeSendCondition() [13:13:47.247] sendCondition(cond) [13:13:47.247] muffleCondition <- function (cond, pattern = "^muffle") [13:13:47.247] { [13:13:47.247] inherits <- base::inherits [13:13:47.247] invokeRestart <- base::invokeRestart [13:13:47.247] is.null <- base::is.null [13:13:47.247] muffled <- FALSE [13:13:47.247] if (inherits(cond, "message")) { [13:13:47.247] muffled <- grepl(pattern, "muffleMessage") [13:13:47.247] if (muffled) [13:13:47.247] invokeRestart("muffleMessage") [13:13:47.247] } [13:13:47.247] else if (inherits(cond, "warning")) { [13:13:47.247] muffled <- grepl(pattern, "muffleWarning") [13:13:47.247] if (muffled) [13:13:47.247] invokeRestart("muffleWarning") [13:13:47.247] } [13:13:47.247] else if (inherits(cond, "condition")) { [13:13:47.247] if (!is.null(pattern)) { [13:13:47.247] computeRestarts <- base::computeRestarts [13:13:47.247] grepl <- base::grepl [13:13:47.247] restarts <- computeRestarts(cond) [13:13:47.247] for (restart in restarts) { [13:13:47.247] name <- restart$name [13:13:47.247] if (is.null(name)) [13:13:47.247] next [13:13:47.247] if (!grepl(pattern, name)) [13:13:47.247] next [13:13:47.247] invokeRestart(restart) [13:13:47.247] muffled <- TRUE [13:13:47.247] break [13:13:47.247] } [13:13:47.247] } [13:13:47.247] } [13:13:47.247] invisible(muffled) [13:13:47.247] } [13:13:47.247] muffleCondition(cond) [13:13:47.247] }) [13:13:47.247] })) [13:13:47.247] future::FutureResult(value = ...future.value$value, [13:13:47.247] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:47.247] ...future.rng), globalenv = if (FALSE) [13:13:47.247] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:47.247] ...future.globalenv.names)) [13:13:47.247] else NULL, started = ...future.startTime, version = "1.8") [13:13:47.247] }, condition = base::local({ [13:13:47.247] c <- base::c [13:13:47.247] inherits <- base::inherits [13:13:47.247] invokeRestart <- base::invokeRestart [13:13:47.247] length <- base::length [13:13:47.247] list <- base::list [13:13:47.247] seq.int <- base::seq.int [13:13:47.247] signalCondition <- base::signalCondition [13:13:47.247] sys.calls <- base::sys.calls [13:13:47.247] `[[` <- base::`[[` [13:13:47.247] `+` <- base::`+` [13:13:47.247] `<<-` <- base::`<<-` [13:13:47.247] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:47.247] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:47.247] 3L)] [13:13:47.247] } [13:13:47.247] function(cond) { [13:13:47.247] is_error <- inherits(cond, "error") [13:13:47.247] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:47.247] NULL) [13:13:47.247] if (is_error) { [13:13:47.247] sessionInformation <- function() { [13:13:47.247] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:47.247] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:47.247] search = base::search(), system = base::Sys.info()) [13:13:47.247] } [13:13:47.247] ...future.conditions[[length(...future.conditions) + [13:13:47.247] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:47.247] cond$call), session = sessionInformation(), [13:13:47.247] timestamp = base::Sys.time(), signaled = 0L) [13:13:47.247] signalCondition(cond) [13:13:47.247] } [13:13:47.247] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:47.247] "immediateCondition"))) { [13:13:47.247] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:47.247] ...future.conditions[[length(...future.conditions) + [13:13:47.247] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:47.247] if (TRUE && !signal) { [13:13:47.247] muffleCondition <- function (cond, pattern = "^muffle") [13:13:47.247] { [13:13:47.247] inherits <- base::inherits [13:13:47.247] invokeRestart <- base::invokeRestart [13:13:47.247] is.null <- base::is.null [13:13:47.247] muffled <- FALSE [13:13:47.247] if (inherits(cond, "message")) { [13:13:47.247] muffled <- grepl(pattern, "muffleMessage") [13:13:47.247] if (muffled) [13:13:47.247] invokeRestart("muffleMessage") [13:13:47.247] } [13:13:47.247] else if (inherits(cond, "warning")) { [13:13:47.247] muffled <- grepl(pattern, "muffleWarning") [13:13:47.247] if (muffled) [13:13:47.247] invokeRestart("muffleWarning") [13:13:47.247] } [13:13:47.247] else if (inherits(cond, "condition")) { [13:13:47.247] if (!is.null(pattern)) { [13:13:47.247] computeRestarts <- base::computeRestarts [13:13:47.247] grepl <- base::grepl [13:13:47.247] restarts <- computeRestarts(cond) [13:13:47.247] for (restart in restarts) { [13:13:47.247] name <- restart$name [13:13:47.247] if (is.null(name)) [13:13:47.247] next [13:13:47.247] if (!grepl(pattern, name)) [13:13:47.247] next [13:13:47.247] invokeRestart(restart) [13:13:47.247] muffled <- TRUE [13:13:47.247] break [13:13:47.247] } [13:13:47.247] } [13:13:47.247] } [13:13:47.247] invisible(muffled) [13:13:47.247] } [13:13:47.247] muffleCondition(cond, pattern = "^muffle") [13:13:47.247] } [13:13:47.247] } [13:13:47.247] else { [13:13:47.247] if (TRUE) { [13:13:47.247] muffleCondition <- function (cond, pattern = "^muffle") [13:13:47.247] { [13:13:47.247] inherits <- base::inherits [13:13:47.247] invokeRestart <- base::invokeRestart [13:13:47.247] is.null <- base::is.null [13:13:47.247] muffled <- FALSE [13:13:47.247] if (inherits(cond, "message")) { [13:13:47.247] muffled <- grepl(pattern, "muffleMessage") [13:13:47.247] if (muffled) [13:13:47.247] invokeRestart("muffleMessage") [13:13:47.247] } [13:13:47.247] else if (inherits(cond, "warning")) { [13:13:47.247] muffled <- grepl(pattern, "muffleWarning") [13:13:47.247] if (muffled) [13:13:47.247] invokeRestart("muffleWarning") [13:13:47.247] } [13:13:47.247] else if (inherits(cond, "condition")) { [13:13:47.247] if (!is.null(pattern)) { [13:13:47.247] computeRestarts <- base::computeRestarts [13:13:47.247] grepl <- base::grepl [13:13:47.247] restarts <- computeRestarts(cond) [13:13:47.247] for (restart in restarts) { [13:13:47.247] name <- restart$name [13:13:47.247] if (is.null(name)) [13:13:47.247] next [13:13:47.247] if (!grepl(pattern, name)) [13:13:47.247] next [13:13:47.247] invokeRestart(restart) [13:13:47.247] muffled <- TRUE [13:13:47.247] break [13:13:47.247] } [13:13:47.247] } [13:13:47.247] } [13:13:47.247] invisible(muffled) [13:13:47.247] } [13:13:47.247] muffleCondition(cond, pattern = "^muffle") [13:13:47.247] } [13:13:47.247] } [13:13:47.247] } [13:13:47.247] })) [13:13:47.247] }, error = function(ex) { [13:13:47.247] base::structure(base::list(value = NULL, visible = NULL, [13:13:47.247] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:47.247] ...future.rng), started = ...future.startTime, [13:13:47.247] finished = Sys.time(), session_uuid = NA_character_, [13:13:47.247] version = "1.8"), class = "FutureResult") [13:13:47.247] }, finally = { [13:13:47.247] if (!identical(...future.workdir, getwd())) [13:13:47.247] setwd(...future.workdir) [13:13:47.247] { [13:13:47.247] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:47.247] ...future.oldOptions$nwarnings <- NULL [13:13:47.247] } [13:13:47.247] base::options(...future.oldOptions) [13:13:47.247] if (.Platform$OS.type == "windows") { [13:13:47.247] old_names <- names(...future.oldEnvVars) [13:13:47.247] envs <- base::Sys.getenv() [13:13:47.247] names <- names(envs) [13:13:47.247] common <- intersect(names, old_names) [13:13:47.247] added <- setdiff(names, old_names) [13:13:47.247] removed <- setdiff(old_names, names) [13:13:47.247] changed <- common[...future.oldEnvVars[common] != [13:13:47.247] envs[common]] [13:13:47.247] NAMES <- toupper(changed) [13:13:47.247] args <- list() [13:13:47.247] for (kk in seq_along(NAMES)) { [13:13:47.247] name <- changed[[kk]] [13:13:47.247] NAME <- NAMES[[kk]] [13:13:47.247] if (name != NAME && is.element(NAME, old_names)) [13:13:47.247] next [13:13:47.247] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:47.247] } [13:13:47.247] NAMES <- toupper(added) [13:13:47.247] for (kk in seq_along(NAMES)) { [13:13:47.247] name <- added[[kk]] [13:13:47.247] NAME <- NAMES[[kk]] [13:13:47.247] if (name != NAME && is.element(NAME, old_names)) [13:13:47.247] next [13:13:47.247] args[[name]] <- "" [13:13:47.247] } [13:13:47.247] NAMES <- toupper(removed) [13:13:47.247] for (kk in seq_along(NAMES)) { [13:13:47.247] name <- removed[[kk]] [13:13:47.247] NAME <- NAMES[[kk]] [13:13:47.247] if (name != NAME && is.element(NAME, old_names)) [13:13:47.247] next [13:13:47.247] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:47.247] } [13:13:47.247] if (length(args) > 0) [13:13:47.247] base::do.call(base::Sys.setenv, args = args) [13:13:47.247] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:47.247] } [13:13:47.247] else { [13:13:47.247] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:47.247] } [13:13:47.247] { [13:13:47.247] if (base::length(...future.futureOptionsAdded) > [13:13:47.247] 0L) { [13:13:47.247] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:47.247] base::names(opts) <- ...future.futureOptionsAdded [13:13:47.247] base::options(opts) [13:13:47.247] } [13:13:47.247] { [13:13:47.247] { [13:13:47.247] base::options(mc.cores = ...future.mc.cores.old) [13:13:47.247] NULL [13:13:47.247] } [13:13:47.247] options(future.plan = NULL) [13:13:47.247] if (is.na(NA_character_)) [13:13:47.247] Sys.unsetenv("R_FUTURE_PLAN") [13:13:47.247] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:47.247] future::plan(list(function (..., workers = availableCores(), [13:13:47.247] lazy = FALSE, rscript_libs = .libPaths(), [13:13:47.247] envir = parent.frame()) [13:13:47.247] { [13:13:47.247] if (is.function(workers)) [13:13:47.247] workers <- workers() [13:13:47.247] workers <- structure(as.integer(workers), [13:13:47.247] class = class(workers)) [13:13:47.247] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:47.247] workers >= 1) [13:13:47.247] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:47.247] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:47.247] } [13:13:47.247] future <- MultisessionFuture(..., workers = workers, [13:13:47.247] lazy = lazy, rscript_libs = rscript_libs, [13:13:47.247] envir = envir) [13:13:47.247] if (!future$lazy) [13:13:47.247] future <- run(future) [13:13:47.247] invisible(future) [13:13:47.247] }), .cleanup = FALSE, .init = FALSE) [13:13:47.247] } [13:13:47.247] } [13:13:47.247] } [13:13:47.247] }) [13:13:47.247] if (TRUE) { [13:13:47.247] base::sink(type = "output", split = FALSE) [13:13:47.247] if (TRUE) { [13:13:47.247] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:47.247] } [13:13:47.247] else { [13:13:47.247] ...future.result["stdout"] <- base::list(NULL) [13:13:47.247] } [13:13:47.247] base::close(...future.stdout) [13:13:47.247] ...future.stdout <- NULL [13:13:47.247] } [13:13:47.247] ...future.result$conditions <- ...future.conditions [13:13:47.247] ...future.result$finished <- base::Sys.time() [13:13:47.247] ...future.result [13:13:47.247] } [13:13:47.252] Exporting 5 global objects (4.85 KiB) to cluster node #1 ... [13:13:47.253] Exporting '...future.FUN' (4.85 KiB) to cluster node #1 ... [13:13:47.253] Exporting '...future.FUN' (4.85 KiB) to cluster node #1 ... DONE [13:13:47.253] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... [13:13:47.254] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... DONE [13:13:47.254] Exporting '...future.elements_ii' (112 bytes) to cluster node #1 ... [13:13:47.255] Exporting '...future.elements_ii' (112 bytes) to cluster node #1 ... DONE [13:13:47.255] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:13:47.255] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:13:47.255] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:13:47.256] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:13:47.256] Exporting 5 global objects (4.85 KiB) to cluster node #1 ... DONE [13:13:47.257] MultisessionFuture started [13:13:47.257] - Launch lazy future ... done [13:13:47.257] run() for 'MultisessionFuture' ... done [13:13:47.257] Created future: [13:13:47.272] receiveMessageFromWorker() for ClusterFuture ... [13:13:47.273] - Validating connection of MultisessionFuture [13:13:47.273] - received message: FutureResult [13:13:47.273] - Received FutureResult [13:13:47.274] - Erased future from FutureRegistry [13:13:47.274] result() for ClusterFuture ... [13:13:47.274] - result already collected: FutureResult [13:13:47.274] result() for ClusterFuture ... done [13:13:47.274] receiveMessageFromWorker() for ClusterFuture ... done [13:13:47.257] MultisessionFuture: [13:13:47.257] Label: 'future_lapply-2' [13:13:47.257] Expression: [13:13:47.257] { [13:13:47.257] do.call(function(...) { [13:13:47.257] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:47.257] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:47.257] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:47.257] on.exit(options(oopts), add = TRUE) [13:13:47.257] } [13:13:47.257] { [13:13:47.257] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:47.257] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:47.257] ...future.FUN(...future.X_jj, ...) [13:13:47.257] }) [13:13:47.257] } [13:13:47.257] }, args = future.call.arguments) [13:13:47.257] } [13:13:47.257] Lazy evaluation: FALSE [13:13:47.257] Asynchronous evaluation: TRUE [13:13:47.257] Local evaluation: TRUE [13:13:47.257] Environment: R_GlobalEnv [13:13:47.257] Capture standard output: TRUE [13:13:47.257] Capture condition classes: 'condition' (excluding 'nothing') [13:13:47.257] 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) [13:13:47.257] Packages: 1 packages ('listenv') [13:13:47.257] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:47.257] Resolved: TRUE [13:13:47.257] Value: [13:13:47.257] Conditions captured: [13:13:47.257] Early signaling: FALSE [13:13:47.257] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:47.257] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:47.275] Chunk #2 of 2 ... DONE [13:13:47.275] Launching 2 futures (chunks) ... DONE [13:13:47.275] Resolving 2 futures (chunks) ... [13:13:47.275] resolve() on list ... [13:13:47.275] recursive: 0 [13:13:47.275] length: 2 [13:13:47.276] [13:13:47.276] Future #1 [13:13:47.276] result() for ClusterFuture ... [13:13:47.276] - result already collected: FutureResult [13:13:47.276] result() for ClusterFuture ... done [13:13:47.276] result() for ClusterFuture ... [13:13:47.277] - result already collected: FutureResult [13:13:47.277] result() for ClusterFuture ... done [13:13:47.277] signalConditionsASAP(MultisessionFuture, pos=1) ... [13:13:47.277] - nx: 2 [13:13:47.277] - relay: TRUE [13:13:47.277] - stdout: TRUE [13:13:47.277] - signal: TRUE [13:13:47.278] - resignal: FALSE [13:13:47.278] - force: TRUE [13:13:47.278] - relayed: [n=2] FALSE, FALSE [13:13:47.278] - queued futures: [n=2] FALSE, FALSE [13:13:47.278] - until=1 [13:13:47.278] - relaying element #1 [13:13:47.279] result() for ClusterFuture ... [13:13:47.279] - result already collected: FutureResult [13:13:47.279] result() for ClusterFuture ... done [13:13:47.279] result() for ClusterFuture ... [13:13:47.279] - result already collected: FutureResult [13:13:47.279] result() for ClusterFuture ... done [13:13:47.280] result() for ClusterFuture ... [13:13:47.280] - result already collected: FutureResult [13:13:47.280] result() for ClusterFuture ... done [13:13:47.280] result() for ClusterFuture ... [13:13:47.280] - result already collected: FutureResult [13:13:47.283] result() for ClusterFuture ... done [13:13:47.283] - relayed: [n=2] TRUE, FALSE [13:13:47.283] - queued futures: [n=2] TRUE, FALSE [13:13:47.283] signalConditionsASAP(MultisessionFuture, pos=1) ... done [13:13:47.284] length: 1 (resolved future 1) [13:13:47.284] Future #2 [13:13:47.284] result() for ClusterFuture ... [13:13:47.284] - result already collected: FutureResult [13:13:47.284] result() for ClusterFuture ... done [13:13:47.284] result() for ClusterFuture ... [13:13:47.284] - result already collected: FutureResult [13:13:47.285] result() for ClusterFuture ... done [13:13:47.285] signalConditionsASAP(MultisessionFuture, pos=2) ... [13:13:47.285] - nx: 2 [13:13:47.285] - relay: TRUE [13:13:47.285] - stdout: TRUE [13:13:47.285] - signal: TRUE [13:13:47.286] - resignal: FALSE [13:13:47.286] - force: TRUE [13:13:47.286] - relayed: [n=2] TRUE, FALSE [13:13:47.286] - queued futures: [n=2] TRUE, FALSE [13:13:47.286] - until=2 [13:13:47.286] - relaying element #2 [13:13:47.286] result() for ClusterFuture ... [13:13:47.287] - result already collected: FutureResult [13:13:47.287] result() for ClusterFuture ... done [13:13:47.287] result() for ClusterFuture ... [13:13:47.287] - result already collected: FutureResult [13:13:47.287] result() for ClusterFuture ... done [13:13:47.287] result() for ClusterFuture ... [13:13:47.288] - result already collected: FutureResult [13:13:47.288] result() for ClusterFuture ... done [13:13:47.288] result() for ClusterFuture ... [13:13:47.288] - result already collected: FutureResult [13:13:47.288] result() for ClusterFuture ... done [13:13:47.288] - relayed: [n=2] TRUE, TRUE [13:13:47.289] - queued futures: [n=2] TRUE, TRUE [13:13:47.289] signalConditionsASAP(MultisessionFuture, pos=2) ... done [13:13:47.289] length: 0 (resolved future 2) [13:13:47.289] Relaying remaining futures [13:13:47.289] signalConditionsASAP(NULL, pos=0) ... [13:13:47.289] - nx: 2 [13:13:47.289] - relay: TRUE [13:13:47.290] - stdout: TRUE [13:13:47.290] - signal: TRUE [13:13:47.290] - resignal: FALSE [13:13:47.290] - force: TRUE [13:13:47.290] - relayed: [n=2] TRUE, TRUE [13:13:47.290] - queued futures: [n=2] TRUE, TRUE - flush all [13:13:47.291] - relayed: [n=2] TRUE, TRUE [13:13:47.291] - queued futures: [n=2] TRUE, TRUE [13:13:47.291] signalConditionsASAP(NULL, pos=0) ... done [13:13:47.291] resolve() on list ... DONE [13:13:47.291] result() for ClusterFuture ... [13:13:47.291] - result already collected: FutureResult [13:13:47.292] result() for ClusterFuture ... done [13:13:47.292] result() for ClusterFuture ... [13:13:47.292] - result already collected: FutureResult [13:13:47.292] result() for ClusterFuture ... done [13:13:47.292] result() for ClusterFuture ... [13:13:47.292] - result already collected: FutureResult [13:13:47.292] result() for ClusterFuture ... done [13:13:47.293] result() for ClusterFuture ... [13:13:47.293] - result already collected: FutureResult [13:13:47.293] result() for ClusterFuture ... done [13:13:47.293] - Number of value chunks collected: 2 [13:13:47.293] Resolving 2 futures (chunks) ... DONE [13:13:47.293] Reducing values from 2 chunks ... [13:13:47.294] - Number of values collected after concatenation: 2 [13:13:47.294] - Number of values expected: 2 [13:13:47.294] Reverse index remapping (attribute 'ordering'): [n = 2] 2, 1 [13:13:47.294] Reducing values from 2 chunks ... DONE [13:13:47.294] 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, ...) ... [13:13:47.296] future_lapply() ... [13:13:47.299] Number of chunks: 2 [13:13:47.299] Index remapping (attribute 'ordering'): [n = 4] 4, 3, 2, 1 [13:13:47.300] getGlobalsAndPackagesXApply() ... [13:13:47.300] - future.globals: TRUE [13:13:47.300] getGlobalsAndPackages() ... [13:13:47.300] Searching for globals... [13:13:47.301] - globals found: [2] 'FUN', '.Internal' [13:13:47.302] Searching for globals ... DONE [13:13:47.302] Resolving globals: FALSE [13:13:47.302] The total size of the 1 globals is 2.13 KiB (2184 bytes) [13:13:47.303] 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') [13:13:47.303] - globals: [1] 'FUN' [13:13:47.303] [13:13:47.303] getGlobalsAndPackages() ... DONE [13:13:47.303] - globals found/used: [n=1] 'FUN' [13:13:47.304] - needed namespaces: [n=0] [13:13:47.304] Finding globals ... DONE [13:13:47.304] - use_args: TRUE [13:13:47.304] - Getting '...' globals ... [13:13:47.304] resolve() on list ... [13:13:47.305] recursive: 0 [13:13:47.305] length: 1 [13:13:47.305] elements: '...' [13:13:47.305] length: 0 (resolved future 1) [13:13:47.305] resolve() on list ... DONE [13:13:47.305] - '...' content: [n=1] 'length' [13:13:47.306] List of 1 [13:13:47.306] $ ...:List of 1 [13:13:47.306] ..$ length: int 2 [13:13:47.306] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:47.306] - attr(*, "where")=List of 1 [13:13:47.306] ..$ ...: [13:13:47.306] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:47.306] - attr(*, "resolved")= logi TRUE [13:13:47.306] - attr(*, "total_size")= num NA [13:13:47.309] - Getting '...' globals ... DONE [13:13:47.309] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:47.310] List of 2 [13:13:47.310] $ ...future.FUN:function (mode = "logical", length = 0L) [13:13:47.310] $ ... :List of 1 [13:13:47.310] ..$ length: int 2 [13:13:47.310] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:47.310] - attr(*, "where")=List of 2 [13:13:47.310] ..$ ...future.FUN: [13:13:47.310] ..$ ... : [13:13:47.310] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:47.310] - attr(*, "resolved")= logi FALSE [13:13:47.310] - attr(*, "total_size")= num 2240 [13:13:47.313] Packages to be attached in all futures: [n=0] [13:13:47.313] getGlobalsAndPackagesXApply() ... DONE [13:13:47.314] Number of futures (= number of chunks): 2 [13:13:47.314] Launching 2 futures (chunks) ... [13:13:47.314] Chunk #1 of 2 ... [13:13:47.314] - Finding globals in 'X' for chunk #1 ... [13:13:47.314] getGlobalsAndPackages() ... [13:13:47.315] Searching for globals... [13:13:47.315] [13:13:47.315] Searching for globals ... DONE [13:13:47.315] - globals: [0] [13:13:47.315] getGlobalsAndPackages() ... DONE [13:13:47.316] + additional globals found: [n=0] [13:13:47.316] + additional namespaces needed: [n=0] [13:13:47.316] - Finding globals in 'X' for chunk #1 ... DONE [13:13:47.316] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:13:47.316] - seeds: [13:13:47.316] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:47.316] getGlobalsAndPackages() ... [13:13:47.317] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:47.317] Resolving globals: FALSE [13:13:47.317] Tweak future expression to call with '...' arguments ... [13:13:47.317] { [13:13:47.317] do.call(function(...) { [13:13:47.317] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:47.317] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:47.317] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:47.317] on.exit(options(oopts), add = TRUE) [13:13:47.317] } [13:13:47.317] { [13:13:47.317] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:47.317] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:47.317] ...future.FUN(...future.X_jj, ...) [13:13:47.317] }) [13:13:47.317] } [13:13:47.317] }, args = future.call.arguments) [13:13:47.317] } [13:13:47.318] Tweak future expression to call with '...' arguments ... DONE [13:13:47.318] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:47.318] [13:13:47.318] getGlobalsAndPackages() ... DONE [13:13:47.319] run() for 'Future' ... [13:13:47.319] - state: 'created' [13:13:47.319] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:47.333] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:47.333] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:13:47.333] - Field: 'node' [13:13:47.333] - Field: 'label' [13:13:47.334] - Field: 'local' [13:13:47.334] - Field: 'owner' [13:13:47.334] - Field: 'envir' [13:13:47.334] - Field: 'workers' [13:13:47.334] - Field: 'packages' [13:13:47.335] - Field: 'gc' [13:13:47.335] - Field: 'conditions' [13:13:47.335] - Field: 'persistent' [13:13:47.335] - Field: 'expr' [13:13:47.335] - Field: 'uuid' [13:13:47.335] - Field: 'seed' [13:13:47.336] - Field: 'version' [13:13:47.336] - Field: 'result' [13:13:47.336] - Field: 'asynchronous' [13:13:47.336] - Field: 'calls' [13:13:47.336] - Field: 'globals' [13:13:47.336] - Field: 'stdout' [13:13:47.337] - Field: 'earlySignal' [13:13:47.337] - Field: 'lazy' [13:13:47.337] - Field: 'state' [13:13:47.337] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:13:47.337] - Launch lazy future ... [13:13:47.338] Packages needed by the future expression (n = 0): [13:13:47.338] Packages needed by future strategies (n = 0): [13:13:47.338] { [13:13:47.338] { [13:13:47.338] { [13:13:47.338] ...future.startTime <- base::Sys.time() [13:13:47.338] { [13:13:47.338] { [13:13:47.338] { [13:13:47.338] { [13:13:47.338] base::local({ [13:13:47.338] has_future <- base::requireNamespace("future", [13:13:47.338] quietly = TRUE) [13:13:47.338] if (has_future) { [13:13:47.338] ns <- base::getNamespace("future") [13:13:47.338] version <- ns[[".package"]][["version"]] [13:13:47.338] if (is.null(version)) [13:13:47.338] version <- utils::packageVersion("future") [13:13:47.338] } [13:13:47.338] else { [13:13:47.338] version <- NULL [13:13:47.338] } [13:13:47.338] if (!has_future || version < "1.8.0") { [13:13:47.338] info <- base::c(r_version = base::gsub("R version ", [13:13:47.338] "", base::R.version$version.string), [13:13:47.338] platform = base::sprintf("%s (%s-bit)", [13:13:47.338] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:47.338] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:47.338] "release", "version")], collapse = " "), [13:13:47.338] hostname = base::Sys.info()[["nodename"]]) [13:13:47.338] info <- base::sprintf("%s: %s", base::names(info), [13:13:47.338] info) [13:13:47.338] info <- base::paste(info, collapse = "; ") [13:13:47.338] if (!has_future) { [13:13:47.338] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:47.338] info) [13:13:47.338] } [13:13:47.338] else { [13:13:47.338] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:47.338] info, version) [13:13:47.338] } [13:13:47.338] base::stop(msg) [13:13:47.338] } [13:13:47.338] }) [13:13:47.338] } [13:13:47.338] ...future.mc.cores.old <- base::getOption("mc.cores") [13:13:47.338] base::options(mc.cores = 1L) [13:13:47.338] } [13:13:47.338] options(future.plan = NULL) [13:13:47.338] Sys.unsetenv("R_FUTURE_PLAN") [13:13:47.338] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:47.338] } [13:13:47.338] ...future.workdir <- getwd() [13:13:47.338] } [13:13:47.338] ...future.oldOptions <- base::as.list(base::.Options) [13:13:47.338] ...future.oldEnvVars <- base::Sys.getenv() [13:13:47.338] } [13:13:47.338] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:47.338] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:13:47.338] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:47.338] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:47.338] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:47.338] future.stdout.windows.reencode = NULL, width = 80L) [13:13:47.338] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:47.338] base::names(...future.oldOptions)) [13:13:47.338] } [13:13:47.338] if (FALSE) { [13:13:47.338] } [13:13:47.338] else { [13:13:47.338] if (TRUE) { [13:13:47.338] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:47.338] open = "w") [13:13:47.338] } [13:13:47.338] else { [13:13:47.338] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:47.338] windows = "NUL", "/dev/null"), open = "w") [13:13:47.338] } [13:13:47.338] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:47.338] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:47.338] base::sink(type = "output", split = FALSE) [13:13:47.338] base::close(...future.stdout) [13:13:47.338] }, add = TRUE) [13:13:47.338] } [13:13:47.338] ...future.frame <- base::sys.nframe() [13:13:47.338] ...future.conditions <- base::list() [13:13:47.338] ...future.rng <- base::globalenv()$.Random.seed [13:13:47.338] if (FALSE) { [13:13:47.338] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:47.338] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:47.338] } [13:13:47.338] ...future.result <- base::tryCatch({ [13:13:47.338] base::withCallingHandlers({ [13:13:47.338] ...future.value <- base::withVisible(base::local({ [13:13:47.338] ...future.makeSendCondition <- local({ [13:13:47.338] sendCondition <- NULL [13:13:47.338] function(frame = 1L) { [13:13:47.338] if (is.function(sendCondition)) [13:13:47.338] return(sendCondition) [13:13:47.338] ns <- getNamespace("parallel") [13:13:47.338] if (exists("sendData", mode = "function", [13:13:47.338] envir = ns)) { [13:13:47.338] parallel_sendData <- get("sendData", mode = "function", [13:13:47.338] envir = ns) [13:13:47.338] envir <- sys.frame(frame) [13:13:47.338] master <- NULL [13:13:47.338] while (!identical(envir, .GlobalEnv) && [13:13:47.338] !identical(envir, emptyenv())) { [13:13:47.338] if (exists("master", mode = "list", envir = envir, [13:13:47.338] inherits = FALSE)) { [13:13:47.338] master <- get("master", mode = "list", [13:13:47.338] envir = envir, inherits = FALSE) [13:13:47.338] if (inherits(master, c("SOCKnode", [13:13:47.338] "SOCK0node"))) { [13:13:47.338] sendCondition <<- function(cond) { [13:13:47.338] data <- list(type = "VALUE", value = cond, [13:13:47.338] success = TRUE) [13:13:47.338] parallel_sendData(master, data) [13:13:47.338] } [13:13:47.338] return(sendCondition) [13:13:47.338] } [13:13:47.338] } [13:13:47.338] frame <- frame + 1L [13:13:47.338] envir <- sys.frame(frame) [13:13:47.338] } [13:13:47.338] } [13:13:47.338] sendCondition <<- function(cond) NULL [13:13:47.338] } [13:13:47.338] }) [13:13:47.338] withCallingHandlers({ [13:13:47.338] { [13:13:47.338] do.call(function(...) { [13:13:47.338] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:47.338] if (!identical(...future.globals.maxSize.org, [13:13:47.338] ...future.globals.maxSize)) { [13:13:47.338] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:47.338] on.exit(options(oopts), add = TRUE) [13:13:47.338] } [13:13:47.338] { [13:13:47.338] lapply(seq_along(...future.elements_ii), [13:13:47.338] FUN = function(jj) { [13:13:47.338] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:47.338] ...future.FUN(...future.X_jj, ...) [13:13:47.338] }) [13:13:47.338] } [13:13:47.338] }, args = future.call.arguments) [13:13:47.338] } [13:13:47.338] }, immediateCondition = function(cond) { [13:13:47.338] sendCondition <- ...future.makeSendCondition() [13:13:47.338] sendCondition(cond) [13:13:47.338] muffleCondition <- function (cond, pattern = "^muffle") [13:13:47.338] { [13:13:47.338] inherits <- base::inherits [13:13:47.338] invokeRestart <- base::invokeRestart [13:13:47.338] is.null <- base::is.null [13:13:47.338] muffled <- FALSE [13:13:47.338] if (inherits(cond, "message")) { [13:13:47.338] muffled <- grepl(pattern, "muffleMessage") [13:13:47.338] if (muffled) [13:13:47.338] invokeRestart("muffleMessage") [13:13:47.338] } [13:13:47.338] else if (inherits(cond, "warning")) { [13:13:47.338] muffled <- grepl(pattern, "muffleWarning") [13:13:47.338] if (muffled) [13:13:47.338] invokeRestart("muffleWarning") [13:13:47.338] } [13:13:47.338] else if (inherits(cond, "condition")) { [13:13:47.338] if (!is.null(pattern)) { [13:13:47.338] computeRestarts <- base::computeRestarts [13:13:47.338] grepl <- base::grepl [13:13:47.338] restarts <- computeRestarts(cond) [13:13:47.338] for (restart in restarts) { [13:13:47.338] name <- restart$name [13:13:47.338] if (is.null(name)) [13:13:47.338] next [13:13:47.338] if (!grepl(pattern, name)) [13:13:47.338] next [13:13:47.338] invokeRestart(restart) [13:13:47.338] muffled <- TRUE [13:13:47.338] break [13:13:47.338] } [13:13:47.338] } [13:13:47.338] } [13:13:47.338] invisible(muffled) [13:13:47.338] } [13:13:47.338] muffleCondition(cond) [13:13:47.338] }) [13:13:47.338] })) [13:13:47.338] future::FutureResult(value = ...future.value$value, [13:13:47.338] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:47.338] ...future.rng), globalenv = if (FALSE) [13:13:47.338] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:47.338] ...future.globalenv.names)) [13:13:47.338] else NULL, started = ...future.startTime, version = "1.8") [13:13:47.338] }, condition = base::local({ [13:13:47.338] c <- base::c [13:13:47.338] inherits <- base::inherits [13:13:47.338] invokeRestart <- base::invokeRestart [13:13:47.338] length <- base::length [13:13:47.338] list <- base::list [13:13:47.338] seq.int <- base::seq.int [13:13:47.338] signalCondition <- base::signalCondition [13:13:47.338] sys.calls <- base::sys.calls [13:13:47.338] `[[` <- base::`[[` [13:13:47.338] `+` <- base::`+` [13:13:47.338] `<<-` <- base::`<<-` [13:13:47.338] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:47.338] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:47.338] 3L)] [13:13:47.338] } [13:13:47.338] function(cond) { [13:13:47.338] is_error <- inherits(cond, "error") [13:13:47.338] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:47.338] NULL) [13:13:47.338] if (is_error) { [13:13:47.338] sessionInformation <- function() { [13:13:47.338] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:47.338] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:47.338] search = base::search(), system = base::Sys.info()) [13:13:47.338] } [13:13:47.338] ...future.conditions[[length(...future.conditions) + [13:13:47.338] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:47.338] cond$call), session = sessionInformation(), [13:13:47.338] timestamp = base::Sys.time(), signaled = 0L) [13:13:47.338] signalCondition(cond) [13:13:47.338] } [13:13:47.338] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:47.338] "immediateCondition"))) { [13:13:47.338] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:47.338] ...future.conditions[[length(...future.conditions) + [13:13:47.338] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:47.338] if (TRUE && !signal) { [13:13:47.338] muffleCondition <- function (cond, pattern = "^muffle") [13:13:47.338] { [13:13:47.338] inherits <- base::inherits [13:13:47.338] invokeRestart <- base::invokeRestart [13:13:47.338] is.null <- base::is.null [13:13:47.338] muffled <- FALSE [13:13:47.338] if (inherits(cond, "message")) { [13:13:47.338] muffled <- grepl(pattern, "muffleMessage") [13:13:47.338] if (muffled) [13:13:47.338] invokeRestart("muffleMessage") [13:13:47.338] } [13:13:47.338] else if (inherits(cond, "warning")) { [13:13:47.338] muffled <- grepl(pattern, "muffleWarning") [13:13:47.338] if (muffled) [13:13:47.338] invokeRestart("muffleWarning") [13:13:47.338] } [13:13:47.338] else if (inherits(cond, "condition")) { [13:13:47.338] if (!is.null(pattern)) { [13:13:47.338] computeRestarts <- base::computeRestarts [13:13:47.338] grepl <- base::grepl [13:13:47.338] restarts <- computeRestarts(cond) [13:13:47.338] for (restart in restarts) { [13:13:47.338] name <- restart$name [13:13:47.338] if (is.null(name)) [13:13:47.338] next [13:13:47.338] if (!grepl(pattern, name)) [13:13:47.338] next [13:13:47.338] invokeRestart(restart) [13:13:47.338] muffled <- TRUE [13:13:47.338] break [13:13:47.338] } [13:13:47.338] } [13:13:47.338] } [13:13:47.338] invisible(muffled) [13:13:47.338] } [13:13:47.338] muffleCondition(cond, pattern = "^muffle") [13:13:47.338] } [13:13:47.338] } [13:13:47.338] else { [13:13:47.338] if (TRUE) { [13:13:47.338] muffleCondition <- function (cond, pattern = "^muffle") [13:13:47.338] { [13:13:47.338] inherits <- base::inherits [13:13:47.338] invokeRestart <- base::invokeRestart [13:13:47.338] is.null <- base::is.null [13:13:47.338] muffled <- FALSE [13:13:47.338] if (inherits(cond, "message")) { [13:13:47.338] muffled <- grepl(pattern, "muffleMessage") [13:13:47.338] if (muffled) [13:13:47.338] invokeRestart("muffleMessage") [13:13:47.338] } [13:13:47.338] else if (inherits(cond, "warning")) { [13:13:47.338] muffled <- grepl(pattern, "muffleWarning") [13:13:47.338] if (muffled) [13:13:47.338] invokeRestart("muffleWarning") [13:13:47.338] } [13:13:47.338] else if (inherits(cond, "condition")) { [13:13:47.338] if (!is.null(pattern)) { [13:13:47.338] computeRestarts <- base::computeRestarts [13:13:47.338] grepl <- base::grepl [13:13:47.338] restarts <- computeRestarts(cond) [13:13:47.338] for (restart in restarts) { [13:13:47.338] name <- restart$name [13:13:47.338] if (is.null(name)) [13:13:47.338] next [13:13:47.338] if (!grepl(pattern, name)) [13:13:47.338] next [13:13:47.338] invokeRestart(restart) [13:13:47.338] muffled <- TRUE [13:13:47.338] break [13:13:47.338] } [13:13:47.338] } [13:13:47.338] } [13:13:47.338] invisible(muffled) [13:13:47.338] } [13:13:47.338] muffleCondition(cond, pattern = "^muffle") [13:13:47.338] } [13:13:47.338] } [13:13:47.338] } [13:13:47.338] })) [13:13:47.338] }, error = function(ex) { [13:13:47.338] base::structure(base::list(value = NULL, visible = NULL, [13:13:47.338] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:47.338] ...future.rng), started = ...future.startTime, [13:13:47.338] finished = Sys.time(), session_uuid = NA_character_, [13:13:47.338] version = "1.8"), class = "FutureResult") [13:13:47.338] }, finally = { [13:13:47.338] if (!identical(...future.workdir, getwd())) [13:13:47.338] setwd(...future.workdir) [13:13:47.338] { [13:13:47.338] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:47.338] ...future.oldOptions$nwarnings <- NULL [13:13:47.338] } [13:13:47.338] base::options(...future.oldOptions) [13:13:47.338] if (.Platform$OS.type == "windows") { [13:13:47.338] old_names <- names(...future.oldEnvVars) [13:13:47.338] envs <- base::Sys.getenv() [13:13:47.338] names <- names(envs) [13:13:47.338] common <- intersect(names, old_names) [13:13:47.338] added <- setdiff(names, old_names) [13:13:47.338] removed <- setdiff(old_names, names) [13:13:47.338] changed <- common[...future.oldEnvVars[common] != [13:13:47.338] envs[common]] [13:13:47.338] NAMES <- toupper(changed) [13:13:47.338] args <- list() [13:13:47.338] for (kk in seq_along(NAMES)) { [13:13:47.338] name <- changed[[kk]] [13:13:47.338] NAME <- NAMES[[kk]] [13:13:47.338] if (name != NAME && is.element(NAME, old_names)) [13:13:47.338] next [13:13:47.338] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:47.338] } [13:13:47.338] NAMES <- toupper(added) [13:13:47.338] for (kk in seq_along(NAMES)) { [13:13:47.338] name <- added[[kk]] [13:13:47.338] NAME <- NAMES[[kk]] [13:13:47.338] if (name != NAME && is.element(NAME, old_names)) [13:13:47.338] next [13:13:47.338] args[[name]] <- "" [13:13:47.338] } [13:13:47.338] NAMES <- toupper(removed) [13:13:47.338] for (kk in seq_along(NAMES)) { [13:13:47.338] name <- removed[[kk]] [13:13:47.338] NAME <- NAMES[[kk]] [13:13:47.338] if (name != NAME && is.element(NAME, old_names)) [13:13:47.338] next [13:13:47.338] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:47.338] } [13:13:47.338] if (length(args) > 0) [13:13:47.338] base::do.call(base::Sys.setenv, args = args) [13:13:47.338] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:47.338] } [13:13:47.338] else { [13:13:47.338] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:47.338] } [13:13:47.338] { [13:13:47.338] if (base::length(...future.futureOptionsAdded) > [13:13:47.338] 0L) { [13:13:47.338] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:47.338] base::names(opts) <- ...future.futureOptionsAdded [13:13:47.338] base::options(opts) [13:13:47.338] } [13:13:47.338] { [13:13:47.338] { [13:13:47.338] base::options(mc.cores = ...future.mc.cores.old) [13:13:47.338] NULL [13:13:47.338] } [13:13:47.338] options(future.plan = NULL) [13:13:47.338] if (is.na(NA_character_)) [13:13:47.338] Sys.unsetenv("R_FUTURE_PLAN") [13:13:47.338] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:47.338] future::plan(list(function (..., workers = availableCores(), [13:13:47.338] lazy = FALSE, rscript_libs = .libPaths(), [13:13:47.338] envir = parent.frame()) [13:13:47.338] { [13:13:47.338] if (is.function(workers)) [13:13:47.338] workers <- workers() [13:13:47.338] workers <- structure(as.integer(workers), [13:13:47.338] class = class(workers)) [13:13:47.338] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:47.338] workers >= 1) [13:13:47.338] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:47.338] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:47.338] } [13:13:47.338] future <- MultisessionFuture(..., workers = workers, [13:13:47.338] lazy = lazy, rscript_libs = rscript_libs, [13:13:47.338] envir = envir) [13:13:47.338] if (!future$lazy) [13:13:47.338] future <- run(future) [13:13:47.338] invisible(future) [13:13:47.338] }), .cleanup = FALSE, .init = FALSE) [13:13:47.338] } [13:13:47.338] } [13:13:47.338] } [13:13:47.338] }) [13:13:47.338] if (TRUE) { [13:13:47.338] base::sink(type = "output", split = FALSE) [13:13:47.338] if (TRUE) { [13:13:47.338] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:47.338] } [13:13:47.338] else { [13:13:47.338] ...future.result["stdout"] <- base::list(NULL) [13:13:47.338] } [13:13:47.338] base::close(...future.stdout) [13:13:47.338] ...future.stdout <- NULL [13:13:47.338] } [13:13:47.338] ...future.result$conditions <- ...future.conditions [13:13:47.338] ...future.result$finished <- base::Sys.time() [13:13:47.338] ...future.result [13:13:47.338] } [13:13:47.344] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... [13:13:47.344] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... [13:13:47.345] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... DONE [13:13:47.345] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... [13:13:47.345] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... DONE [13:13:47.346] Exporting '...future.elements_ii' (232 bytes) to cluster node #1 ... [13:13:47.346] Exporting '...future.elements_ii' (232 bytes) to cluster node #1 ... DONE [13:13:47.346] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:13:47.347] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:13:47.347] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:13:47.347] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:13:47.347] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... DONE [13:13:47.348] MultisessionFuture started [13:13:47.348] - Launch lazy future ... done [13:13:47.348] run() for 'MultisessionFuture' ... done [13:13:47.349] Created future: [13:13:47.365] receiveMessageFromWorker() for ClusterFuture ... [13:13:47.365] - Validating connection of MultisessionFuture [13:13:47.365] - received message: FutureResult [13:13:47.365] - Received FutureResult [13:13:47.365] - Erased future from FutureRegistry [13:13:47.366] result() for ClusterFuture ... [13:13:47.366] - result already collected: FutureResult [13:13:47.366] result() for ClusterFuture ... done [13:13:47.366] receiveMessageFromWorker() for ClusterFuture ... done [13:13:47.349] MultisessionFuture: [13:13:47.349] Label: 'future_lapply-1' [13:13:47.349] Expression: [13:13:47.349] { [13:13:47.349] do.call(function(...) { [13:13:47.349] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:47.349] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:47.349] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:47.349] on.exit(options(oopts), add = TRUE) [13:13:47.349] } [13:13:47.349] { [13:13:47.349] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:47.349] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:47.349] ...future.FUN(...future.X_jj, ...) [13:13:47.349] }) [13:13:47.349] } [13:13:47.349] }, args = future.call.arguments) [13:13:47.349] } [13:13:47.349] Lazy evaluation: FALSE [13:13:47.349] Asynchronous evaluation: TRUE [13:13:47.349] Local evaluation: TRUE [13:13:47.349] Environment: R_GlobalEnv [13:13:47.349] Capture standard output: TRUE [13:13:47.349] Capture condition classes: 'condition' (excluding 'nothing') [13:13:47.349] 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) [13:13:47.349] Packages: [13:13:47.349] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:47.349] Resolved: TRUE [13:13:47.349] Value: [13:13:47.349] Conditions captured: [13:13:47.349] Early signaling: FALSE [13:13:47.349] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:47.349] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:47.366] Chunk #1 of 2 ... DONE [13:13:47.367] Chunk #2 of 2 ... [13:13:47.367] - Finding globals in 'X' for chunk #2 ... [13:13:47.367] getGlobalsAndPackages() ... [13:13:47.367] Searching for globals... [13:13:47.367] [13:13:47.368] Searching for globals ... DONE [13:13:47.368] - globals: [0] [13:13:47.368] getGlobalsAndPackages() ... DONE [13:13:47.368] + additional globals found: [n=0] [13:13:47.368] + additional namespaces needed: [n=0] [13:13:47.368] - Finding globals in 'X' for chunk #2 ... DONE [13:13:47.369] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:13:47.369] - seeds: [13:13:47.369] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:47.369] getGlobalsAndPackages() ... [13:13:47.369] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:47.369] Resolving globals: FALSE [13:13:47.370] Tweak future expression to call with '...' arguments ... [13:13:47.370] { [13:13:47.370] do.call(function(...) { [13:13:47.370] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:47.370] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:47.370] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:47.370] on.exit(options(oopts), add = TRUE) [13:13:47.370] } [13:13:47.370] { [13:13:47.370] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:47.370] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:47.370] ...future.FUN(...future.X_jj, ...) [13:13:47.370] }) [13:13:47.370] } [13:13:47.370] }, args = future.call.arguments) [13:13:47.370] } [13:13:47.370] Tweak future expression to call with '...' arguments ... DONE [13:13:47.371] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:47.371] [13:13:47.371] getGlobalsAndPackages() ... DONE [13:13:47.371] run() for 'Future' ... [13:13:47.371] - state: 'created' [13:13:47.372] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:47.385] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:47.386] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:13:47.386] - Field: 'node' [13:13:47.386] - Field: 'label' [13:13:47.386] - Field: 'local' [13:13:47.386] - Field: 'owner' [13:13:47.387] - Field: 'envir' [13:13:47.387] - Field: 'workers' [13:13:47.387] - Field: 'packages' [13:13:47.387] - Field: 'gc' [13:13:47.387] - Field: 'conditions' [13:13:47.387] - Field: 'persistent' [13:13:47.388] - Field: 'expr' [13:13:47.388] - Field: 'uuid' [13:13:47.388] - Field: 'seed' [13:13:47.388] - Field: 'version' [13:13:47.388] - Field: 'result' [13:13:47.388] - Field: 'asynchronous' [13:13:47.389] - Field: 'calls' [13:13:47.389] - Field: 'globals' [13:13:47.389] - Field: 'stdout' [13:13:47.389] - Field: 'earlySignal' [13:13:47.389] - Field: 'lazy' [13:13:47.389] - Field: 'state' [13:13:47.390] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:13:47.390] - Launch lazy future ... [13:13:47.390] Packages needed by the future expression (n = 0): [13:13:47.390] Packages needed by future strategies (n = 0): [13:13:47.391] { [13:13:47.391] { [13:13:47.391] { [13:13:47.391] ...future.startTime <- base::Sys.time() [13:13:47.391] { [13:13:47.391] { [13:13:47.391] { [13:13:47.391] { [13:13:47.391] base::local({ [13:13:47.391] has_future <- base::requireNamespace("future", [13:13:47.391] quietly = TRUE) [13:13:47.391] if (has_future) { [13:13:47.391] ns <- base::getNamespace("future") [13:13:47.391] version <- ns[[".package"]][["version"]] [13:13:47.391] if (is.null(version)) [13:13:47.391] version <- utils::packageVersion("future") [13:13:47.391] } [13:13:47.391] else { [13:13:47.391] version <- NULL [13:13:47.391] } [13:13:47.391] if (!has_future || version < "1.8.0") { [13:13:47.391] info <- base::c(r_version = base::gsub("R version ", [13:13:47.391] "", base::R.version$version.string), [13:13:47.391] platform = base::sprintf("%s (%s-bit)", [13:13:47.391] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:47.391] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:47.391] "release", "version")], collapse = " "), [13:13:47.391] hostname = base::Sys.info()[["nodename"]]) [13:13:47.391] info <- base::sprintf("%s: %s", base::names(info), [13:13:47.391] info) [13:13:47.391] info <- base::paste(info, collapse = "; ") [13:13:47.391] if (!has_future) { [13:13:47.391] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:47.391] info) [13:13:47.391] } [13:13:47.391] else { [13:13:47.391] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:47.391] info, version) [13:13:47.391] } [13:13:47.391] base::stop(msg) [13:13:47.391] } [13:13:47.391] }) [13:13:47.391] } [13:13:47.391] ...future.mc.cores.old <- base::getOption("mc.cores") [13:13:47.391] base::options(mc.cores = 1L) [13:13:47.391] } [13:13:47.391] options(future.plan = NULL) [13:13:47.391] Sys.unsetenv("R_FUTURE_PLAN") [13:13:47.391] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:47.391] } [13:13:47.391] ...future.workdir <- getwd() [13:13:47.391] } [13:13:47.391] ...future.oldOptions <- base::as.list(base::.Options) [13:13:47.391] ...future.oldEnvVars <- base::Sys.getenv() [13:13:47.391] } [13:13:47.391] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:47.391] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:13:47.391] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:47.391] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:47.391] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:47.391] future.stdout.windows.reencode = NULL, width = 80L) [13:13:47.391] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:47.391] base::names(...future.oldOptions)) [13:13:47.391] } [13:13:47.391] if (FALSE) { [13:13:47.391] } [13:13:47.391] else { [13:13:47.391] if (TRUE) { [13:13:47.391] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:47.391] open = "w") [13:13:47.391] } [13:13:47.391] else { [13:13:47.391] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:47.391] windows = "NUL", "/dev/null"), open = "w") [13:13:47.391] } [13:13:47.391] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:47.391] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:47.391] base::sink(type = "output", split = FALSE) [13:13:47.391] base::close(...future.stdout) [13:13:47.391] }, add = TRUE) [13:13:47.391] } [13:13:47.391] ...future.frame <- base::sys.nframe() [13:13:47.391] ...future.conditions <- base::list() [13:13:47.391] ...future.rng <- base::globalenv()$.Random.seed [13:13:47.391] if (FALSE) { [13:13:47.391] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:47.391] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:47.391] } [13:13:47.391] ...future.result <- base::tryCatch({ [13:13:47.391] base::withCallingHandlers({ [13:13:47.391] ...future.value <- base::withVisible(base::local({ [13:13:47.391] ...future.makeSendCondition <- local({ [13:13:47.391] sendCondition <- NULL [13:13:47.391] function(frame = 1L) { [13:13:47.391] if (is.function(sendCondition)) [13:13:47.391] return(sendCondition) [13:13:47.391] ns <- getNamespace("parallel") [13:13:47.391] if (exists("sendData", mode = "function", [13:13:47.391] envir = ns)) { [13:13:47.391] parallel_sendData <- get("sendData", mode = "function", [13:13:47.391] envir = ns) [13:13:47.391] envir <- sys.frame(frame) [13:13:47.391] master <- NULL [13:13:47.391] while (!identical(envir, .GlobalEnv) && [13:13:47.391] !identical(envir, emptyenv())) { [13:13:47.391] if (exists("master", mode = "list", envir = envir, [13:13:47.391] inherits = FALSE)) { [13:13:47.391] master <- get("master", mode = "list", [13:13:47.391] envir = envir, inherits = FALSE) [13:13:47.391] if (inherits(master, c("SOCKnode", [13:13:47.391] "SOCK0node"))) { [13:13:47.391] sendCondition <<- function(cond) { [13:13:47.391] data <- list(type = "VALUE", value = cond, [13:13:47.391] success = TRUE) [13:13:47.391] parallel_sendData(master, data) [13:13:47.391] } [13:13:47.391] return(sendCondition) [13:13:47.391] } [13:13:47.391] } [13:13:47.391] frame <- frame + 1L [13:13:47.391] envir <- sys.frame(frame) [13:13:47.391] } [13:13:47.391] } [13:13:47.391] sendCondition <<- function(cond) NULL [13:13:47.391] } [13:13:47.391] }) [13:13:47.391] withCallingHandlers({ [13:13:47.391] { [13:13:47.391] do.call(function(...) { [13:13:47.391] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:47.391] if (!identical(...future.globals.maxSize.org, [13:13:47.391] ...future.globals.maxSize)) { [13:13:47.391] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:47.391] on.exit(options(oopts), add = TRUE) [13:13:47.391] } [13:13:47.391] { [13:13:47.391] lapply(seq_along(...future.elements_ii), [13:13:47.391] FUN = function(jj) { [13:13:47.391] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:47.391] ...future.FUN(...future.X_jj, ...) [13:13:47.391] }) [13:13:47.391] } [13:13:47.391] }, args = future.call.arguments) [13:13:47.391] } [13:13:47.391] }, immediateCondition = function(cond) { [13:13:47.391] sendCondition <- ...future.makeSendCondition() [13:13:47.391] sendCondition(cond) [13:13:47.391] muffleCondition <- function (cond, pattern = "^muffle") [13:13:47.391] { [13:13:47.391] inherits <- base::inherits [13:13:47.391] invokeRestart <- base::invokeRestart [13:13:47.391] is.null <- base::is.null [13:13:47.391] muffled <- FALSE [13:13:47.391] if (inherits(cond, "message")) { [13:13:47.391] muffled <- grepl(pattern, "muffleMessage") [13:13:47.391] if (muffled) [13:13:47.391] invokeRestart("muffleMessage") [13:13:47.391] } [13:13:47.391] else if (inherits(cond, "warning")) { [13:13:47.391] muffled <- grepl(pattern, "muffleWarning") [13:13:47.391] if (muffled) [13:13:47.391] invokeRestart("muffleWarning") [13:13:47.391] } [13:13:47.391] else if (inherits(cond, "condition")) { [13:13:47.391] if (!is.null(pattern)) { [13:13:47.391] computeRestarts <- base::computeRestarts [13:13:47.391] grepl <- base::grepl [13:13:47.391] restarts <- computeRestarts(cond) [13:13:47.391] for (restart in restarts) { [13:13:47.391] name <- restart$name [13:13:47.391] if (is.null(name)) [13:13:47.391] next [13:13:47.391] if (!grepl(pattern, name)) [13:13:47.391] next [13:13:47.391] invokeRestart(restart) [13:13:47.391] muffled <- TRUE [13:13:47.391] break [13:13:47.391] } [13:13:47.391] } [13:13:47.391] } [13:13:47.391] invisible(muffled) [13:13:47.391] } [13:13:47.391] muffleCondition(cond) [13:13:47.391] }) [13:13:47.391] })) [13:13:47.391] future::FutureResult(value = ...future.value$value, [13:13:47.391] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:47.391] ...future.rng), globalenv = if (FALSE) [13:13:47.391] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:47.391] ...future.globalenv.names)) [13:13:47.391] else NULL, started = ...future.startTime, version = "1.8") [13:13:47.391] }, condition = base::local({ [13:13:47.391] c <- base::c [13:13:47.391] inherits <- base::inherits [13:13:47.391] invokeRestart <- base::invokeRestart [13:13:47.391] length <- base::length [13:13:47.391] list <- base::list [13:13:47.391] seq.int <- base::seq.int [13:13:47.391] signalCondition <- base::signalCondition [13:13:47.391] sys.calls <- base::sys.calls [13:13:47.391] `[[` <- base::`[[` [13:13:47.391] `+` <- base::`+` [13:13:47.391] `<<-` <- base::`<<-` [13:13:47.391] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:47.391] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:47.391] 3L)] [13:13:47.391] } [13:13:47.391] function(cond) { [13:13:47.391] is_error <- inherits(cond, "error") [13:13:47.391] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:47.391] NULL) [13:13:47.391] if (is_error) { [13:13:47.391] sessionInformation <- function() { [13:13:47.391] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:47.391] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:47.391] search = base::search(), system = base::Sys.info()) [13:13:47.391] } [13:13:47.391] ...future.conditions[[length(...future.conditions) + [13:13:47.391] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:47.391] cond$call), session = sessionInformation(), [13:13:47.391] timestamp = base::Sys.time(), signaled = 0L) [13:13:47.391] signalCondition(cond) [13:13:47.391] } [13:13:47.391] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:47.391] "immediateCondition"))) { [13:13:47.391] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:47.391] ...future.conditions[[length(...future.conditions) + [13:13:47.391] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:47.391] if (TRUE && !signal) { [13:13:47.391] muffleCondition <- function (cond, pattern = "^muffle") [13:13:47.391] { [13:13:47.391] inherits <- base::inherits [13:13:47.391] invokeRestart <- base::invokeRestart [13:13:47.391] is.null <- base::is.null [13:13:47.391] muffled <- FALSE [13:13:47.391] if (inherits(cond, "message")) { [13:13:47.391] muffled <- grepl(pattern, "muffleMessage") [13:13:47.391] if (muffled) [13:13:47.391] invokeRestart("muffleMessage") [13:13:47.391] } [13:13:47.391] else if (inherits(cond, "warning")) { [13:13:47.391] muffled <- grepl(pattern, "muffleWarning") [13:13:47.391] if (muffled) [13:13:47.391] invokeRestart("muffleWarning") [13:13:47.391] } [13:13:47.391] else if (inherits(cond, "condition")) { [13:13:47.391] if (!is.null(pattern)) { [13:13:47.391] computeRestarts <- base::computeRestarts [13:13:47.391] grepl <- base::grepl [13:13:47.391] restarts <- computeRestarts(cond) [13:13:47.391] for (restart in restarts) { [13:13:47.391] name <- restart$name [13:13:47.391] if (is.null(name)) [13:13:47.391] next [13:13:47.391] if (!grepl(pattern, name)) [13:13:47.391] next [13:13:47.391] invokeRestart(restart) [13:13:47.391] muffled <- TRUE [13:13:47.391] break [13:13:47.391] } [13:13:47.391] } [13:13:47.391] } [13:13:47.391] invisible(muffled) [13:13:47.391] } [13:13:47.391] muffleCondition(cond, pattern = "^muffle") [13:13:47.391] } [13:13:47.391] } [13:13:47.391] else { [13:13:47.391] if (TRUE) { [13:13:47.391] muffleCondition <- function (cond, pattern = "^muffle") [13:13:47.391] { [13:13:47.391] inherits <- base::inherits [13:13:47.391] invokeRestart <- base::invokeRestart [13:13:47.391] is.null <- base::is.null [13:13:47.391] muffled <- FALSE [13:13:47.391] if (inherits(cond, "message")) { [13:13:47.391] muffled <- grepl(pattern, "muffleMessage") [13:13:47.391] if (muffled) [13:13:47.391] invokeRestart("muffleMessage") [13:13:47.391] } [13:13:47.391] else if (inherits(cond, "warning")) { [13:13:47.391] muffled <- grepl(pattern, "muffleWarning") [13:13:47.391] if (muffled) [13:13:47.391] invokeRestart("muffleWarning") [13:13:47.391] } [13:13:47.391] else if (inherits(cond, "condition")) { [13:13:47.391] if (!is.null(pattern)) { [13:13:47.391] computeRestarts <- base::computeRestarts [13:13:47.391] grepl <- base::grepl [13:13:47.391] restarts <- computeRestarts(cond) [13:13:47.391] for (restart in restarts) { [13:13:47.391] name <- restart$name [13:13:47.391] if (is.null(name)) [13:13:47.391] next [13:13:47.391] if (!grepl(pattern, name)) [13:13:47.391] next [13:13:47.391] invokeRestart(restart) [13:13:47.391] muffled <- TRUE [13:13:47.391] break [13:13:47.391] } [13:13:47.391] } [13:13:47.391] } [13:13:47.391] invisible(muffled) [13:13:47.391] } [13:13:47.391] muffleCondition(cond, pattern = "^muffle") [13:13:47.391] } [13:13:47.391] } [13:13:47.391] } [13:13:47.391] })) [13:13:47.391] }, error = function(ex) { [13:13:47.391] base::structure(base::list(value = NULL, visible = NULL, [13:13:47.391] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:47.391] ...future.rng), started = ...future.startTime, [13:13:47.391] finished = Sys.time(), session_uuid = NA_character_, [13:13:47.391] version = "1.8"), class = "FutureResult") [13:13:47.391] }, finally = { [13:13:47.391] if (!identical(...future.workdir, getwd())) [13:13:47.391] setwd(...future.workdir) [13:13:47.391] { [13:13:47.391] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:47.391] ...future.oldOptions$nwarnings <- NULL [13:13:47.391] } [13:13:47.391] base::options(...future.oldOptions) [13:13:47.391] if (.Platform$OS.type == "windows") { [13:13:47.391] old_names <- names(...future.oldEnvVars) [13:13:47.391] envs <- base::Sys.getenv() [13:13:47.391] names <- names(envs) [13:13:47.391] common <- intersect(names, old_names) [13:13:47.391] added <- setdiff(names, old_names) [13:13:47.391] removed <- setdiff(old_names, names) [13:13:47.391] changed <- common[...future.oldEnvVars[common] != [13:13:47.391] envs[common]] [13:13:47.391] NAMES <- toupper(changed) [13:13:47.391] args <- list() [13:13:47.391] for (kk in seq_along(NAMES)) { [13:13:47.391] name <- changed[[kk]] [13:13:47.391] NAME <- NAMES[[kk]] [13:13:47.391] if (name != NAME && is.element(NAME, old_names)) [13:13:47.391] next [13:13:47.391] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:47.391] } [13:13:47.391] NAMES <- toupper(added) [13:13:47.391] for (kk in seq_along(NAMES)) { [13:13:47.391] name <- added[[kk]] [13:13:47.391] NAME <- NAMES[[kk]] [13:13:47.391] if (name != NAME && is.element(NAME, old_names)) [13:13:47.391] next [13:13:47.391] args[[name]] <- "" [13:13:47.391] } [13:13:47.391] NAMES <- toupper(removed) [13:13:47.391] for (kk in seq_along(NAMES)) { [13:13:47.391] name <- removed[[kk]] [13:13:47.391] NAME <- NAMES[[kk]] [13:13:47.391] if (name != NAME && is.element(NAME, old_names)) [13:13:47.391] next [13:13:47.391] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:47.391] } [13:13:47.391] if (length(args) > 0) [13:13:47.391] base::do.call(base::Sys.setenv, args = args) [13:13:47.391] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:47.391] } [13:13:47.391] else { [13:13:47.391] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:47.391] } [13:13:47.391] { [13:13:47.391] if (base::length(...future.futureOptionsAdded) > [13:13:47.391] 0L) { [13:13:47.391] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:47.391] base::names(opts) <- ...future.futureOptionsAdded [13:13:47.391] base::options(opts) [13:13:47.391] } [13:13:47.391] { [13:13:47.391] { [13:13:47.391] base::options(mc.cores = ...future.mc.cores.old) [13:13:47.391] NULL [13:13:47.391] } [13:13:47.391] options(future.plan = NULL) [13:13:47.391] if (is.na(NA_character_)) [13:13:47.391] Sys.unsetenv("R_FUTURE_PLAN") [13:13:47.391] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:47.391] future::plan(list(function (..., workers = availableCores(), [13:13:47.391] lazy = FALSE, rscript_libs = .libPaths(), [13:13:47.391] envir = parent.frame()) [13:13:47.391] { [13:13:47.391] if (is.function(workers)) [13:13:47.391] workers <- workers() [13:13:47.391] workers <- structure(as.integer(workers), [13:13:47.391] class = class(workers)) [13:13:47.391] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:47.391] workers >= 1) [13:13:47.391] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:47.391] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:47.391] } [13:13:47.391] future <- MultisessionFuture(..., workers = workers, [13:13:47.391] lazy = lazy, rscript_libs = rscript_libs, [13:13:47.391] envir = envir) [13:13:47.391] if (!future$lazy) [13:13:47.391] future <- run(future) [13:13:47.391] invisible(future) [13:13:47.391] }), .cleanup = FALSE, .init = FALSE) [13:13:47.391] } [13:13:47.391] } [13:13:47.391] } [13:13:47.391] }) [13:13:47.391] if (TRUE) { [13:13:47.391] base::sink(type = "output", split = FALSE) [13:13:47.391] if (TRUE) { [13:13:47.391] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:47.391] } [13:13:47.391] else { [13:13:47.391] ...future.result["stdout"] <- base::list(NULL) [13:13:47.391] } [13:13:47.391] base::close(...future.stdout) [13:13:47.391] ...future.stdout <- NULL [13:13:47.391] } [13:13:47.391] ...future.result$conditions <- ...future.conditions [13:13:47.391] ...future.result$finished <- base::Sys.time() [13:13:47.391] ...future.result [13:13:47.391] } [13:13:47.396] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... [13:13:47.396] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... [13:13:47.397] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... DONE [13:13:47.397] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... [13:13:47.398] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... DONE [13:13:47.398] Exporting '...future.elements_ii' (224 bytes) to cluster node #1 ... [13:13:47.398] Exporting '...future.elements_ii' (224 bytes) to cluster node #1 ... DONE [13:13:47.398] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:13:47.399] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:13:47.399] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:13:47.399] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:13:47.400] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... DONE [13:13:47.400] MultisessionFuture started [13:13:47.400] - Launch lazy future ... done [13:13:47.401] run() for 'MultisessionFuture' ... done [13:13:47.401] Created future: [13:13:47.417] receiveMessageFromWorker() for ClusterFuture ... [13:13:47.417] - Validating connection of MultisessionFuture [13:13:47.417] - received message: FutureResult [13:13:47.417] - Received FutureResult [13:13:47.418] - Erased future from FutureRegistry [13:13:47.418] result() for ClusterFuture ... [13:13:47.418] - result already collected: FutureResult [13:13:47.418] result() for ClusterFuture ... done [13:13:47.418] receiveMessageFromWorker() for ClusterFuture ... done [13:13:47.401] MultisessionFuture: [13:13:47.401] Label: 'future_lapply-2' [13:13:47.401] Expression: [13:13:47.401] { [13:13:47.401] do.call(function(...) { [13:13:47.401] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:47.401] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:47.401] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:47.401] on.exit(options(oopts), add = TRUE) [13:13:47.401] } [13:13:47.401] { [13:13:47.401] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:47.401] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:47.401] ...future.FUN(...future.X_jj, ...) [13:13:47.401] }) [13:13:47.401] } [13:13:47.401] }, args = future.call.arguments) [13:13:47.401] } [13:13:47.401] Lazy evaluation: FALSE [13:13:47.401] Asynchronous evaluation: TRUE [13:13:47.401] Local evaluation: TRUE [13:13:47.401] Environment: R_GlobalEnv [13:13:47.401] Capture standard output: TRUE [13:13:47.401] Capture condition classes: 'condition' (excluding 'nothing') [13:13:47.401] 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) [13:13:47.401] Packages: [13:13:47.401] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:47.401] Resolved: TRUE [13:13:47.401] Value: [13:13:47.401] Conditions captured: [13:13:47.401] Early signaling: FALSE [13:13:47.401] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:47.401] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:47.419] Chunk #2 of 2 ... DONE [13:13:47.419] Launching 2 futures (chunks) ... DONE [13:13:47.419] Resolving 2 futures (chunks) ... [13:13:47.419] resolve() on list ... [13:13:47.419] recursive: 0 [13:13:47.419] length: 2 [13:13:47.420] [13:13:47.420] Future #1 [13:13:47.420] result() for ClusterFuture ... [13:13:47.420] - result already collected: FutureResult [13:13:47.420] result() for ClusterFuture ... done [13:13:47.420] result() for ClusterFuture ... [13:13:47.421] - result already collected: FutureResult [13:13:47.421] result() for ClusterFuture ... done [13:13:47.421] signalConditionsASAP(MultisessionFuture, pos=1) ... [13:13:47.421] - nx: 2 [13:13:47.421] - relay: TRUE [13:13:47.421] - stdout: TRUE [13:13:47.421] - signal: TRUE [13:13:47.422] - resignal: FALSE [13:13:47.422] - force: TRUE [13:13:47.422] - relayed: [n=2] FALSE, FALSE [13:13:47.422] - queued futures: [n=2] FALSE, FALSE [13:13:47.422] - until=1 [13:13:47.422] - relaying element #1 [13:13:47.423] result() for ClusterFuture ... [13:13:47.423] - result already collected: FutureResult [13:13:47.423] result() for ClusterFuture ... done [13:13:47.423] result() for ClusterFuture ... [13:13:47.423] - result already collected: FutureResult [13:13:47.423] result() for ClusterFuture ... done [13:13:47.424] result() for ClusterFuture ... [13:13:47.424] - result already collected: FutureResult [13:13:47.424] result() for ClusterFuture ... done [13:13:47.424] result() for ClusterFuture ... [13:13:47.424] - result already collected: FutureResult [13:13:47.424] result() for ClusterFuture ... done [13:13:47.424] - relayed: [n=2] TRUE, FALSE [13:13:47.425] - queued futures: [n=2] TRUE, FALSE [13:13:47.425] signalConditionsASAP(MultisessionFuture, pos=1) ... done [13:13:47.425] length: 1 (resolved future 1) [13:13:47.425] Future #2 [13:13:47.425] result() for ClusterFuture ... [13:13:47.425] - result already collected: FutureResult [13:13:47.426] result() for ClusterFuture ... done [13:13:47.426] result() for ClusterFuture ... [13:13:47.426] - result already collected: FutureResult [13:13:47.426] result() for ClusterFuture ... done [13:13:47.426] signalConditionsASAP(MultisessionFuture, pos=2) ... [13:13:47.426] - nx: 2 [13:13:47.427] - relay: TRUE [13:13:47.427] - stdout: TRUE [13:13:47.427] - signal: TRUE [13:13:47.427] - resignal: FALSE [13:13:47.427] - force: TRUE [13:13:47.427] - relayed: [n=2] TRUE, FALSE [13:13:47.427] - queued futures: [n=2] TRUE, FALSE [13:13:47.428] - until=2 [13:13:47.428] - relaying element #2 [13:13:47.428] result() for ClusterFuture ... [13:13:47.428] - result already collected: FutureResult [13:13:47.428] result() for ClusterFuture ... done [13:13:47.428] result() for ClusterFuture ... [13:13:47.429] - result already collected: FutureResult [13:13:47.429] result() for ClusterFuture ... done [13:13:47.429] result() for ClusterFuture ... [13:13:47.429] - result already collected: FutureResult [13:13:47.429] result() for ClusterFuture ... done [13:13:47.430] result() for ClusterFuture ... [13:13:47.430] - result already collected: FutureResult [13:13:47.430] result() for ClusterFuture ... done [13:13:47.430] - relayed: [n=2] TRUE, TRUE [13:13:47.430] - queued futures: [n=2] TRUE, TRUE [13:13:47.430] signalConditionsASAP(MultisessionFuture, pos=2) ... done [13:13:47.430] length: 0 (resolved future 2) [13:13:47.431] Relaying remaining futures [13:13:47.431] signalConditionsASAP(NULL, pos=0) ... [13:13:47.431] - nx: 2 [13:13:47.431] - relay: TRUE [13:13:47.431] - stdout: TRUE [13:13:47.431] - signal: TRUE [13:13:47.432] - resignal: FALSE [13:13:47.432] - force: TRUE [13:13:47.432] - relayed: [n=2] TRUE, TRUE [13:13:47.432] - queued futures: [n=2] TRUE, TRUE - flush all [13:13:47.432] - relayed: [n=2] TRUE, TRUE [13:13:47.432] - queued futures: [n=2] TRUE, TRUE [13:13:47.433] signalConditionsASAP(NULL, pos=0) ... done [13:13:47.433] resolve() on list ... DONE [13:13:47.433] result() for ClusterFuture ... [13:13:47.433] - result already collected: FutureResult [13:13:47.433] result() for ClusterFuture ... done [13:13:47.433] result() for ClusterFuture ... [13:13:47.433] - result already collected: FutureResult [13:13:47.434] result() for ClusterFuture ... done [13:13:47.434] result() for ClusterFuture ... [13:13:47.434] - result already collected: FutureResult [13:13:47.434] result() for ClusterFuture ... done [13:13:47.434] result() for ClusterFuture ... [13:13:47.434] - result already collected: FutureResult [13:13:47.435] result() for ClusterFuture ... done [13:13:47.435] - Number of value chunks collected: 2 [13:13:47.435] Resolving 2 futures (chunks) ... DONE [13:13:47.435] Reducing values from 2 chunks ... [13:13:47.435] - Number of values collected after concatenation: 4 [13:13:47.435] - Number of values expected: 4 [13:13:47.436] Reverse index remapping (attribute 'ordering'): [n = 4] 4, 3, 2, 1 [13:13:47.436] Reducing values from 2 chunks ... DONE [13:13:47.436] 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 [13:13:47.438] future_lapply() ... [13:13:47.441] Number of chunks: 2 [13:13:47.442] Index remapping (attribute 'ordering'): [n = 4] 4, 3, 2, 1 [13:13:47.442] getGlobalsAndPackagesXApply() ... [13:13:47.442] - future.globals: TRUE [13:13:47.442] getGlobalsAndPackages() ... [13:13:47.442] Searching for globals... [13:13:47.444] - globals found: [2] 'FUN', '.Internal' [13:13:47.444] Searching for globals ... DONE [13:13:47.444] Resolving globals: FALSE [13:13:47.444] The total size of the 1 globals is 2.13 KiB (2184 bytes) [13:13:47.445] 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') [13:13:47.445] - globals: [1] 'FUN' [13:13:47.445] [13:13:47.445] getGlobalsAndPackages() ... DONE [13:13:47.446] - globals found/used: [n=1] 'FUN' [13:13:47.446] - needed namespaces: [n=0] [13:13:47.446] Finding globals ... DONE [13:13:47.446] - use_args: TRUE [13:13:47.446] - Getting '...' globals ... [13:13:47.447] resolve() on list ... [13:13:47.447] recursive: 0 [13:13:47.447] length: 1 [13:13:47.447] elements: '...' [13:13:47.447] length: 0 (resolved future 1) [13:13:47.448] resolve() on list ... DONE [13:13:47.448] - '...' content: [n=1] 'length' [13:13:47.448] List of 1 [13:13:47.448] $ ...:List of 1 [13:13:47.448] ..$ length: int 2 [13:13:47.448] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:47.448] - attr(*, "where")=List of 1 [13:13:47.448] ..$ ...: [13:13:47.448] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:47.448] - attr(*, "resolved")= logi TRUE [13:13:47.448] - attr(*, "total_size")= num NA [13:13:47.454] - Getting '...' globals ... DONE [13:13:47.454] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:47.454] List of 2 [13:13:47.454] $ ...future.FUN:function (mode = "logical", length = 0L) [13:13:47.454] $ ... :List of 1 [13:13:47.454] ..$ length: int 2 [13:13:47.454] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:47.454] - attr(*, "where")=List of 2 [13:13:47.454] ..$ ...future.FUN: [13:13:47.454] ..$ ... : [13:13:47.454] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:47.454] - attr(*, "resolved")= logi FALSE [13:13:47.454] - attr(*, "total_size")= num 2240 [13:13:47.458] Packages to be attached in all futures: [n=0] [13:13:47.458] getGlobalsAndPackagesXApply() ... DONE [13:13:47.458] Number of futures (= number of chunks): 2 [13:13:47.458] Launching 2 futures (chunks) ... [13:13:47.459] Chunk #1 of 2 ... [13:13:47.459] - Finding globals in 'X' for chunk #1 ... [13:13:47.459] getGlobalsAndPackages() ... [13:13:47.459] Searching for globals... [13:13:47.459] [13:13:47.460] Searching for globals ... DONE [13:13:47.460] - globals: [0] [13:13:47.460] getGlobalsAndPackages() ... DONE [13:13:47.460] + additional globals found: [n=0] [13:13:47.460] + additional namespaces needed: [n=0] [13:13:47.460] - Finding globals in 'X' for chunk #1 ... DONE [13:13:47.461] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:13:47.461] - seeds: [13:13:47.461] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:47.461] getGlobalsAndPackages() ... [13:13:47.461] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:47.461] Resolving globals: FALSE [13:13:47.462] Tweak future expression to call with '...' arguments ... [13:13:47.462] { [13:13:47.462] do.call(function(...) { [13:13:47.462] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:47.462] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:47.462] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:47.462] on.exit(options(oopts), add = TRUE) [13:13:47.462] } [13:13:47.462] { [13:13:47.462] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:47.462] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:47.462] ...future.FUN(...future.X_jj, ...) [13:13:47.462] }) [13:13:47.462] } [13:13:47.462] }, args = future.call.arguments) [13:13:47.462] } [13:13:47.462] Tweak future expression to call with '...' arguments ... DONE [13:13:47.463] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:47.463] [13:13:47.463] getGlobalsAndPackages() ... DONE [13:13:47.463] run() for 'Future' ... [13:13:47.464] - state: 'created' [13:13:47.464] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:47.477] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:47.478] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:13:47.478] - Field: 'node' [13:13:47.478] - Field: 'label' [13:13:47.478] - Field: 'local' [13:13:47.478] - Field: 'owner' [13:13:47.479] - Field: 'envir' [13:13:47.479] - Field: 'workers' [13:13:47.479] - Field: 'packages' [13:13:47.479] - Field: 'gc' [13:13:47.479] - Field: 'conditions' [13:13:47.479] - Field: 'persistent' [13:13:47.480] - Field: 'expr' [13:13:47.480] - Field: 'uuid' [13:13:47.480] - Field: 'seed' [13:13:47.480] - Field: 'version' [13:13:47.480] - Field: 'result' [13:13:47.480] - Field: 'asynchronous' [13:13:47.481] - Field: 'calls' [13:13:47.481] - Field: 'globals' [13:13:47.481] - Field: 'stdout' [13:13:47.481] - Field: 'earlySignal' [13:13:47.481] - Field: 'lazy' [13:13:47.481] - Field: 'state' [13:13:47.482] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:13:47.482] - Launch lazy future ... [13:13:47.482] Packages needed by the future expression (n = 0): [13:13:47.482] Packages needed by future strategies (n = 0): [13:13:47.483] { [13:13:47.483] { [13:13:47.483] { [13:13:47.483] ...future.startTime <- base::Sys.time() [13:13:47.483] { [13:13:47.483] { [13:13:47.483] { [13:13:47.483] { [13:13:47.483] base::local({ [13:13:47.483] has_future <- base::requireNamespace("future", [13:13:47.483] quietly = TRUE) [13:13:47.483] if (has_future) { [13:13:47.483] ns <- base::getNamespace("future") [13:13:47.483] version <- ns[[".package"]][["version"]] [13:13:47.483] if (is.null(version)) [13:13:47.483] version <- utils::packageVersion("future") [13:13:47.483] } [13:13:47.483] else { [13:13:47.483] version <- NULL [13:13:47.483] } [13:13:47.483] if (!has_future || version < "1.8.0") { [13:13:47.483] info <- base::c(r_version = base::gsub("R version ", [13:13:47.483] "", base::R.version$version.string), [13:13:47.483] platform = base::sprintf("%s (%s-bit)", [13:13:47.483] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:47.483] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:47.483] "release", "version")], collapse = " "), [13:13:47.483] hostname = base::Sys.info()[["nodename"]]) [13:13:47.483] info <- base::sprintf("%s: %s", base::names(info), [13:13:47.483] info) [13:13:47.483] info <- base::paste(info, collapse = "; ") [13:13:47.483] if (!has_future) { [13:13:47.483] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:47.483] info) [13:13:47.483] } [13:13:47.483] else { [13:13:47.483] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:47.483] info, version) [13:13:47.483] } [13:13:47.483] base::stop(msg) [13:13:47.483] } [13:13:47.483] }) [13:13:47.483] } [13:13:47.483] ...future.mc.cores.old <- base::getOption("mc.cores") [13:13:47.483] base::options(mc.cores = 1L) [13:13:47.483] } [13:13:47.483] options(future.plan = NULL) [13:13:47.483] Sys.unsetenv("R_FUTURE_PLAN") [13:13:47.483] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:47.483] } [13:13:47.483] ...future.workdir <- getwd() [13:13:47.483] } [13:13:47.483] ...future.oldOptions <- base::as.list(base::.Options) [13:13:47.483] ...future.oldEnvVars <- base::Sys.getenv() [13:13:47.483] } [13:13:47.483] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:47.483] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:13:47.483] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:47.483] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:47.483] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:47.483] future.stdout.windows.reencode = NULL, width = 80L) [13:13:47.483] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:47.483] base::names(...future.oldOptions)) [13:13:47.483] } [13:13:47.483] if (FALSE) { [13:13:47.483] } [13:13:47.483] else { [13:13:47.483] if (TRUE) { [13:13:47.483] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:47.483] open = "w") [13:13:47.483] } [13:13:47.483] else { [13:13:47.483] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:47.483] windows = "NUL", "/dev/null"), open = "w") [13:13:47.483] } [13:13:47.483] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:47.483] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:47.483] base::sink(type = "output", split = FALSE) [13:13:47.483] base::close(...future.stdout) [13:13:47.483] }, add = TRUE) [13:13:47.483] } [13:13:47.483] ...future.frame <- base::sys.nframe() [13:13:47.483] ...future.conditions <- base::list() [13:13:47.483] ...future.rng <- base::globalenv()$.Random.seed [13:13:47.483] if (FALSE) { [13:13:47.483] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:47.483] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:47.483] } [13:13:47.483] ...future.result <- base::tryCatch({ [13:13:47.483] base::withCallingHandlers({ [13:13:47.483] ...future.value <- base::withVisible(base::local({ [13:13:47.483] ...future.makeSendCondition <- local({ [13:13:47.483] sendCondition <- NULL [13:13:47.483] function(frame = 1L) { [13:13:47.483] if (is.function(sendCondition)) [13:13:47.483] return(sendCondition) [13:13:47.483] ns <- getNamespace("parallel") [13:13:47.483] if (exists("sendData", mode = "function", [13:13:47.483] envir = ns)) { [13:13:47.483] parallel_sendData <- get("sendData", mode = "function", [13:13:47.483] envir = ns) [13:13:47.483] envir <- sys.frame(frame) [13:13:47.483] master <- NULL [13:13:47.483] while (!identical(envir, .GlobalEnv) && [13:13:47.483] !identical(envir, emptyenv())) { [13:13:47.483] if (exists("master", mode = "list", envir = envir, [13:13:47.483] inherits = FALSE)) { [13:13:47.483] master <- get("master", mode = "list", [13:13:47.483] envir = envir, inherits = FALSE) [13:13:47.483] if (inherits(master, c("SOCKnode", [13:13:47.483] "SOCK0node"))) { [13:13:47.483] sendCondition <<- function(cond) { [13:13:47.483] data <- list(type = "VALUE", value = cond, [13:13:47.483] success = TRUE) [13:13:47.483] parallel_sendData(master, data) [13:13:47.483] } [13:13:47.483] return(sendCondition) [13:13:47.483] } [13:13:47.483] } [13:13:47.483] frame <- frame + 1L [13:13:47.483] envir <- sys.frame(frame) [13:13:47.483] } [13:13:47.483] } [13:13:47.483] sendCondition <<- function(cond) NULL [13:13:47.483] } [13:13:47.483] }) [13:13:47.483] withCallingHandlers({ [13:13:47.483] { [13:13:47.483] do.call(function(...) { [13:13:47.483] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:47.483] if (!identical(...future.globals.maxSize.org, [13:13:47.483] ...future.globals.maxSize)) { [13:13:47.483] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:47.483] on.exit(options(oopts), add = TRUE) [13:13:47.483] } [13:13:47.483] { [13:13:47.483] lapply(seq_along(...future.elements_ii), [13:13:47.483] FUN = function(jj) { [13:13:47.483] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:47.483] ...future.FUN(...future.X_jj, ...) [13:13:47.483] }) [13:13:47.483] } [13:13:47.483] }, args = future.call.arguments) [13:13:47.483] } [13:13:47.483] }, immediateCondition = function(cond) { [13:13:47.483] sendCondition <- ...future.makeSendCondition() [13:13:47.483] sendCondition(cond) [13:13:47.483] muffleCondition <- function (cond, pattern = "^muffle") [13:13:47.483] { [13:13:47.483] inherits <- base::inherits [13:13:47.483] invokeRestart <- base::invokeRestart [13:13:47.483] is.null <- base::is.null [13:13:47.483] muffled <- FALSE [13:13:47.483] if (inherits(cond, "message")) { [13:13:47.483] muffled <- grepl(pattern, "muffleMessage") [13:13:47.483] if (muffled) [13:13:47.483] invokeRestart("muffleMessage") [13:13:47.483] } [13:13:47.483] else if (inherits(cond, "warning")) { [13:13:47.483] muffled <- grepl(pattern, "muffleWarning") [13:13:47.483] if (muffled) [13:13:47.483] invokeRestart("muffleWarning") [13:13:47.483] } [13:13:47.483] else if (inherits(cond, "condition")) { [13:13:47.483] if (!is.null(pattern)) { [13:13:47.483] computeRestarts <- base::computeRestarts [13:13:47.483] grepl <- base::grepl [13:13:47.483] restarts <- computeRestarts(cond) [13:13:47.483] for (restart in restarts) { [13:13:47.483] name <- restart$name [13:13:47.483] if (is.null(name)) [13:13:47.483] next [13:13:47.483] if (!grepl(pattern, name)) [13:13:47.483] next [13:13:47.483] invokeRestart(restart) [13:13:47.483] muffled <- TRUE [13:13:47.483] break [13:13:47.483] } [13:13:47.483] } [13:13:47.483] } [13:13:47.483] invisible(muffled) [13:13:47.483] } [13:13:47.483] muffleCondition(cond) [13:13:47.483] }) [13:13:47.483] })) [13:13:47.483] future::FutureResult(value = ...future.value$value, [13:13:47.483] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:47.483] ...future.rng), globalenv = if (FALSE) [13:13:47.483] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:47.483] ...future.globalenv.names)) [13:13:47.483] else NULL, started = ...future.startTime, version = "1.8") [13:13:47.483] }, condition = base::local({ [13:13:47.483] c <- base::c [13:13:47.483] inherits <- base::inherits [13:13:47.483] invokeRestart <- base::invokeRestart [13:13:47.483] length <- base::length [13:13:47.483] list <- base::list [13:13:47.483] seq.int <- base::seq.int [13:13:47.483] signalCondition <- base::signalCondition [13:13:47.483] sys.calls <- base::sys.calls [13:13:47.483] `[[` <- base::`[[` [13:13:47.483] `+` <- base::`+` [13:13:47.483] `<<-` <- base::`<<-` [13:13:47.483] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:47.483] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:47.483] 3L)] [13:13:47.483] } [13:13:47.483] function(cond) { [13:13:47.483] is_error <- inherits(cond, "error") [13:13:47.483] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:47.483] NULL) [13:13:47.483] if (is_error) { [13:13:47.483] sessionInformation <- function() { [13:13:47.483] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:47.483] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:47.483] search = base::search(), system = base::Sys.info()) [13:13:47.483] } [13:13:47.483] ...future.conditions[[length(...future.conditions) + [13:13:47.483] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:47.483] cond$call), session = sessionInformation(), [13:13:47.483] timestamp = base::Sys.time(), signaled = 0L) [13:13:47.483] signalCondition(cond) [13:13:47.483] } [13:13:47.483] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:47.483] "immediateCondition"))) { [13:13:47.483] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:47.483] ...future.conditions[[length(...future.conditions) + [13:13:47.483] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:47.483] if (TRUE && !signal) { [13:13:47.483] muffleCondition <- function (cond, pattern = "^muffle") [13:13:47.483] { [13:13:47.483] inherits <- base::inherits [13:13:47.483] invokeRestart <- base::invokeRestart [13:13:47.483] is.null <- base::is.null [13:13:47.483] muffled <- FALSE [13:13:47.483] if (inherits(cond, "message")) { [13:13:47.483] muffled <- grepl(pattern, "muffleMessage") [13:13:47.483] if (muffled) [13:13:47.483] invokeRestart("muffleMessage") [13:13:47.483] } [13:13:47.483] else if (inherits(cond, "warning")) { [13:13:47.483] muffled <- grepl(pattern, "muffleWarning") [13:13:47.483] if (muffled) [13:13:47.483] invokeRestart("muffleWarning") [13:13:47.483] } [13:13:47.483] else if (inherits(cond, "condition")) { [13:13:47.483] if (!is.null(pattern)) { [13:13:47.483] computeRestarts <- base::computeRestarts [13:13:47.483] grepl <- base::grepl [13:13:47.483] restarts <- computeRestarts(cond) [13:13:47.483] for (restart in restarts) { [13:13:47.483] name <- restart$name [13:13:47.483] if (is.null(name)) [13:13:47.483] next [13:13:47.483] if (!grepl(pattern, name)) [13:13:47.483] next [13:13:47.483] invokeRestart(restart) [13:13:47.483] muffled <- TRUE [13:13:47.483] break [13:13:47.483] } [13:13:47.483] } [13:13:47.483] } [13:13:47.483] invisible(muffled) [13:13:47.483] } [13:13:47.483] muffleCondition(cond, pattern = "^muffle") [13:13:47.483] } [13:13:47.483] } [13:13:47.483] else { [13:13:47.483] if (TRUE) { [13:13:47.483] muffleCondition <- function (cond, pattern = "^muffle") [13:13:47.483] { [13:13:47.483] inherits <- base::inherits [13:13:47.483] invokeRestart <- base::invokeRestart [13:13:47.483] is.null <- base::is.null [13:13:47.483] muffled <- FALSE [13:13:47.483] if (inherits(cond, "message")) { [13:13:47.483] muffled <- grepl(pattern, "muffleMessage") [13:13:47.483] if (muffled) [13:13:47.483] invokeRestart("muffleMessage") [13:13:47.483] } [13:13:47.483] else if (inherits(cond, "warning")) { [13:13:47.483] muffled <- grepl(pattern, "muffleWarning") [13:13:47.483] if (muffled) [13:13:47.483] invokeRestart("muffleWarning") [13:13:47.483] } [13:13:47.483] else if (inherits(cond, "condition")) { [13:13:47.483] if (!is.null(pattern)) { [13:13:47.483] computeRestarts <- base::computeRestarts [13:13:47.483] grepl <- base::grepl [13:13:47.483] restarts <- computeRestarts(cond) [13:13:47.483] for (restart in restarts) { [13:13:47.483] name <- restart$name [13:13:47.483] if (is.null(name)) [13:13:47.483] next [13:13:47.483] if (!grepl(pattern, name)) [13:13:47.483] next [13:13:47.483] invokeRestart(restart) [13:13:47.483] muffled <- TRUE [13:13:47.483] break [13:13:47.483] } [13:13:47.483] } [13:13:47.483] } [13:13:47.483] invisible(muffled) [13:13:47.483] } [13:13:47.483] muffleCondition(cond, pattern = "^muffle") [13:13:47.483] } [13:13:47.483] } [13:13:47.483] } [13:13:47.483] })) [13:13:47.483] }, error = function(ex) { [13:13:47.483] base::structure(base::list(value = NULL, visible = NULL, [13:13:47.483] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:47.483] ...future.rng), started = ...future.startTime, [13:13:47.483] finished = Sys.time(), session_uuid = NA_character_, [13:13:47.483] version = "1.8"), class = "FutureResult") [13:13:47.483] }, finally = { [13:13:47.483] if (!identical(...future.workdir, getwd())) [13:13:47.483] setwd(...future.workdir) [13:13:47.483] { [13:13:47.483] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:47.483] ...future.oldOptions$nwarnings <- NULL [13:13:47.483] } [13:13:47.483] base::options(...future.oldOptions) [13:13:47.483] if (.Platform$OS.type == "windows") { [13:13:47.483] old_names <- names(...future.oldEnvVars) [13:13:47.483] envs <- base::Sys.getenv() [13:13:47.483] names <- names(envs) [13:13:47.483] common <- intersect(names, old_names) [13:13:47.483] added <- setdiff(names, old_names) [13:13:47.483] removed <- setdiff(old_names, names) [13:13:47.483] changed <- common[...future.oldEnvVars[common] != [13:13:47.483] envs[common]] [13:13:47.483] NAMES <- toupper(changed) [13:13:47.483] args <- list() [13:13:47.483] for (kk in seq_along(NAMES)) { [13:13:47.483] name <- changed[[kk]] [13:13:47.483] NAME <- NAMES[[kk]] [13:13:47.483] if (name != NAME && is.element(NAME, old_names)) [13:13:47.483] next [13:13:47.483] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:47.483] } [13:13:47.483] NAMES <- toupper(added) [13:13:47.483] for (kk in seq_along(NAMES)) { [13:13:47.483] name <- added[[kk]] [13:13:47.483] NAME <- NAMES[[kk]] [13:13:47.483] if (name != NAME && is.element(NAME, old_names)) [13:13:47.483] next [13:13:47.483] args[[name]] <- "" [13:13:47.483] } [13:13:47.483] NAMES <- toupper(removed) [13:13:47.483] for (kk in seq_along(NAMES)) { [13:13:47.483] name <- removed[[kk]] [13:13:47.483] NAME <- NAMES[[kk]] [13:13:47.483] if (name != NAME && is.element(NAME, old_names)) [13:13:47.483] next [13:13:47.483] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:47.483] } [13:13:47.483] if (length(args) > 0) [13:13:47.483] base::do.call(base::Sys.setenv, args = args) [13:13:47.483] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:47.483] } [13:13:47.483] else { [13:13:47.483] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:47.483] } [13:13:47.483] { [13:13:47.483] if (base::length(...future.futureOptionsAdded) > [13:13:47.483] 0L) { [13:13:47.483] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:47.483] base::names(opts) <- ...future.futureOptionsAdded [13:13:47.483] base::options(opts) [13:13:47.483] } [13:13:47.483] { [13:13:47.483] { [13:13:47.483] base::options(mc.cores = ...future.mc.cores.old) [13:13:47.483] NULL [13:13:47.483] } [13:13:47.483] options(future.plan = NULL) [13:13:47.483] if (is.na(NA_character_)) [13:13:47.483] Sys.unsetenv("R_FUTURE_PLAN") [13:13:47.483] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:47.483] future::plan(list(function (..., workers = availableCores(), [13:13:47.483] lazy = FALSE, rscript_libs = .libPaths(), [13:13:47.483] envir = parent.frame()) [13:13:47.483] { [13:13:47.483] if (is.function(workers)) [13:13:47.483] workers <- workers() [13:13:47.483] workers <- structure(as.integer(workers), [13:13:47.483] class = class(workers)) [13:13:47.483] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:47.483] workers >= 1) [13:13:47.483] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:47.483] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:47.483] } [13:13:47.483] future <- MultisessionFuture(..., workers = workers, [13:13:47.483] lazy = lazy, rscript_libs = rscript_libs, [13:13:47.483] envir = envir) [13:13:47.483] if (!future$lazy) [13:13:47.483] future <- run(future) [13:13:47.483] invisible(future) [13:13:47.483] }), .cleanup = FALSE, .init = FALSE) [13:13:47.483] } [13:13:47.483] } [13:13:47.483] } [13:13:47.483] }) [13:13:47.483] if (TRUE) { [13:13:47.483] base::sink(type = "output", split = FALSE) [13:13:47.483] if (TRUE) { [13:13:47.483] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:47.483] } [13:13:47.483] else { [13:13:47.483] ...future.result["stdout"] <- base::list(NULL) [13:13:47.483] } [13:13:47.483] base::close(...future.stdout) [13:13:47.483] ...future.stdout <- NULL [13:13:47.483] } [13:13:47.483] ...future.result$conditions <- ...future.conditions [13:13:47.483] ...future.result$finished <- base::Sys.time() [13:13:47.483] ...future.result [13:13:47.483] } [13:13:47.488] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... [13:13:47.489] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... [13:13:47.489] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... DONE [13:13:47.489] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... [13:13:47.490] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... DONE [13:13:47.490] Exporting '...future.elements_ii' (232 bytes) to cluster node #1 ... [13:13:47.490] Exporting '...future.elements_ii' (232 bytes) to cluster node #1 ... DONE [13:13:47.491] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:13:47.491] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:13:47.491] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:13:47.492] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:13:47.492] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... DONE [13:13:47.492] MultisessionFuture started [13:13:47.493] - Launch lazy future ... done [13:13:47.493] run() for 'MultisessionFuture' ... done [13:13:47.493] Created future: [13:13:47.509] receiveMessageFromWorker() for ClusterFuture ... [13:13:47.509] - Validating connection of MultisessionFuture [13:13:47.509] - received message: FutureResult [13:13:47.510] - Received FutureResult [13:13:47.510] - Erased future from FutureRegistry [13:13:47.510] result() for ClusterFuture ... [13:13:47.510] - result already collected: FutureResult [13:13:47.510] result() for ClusterFuture ... done [13:13:47.510] receiveMessageFromWorker() for ClusterFuture ... done [13:13:47.493] MultisessionFuture: [13:13:47.493] Label: 'future_lapply-1' [13:13:47.493] Expression: [13:13:47.493] { [13:13:47.493] do.call(function(...) { [13:13:47.493] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:47.493] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:47.493] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:47.493] on.exit(options(oopts), add = TRUE) [13:13:47.493] } [13:13:47.493] { [13:13:47.493] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:47.493] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:47.493] ...future.FUN(...future.X_jj, ...) [13:13:47.493] }) [13:13:47.493] } [13:13:47.493] }, args = future.call.arguments) [13:13:47.493] } [13:13:47.493] Lazy evaluation: FALSE [13:13:47.493] Asynchronous evaluation: TRUE [13:13:47.493] Local evaluation: TRUE [13:13:47.493] Environment: R_GlobalEnv [13:13:47.493] Capture standard output: TRUE [13:13:47.493] Capture condition classes: 'condition' (excluding 'nothing') [13:13:47.493] 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) [13:13:47.493] Packages: [13:13:47.493] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:47.493] Resolved: TRUE [13:13:47.493] Value: [13:13:47.493] Conditions captured: [13:13:47.493] Early signaling: FALSE [13:13:47.493] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:47.493] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:47.511] Chunk #1 of 2 ... DONE [13:13:47.511] Chunk #2 of 2 ... [13:13:47.511] - Finding globals in 'X' for chunk #2 ... [13:13:47.511] getGlobalsAndPackages() ... [13:13:47.511] Searching for globals... [13:13:47.512] [13:13:47.512] Searching for globals ... DONE [13:13:47.512] - globals: [0] [13:13:47.512] getGlobalsAndPackages() ... DONE [13:13:47.512] + additional globals found: [n=0] [13:13:47.513] + additional namespaces needed: [n=0] [13:13:47.513] - Finding globals in 'X' for chunk #2 ... DONE [13:13:47.513] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:13:47.513] - seeds: [13:13:47.513] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:47.513] getGlobalsAndPackages() ... [13:13:47.513] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:47.514] Resolving globals: FALSE [13:13:47.514] Tweak future expression to call with '...' arguments ... [13:13:47.514] { [13:13:47.514] do.call(function(...) { [13:13:47.514] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:47.514] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:47.514] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:47.514] on.exit(options(oopts), add = TRUE) [13:13:47.514] } [13:13:47.514] { [13:13:47.514] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:47.514] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:47.514] ...future.FUN(...future.X_jj, ...) [13:13:47.514] }) [13:13:47.514] } [13:13:47.514] }, args = future.call.arguments) [13:13:47.514] } [13:13:47.514] Tweak future expression to call with '...' arguments ... DONE [13:13:47.515] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:47.515] [13:13:47.515] getGlobalsAndPackages() ... DONE [13:13:47.516] run() for 'Future' ... [13:13:47.516] - state: 'created' [13:13:47.516] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:47.530] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:47.530] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:13:47.530] - Field: 'node' [13:13:47.530] - Field: 'label' [13:13:47.530] - Field: 'local' [13:13:47.531] - Field: 'owner' [13:13:47.531] - Field: 'envir' [13:13:47.531] - Field: 'workers' [13:13:47.531] - Field: 'packages' [13:13:47.531] - Field: 'gc' [13:13:47.532] - Field: 'conditions' [13:13:47.532] - Field: 'persistent' [13:13:47.532] - Field: 'expr' [13:13:47.532] - Field: 'uuid' [13:13:47.532] - Field: 'seed' [13:13:47.532] - Field: 'version' [13:13:47.533] - Field: 'result' [13:13:47.533] - Field: 'asynchronous' [13:13:47.533] - Field: 'calls' [13:13:47.533] - Field: 'globals' [13:13:47.533] - Field: 'stdout' [13:13:47.533] - Field: 'earlySignal' [13:13:47.534] - Field: 'lazy' [13:13:47.534] - Field: 'state' [13:13:47.534] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:13:47.534] - Launch lazy future ... [13:13:47.534] Packages needed by the future expression (n = 0): [13:13:47.535] Packages needed by future strategies (n = 0): [13:13:47.535] { [13:13:47.535] { [13:13:47.535] { [13:13:47.535] ...future.startTime <- base::Sys.time() [13:13:47.535] { [13:13:47.535] { [13:13:47.535] { [13:13:47.535] { [13:13:47.535] base::local({ [13:13:47.535] has_future <- base::requireNamespace("future", [13:13:47.535] quietly = TRUE) [13:13:47.535] if (has_future) { [13:13:47.535] ns <- base::getNamespace("future") [13:13:47.535] version <- ns[[".package"]][["version"]] [13:13:47.535] if (is.null(version)) [13:13:47.535] version <- utils::packageVersion("future") [13:13:47.535] } [13:13:47.535] else { [13:13:47.535] version <- NULL [13:13:47.535] } [13:13:47.535] if (!has_future || version < "1.8.0") { [13:13:47.535] info <- base::c(r_version = base::gsub("R version ", [13:13:47.535] "", base::R.version$version.string), [13:13:47.535] platform = base::sprintf("%s (%s-bit)", [13:13:47.535] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:47.535] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:47.535] "release", "version")], collapse = " "), [13:13:47.535] hostname = base::Sys.info()[["nodename"]]) [13:13:47.535] info <- base::sprintf("%s: %s", base::names(info), [13:13:47.535] info) [13:13:47.535] info <- base::paste(info, collapse = "; ") [13:13:47.535] if (!has_future) { [13:13:47.535] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:47.535] info) [13:13:47.535] } [13:13:47.535] else { [13:13:47.535] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:47.535] info, version) [13:13:47.535] } [13:13:47.535] base::stop(msg) [13:13:47.535] } [13:13:47.535] }) [13:13:47.535] } [13:13:47.535] ...future.mc.cores.old <- base::getOption("mc.cores") [13:13:47.535] base::options(mc.cores = 1L) [13:13:47.535] } [13:13:47.535] options(future.plan = NULL) [13:13:47.535] Sys.unsetenv("R_FUTURE_PLAN") [13:13:47.535] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:47.535] } [13:13:47.535] ...future.workdir <- getwd() [13:13:47.535] } [13:13:47.535] ...future.oldOptions <- base::as.list(base::.Options) [13:13:47.535] ...future.oldEnvVars <- base::Sys.getenv() [13:13:47.535] } [13:13:47.535] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:47.535] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:13:47.535] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:47.535] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:47.535] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:47.535] future.stdout.windows.reencode = NULL, width = 80L) [13:13:47.535] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:47.535] base::names(...future.oldOptions)) [13:13:47.535] } [13:13:47.535] if (FALSE) { [13:13:47.535] } [13:13:47.535] else { [13:13:47.535] if (TRUE) { [13:13:47.535] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:47.535] open = "w") [13:13:47.535] } [13:13:47.535] else { [13:13:47.535] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:47.535] windows = "NUL", "/dev/null"), open = "w") [13:13:47.535] } [13:13:47.535] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:47.535] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:47.535] base::sink(type = "output", split = FALSE) [13:13:47.535] base::close(...future.stdout) [13:13:47.535] }, add = TRUE) [13:13:47.535] } [13:13:47.535] ...future.frame <- base::sys.nframe() [13:13:47.535] ...future.conditions <- base::list() [13:13:47.535] ...future.rng <- base::globalenv()$.Random.seed [13:13:47.535] if (FALSE) { [13:13:47.535] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:47.535] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:47.535] } [13:13:47.535] ...future.result <- base::tryCatch({ [13:13:47.535] base::withCallingHandlers({ [13:13:47.535] ...future.value <- base::withVisible(base::local({ [13:13:47.535] ...future.makeSendCondition <- local({ [13:13:47.535] sendCondition <- NULL [13:13:47.535] function(frame = 1L) { [13:13:47.535] if (is.function(sendCondition)) [13:13:47.535] return(sendCondition) [13:13:47.535] ns <- getNamespace("parallel") [13:13:47.535] if (exists("sendData", mode = "function", [13:13:47.535] envir = ns)) { [13:13:47.535] parallel_sendData <- get("sendData", mode = "function", [13:13:47.535] envir = ns) [13:13:47.535] envir <- sys.frame(frame) [13:13:47.535] master <- NULL [13:13:47.535] while (!identical(envir, .GlobalEnv) && [13:13:47.535] !identical(envir, emptyenv())) { [13:13:47.535] if (exists("master", mode = "list", envir = envir, [13:13:47.535] inherits = FALSE)) { [13:13:47.535] master <- get("master", mode = "list", [13:13:47.535] envir = envir, inherits = FALSE) [13:13:47.535] if (inherits(master, c("SOCKnode", [13:13:47.535] "SOCK0node"))) { [13:13:47.535] sendCondition <<- function(cond) { [13:13:47.535] data <- list(type = "VALUE", value = cond, [13:13:47.535] success = TRUE) [13:13:47.535] parallel_sendData(master, data) [13:13:47.535] } [13:13:47.535] return(sendCondition) [13:13:47.535] } [13:13:47.535] } [13:13:47.535] frame <- frame + 1L [13:13:47.535] envir <- sys.frame(frame) [13:13:47.535] } [13:13:47.535] } [13:13:47.535] sendCondition <<- function(cond) NULL [13:13:47.535] } [13:13:47.535] }) [13:13:47.535] withCallingHandlers({ [13:13:47.535] { [13:13:47.535] do.call(function(...) { [13:13:47.535] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:47.535] if (!identical(...future.globals.maxSize.org, [13:13:47.535] ...future.globals.maxSize)) { [13:13:47.535] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:47.535] on.exit(options(oopts), add = TRUE) [13:13:47.535] } [13:13:47.535] { [13:13:47.535] lapply(seq_along(...future.elements_ii), [13:13:47.535] FUN = function(jj) { [13:13:47.535] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:47.535] ...future.FUN(...future.X_jj, ...) [13:13:47.535] }) [13:13:47.535] } [13:13:47.535] }, args = future.call.arguments) [13:13:47.535] } [13:13:47.535] }, immediateCondition = function(cond) { [13:13:47.535] sendCondition <- ...future.makeSendCondition() [13:13:47.535] sendCondition(cond) [13:13:47.535] muffleCondition <- function (cond, pattern = "^muffle") [13:13:47.535] { [13:13:47.535] inherits <- base::inherits [13:13:47.535] invokeRestart <- base::invokeRestart [13:13:47.535] is.null <- base::is.null [13:13:47.535] muffled <- FALSE [13:13:47.535] if (inherits(cond, "message")) { [13:13:47.535] muffled <- grepl(pattern, "muffleMessage") [13:13:47.535] if (muffled) [13:13:47.535] invokeRestart("muffleMessage") [13:13:47.535] } [13:13:47.535] else if (inherits(cond, "warning")) { [13:13:47.535] muffled <- grepl(pattern, "muffleWarning") [13:13:47.535] if (muffled) [13:13:47.535] invokeRestart("muffleWarning") [13:13:47.535] } [13:13:47.535] else if (inherits(cond, "condition")) { [13:13:47.535] if (!is.null(pattern)) { [13:13:47.535] computeRestarts <- base::computeRestarts [13:13:47.535] grepl <- base::grepl [13:13:47.535] restarts <- computeRestarts(cond) [13:13:47.535] for (restart in restarts) { [13:13:47.535] name <- restart$name [13:13:47.535] if (is.null(name)) [13:13:47.535] next [13:13:47.535] if (!grepl(pattern, name)) [13:13:47.535] next [13:13:47.535] invokeRestart(restart) [13:13:47.535] muffled <- TRUE [13:13:47.535] break [13:13:47.535] } [13:13:47.535] } [13:13:47.535] } [13:13:47.535] invisible(muffled) [13:13:47.535] } [13:13:47.535] muffleCondition(cond) [13:13:47.535] }) [13:13:47.535] })) [13:13:47.535] future::FutureResult(value = ...future.value$value, [13:13:47.535] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:47.535] ...future.rng), globalenv = if (FALSE) [13:13:47.535] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:47.535] ...future.globalenv.names)) [13:13:47.535] else NULL, started = ...future.startTime, version = "1.8") [13:13:47.535] }, condition = base::local({ [13:13:47.535] c <- base::c [13:13:47.535] inherits <- base::inherits [13:13:47.535] invokeRestart <- base::invokeRestart [13:13:47.535] length <- base::length [13:13:47.535] list <- base::list [13:13:47.535] seq.int <- base::seq.int [13:13:47.535] signalCondition <- base::signalCondition [13:13:47.535] sys.calls <- base::sys.calls [13:13:47.535] `[[` <- base::`[[` [13:13:47.535] `+` <- base::`+` [13:13:47.535] `<<-` <- base::`<<-` [13:13:47.535] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:47.535] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:47.535] 3L)] [13:13:47.535] } [13:13:47.535] function(cond) { [13:13:47.535] is_error <- inherits(cond, "error") [13:13:47.535] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:47.535] NULL) [13:13:47.535] if (is_error) { [13:13:47.535] sessionInformation <- function() { [13:13:47.535] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:47.535] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:47.535] search = base::search(), system = base::Sys.info()) [13:13:47.535] } [13:13:47.535] ...future.conditions[[length(...future.conditions) + [13:13:47.535] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:47.535] cond$call), session = sessionInformation(), [13:13:47.535] timestamp = base::Sys.time(), signaled = 0L) [13:13:47.535] signalCondition(cond) [13:13:47.535] } [13:13:47.535] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:47.535] "immediateCondition"))) { [13:13:47.535] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:47.535] ...future.conditions[[length(...future.conditions) + [13:13:47.535] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:47.535] if (TRUE && !signal) { [13:13:47.535] muffleCondition <- function (cond, pattern = "^muffle") [13:13:47.535] { [13:13:47.535] inherits <- base::inherits [13:13:47.535] invokeRestart <- base::invokeRestart [13:13:47.535] is.null <- base::is.null [13:13:47.535] muffled <- FALSE [13:13:47.535] if (inherits(cond, "message")) { [13:13:47.535] muffled <- grepl(pattern, "muffleMessage") [13:13:47.535] if (muffled) [13:13:47.535] invokeRestart("muffleMessage") [13:13:47.535] } [13:13:47.535] else if (inherits(cond, "warning")) { [13:13:47.535] muffled <- grepl(pattern, "muffleWarning") [13:13:47.535] if (muffled) [13:13:47.535] invokeRestart("muffleWarning") [13:13:47.535] } [13:13:47.535] else if (inherits(cond, "condition")) { [13:13:47.535] if (!is.null(pattern)) { [13:13:47.535] computeRestarts <- base::computeRestarts [13:13:47.535] grepl <- base::grepl [13:13:47.535] restarts <- computeRestarts(cond) [13:13:47.535] for (restart in restarts) { [13:13:47.535] name <- restart$name [13:13:47.535] if (is.null(name)) [13:13:47.535] next [13:13:47.535] if (!grepl(pattern, name)) [13:13:47.535] next [13:13:47.535] invokeRestart(restart) [13:13:47.535] muffled <- TRUE [13:13:47.535] break [13:13:47.535] } [13:13:47.535] } [13:13:47.535] } [13:13:47.535] invisible(muffled) [13:13:47.535] } [13:13:47.535] muffleCondition(cond, pattern = "^muffle") [13:13:47.535] } [13:13:47.535] } [13:13:47.535] else { [13:13:47.535] if (TRUE) { [13:13:47.535] muffleCondition <- function (cond, pattern = "^muffle") [13:13:47.535] { [13:13:47.535] inherits <- base::inherits [13:13:47.535] invokeRestart <- base::invokeRestart [13:13:47.535] is.null <- base::is.null [13:13:47.535] muffled <- FALSE [13:13:47.535] if (inherits(cond, "message")) { [13:13:47.535] muffled <- grepl(pattern, "muffleMessage") [13:13:47.535] if (muffled) [13:13:47.535] invokeRestart("muffleMessage") [13:13:47.535] } [13:13:47.535] else if (inherits(cond, "warning")) { [13:13:47.535] muffled <- grepl(pattern, "muffleWarning") [13:13:47.535] if (muffled) [13:13:47.535] invokeRestart("muffleWarning") [13:13:47.535] } [13:13:47.535] else if (inherits(cond, "condition")) { [13:13:47.535] if (!is.null(pattern)) { [13:13:47.535] computeRestarts <- base::computeRestarts [13:13:47.535] grepl <- base::grepl [13:13:47.535] restarts <- computeRestarts(cond) [13:13:47.535] for (restart in restarts) { [13:13:47.535] name <- restart$name [13:13:47.535] if (is.null(name)) [13:13:47.535] next [13:13:47.535] if (!grepl(pattern, name)) [13:13:47.535] next [13:13:47.535] invokeRestart(restart) [13:13:47.535] muffled <- TRUE [13:13:47.535] break [13:13:47.535] } [13:13:47.535] } [13:13:47.535] } [13:13:47.535] invisible(muffled) [13:13:47.535] } [13:13:47.535] muffleCondition(cond, pattern = "^muffle") [13:13:47.535] } [13:13:47.535] } [13:13:47.535] } [13:13:47.535] })) [13:13:47.535] }, error = function(ex) { [13:13:47.535] base::structure(base::list(value = NULL, visible = NULL, [13:13:47.535] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:47.535] ...future.rng), started = ...future.startTime, [13:13:47.535] finished = Sys.time(), session_uuid = NA_character_, [13:13:47.535] version = "1.8"), class = "FutureResult") [13:13:47.535] }, finally = { [13:13:47.535] if (!identical(...future.workdir, getwd())) [13:13:47.535] setwd(...future.workdir) [13:13:47.535] { [13:13:47.535] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:47.535] ...future.oldOptions$nwarnings <- NULL [13:13:47.535] } [13:13:47.535] base::options(...future.oldOptions) [13:13:47.535] if (.Platform$OS.type == "windows") { [13:13:47.535] old_names <- names(...future.oldEnvVars) [13:13:47.535] envs <- base::Sys.getenv() [13:13:47.535] names <- names(envs) [13:13:47.535] common <- intersect(names, old_names) [13:13:47.535] added <- setdiff(names, old_names) [13:13:47.535] removed <- setdiff(old_names, names) [13:13:47.535] changed <- common[...future.oldEnvVars[common] != [13:13:47.535] envs[common]] [13:13:47.535] NAMES <- toupper(changed) [13:13:47.535] args <- list() [13:13:47.535] for (kk in seq_along(NAMES)) { [13:13:47.535] name <- changed[[kk]] [13:13:47.535] NAME <- NAMES[[kk]] [13:13:47.535] if (name != NAME && is.element(NAME, old_names)) [13:13:47.535] next [13:13:47.535] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:47.535] } [13:13:47.535] NAMES <- toupper(added) [13:13:47.535] for (kk in seq_along(NAMES)) { [13:13:47.535] name <- added[[kk]] [13:13:47.535] NAME <- NAMES[[kk]] [13:13:47.535] if (name != NAME && is.element(NAME, old_names)) [13:13:47.535] next [13:13:47.535] args[[name]] <- "" [13:13:47.535] } [13:13:47.535] NAMES <- toupper(removed) [13:13:47.535] for (kk in seq_along(NAMES)) { [13:13:47.535] name <- removed[[kk]] [13:13:47.535] NAME <- NAMES[[kk]] [13:13:47.535] if (name != NAME && is.element(NAME, old_names)) [13:13:47.535] next [13:13:47.535] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:47.535] } [13:13:47.535] if (length(args) > 0) [13:13:47.535] base::do.call(base::Sys.setenv, args = args) [13:13:47.535] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:47.535] } [13:13:47.535] else { [13:13:47.535] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:47.535] } [13:13:47.535] { [13:13:47.535] if (base::length(...future.futureOptionsAdded) > [13:13:47.535] 0L) { [13:13:47.535] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:47.535] base::names(opts) <- ...future.futureOptionsAdded [13:13:47.535] base::options(opts) [13:13:47.535] } [13:13:47.535] { [13:13:47.535] { [13:13:47.535] base::options(mc.cores = ...future.mc.cores.old) [13:13:47.535] NULL [13:13:47.535] } [13:13:47.535] options(future.plan = NULL) [13:13:47.535] if (is.na(NA_character_)) [13:13:47.535] Sys.unsetenv("R_FUTURE_PLAN") [13:13:47.535] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:47.535] future::plan(list(function (..., workers = availableCores(), [13:13:47.535] lazy = FALSE, rscript_libs = .libPaths(), [13:13:47.535] envir = parent.frame()) [13:13:47.535] { [13:13:47.535] if (is.function(workers)) [13:13:47.535] workers <- workers() [13:13:47.535] workers <- structure(as.integer(workers), [13:13:47.535] class = class(workers)) [13:13:47.535] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:47.535] workers >= 1) [13:13:47.535] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:47.535] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:47.535] } [13:13:47.535] future <- MultisessionFuture(..., workers = workers, [13:13:47.535] lazy = lazy, rscript_libs = rscript_libs, [13:13:47.535] envir = envir) [13:13:47.535] if (!future$lazy) [13:13:47.535] future <- run(future) [13:13:47.535] invisible(future) [13:13:47.535] }), .cleanup = FALSE, .init = FALSE) [13:13:47.535] } [13:13:47.535] } [13:13:47.535] } [13:13:47.535] }) [13:13:47.535] if (TRUE) { [13:13:47.535] base::sink(type = "output", split = FALSE) [13:13:47.535] if (TRUE) { [13:13:47.535] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:47.535] } [13:13:47.535] else { [13:13:47.535] ...future.result["stdout"] <- base::list(NULL) [13:13:47.535] } [13:13:47.535] base::close(...future.stdout) [13:13:47.535] ...future.stdout <- NULL [13:13:47.535] } [13:13:47.535] ...future.result$conditions <- ...future.conditions [13:13:47.535] ...future.result$finished <- base::Sys.time() [13:13:47.535] ...future.result [13:13:47.535] } [13:13:47.541] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... [13:13:47.541] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... [13:13:47.541] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... DONE [13:13:47.542] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... [13:13:47.542] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... DONE [13:13:47.542] Exporting '...future.elements_ii' (224 bytes) to cluster node #1 ... [13:13:47.543] Exporting '...future.elements_ii' (224 bytes) to cluster node #1 ... DONE [13:13:47.543] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:13:47.543] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:13:47.543] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:13:47.544] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:13:47.544] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... DONE [13:13:47.545] MultisessionFuture started [13:13:47.545] - Launch lazy future ... done [13:13:47.545] run() for 'MultisessionFuture' ... done [13:13:47.545] Created future: [13:13:47.560] receiveMessageFromWorker() for ClusterFuture ... [13:13:47.561] - Validating connection of MultisessionFuture [13:13:47.561] - received message: FutureResult [13:13:47.561] - Received FutureResult [13:13:47.561] - Erased future from FutureRegistry [13:13:47.561] result() for ClusterFuture ... [13:13:47.562] - result already collected: FutureResult [13:13:47.562] result() for ClusterFuture ... done [13:13:47.562] receiveMessageFromWorker() for ClusterFuture ... done [13:13:47.545] MultisessionFuture: [13:13:47.545] Label: 'future_lapply-2' [13:13:47.545] Expression: [13:13:47.545] { [13:13:47.545] do.call(function(...) { [13:13:47.545] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:47.545] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:47.545] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:47.545] on.exit(options(oopts), add = TRUE) [13:13:47.545] } [13:13:47.545] { [13:13:47.545] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:47.545] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:47.545] ...future.FUN(...future.X_jj, ...) [13:13:47.545] }) [13:13:47.545] } [13:13:47.545] }, args = future.call.arguments) [13:13:47.545] } [13:13:47.545] Lazy evaluation: FALSE [13:13:47.545] Asynchronous evaluation: TRUE [13:13:47.545] Local evaluation: TRUE [13:13:47.545] Environment: R_GlobalEnv [13:13:47.545] Capture standard output: TRUE [13:13:47.545] Capture condition classes: 'condition' (excluding 'nothing') [13:13:47.545] 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) [13:13:47.545] Packages: [13:13:47.545] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:47.545] Resolved: TRUE [13:13:47.545] Value: [13:13:47.545] Conditions captured: [13:13:47.545] Early signaling: FALSE [13:13:47.545] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:47.545] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:47.562] Chunk #2 of 2 ... DONE [13:13:47.562] Launching 2 futures (chunks) ... DONE [13:13:47.563] Resolving 2 futures (chunks) ... [13:13:47.563] resolve() on list ... [13:13:47.563] recursive: 0 [13:13:47.563] length: 2 [13:13:47.563] [13:13:47.563] Future #1 [13:13:47.564] result() for ClusterFuture ... [13:13:47.564] - result already collected: FutureResult [13:13:47.564] result() for ClusterFuture ... done [13:13:47.564] result() for ClusterFuture ... [13:13:47.564] - result already collected: FutureResult [13:13:47.564] result() for ClusterFuture ... done [13:13:47.564] signalConditionsASAP(MultisessionFuture, pos=1) ... [13:13:47.565] - nx: 2 [13:13:47.565] - relay: TRUE [13:13:47.565] - stdout: TRUE [13:13:47.565] - signal: TRUE [13:13:47.565] - resignal: FALSE [13:13:47.565] - force: TRUE [13:13:47.565] - relayed: [n=2] FALSE, FALSE [13:13:47.566] - queued futures: [n=2] FALSE, FALSE [13:13:47.566] - until=1 [13:13:47.566] - relaying element #1 [13:13:47.566] result() for ClusterFuture ... [13:13:47.566] - result already collected: FutureResult [13:13:47.566] result() for ClusterFuture ... done [13:13:47.567] result() for ClusterFuture ... [13:13:47.567] - result already collected: FutureResult [13:13:47.567] result() for ClusterFuture ... done [13:13:47.567] result() for ClusterFuture ... [13:13:47.567] - result already collected: FutureResult [13:13:47.567] result() for ClusterFuture ... done [13:13:47.568] result() for ClusterFuture ... [13:13:47.568] - result already collected: FutureResult [13:13:47.568] result() for ClusterFuture ... done [13:13:47.568] - relayed: [n=2] TRUE, FALSE [13:13:47.568] - queued futures: [n=2] TRUE, FALSE [13:13:47.568] signalConditionsASAP(MultisessionFuture, pos=1) ... done [13:13:47.569] length: 1 (resolved future 1) [13:13:47.569] Future #2 [13:13:47.569] result() for ClusterFuture ... [13:13:47.569] - result already collected: FutureResult [13:13:47.569] result() for ClusterFuture ... done [13:13:47.569] result() for ClusterFuture ... [13:13:47.569] - result already collected: FutureResult [13:13:47.570] result() for ClusterFuture ... done [13:13:47.570] signalConditionsASAP(MultisessionFuture, pos=2) ... [13:13:47.570] - nx: 2 [13:13:47.570] - relay: TRUE [13:13:47.570] - stdout: TRUE [13:13:47.570] - signal: TRUE [13:13:47.571] - resignal: FALSE [13:13:47.571] - force: TRUE [13:13:47.571] - relayed: [n=2] TRUE, FALSE [13:13:47.571] - queued futures: [n=2] TRUE, FALSE [13:13:47.571] - until=2 [13:13:47.571] - relaying element #2 [13:13:47.572] result() for ClusterFuture ... [13:13:47.572] - result already collected: FutureResult [13:13:47.572] result() for ClusterFuture ... done [13:13:47.572] result() for ClusterFuture ... [13:13:47.572] - result already collected: FutureResult [13:13:47.572] result() for ClusterFuture ... done [13:13:47.573] result() for ClusterFuture ... [13:13:47.573] - result already collected: FutureResult [13:13:47.573] result() for ClusterFuture ... done [13:13:47.573] result() for ClusterFuture ... [13:13:47.573] - result already collected: FutureResult [13:13:47.573] result() for ClusterFuture ... done [13:13:47.573] - relayed: [n=2] TRUE, TRUE [13:13:47.574] - queued futures: [n=2] TRUE, TRUE [13:13:47.574] signalConditionsASAP(MultisessionFuture, pos=2) ... done [13:13:47.574] length: 0 (resolved future 2) [13:13:47.574] Relaying remaining futures [13:13:47.574] signalConditionsASAP(NULL, pos=0) ... [13:13:47.574] - nx: 2 [13:13:47.575] - relay: TRUE [13:13:47.575] - stdout: TRUE [13:13:47.575] - signal: TRUE [13:13:47.575] - resignal: FALSE [13:13:47.575] - force: TRUE [13:13:47.575] - relayed: [n=2] TRUE, TRUE [13:13:47.575] - queued futures: [n=2] TRUE, TRUE - flush all [13:13:47.576] - relayed: [n=2] TRUE, TRUE [13:13:47.576] - queued futures: [n=2] TRUE, TRUE [13:13:47.576] signalConditionsASAP(NULL, pos=0) ... done [13:13:47.576] resolve() on list ... DONE [13:13:47.576] result() for ClusterFuture ... [13:13:47.576] - result already collected: FutureResult [13:13:47.577] result() for ClusterFuture ... done [13:13:47.577] result() for ClusterFuture ... [13:13:47.577] - result already collected: FutureResult [13:13:47.577] result() for ClusterFuture ... done [13:13:47.577] result() for ClusterFuture ... [13:13:47.577] - result already collected: FutureResult [13:13:47.578] result() for ClusterFuture ... done [13:13:47.578] result() for ClusterFuture ... [13:13:47.578] - result already collected: FutureResult [13:13:47.578] result() for ClusterFuture ... done [13:13:47.578] - Number of value chunks collected: 2 [13:13:47.578] Resolving 2 futures (chunks) ... DONE [13:13:47.579] Reducing values from 2 chunks ... [13:13:47.579] - Number of values collected after concatenation: 4 [13:13:47.579] - Number of values expected: 4 [13:13:47.579] Reverse index remapping (attribute 'ordering'): [n = 4] 4, 3, 2, 1 [13:13:47.579] Reducing values from 2 chunks ... DONE [13:13:47.579] 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, ...) ... [13:13:47.582] future_lapply() ... [13:13:47.585] Number of chunks: 2 [13:13:47.585] Index remapping (attribute 'ordering'): [n = 4] 4, 3, 2, 1 [13:13:47.585] getGlobalsAndPackagesXApply() ... [13:13:47.585] - future.globals: TRUE [13:13:47.586] getGlobalsAndPackages() ... [13:13:47.586] Searching for globals... [13:13:47.587] - globals found: [2] 'FUN', '.Internal' [13:13:47.587] Searching for globals ... DONE [13:13:47.588] Resolving globals: FALSE [13:13:47.588] The total size of the 1 globals is 2.13 KiB (2184 bytes) [13:13:47.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') [13:13:47.589] - globals: [1] 'FUN' [13:13:47.589] [13:13:47.589] getGlobalsAndPackages() ... DONE [13:13:47.589] - globals found/used: [n=1] 'FUN' [13:13:47.589] - needed namespaces: [n=0] [13:13:47.589] Finding globals ... DONE [13:13:47.590] - use_args: TRUE [13:13:47.590] - Getting '...' globals ... [13:13:47.590] resolve() on list ... [13:13:47.590] recursive: 0 [13:13:47.590] length: 1 [13:13:47.591] elements: '...' [13:13:47.591] length: 0 (resolved future 1) [13:13:47.591] resolve() on list ... DONE [13:13:47.591] - '...' content: [n=1] 'length' [13:13:47.591] List of 1 [13:13:47.591] $ ...:List of 1 [13:13:47.591] ..$ length: int 2 [13:13:47.591] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:47.591] - attr(*, "where")=List of 1 [13:13:47.591] ..$ ...: [13:13:47.591] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:47.591] - attr(*, "resolved")= logi TRUE [13:13:47.591] - attr(*, "total_size")= num NA [13:13:47.595] - Getting '...' globals ... DONE [13:13:47.595] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:47.595] List of 2 [13:13:47.595] $ ...future.FUN:function (mode = "logical", length = 0L) [13:13:47.595] $ ... :List of 1 [13:13:47.595] ..$ length: int 2 [13:13:47.595] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:47.595] - attr(*, "where")=List of 2 [13:13:47.595] ..$ ...future.FUN: [13:13:47.595] ..$ ... : [13:13:47.595] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:47.595] - attr(*, "resolved")= logi FALSE [13:13:47.595] - attr(*, "total_size")= num 2240 [13:13:47.599] Packages to be attached in all futures: [n=0] [13:13:47.599] getGlobalsAndPackagesXApply() ... DONE [13:13:47.599] Number of futures (= number of chunks): 2 [13:13:47.600] Launching 2 futures (chunks) ... [13:13:47.600] Chunk #1 of 2 ... [13:13:47.600] - Finding globals in 'X' for chunk #1 ... [13:13:47.600] getGlobalsAndPackages() ... [13:13:47.600] Searching for globals... [13:13:47.601] [13:13:47.601] Searching for globals ... DONE [13:13:47.601] - globals: [0] [13:13:47.601] getGlobalsAndPackages() ... DONE [13:13:47.601] + additional globals found: [n=0] [13:13:47.602] + additional namespaces needed: [n=0] [13:13:47.602] - Finding globals in 'X' for chunk #1 ... DONE [13:13:47.602] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:13:47.602] - seeds: [13:13:47.602] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:47.602] getGlobalsAndPackages() ... [13:13:47.602] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:47.603] Resolving globals: FALSE [13:13:47.603] Tweak future expression to call with '...' arguments ... [13:13:47.603] { [13:13:47.603] do.call(function(...) { [13:13:47.603] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:47.603] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:47.603] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:47.603] on.exit(options(oopts), add = TRUE) [13:13:47.603] } [13:13:47.603] { [13:13:47.603] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:47.603] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:47.603] ...future.FUN(...future.X_jj, ...) [13:13:47.603] }) [13:13:47.603] } [13:13:47.603] }, args = future.call.arguments) [13:13:47.603] } [13:13:47.603] Tweak future expression to call with '...' arguments ... DONE [13:13:47.604] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:47.604] [13:13:47.604] getGlobalsAndPackages() ... DONE [13:13:47.605] run() for 'Future' ... [13:13:47.605] - state: 'created' [13:13:47.605] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:47.620] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:47.620] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:13:47.620] - Field: 'node' [13:13:47.620] - Field: 'label' [13:13:47.621] - Field: 'local' [13:13:47.621] - Field: 'owner' [13:13:47.621] - Field: 'envir' [13:13:47.621] - Field: 'workers' [13:13:47.621] - Field: 'packages' [13:13:47.621] - Field: 'gc' [13:13:47.622] - Field: 'conditions' [13:13:47.622] - Field: 'persistent' [13:13:47.622] - Field: 'expr' [13:13:47.622] - Field: 'uuid' [13:13:47.622] - Field: 'seed' [13:13:47.622] - Field: 'version' [13:13:47.623] - Field: 'result' [13:13:47.623] - Field: 'asynchronous' [13:13:47.625] - Field: 'calls' [13:13:47.626] - Field: 'globals' [13:13:47.626] - Field: 'stdout' [13:13:47.626] - Field: 'earlySignal' [13:13:47.626] - Field: 'lazy' [13:13:47.626] - Field: 'state' [13:13:47.626] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:13:47.627] - Launch lazy future ... [13:13:47.627] Packages needed by the future expression (n = 0): [13:13:47.627] Packages needed by future strategies (n = 0): [13:13:47.628] { [13:13:47.628] { [13:13:47.628] { [13:13:47.628] ...future.startTime <- base::Sys.time() [13:13:47.628] { [13:13:47.628] { [13:13:47.628] { [13:13:47.628] { [13:13:47.628] base::local({ [13:13:47.628] has_future <- base::requireNamespace("future", [13:13:47.628] quietly = TRUE) [13:13:47.628] if (has_future) { [13:13:47.628] ns <- base::getNamespace("future") [13:13:47.628] version <- ns[[".package"]][["version"]] [13:13:47.628] if (is.null(version)) [13:13:47.628] version <- utils::packageVersion("future") [13:13:47.628] } [13:13:47.628] else { [13:13:47.628] version <- NULL [13:13:47.628] } [13:13:47.628] if (!has_future || version < "1.8.0") { [13:13:47.628] info <- base::c(r_version = base::gsub("R version ", [13:13:47.628] "", base::R.version$version.string), [13:13:47.628] platform = base::sprintf("%s (%s-bit)", [13:13:47.628] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:47.628] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:47.628] "release", "version")], collapse = " "), [13:13:47.628] hostname = base::Sys.info()[["nodename"]]) [13:13:47.628] info <- base::sprintf("%s: %s", base::names(info), [13:13:47.628] info) [13:13:47.628] info <- base::paste(info, collapse = "; ") [13:13:47.628] if (!has_future) { [13:13:47.628] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:47.628] info) [13:13:47.628] } [13:13:47.628] else { [13:13:47.628] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:47.628] info, version) [13:13:47.628] } [13:13:47.628] base::stop(msg) [13:13:47.628] } [13:13:47.628] }) [13:13:47.628] } [13:13:47.628] ...future.mc.cores.old <- base::getOption("mc.cores") [13:13:47.628] base::options(mc.cores = 1L) [13:13:47.628] } [13:13:47.628] options(future.plan = NULL) [13:13:47.628] Sys.unsetenv("R_FUTURE_PLAN") [13:13:47.628] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:47.628] } [13:13:47.628] ...future.workdir <- getwd() [13:13:47.628] } [13:13:47.628] ...future.oldOptions <- base::as.list(base::.Options) [13:13:47.628] ...future.oldEnvVars <- base::Sys.getenv() [13:13:47.628] } [13:13:47.628] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:47.628] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:13:47.628] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:47.628] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:47.628] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:47.628] future.stdout.windows.reencode = NULL, width = 80L) [13:13:47.628] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:47.628] base::names(...future.oldOptions)) [13:13:47.628] } [13:13:47.628] if (FALSE) { [13:13:47.628] } [13:13:47.628] else { [13:13:47.628] if (TRUE) { [13:13:47.628] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:47.628] open = "w") [13:13:47.628] } [13:13:47.628] else { [13:13:47.628] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:47.628] windows = "NUL", "/dev/null"), open = "w") [13:13:47.628] } [13:13:47.628] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:47.628] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:47.628] base::sink(type = "output", split = FALSE) [13:13:47.628] base::close(...future.stdout) [13:13:47.628] }, add = TRUE) [13:13:47.628] } [13:13:47.628] ...future.frame <- base::sys.nframe() [13:13:47.628] ...future.conditions <- base::list() [13:13:47.628] ...future.rng <- base::globalenv()$.Random.seed [13:13:47.628] if (FALSE) { [13:13:47.628] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:47.628] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:47.628] } [13:13:47.628] ...future.result <- base::tryCatch({ [13:13:47.628] base::withCallingHandlers({ [13:13:47.628] ...future.value <- base::withVisible(base::local({ [13:13:47.628] ...future.makeSendCondition <- local({ [13:13:47.628] sendCondition <- NULL [13:13:47.628] function(frame = 1L) { [13:13:47.628] if (is.function(sendCondition)) [13:13:47.628] return(sendCondition) [13:13:47.628] ns <- getNamespace("parallel") [13:13:47.628] if (exists("sendData", mode = "function", [13:13:47.628] envir = ns)) { [13:13:47.628] parallel_sendData <- get("sendData", mode = "function", [13:13:47.628] envir = ns) [13:13:47.628] envir <- sys.frame(frame) [13:13:47.628] master <- NULL [13:13:47.628] while (!identical(envir, .GlobalEnv) && [13:13:47.628] !identical(envir, emptyenv())) { [13:13:47.628] if (exists("master", mode = "list", envir = envir, [13:13:47.628] inherits = FALSE)) { [13:13:47.628] master <- get("master", mode = "list", [13:13:47.628] envir = envir, inherits = FALSE) [13:13:47.628] if (inherits(master, c("SOCKnode", [13:13:47.628] "SOCK0node"))) { [13:13:47.628] sendCondition <<- function(cond) { [13:13:47.628] data <- list(type = "VALUE", value = cond, [13:13:47.628] success = TRUE) [13:13:47.628] parallel_sendData(master, data) [13:13:47.628] } [13:13:47.628] return(sendCondition) [13:13:47.628] } [13:13:47.628] } [13:13:47.628] frame <- frame + 1L [13:13:47.628] envir <- sys.frame(frame) [13:13:47.628] } [13:13:47.628] } [13:13:47.628] sendCondition <<- function(cond) NULL [13:13:47.628] } [13:13:47.628] }) [13:13:47.628] withCallingHandlers({ [13:13:47.628] { [13:13:47.628] do.call(function(...) { [13:13:47.628] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:47.628] if (!identical(...future.globals.maxSize.org, [13:13:47.628] ...future.globals.maxSize)) { [13:13:47.628] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:47.628] on.exit(options(oopts), add = TRUE) [13:13:47.628] } [13:13:47.628] { [13:13:47.628] lapply(seq_along(...future.elements_ii), [13:13:47.628] FUN = function(jj) { [13:13:47.628] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:47.628] ...future.FUN(...future.X_jj, ...) [13:13:47.628] }) [13:13:47.628] } [13:13:47.628] }, args = future.call.arguments) [13:13:47.628] } [13:13:47.628] }, immediateCondition = function(cond) { [13:13:47.628] sendCondition <- ...future.makeSendCondition() [13:13:47.628] sendCondition(cond) [13:13:47.628] muffleCondition <- function (cond, pattern = "^muffle") [13:13:47.628] { [13:13:47.628] inherits <- base::inherits [13:13:47.628] invokeRestart <- base::invokeRestart [13:13:47.628] is.null <- base::is.null [13:13:47.628] muffled <- FALSE [13:13:47.628] if (inherits(cond, "message")) { [13:13:47.628] muffled <- grepl(pattern, "muffleMessage") [13:13:47.628] if (muffled) [13:13:47.628] invokeRestart("muffleMessage") [13:13:47.628] } [13:13:47.628] else if (inherits(cond, "warning")) { [13:13:47.628] muffled <- grepl(pattern, "muffleWarning") [13:13:47.628] if (muffled) [13:13:47.628] invokeRestart("muffleWarning") [13:13:47.628] } [13:13:47.628] else if (inherits(cond, "condition")) { [13:13:47.628] if (!is.null(pattern)) { [13:13:47.628] computeRestarts <- base::computeRestarts [13:13:47.628] grepl <- base::grepl [13:13:47.628] restarts <- computeRestarts(cond) [13:13:47.628] for (restart in restarts) { [13:13:47.628] name <- restart$name [13:13:47.628] if (is.null(name)) [13:13:47.628] next [13:13:47.628] if (!grepl(pattern, name)) [13:13:47.628] next [13:13:47.628] invokeRestart(restart) [13:13:47.628] muffled <- TRUE [13:13:47.628] break [13:13:47.628] } [13:13:47.628] } [13:13:47.628] } [13:13:47.628] invisible(muffled) [13:13:47.628] } [13:13:47.628] muffleCondition(cond) [13:13:47.628] }) [13:13:47.628] })) [13:13:47.628] future::FutureResult(value = ...future.value$value, [13:13:47.628] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:47.628] ...future.rng), globalenv = if (FALSE) [13:13:47.628] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:47.628] ...future.globalenv.names)) [13:13:47.628] else NULL, started = ...future.startTime, version = "1.8") [13:13:47.628] }, condition = base::local({ [13:13:47.628] c <- base::c [13:13:47.628] inherits <- base::inherits [13:13:47.628] invokeRestart <- base::invokeRestart [13:13:47.628] length <- base::length [13:13:47.628] list <- base::list [13:13:47.628] seq.int <- base::seq.int [13:13:47.628] signalCondition <- base::signalCondition [13:13:47.628] sys.calls <- base::sys.calls [13:13:47.628] `[[` <- base::`[[` [13:13:47.628] `+` <- base::`+` [13:13:47.628] `<<-` <- base::`<<-` [13:13:47.628] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:47.628] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:47.628] 3L)] [13:13:47.628] } [13:13:47.628] function(cond) { [13:13:47.628] is_error <- inherits(cond, "error") [13:13:47.628] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:47.628] NULL) [13:13:47.628] if (is_error) { [13:13:47.628] sessionInformation <- function() { [13:13:47.628] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:47.628] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:47.628] search = base::search(), system = base::Sys.info()) [13:13:47.628] } [13:13:47.628] ...future.conditions[[length(...future.conditions) + [13:13:47.628] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:47.628] cond$call), session = sessionInformation(), [13:13:47.628] timestamp = base::Sys.time(), signaled = 0L) [13:13:47.628] signalCondition(cond) [13:13:47.628] } [13:13:47.628] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:47.628] "immediateCondition"))) { [13:13:47.628] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:47.628] ...future.conditions[[length(...future.conditions) + [13:13:47.628] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:47.628] if (TRUE && !signal) { [13:13:47.628] muffleCondition <- function (cond, pattern = "^muffle") [13:13:47.628] { [13:13:47.628] inherits <- base::inherits [13:13:47.628] invokeRestart <- base::invokeRestart [13:13:47.628] is.null <- base::is.null [13:13:47.628] muffled <- FALSE [13:13:47.628] if (inherits(cond, "message")) { [13:13:47.628] muffled <- grepl(pattern, "muffleMessage") [13:13:47.628] if (muffled) [13:13:47.628] invokeRestart("muffleMessage") [13:13:47.628] } [13:13:47.628] else if (inherits(cond, "warning")) { [13:13:47.628] muffled <- grepl(pattern, "muffleWarning") [13:13:47.628] if (muffled) [13:13:47.628] invokeRestart("muffleWarning") [13:13:47.628] } [13:13:47.628] else if (inherits(cond, "condition")) { [13:13:47.628] if (!is.null(pattern)) { [13:13:47.628] computeRestarts <- base::computeRestarts [13:13:47.628] grepl <- base::grepl [13:13:47.628] restarts <- computeRestarts(cond) [13:13:47.628] for (restart in restarts) { [13:13:47.628] name <- restart$name [13:13:47.628] if (is.null(name)) [13:13:47.628] next [13:13:47.628] if (!grepl(pattern, name)) [13:13:47.628] next [13:13:47.628] invokeRestart(restart) [13:13:47.628] muffled <- TRUE [13:13:47.628] break [13:13:47.628] } [13:13:47.628] } [13:13:47.628] } [13:13:47.628] invisible(muffled) [13:13:47.628] } [13:13:47.628] muffleCondition(cond, pattern = "^muffle") [13:13:47.628] } [13:13:47.628] } [13:13:47.628] else { [13:13:47.628] if (TRUE) { [13:13:47.628] muffleCondition <- function (cond, pattern = "^muffle") [13:13:47.628] { [13:13:47.628] inherits <- base::inherits [13:13:47.628] invokeRestart <- base::invokeRestart [13:13:47.628] is.null <- base::is.null [13:13:47.628] muffled <- FALSE [13:13:47.628] if (inherits(cond, "message")) { [13:13:47.628] muffled <- grepl(pattern, "muffleMessage") [13:13:47.628] if (muffled) [13:13:47.628] invokeRestart("muffleMessage") [13:13:47.628] } [13:13:47.628] else if (inherits(cond, "warning")) { [13:13:47.628] muffled <- grepl(pattern, "muffleWarning") [13:13:47.628] if (muffled) [13:13:47.628] invokeRestart("muffleWarning") [13:13:47.628] } [13:13:47.628] else if (inherits(cond, "condition")) { [13:13:47.628] if (!is.null(pattern)) { [13:13:47.628] computeRestarts <- base::computeRestarts [13:13:47.628] grepl <- base::grepl [13:13:47.628] restarts <- computeRestarts(cond) [13:13:47.628] for (restart in restarts) { [13:13:47.628] name <- restart$name [13:13:47.628] if (is.null(name)) [13:13:47.628] next [13:13:47.628] if (!grepl(pattern, name)) [13:13:47.628] next [13:13:47.628] invokeRestart(restart) [13:13:47.628] muffled <- TRUE [13:13:47.628] break [13:13:47.628] } [13:13:47.628] } [13:13:47.628] } [13:13:47.628] invisible(muffled) [13:13:47.628] } [13:13:47.628] muffleCondition(cond, pattern = "^muffle") [13:13:47.628] } [13:13:47.628] } [13:13:47.628] } [13:13:47.628] })) [13:13:47.628] }, error = function(ex) { [13:13:47.628] base::structure(base::list(value = NULL, visible = NULL, [13:13:47.628] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:47.628] ...future.rng), started = ...future.startTime, [13:13:47.628] finished = Sys.time(), session_uuid = NA_character_, [13:13:47.628] version = "1.8"), class = "FutureResult") [13:13:47.628] }, finally = { [13:13:47.628] if (!identical(...future.workdir, getwd())) [13:13:47.628] setwd(...future.workdir) [13:13:47.628] { [13:13:47.628] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:47.628] ...future.oldOptions$nwarnings <- NULL [13:13:47.628] } [13:13:47.628] base::options(...future.oldOptions) [13:13:47.628] if (.Platform$OS.type == "windows") { [13:13:47.628] old_names <- names(...future.oldEnvVars) [13:13:47.628] envs <- base::Sys.getenv() [13:13:47.628] names <- names(envs) [13:13:47.628] common <- intersect(names, old_names) [13:13:47.628] added <- setdiff(names, old_names) [13:13:47.628] removed <- setdiff(old_names, names) [13:13:47.628] changed <- common[...future.oldEnvVars[common] != [13:13:47.628] envs[common]] [13:13:47.628] NAMES <- toupper(changed) [13:13:47.628] args <- list() [13:13:47.628] for (kk in seq_along(NAMES)) { [13:13:47.628] name <- changed[[kk]] [13:13:47.628] NAME <- NAMES[[kk]] [13:13:47.628] if (name != NAME && is.element(NAME, old_names)) [13:13:47.628] next [13:13:47.628] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:47.628] } [13:13:47.628] NAMES <- toupper(added) [13:13:47.628] for (kk in seq_along(NAMES)) { [13:13:47.628] name <- added[[kk]] [13:13:47.628] NAME <- NAMES[[kk]] [13:13:47.628] if (name != NAME && is.element(NAME, old_names)) [13:13:47.628] next [13:13:47.628] args[[name]] <- "" [13:13:47.628] } [13:13:47.628] NAMES <- toupper(removed) [13:13:47.628] for (kk in seq_along(NAMES)) { [13:13:47.628] name <- removed[[kk]] [13:13:47.628] NAME <- NAMES[[kk]] [13:13:47.628] if (name != NAME && is.element(NAME, old_names)) [13:13:47.628] next [13:13:47.628] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:47.628] } [13:13:47.628] if (length(args) > 0) [13:13:47.628] base::do.call(base::Sys.setenv, args = args) [13:13:47.628] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:47.628] } [13:13:47.628] else { [13:13:47.628] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:47.628] } [13:13:47.628] { [13:13:47.628] if (base::length(...future.futureOptionsAdded) > [13:13:47.628] 0L) { [13:13:47.628] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:47.628] base::names(opts) <- ...future.futureOptionsAdded [13:13:47.628] base::options(opts) [13:13:47.628] } [13:13:47.628] { [13:13:47.628] { [13:13:47.628] base::options(mc.cores = ...future.mc.cores.old) [13:13:47.628] NULL [13:13:47.628] } [13:13:47.628] options(future.plan = NULL) [13:13:47.628] if (is.na(NA_character_)) [13:13:47.628] Sys.unsetenv("R_FUTURE_PLAN") [13:13:47.628] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:47.628] future::plan(list(function (..., workers = availableCores(), [13:13:47.628] lazy = FALSE, rscript_libs = .libPaths(), [13:13:47.628] envir = parent.frame()) [13:13:47.628] { [13:13:47.628] if (is.function(workers)) [13:13:47.628] workers <- workers() [13:13:47.628] workers <- structure(as.integer(workers), [13:13:47.628] class = class(workers)) [13:13:47.628] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:47.628] workers >= 1) [13:13:47.628] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:47.628] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:47.628] } [13:13:47.628] future <- MultisessionFuture(..., workers = workers, [13:13:47.628] lazy = lazy, rscript_libs = rscript_libs, [13:13:47.628] envir = envir) [13:13:47.628] if (!future$lazy) [13:13:47.628] future <- run(future) [13:13:47.628] invisible(future) [13:13:47.628] }), .cleanup = FALSE, .init = FALSE) [13:13:47.628] } [13:13:47.628] } [13:13:47.628] } [13:13:47.628] }) [13:13:47.628] if (TRUE) { [13:13:47.628] base::sink(type = "output", split = FALSE) [13:13:47.628] if (TRUE) { [13:13:47.628] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:47.628] } [13:13:47.628] else { [13:13:47.628] ...future.result["stdout"] <- base::list(NULL) [13:13:47.628] } [13:13:47.628] base::close(...future.stdout) [13:13:47.628] ...future.stdout <- NULL [13:13:47.628] } [13:13:47.628] ...future.result$conditions <- ...future.conditions [13:13:47.628] ...future.result$finished <- base::Sys.time() [13:13:47.628] ...future.result [13:13:47.628] } [13:13:47.633] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... [13:13:47.633] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... [13:13:47.634] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... DONE [13:13:47.634] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... [13:13:47.635] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... DONE [13:13:47.635] Exporting '...future.elements_ii' (232 bytes) to cluster node #1 ... [13:13:47.635] Exporting '...future.elements_ii' (232 bytes) to cluster node #1 ... DONE [13:13:47.635] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:13:47.636] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:13:47.636] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:13:47.636] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:13:47.637] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... DONE [13:13:47.637] MultisessionFuture started [13:13:47.637] - Launch lazy future ... done [13:13:47.638] run() for 'MultisessionFuture' ... done [13:13:47.638] Created future: [13:13:47.654] receiveMessageFromWorker() for ClusterFuture ... [13:13:47.654] - Validating connection of MultisessionFuture [13:13:47.654] - received message: FutureResult [13:13:47.655] - Received FutureResult [13:13:47.655] - Erased future from FutureRegistry [13:13:47.655] result() for ClusterFuture ... [13:13:47.655] - result already collected: FutureResult [13:13:47.655] result() for ClusterFuture ... done [13:13:47.655] receiveMessageFromWorker() for ClusterFuture ... done [13:13:47.638] MultisessionFuture: [13:13:47.638] Label: 'future_lapply-1' [13:13:47.638] Expression: [13:13:47.638] { [13:13:47.638] do.call(function(...) { [13:13:47.638] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:47.638] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:47.638] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:47.638] on.exit(options(oopts), add = TRUE) [13:13:47.638] } [13:13:47.638] { [13:13:47.638] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:47.638] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:47.638] ...future.FUN(...future.X_jj, ...) [13:13:47.638] }) [13:13:47.638] } [13:13:47.638] }, args = future.call.arguments) [13:13:47.638] } [13:13:47.638] Lazy evaluation: FALSE [13:13:47.638] Asynchronous evaluation: TRUE [13:13:47.638] Local evaluation: TRUE [13:13:47.638] Environment: R_GlobalEnv [13:13:47.638] Capture standard output: TRUE [13:13:47.638] Capture condition classes: 'condition' (excluding 'nothing') [13:13:47.638] 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) [13:13:47.638] Packages: [13:13:47.638] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:47.638] Resolved: TRUE [13:13:47.638] Value: [13:13:47.638] Conditions captured: [13:13:47.638] Early signaling: FALSE [13:13:47.638] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:47.638] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:47.656] Chunk #1 of 2 ... DONE [13:13:47.656] Chunk #2 of 2 ... [13:13:47.656] - Finding globals in 'X' for chunk #2 ... [13:13:47.656] getGlobalsAndPackages() ... [13:13:47.656] Searching for globals... [13:13:47.657] [13:13:47.657] Searching for globals ... DONE [13:13:47.657] - globals: [0] [13:13:47.657] getGlobalsAndPackages() ... DONE [13:13:47.657] + additional globals found: [n=0] [13:13:47.658] + additional namespaces needed: [n=0] [13:13:47.658] - Finding globals in 'X' for chunk #2 ... DONE [13:13:47.658] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:13:47.658] - seeds: [13:13:47.658] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:47.658] getGlobalsAndPackages() ... [13:13:47.659] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:47.659] Resolving globals: FALSE [13:13:47.659] Tweak future expression to call with '...' arguments ... [13:13:47.659] { [13:13:47.659] do.call(function(...) { [13:13:47.659] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:47.659] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:47.659] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:47.659] on.exit(options(oopts), add = TRUE) [13:13:47.659] } [13:13:47.659] { [13:13:47.659] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:47.659] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:47.659] ...future.FUN(...future.X_jj, ...) [13:13:47.659] }) [13:13:47.659] } [13:13:47.659] }, args = future.call.arguments) [13:13:47.659] } [13:13:47.660] Tweak future expression to call with '...' arguments ... DONE [13:13:47.660] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:47.660] [13:13:47.660] getGlobalsAndPackages() ... DONE [13:13:47.661] run() for 'Future' ... [13:13:47.661] - state: 'created' [13:13:47.661] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:47.675] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:47.675] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:13:47.675] - Field: 'node' [13:13:47.675] - Field: 'label' [13:13:47.675] - Field: 'local' [13:13:47.676] - Field: 'owner' [13:13:47.676] - Field: 'envir' [13:13:47.676] - Field: 'workers' [13:13:47.676] - Field: 'packages' [13:13:47.676] - Field: 'gc' [13:13:47.676] - Field: 'conditions' [13:13:47.677] - Field: 'persistent' [13:13:47.677] - Field: 'expr' [13:13:47.677] - Field: 'uuid' [13:13:47.677] - Field: 'seed' [13:13:47.677] - Field: 'version' [13:13:47.677] - Field: 'result' [13:13:47.678] - Field: 'asynchronous' [13:13:47.678] - Field: 'calls' [13:13:47.678] - Field: 'globals' [13:13:47.678] - Field: 'stdout' [13:13:47.678] - Field: 'earlySignal' [13:13:47.678] - Field: 'lazy' [13:13:47.679] - Field: 'state' [13:13:47.679] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:13:47.679] - Launch lazy future ... [13:13:47.679] Packages needed by the future expression (n = 0): [13:13:47.680] Packages needed by future strategies (n = 0): [13:13:47.680] { [13:13:47.680] { [13:13:47.680] { [13:13:47.680] ...future.startTime <- base::Sys.time() [13:13:47.680] { [13:13:47.680] { [13:13:47.680] { [13:13:47.680] { [13:13:47.680] base::local({ [13:13:47.680] has_future <- base::requireNamespace("future", [13:13:47.680] quietly = TRUE) [13:13:47.680] if (has_future) { [13:13:47.680] ns <- base::getNamespace("future") [13:13:47.680] version <- ns[[".package"]][["version"]] [13:13:47.680] if (is.null(version)) [13:13:47.680] version <- utils::packageVersion("future") [13:13:47.680] } [13:13:47.680] else { [13:13:47.680] version <- NULL [13:13:47.680] } [13:13:47.680] if (!has_future || version < "1.8.0") { [13:13:47.680] info <- base::c(r_version = base::gsub("R version ", [13:13:47.680] "", base::R.version$version.string), [13:13:47.680] platform = base::sprintf("%s (%s-bit)", [13:13:47.680] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:47.680] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:47.680] "release", "version")], collapse = " "), [13:13:47.680] hostname = base::Sys.info()[["nodename"]]) [13:13:47.680] info <- base::sprintf("%s: %s", base::names(info), [13:13:47.680] info) [13:13:47.680] info <- base::paste(info, collapse = "; ") [13:13:47.680] if (!has_future) { [13:13:47.680] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:47.680] info) [13:13:47.680] } [13:13:47.680] else { [13:13:47.680] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:47.680] info, version) [13:13:47.680] } [13:13:47.680] base::stop(msg) [13:13:47.680] } [13:13:47.680] }) [13:13:47.680] } [13:13:47.680] ...future.mc.cores.old <- base::getOption("mc.cores") [13:13:47.680] base::options(mc.cores = 1L) [13:13:47.680] } [13:13:47.680] options(future.plan = NULL) [13:13:47.680] Sys.unsetenv("R_FUTURE_PLAN") [13:13:47.680] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:47.680] } [13:13:47.680] ...future.workdir <- getwd() [13:13:47.680] } [13:13:47.680] ...future.oldOptions <- base::as.list(base::.Options) [13:13:47.680] ...future.oldEnvVars <- base::Sys.getenv() [13:13:47.680] } [13:13:47.680] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:47.680] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:13:47.680] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:47.680] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:47.680] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:47.680] future.stdout.windows.reencode = NULL, width = 80L) [13:13:47.680] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:47.680] base::names(...future.oldOptions)) [13:13:47.680] } [13:13:47.680] if (FALSE) { [13:13:47.680] } [13:13:47.680] else { [13:13:47.680] if (TRUE) { [13:13:47.680] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:47.680] open = "w") [13:13:47.680] } [13:13:47.680] else { [13:13:47.680] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:47.680] windows = "NUL", "/dev/null"), open = "w") [13:13:47.680] } [13:13:47.680] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:47.680] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:47.680] base::sink(type = "output", split = FALSE) [13:13:47.680] base::close(...future.stdout) [13:13:47.680] }, add = TRUE) [13:13:47.680] } [13:13:47.680] ...future.frame <- base::sys.nframe() [13:13:47.680] ...future.conditions <- base::list() [13:13:47.680] ...future.rng <- base::globalenv()$.Random.seed [13:13:47.680] if (FALSE) { [13:13:47.680] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:47.680] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:47.680] } [13:13:47.680] ...future.result <- base::tryCatch({ [13:13:47.680] base::withCallingHandlers({ [13:13:47.680] ...future.value <- base::withVisible(base::local({ [13:13:47.680] ...future.makeSendCondition <- local({ [13:13:47.680] sendCondition <- NULL [13:13:47.680] function(frame = 1L) { [13:13:47.680] if (is.function(sendCondition)) [13:13:47.680] return(sendCondition) [13:13:47.680] ns <- getNamespace("parallel") [13:13:47.680] if (exists("sendData", mode = "function", [13:13:47.680] envir = ns)) { [13:13:47.680] parallel_sendData <- get("sendData", mode = "function", [13:13:47.680] envir = ns) [13:13:47.680] envir <- sys.frame(frame) [13:13:47.680] master <- NULL [13:13:47.680] while (!identical(envir, .GlobalEnv) && [13:13:47.680] !identical(envir, emptyenv())) { [13:13:47.680] if (exists("master", mode = "list", envir = envir, [13:13:47.680] inherits = FALSE)) { [13:13:47.680] master <- get("master", mode = "list", [13:13:47.680] envir = envir, inherits = FALSE) [13:13:47.680] if (inherits(master, c("SOCKnode", [13:13:47.680] "SOCK0node"))) { [13:13:47.680] sendCondition <<- function(cond) { [13:13:47.680] data <- list(type = "VALUE", value = cond, [13:13:47.680] success = TRUE) [13:13:47.680] parallel_sendData(master, data) [13:13:47.680] } [13:13:47.680] return(sendCondition) [13:13:47.680] } [13:13:47.680] } [13:13:47.680] frame <- frame + 1L [13:13:47.680] envir <- sys.frame(frame) [13:13:47.680] } [13:13:47.680] } [13:13:47.680] sendCondition <<- function(cond) NULL [13:13:47.680] } [13:13:47.680] }) [13:13:47.680] withCallingHandlers({ [13:13:47.680] { [13:13:47.680] do.call(function(...) { [13:13:47.680] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:47.680] if (!identical(...future.globals.maxSize.org, [13:13:47.680] ...future.globals.maxSize)) { [13:13:47.680] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:47.680] on.exit(options(oopts), add = TRUE) [13:13:47.680] } [13:13:47.680] { [13:13:47.680] lapply(seq_along(...future.elements_ii), [13:13:47.680] FUN = function(jj) { [13:13:47.680] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:47.680] ...future.FUN(...future.X_jj, ...) [13:13:47.680] }) [13:13:47.680] } [13:13:47.680] }, args = future.call.arguments) [13:13:47.680] } [13:13:47.680] }, immediateCondition = function(cond) { [13:13:47.680] sendCondition <- ...future.makeSendCondition() [13:13:47.680] sendCondition(cond) [13:13:47.680] muffleCondition <- function (cond, pattern = "^muffle") [13:13:47.680] { [13:13:47.680] inherits <- base::inherits [13:13:47.680] invokeRestart <- base::invokeRestart [13:13:47.680] is.null <- base::is.null [13:13:47.680] muffled <- FALSE [13:13:47.680] if (inherits(cond, "message")) { [13:13:47.680] muffled <- grepl(pattern, "muffleMessage") [13:13:47.680] if (muffled) [13:13:47.680] invokeRestart("muffleMessage") [13:13:47.680] } [13:13:47.680] else if (inherits(cond, "warning")) { [13:13:47.680] muffled <- grepl(pattern, "muffleWarning") [13:13:47.680] if (muffled) [13:13:47.680] invokeRestart("muffleWarning") [13:13:47.680] } [13:13:47.680] else if (inherits(cond, "condition")) { [13:13:47.680] if (!is.null(pattern)) { [13:13:47.680] computeRestarts <- base::computeRestarts [13:13:47.680] grepl <- base::grepl [13:13:47.680] restarts <- computeRestarts(cond) [13:13:47.680] for (restart in restarts) { [13:13:47.680] name <- restart$name [13:13:47.680] if (is.null(name)) [13:13:47.680] next [13:13:47.680] if (!grepl(pattern, name)) [13:13:47.680] next [13:13:47.680] invokeRestart(restart) [13:13:47.680] muffled <- TRUE [13:13:47.680] break [13:13:47.680] } [13:13:47.680] } [13:13:47.680] } [13:13:47.680] invisible(muffled) [13:13:47.680] } [13:13:47.680] muffleCondition(cond) [13:13:47.680] }) [13:13:47.680] })) [13:13:47.680] future::FutureResult(value = ...future.value$value, [13:13:47.680] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:47.680] ...future.rng), globalenv = if (FALSE) [13:13:47.680] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:47.680] ...future.globalenv.names)) [13:13:47.680] else NULL, started = ...future.startTime, version = "1.8") [13:13:47.680] }, condition = base::local({ [13:13:47.680] c <- base::c [13:13:47.680] inherits <- base::inherits [13:13:47.680] invokeRestart <- base::invokeRestart [13:13:47.680] length <- base::length [13:13:47.680] list <- base::list [13:13:47.680] seq.int <- base::seq.int [13:13:47.680] signalCondition <- base::signalCondition [13:13:47.680] sys.calls <- base::sys.calls [13:13:47.680] `[[` <- base::`[[` [13:13:47.680] `+` <- base::`+` [13:13:47.680] `<<-` <- base::`<<-` [13:13:47.680] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:47.680] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:47.680] 3L)] [13:13:47.680] } [13:13:47.680] function(cond) { [13:13:47.680] is_error <- inherits(cond, "error") [13:13:47.680] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:47.680] NULL) [13:13:47.680] if (is_error) { [13:13:47.680] sessionInformation <- function() { [13:13:47.680] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:47.680] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:47.680] search = base::search(), system = base::Sys.info()) [13:13:47.680] } [13:13:47.680] ...future.conditions[[length(...future.conditions) + [13:13:47.680] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:47.680] cond$call), session = sessionInformation(), [13:13:47.680] timestamp = base::Sys.time(), signaled = 0L) [13:13:47.680] signalCondition(cond) [13:13:47.680] } [13:13:47.680] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:47.680] "immediateCondition"))) { [13:13:47.680] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:47.680] ...future.conditions[[length(...future.conditions) + [13:13:47.680] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:47.680] if (TRUE && !signal) { [13:13:47.680] muffleCondition <- function (cond, pattern = "^muffle") [13:13:47.680] { [13:13:47.680] inherits <- base::inherits [13:13:47.680] invokeRestart <- base::invokeRestart [13:13:47.680] is.null <- base::is.null [13:13:47.680] muffled <- FALSE [13:13:47.680] if (inherits(cond, "message")) { [13:13:47.680] muffled <- grepl(pattern, "muffleMessage") [13:13:47.680] if (muffled) [13:13:47.680] invokeRestart("muffleMessage") [13:13:47.680] } [13:13:47.680] else if (inherits(cond, "warning")) { [13:13:47.680] muffled <- grepl(pattern, "muffleWarning") [13:13:47.680] if (muffled) [13:13:47.680] invokeRestart("muffleWarning") [13:13:47.680] } [13:13:47.680] else if (inherits(cond, "condition")) { [13:13:47.680] if (!is.null(pattern)) { [13:13:47.680] computeRestarts <- base::computeRestarts [13:13:47.680] grepl <- base::grepl [13:13:47.680] restarts <- computeRestarts(cond) [13:13:47.680] for (restart in restarts) { [13:13:47.680] name <- restart$name [13:13:47.680] if (is.null(name)) [13:13:47.680] next [13:13:47.680] if (!grepl(pattern, name)) [13:13:47.680] next [13:13:47.680] invokeRestart(restart) [13:13:47.680] muffled <- TRUE [13:13:47.680] break [13:13:47.680] } [13:13:47.680] } [13:13:47.680] } [13:13:47.680] invisible(muffled) [13:13:47.680] } [13:13:47.680] muffleCondition(cond, pattern = "^muffle") [13:13:47.680] } [13:13:47.680] } [13:13:47.680] else { [13:13:47.680] if (TRUE) { [13:13:47.680] muffleCondition <- function (cond, pattern = "^muffle") [13:13:47.680] { [13:13:47.680] inherits <- base::inherits [13:13:47.680] invokeRestart <- base::invokeRestart [13:13:47.680] is.null <- base::is.null [13:13:47.680] muffled <- FALSE [13:13:47.680] if (inherits(cond, "message")) { [13:13:47.680] muffled <- grepl(pattern, "muffleMessage") [13:13:47.680] if (muffled) [13:13:47.680] invokeRestart("muffleMessage") [13:13:47.680] } [13:13:47.680] else if (inherits(cond, "warning")) { [13:13:47.680] muffled <- grepl(pattern, "muffleWarning") [13:13:47.680] if (muffled) [13:13:47.680] invokeRestart("muffleWarning") [13:13:47.680] } [13:13:47.680] else if (inherits(cond, "condition")) { [13:13:47.680] if (!is.null(pattern)) { [13:13:47.680] computeRestarts <- base::computeRestarts [13:13:47.680] grepl <- base::grepl [13:13:47.680] restarts <- computeRestarts(cond) [13:13:47.680] for (restart in restarts) { [13:13:47.680] name <- restart$name [13:13:47.680] if (is.null(name)) [13:13:47.680] next [13:13:47.680] if (!grepl(pattern, name)) [13:13:47.680] next [13:13:47.680] invokeRestart(restart) [13:13:47.680] muffled <- TRUE [13:13:47.680] break [13:13:47.680] } [13:13:47.680] } [13:13:47.680] } [13:13:47.680] invisible(muffled) [13:13:47.680] } [13:13:47.680] muffleCondition(cond, pattern = "^muffle") [13:13:47.680] } [13:13:47.680] } [13:13:47.680] } [13:13:47.680] })) [13:13:47.680] }, error = function(ex) { [13:13:47.680] base::structure(base::list(value = NULL, visible = NULL, [13:13:47.680] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:47.680] ...future.rng), started = ...future.startTime, [13:13:47.680] finished = Sys.time(), session_uuid = NA_character_, [13:13:47.680] version = "1.8"), class = "FutureResult") [13:13:47.680] }, finally = { [13:13:47.680] if (!identical(...future.workdir, getwd())) [13:13:47.680] setwd(...future.workdir) [13:13:47.680] { [13:13:47.680] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:47.680] ...future.oldOptions$nwarnings <- NULL [13:13:47.680] } [13:13:47.680] base::options(...future.oldOptions) [13:13:47.680] if (.Platform$OS.type == "windows") { [13:13:47.680] old_names <- names(...future.oldEnvVars) [13:13:47.680] envs <- base::Sys.getenv() [13:13:47.680] names <- names(envs) [13:13:47.680] common <- intersect(names, old_names) [13:13:47.680] added <- setdiff(names, old_names) [13:13:47.680] removed <- setdiff(old_names, names) [13:13:47.680] changed <- common[...future.oldEnvVars[common] != [13:13:47.680] envs[common]] [13:13:47.680] NAMES <- toupper(changed) [13:13:47.680] args <- list() [13:13:47.680] for (kk in seq_along(NAMES)) { [13:13:47.680] name <- changed[[kk]] [13:13:47.680] NAME <- NAMES[[kk]] [13:13:47.680] if (name != NAME && is.element(NAME, old_names)) [13:13:47.680] next [13:13:47.680] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:47.680] } [13:13:47.680] NAMES <- toupper(added) [13:13:47.680] for (kk in seq_along(NAMES)) { [13:13:47.680] name <- added[[kk]] [13:13:47.680] NAME <- NAMES[[kk]] [13:13:47.680] if (name != NAME && is.element(NAME, old_names)) [13:13:47.680] next [13:13:47.680] args[[name]] <- "" [13:13:47.680] } [13:13:47.680] NAMES <- toupper(removed) [13:13:47.680] for (kk in seq_along(NAMES)) { [13:13:47.680] name <- removed[[kk]] [13:13:47.680] NAME <- NAMES[[kk]] [13:13:47.680] if (name != NAME && is.element(NAME, old_names)) [13:13:47.680] next [13:13:47.680] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:47.680] } [13:13:47.680] if (length(args) > 0) [13:13:47.680] base::do.call(base::Sys.setenv, args = args) [13:13:47.680] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:47.680] } [13:13:47.680] else { [13:13:47.680] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:47.680] } [13:13:47.680] { [13:13:47.680] if (base::length(...future.futureOptionsAdded) > [13:13:47.680] 0L) { [13:13:47.680] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:47.680] base::names(opts) <- ...future.futureOptionsAdded [13:13:47.680] base::options(opts) [13:13:47.680] } [13:13:47.680] { [13:13:47.680] { [13:13:47.680] base::options(mc.cores = ...future.mc.cores.old) [13:13:47.680] NULL [13:13:47.680] } [13:13:47.680] options(future.plan = NULL) [13:13:47.680] if (is.na(NA_character_)) [13:13:47.680] Sys.unsetenv("R_FUTURE_PLAN") [13:13:47.680] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:47.680] future::plan(list(function (..., workers = availableCores(), [13:13:47.680] lazy = FALSE, rscript_libs = .libPaths(), [13:13:47.680] envir = parent.frame()) [13:13:47.680] { [13:13:47.680] if (is.function(workers)) [13:13:47.680] workers <- workers() [13:13:47.680] workers <- structure(as.integer(workers), [13:13:47.680] class = class(workers)) [13:13:47.680] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:47.680] workers >= 1) [13:13:47.680] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:47.680] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:47.680] } [13:13:47.680] future <- MultisessionFuture(..., workers = workers, [13:13:47.680] lazy = lazy, rscript_libs = rscript_libs, [13:13:47.680] envir = envir) [13:13:47.680] if (!future$lazy) [13:13:47.680] future <- run(future) [13:13:47.680] invisible(future) [13:13:47.680] }), .cleanup = FALSE, .init = FALSE) [13:13:47.680] } [13:13:47.680] } [13:13:47.680] } [13:13:47.680] }) [13:13:47.680] if (TRUE) { [13:13:47.680] base::sink(type = "output", split = FALSE) [13:13:47.680] if (TRUE) { [13:13:47.680] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:47.680] } [13:13:47.680] else { [13:13:47.680] ...future.result["stdout"] <- base::list(NULL) [13:13:47.680] } [13:13:47.680] base::close(...future.stdout) [13:13:47.680] ...future.stdout <- NULL [13:13:47.680] } [13:13:47.680] ...future.result$conditions <- ...future.conditions [13:13:47.680] ...future.result$finished <- base::Sys.time() [13:13:47.680] ...future.result [13:13:47.680] } [13:13:47.685] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... [13:13:47.686] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... [13:13:47.686] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... DONE [13:13:47.686] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... [13:13:47.687] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... DONE [13:13:47.687] Exporting '...future.elements_ii' (224 bytes) to cluster node #1 ... [13:13:47.687] Exporting '...future.elements_ii' (224 bytes) to cluster node #1 ... DONE [13:13:47.688] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:13:47.688] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:13:47.688] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:13:47.689] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:13:47.689] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... DONE [13:13:47.690] MultisessionFuture started [13:13:47.690] - Launch lazy future ... done [13:13:47.690] run() for 'MultisessionFuture' ... done [13:13:47.690] Created future: [13:13:47.706] receiveMessageFromWorker() for ClusterFuture ... [13:13:47.706] - Validating connection of MultisessionFuture [13:13:47.707] - received message: FutureResult [13:13:47.707] - Received FutureResult [13:13:47.707] - Erased future from FutureRegistry [13:13:47.707] result() for ClusterFuture ... [13:13:47.707] - result already collected: FutureResult [13:13:47.707] result() for ClusterFuture ... done [13:13:47.708] receiveMessageFromWorker() for ClusterFuture ... done [13:13:47.690] MultisessionFuture: [13:13:47.690] Label: 'future_lapply-2' [13:13:47.690] Expression: [13:13:47.690] { [13:13:47.690] do.call(function(...) { [13:13:47.690] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:47.690] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:47.690] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:47.690] on.exit(options(oopts), add = TRUE) [13:13:47.690] } [13:13:47.690] { [13:13:47.690] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:47.690] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:47.690] ...future.FUN(...future.X_jj, ...) [13:13:47.690] }) [13:13:47.690] } [13:13:47.690] }, args = future.call.arguments) [13:13:47.690] } [13:13:47.690] Lazy evaluation: FALSE [13:13:47.690] Asynchronous evaluation: TRUE [13:13:47.690] Local evaluation: TRUE [13:13:47.690] Environment: R_GlobalEnv [13:13:47.690] Capture standard output: TRUE [13:13:47.690] Capture condition classes: 'condition' (excluding 'nothing') [13:13:47.690] 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) [13:13:47.690] Packages: [13:13:47.690] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:47.690] Resolved: TRUE [13:13:47.690] Value: [13:13:47.690] Conditions captured: [13:13:47.690] Early signaling: FALSE [13:13:47.690] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:47.690] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:47.708] Chunk #2 of 2 ... DONE [13:13:47.708] Launching 2 futures (chunks) ... DONE [13:13:47.708] Resolving 2 futures (chunks) ... [13:13:47.709] resolve() on list ... [13:13:47.709] recursive: 0 [13:13:47.709] length: 2 [13:13:47.709] [13:13:47.709] Future #1 [13:13:47.709] result() for ClusterFuture ... [13:13:47.710] - result already collected: FutureResult [13:13:47.710] result() for ClusterFuture ... done [13:13:47.710] result() for ClusterFuture ... [13:13:47.710] - result already collected: FutureResult [13:13:47.710] result() for ClusterFuture ... done [13:13:47.710] signalConditionsASAP(MultisessionFuture, pos=1) ... [13:13:47.711] - nx: 2 [13:13:47.711] - relay: TRUE [13:13:47.711] - stdout: TRUE [13:13:47.711] - signal: TRUE [13:13:47.711] - resignal: FALSE [13:13:47.711] - force: TRUE [13:13:47.711] - relayed: [n=2] FALSE, FALSE [13:13:47.712] - queued futures: [n=2] FALSE, FALSE [13:13:47.712] - until=1 [13:13:47.712] - relaying element #1 [13:13:47.712] result() for ClusterFuture ... [13:13:47.712] - result already collected: FutureResult [13:13:47.712] result() for ClusterFuture ... done [13:13:47.713] result() for ClusterFuture ... [13:13:47.713] - result already collected: FutureResult [13:13:47.713] result() for ClusterFuture ... done [13:13:47.713] result() for ClusterFuture ... [13:13:47.713] - result already collected: FutureResult [13:13:47.713] result() for ClusterFuture ... done [13:13:47.714] result() for ClusterFuture ... [13:13:47.714] - result already collected: FutureResult [13:13:47.714] result() for ClusterFuture ... done [13:13:47.714] - relayed: [n=2] TRUE, FALSE [13:13:47.714] - queued futures: [n=2] TRUE, FALSE [13:13:47.714] signalConditionsASAP(MultisessionFuture, pos=1) ... done [13:13:47.714] length: 1 (resolved future 1) [13:13:47.715] Future #2 [13:13:47.715] result() for ClusterFuture ... [13:13:47.715] - result already collected: FutureResult [13:13:47.715] result() for ClusterFuture ... done [13:13:47.715] result() for ClusterFuture ... [13:13:47.715] - result already collected: FutureResult [13:13:47.716] result() for ClusterFuture ... done [13:13:47.716] signalConditionsASAP(MultisessionFuture, pos=2) ... [13:13:47.716] - nx: 2 [13:13:47.716] - relay: TRUE [13:13:47.716] - stdout: TRUE [13:13:47.716] - signal: TRUE [13:13:47.716] - resignal: FALSE [13:13:47.717] - force: TRUE [13:13:47.717] - relayed: [n=2] TRUE, FALSE [13:13:47.717] - queued futures: [n=2] TRUE, FALSE [13:13:47.717] - until=2 [13:13:47.717] - relaying element #2 [13:13:47.717] result() for ClusterFuture ... [13:13:47.718] - result already collected: FutureResult [13:13:47.718] result() for ClusterFuture ... done [13:13:47.718] result() for ClusterFuture ... [13:13:47.718] - result already collected: FutureResult [13:13:47.718] result() for ClusterFuture ... done [13:13:47.718] result() for ClusterFuture ... [13:13:47.719] - result already collected: FutureResult [13:13:47.719] result() for ClusterFuture ... done [13:13:47.719] result() for ClusterFuture ... [13:13:47.719] - result already collected: FutureResult [13:13:47.719] result() for ClusterFuture ... done [13:13:47.719] - relayed: [n=2] TRUE, TRUE [13:13:47.719] - queued futures: [n=2] TRUE, TRUE [13:13:47.720] signalConditionsASAP(MultisessionFuture, pos=2) ... done [13:13:47.720] length: 0 (resolved future 2) [13:13:47.720] Relaying remaining futures [13:13:47.720] signalConditionsASAP(NULL, pos=0) ... [13:13:47.720] - nx: 2 [13:13:47.720] - relay: TRUE [13:13:47.721] - stdout: TRUE [13:13:47.721] - signal: TRUE [13:13:47.721] - resignal: FALSE [13:13:47.721] - force: TRUE [13:13:47.721] - relayed: [n=2] TRUE, TRUE [13:13:47.721] - queued futures: [n=2] TRUE, TRUE - flush all [13:13:47.722] - relayed: [n=2] TRUE, TRUE [13:13:47.722] - queued futures: [n=2] TRUE, TRUE [13:13:47.722] signalConditionsASAP(NULL, pos=0) ... done [13:13:47.722] resolve() on list ... DONE [13:13:47.722] result() for ClusterFuture ... [13:13:47.722] - result already collected: FutureResult [13:13:47.722] result() for ClusterFuture ... done [13:13:47.723] result() for ClusterFuture ... [13:13:47.723] - result already collected: FutureResult [13:13:47.723] result() for ClusterFuture ... done [13:13:47.723] result() for ClusterFuture ... [13:13:47.723] - result already collected: FutureResult [13:13:47.723] result() for ClusterFuture ... done [13:13:47.724] result() for ClusterFuture ... [13:13:47.724] - result already collected: FutureResult [13:13:47.724] result() for ClusterFuture ... done [13:13:47.724] - Number of value chunks collected: 2 [13:13:47.724] Resolving 2 futures (chunks) ... DONE [13:13:47.724] Reducing values from 2 chunks ... [13:13:47.724] - Number of values collected after concatenation: 4 [13:13:47.725] - Number of values expected: 4 [13:13:47.725] Reverse index remapping (attribute 'ordering'): [n = 4] 4, 3, 2, 1 [13:13:47.725] Reducing values from 2 chunks ... DONE [13:13:47.725] 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, ...) ... [13:13:47.728] future_lapply() ... [13:13:47.739] Number of chunks: 1 [13:13:47.739] getGlobalsAndPackagesXApply() ... [13:13:47.739] - future.globals: TRUE [13:13:47.740] getGlobalsAndPackages() ... [13:13:47.740] Searching for globals... [13:13:47.750] - globals found: [22] 'FUN', 'if', 'missing', 'is.finite', '{', 'is.null', '<-', 'paste', 'length', '==', 'return', '>', '+', '[', 'seq_len', 'rev', 'c', '&&', '!', ':', '(', '-' [13:13:47.750] Searching for globals ... DONE [13:13:47.750] Resolving globals: FALSE [13:13:47.751] The total size of the 1 globals is 69.62 KiB (71288 bytes) [13:13:47.751] 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') [13:13:47.752] - globals: [1] 'FUN' [13:13:47.752] - packages: [1] 'future' [13:13:47.752] getGlobalsAndPackages() ... DONE [13:13:47.752] - globals found/used: [n=1] 'FUN' [13:13:47.752] - needed namespaces: [n=1] 'future' [13:13:47.753] Finding globals ... DONE [13:13:47.753] - use_args: TRUE [13:13:47.753] - Getting '...' globals ... [13:13:47.753] resolve() on list ... [13:13:47.753] recursive: 0 [13:13:47.754] length: 1 [13:13:47.754] elements: '...' [13:13:47.754] length: 0 (resolved future 1) [13:13:47.754] resolve() on list ... DONE [13:13:47.754] - '...' content: [n=2] 'collapse', 'maxHead' [13:13:47.754] List of 1 [13:13:47.754] $ ...:List of 2 [13:13:47.754] ..$ collapse: chr "; " [13:13:47.754] ..$ maxHead : int 3 [13:13:47.754] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:47.754] - attr(*, "where")=List of 1 [13:13:47.754] ..$ ...: [13:13:47.754] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:47.754] - attr(*, "resolved")= logi TRUE [13:13:47.754] - attr(*, "total_size")= num NA [13:13:47.758] - Getting '...' globals ... DONE [13:13:47.759] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:47.759] List of 2 [13:13:47.759] $ ...future.FUN:function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [13:13:47.759] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [13:13:47.759] $ ... :List of 2 [13:13:47.759] ..$ collapse: chr "; " [13:13:47.759] ..$ maxHead : int 3 [13:13:47.759] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:47.759] - attr(*, "where")=List of 2 [13:13:47.759] ..$ ...future.FUN: [13:13:47.759] ..$ ... : [13:13:47.759] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:47.759] - attr(*, "resolved")= logi FALSE [13:13:47.759] - attr(*, "total_size")= num 71456 [13:13:47.763] Packages to be attached in all futures: [n=1] 'future' [13:13:47.763] getGlobalsAndPackagesXApply() ... DONE [13:13:47.763] Number of futures (= number of chunks): 1 [13:13:47.764] Launching 1 futures (chunks) ... [13:13:47.764] Chunk #1 of 1 ... [13:13:47.764] - Finding globals in 'X' for chunk #1 ... [13:13:47.764] getGlobalsAndPackages() ... [13:13:47.764] Searching for globals... [13:13:47.764] [13:13:47.765] Searching for globals ... DONE [13:13:47.765] - globals: [0] [13:13:47.765] getGlobalsAndPackages() ... DONE [13:13:47.765] + additional globals found: [n=0] [13:13:47.765] + additional namespaces needed: [n=0] [13:13:47.765] - Finding globals in 'X' for chunk #1 ... DONE [13:13:47.766] - seeds: [13:13:47.766] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:47.766] getGlobalsAndPackages() ... [13:13:47.766] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:47.766] Resolving globals: FALSE [13:13:47.767] Tweak future expression to call with '...' arguments ... [13:13:47.767] { [13:13:47.767] do.call(function(...) { [13:13:47.767] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:47.767] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:47.767] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:47.767] on.exit(options(oopts), add = TRUE) [13:13:47.767] } [13:13:47.767] { [13:13:47.767] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:47.767] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:47.767] ...future.FUN(...future.X_jj, ...) [13:13:47.767] }) [13:13:47.767] } [13:13:47.767] }, args = future.call.arguments) [13:13:47.767] } [13:13:47.767] Tweak future expression to call with '...' arguments ... DONE [13:13:47.768] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:47.768] - packages: [1] 'future' [13:13:47.768] getGlobalsAndPackages() ... DONE [13:13:47.768] run() for 'Future' ... [13:13:47.769] - state: 'created' [13:13:47.769] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:47.784] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:47.784] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:13:47.785] - Field: 'node' [13:13:47.785] - Field: 'label' [13:13:47.785] - Field: 'local' [13:13:47.788] - Field: 'owner' [13:13:47.788] - Field: 'envir' [13:13:47.788] - Field: 'workers' [13:13:47.788] - Field: 'packages' [13:13:47.788] - Field: 'gc' [13:13:47.788] - Field: 'conditions' [13:13:47.789] - Field: 'persistent' [13:13:47.789] - Field: 'expr' [13:13:47.789] - Field: 'uuid' [13:13:47.789] - Field: 'seed' [13:13:47.789] - Field: 'version' [13:13:47.789] - Field: 'result' [13:13:47.790] - Field: 'asynchronous' [13:13:47.790] - Field: 'calls' [13:13:47.790] - Field: 'globals' [13:13:47.790] - Field: 'stdout' [13:13:47.790] - Field: 'earlySignal' [13:13:47.791] - Field: 'lazy' [13:13:47.791] - Field: 'state' [13:13:47.791] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:13:47.791] - Launch lazy future ... [13:13:47.791] Packages needed by the future expression (n = 1): 'future' [13:13:47.792] Packages needed by future strategies (n = 0): [13:13:47.792] { [13:13:47.792] { [13:13:47.792] { [13:13:47.792] ...future.startTime <- base::Sys.time() [13:13:47.792] { [13:13:47.792] { [13:13:47.792] { [13:13:47.792] { [13:13:47.792] { [13:13:47.792] base::local({ [13:13:47.792] has_future <- base::requireNamespace("future", [13:13:47.792] quietly = TRUE) [13:13:47.792] if (has_future) { [13:13:47.792] ns <- base::getNamespace("future") [13:13:47.792] version <- ns[[".package"]][["version"]] [13:13:47.792] if (is.null(version)) [13:13:47.792] version <- utils::packageVersion("future") [13:13:47.792] } [13:13:47.792] else { [13:13:47.792] version <- NULL [13:13:47.792] } [13:13:47.792] if (!has_future || version < "1.8.0") { [13:13:47.792] info <- base::c(r_version = base::gsub("R version ", [13:13:47.792] "", base::R.version$version.string), [13:13:47.792] platform = base::sprintf("%s (%s-bit)", [13:13:47.792] base::R.version$platform, 8 * [13:13:47.792] base::.Machine$sizeof.pointer), [13:13:47.792] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:47.792] "release", "version")], collapse = " "), [13:13:47.792] hostname = base::Sys.info()[["nodename"]]) [13:13:47.792] info <- base::sprintf("%s: %s", base::names(info), [13:13:47.792] info) [13:13:47.792] info <- base::paste(info, collapse = "; ") [13:13:47.792] if (!has_future) { [13:13:47.792] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:47.792] info) [13:13:47.792] } [13:13:47.792] else { [13:13:47.792] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:47.792] info, version) [13:13:47.792] } [13:13:47.792] base::stop(msg) [13:13:47.792] } [13:13:47.792] }) [13:13:47.792] } [13:13:47.792] ...future.mc.cores.old <- base::getOption("mc.cores") [13:13:47.792] base::options(mc.cores = 1L) [13:13:47.792] } [13:13:47.792] base::local({ [13:13:47.792] for (pkg in "future") { [13:13:47.792] base::loadNamespace(pkg) [13:13:47.792] base::library(pkg, character.only = TRUE) [13:13:47.792] } [13:13:47.792] }) [13:13:47.792] } [13:13:47.792] options(future.plan = NULL) [13:13:47.792] Sys.unsetenv("R_FUTURE_PLAN") [13:13:47.792] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:47.792] } [13:13:47.792] ...future.workdir <- getwd() [13:13:47.792] } [13:13:47.792] ...future.oldOptions <- base::as.list(base::.Options) [13:13:47.792] ...future.oldEnvVars <- base::Sys.getenv() [13:13:47.792] } [13:13:47.792] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:47.792] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:47.792] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:47.792] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:47.792] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:47.792] future.stdout.windows.reencode = NULL, width = 80L) [13:13:47.792] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:47.792] base::names(...future.oldOptions)) [13:13:47.792] } [13:13:47.792] if (FALSE) { [13:13:47.792] } [13:13:47.792] else { [13:13:47.792] if (TRUE) { [13:13:47.792] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:47.792] open = "w") [13:13:47.792] } [13:13:47.792] else { [13:13:47.792] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:47.792] windows = "NUL", "/dev/null"), open = "w") [13:13:47.792] } [13:13:47.792] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:47.792] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:47.792] base::sink(type = "output", split = FALSE) [13:13:47.792] base::close(...future.stdout) [13:13:47.792] }, add = TRUE) [13:13:47.792] } [13:13:47.792] ...future.frame <- base::sys.nframe() [13:13:47.792] ...future.conditions <- base::list() [13:13:47.792] ...future.rng <- base::globalenv()$.Random.seed [13:13:47.792] if (FALSE) { [13:13:47.792] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:47.792] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:47.792] } [13:13:47.792] ...future.result <- base::tryCatch({ [13:13:47.792] base::withCallingHandlers({ [13:13:47.792] ...future.value <- base::withVisible(base::local({ [13:13:47.792] ...future.makeSendCondition <- local({ [13:13:47.792] sendCondition <- NULL [13:13:47.792] function(frame = 1L) { [13:13:47.792] if (is.function(sendCondition)) [13:13:47.792] return(sendCondition) [13:13:47.792] ns <- getNamespace("parallel") [13:13:47.792] if (exists("sendData", mode = "function", [13:13:47.792] envir = ns)) { [13:13:47.792] parallel_sendData <- get("sendData", mode = "function", [13:13:47.792] envir = ns) [13:13:47.792] envir <- sys.frame(frame) [13:13:47.792] master <- NULL [13:13:47.792] while (!identical(envir, .GlobalEnv) && [13:13:47.792] !identical(envir, emptyenv())) { [13:13:47.792] if (exists("master", mode = "list", envir = envir, [13:13:47.792] inherits = FALSE)) { [13:13:47.792] master <- get("master", mode = "list", [13:13:47.792] envir = envir, inherits = FALSE) [13:13:47.792] if (inherits(master, c("SOCKnode", [13:13:47.792] "SOCK0node"))) { [13:13:47.792] sendCondition <<- function(cond) { [13:13:47.792] data <- list(type = "VALUE", value = cond, [13:13:47.792] success = TRUE) [13:13:47.792] parallel_sendData(master, data) [13:13:47.792] } [13:13:47.792] return(sendCondition) [13:13:47.792] } [13:13:47.792] } [13:13:47.792] frame <- frame + 1L [13:13:47.792] envir <- sys.frame(frame) [13:13:47.792] } [13:13:47.792] } [13:13:47.792] sendCondition <<- function(cond) NULL [13:13:47.792] } [13:13:47.792] }) [13:13:47.792] withCallingHandlers({ [13:13:47.792] { [13:13:47.792] do.call(function(...) { [13:13:47.792] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:47.792] if (!identical(...future.globals.maxSize.org, [13:13:47.792] ...future.globals.maxSize)) { [13:13:47.792] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:47.792] on.exit(options(oopts), add = TRUE) [13:13:47.792] } [13:13:47.792] { [13:13:47.792] lapply(seq_along(...future.elements_ii), [13:13:47.792] FUN = function(jj) { [13:13:47.792] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:47.792] ...future.FUN(...future.X_jj, ...) [13:13:47.792] }) [13:13:47.792] } [13:13:47.792] }, args = future.call.arguments) [13:13:47.792] } [13:13:47.792] }, immediateCondition = function(cond) { [13:13:47.792] sendCondition <- ...future.makeSendCondition() [13:13:47.792] sendCondition(cond) [13:13:47.792] muffleCondition <- function (cond, pattern = "^muffle") [13:13:47.792] { [13:13:47.792] inherits <- base::inherits [13:13:47.792] invokeRestart <- base::invokeRestart [13:13:47.792] is.null <- base::is.null [13:13:47.792] muffled <- FALSE [13:13:47.792] if (inherits(cond, "message")) { [13:13:47.792] muffled <- grepl(pattern, "muffleMessage") [13:13:47.792] if (muffled) [13:13:47.792] invokeRestart("muffleMessage") [13:13:47.792] } [13:13:47.792] else if (inherits(cond, "warning")) { [13:13:47.792] muffled <- grepl(pattern, "muffleWarning") [13:13:47.792] if (muffled) [13:13:47.792] invokeRestart("muffleWarning") [13:13:47.792] } [13:13:47.792] else if (inherits(cond, "condition")) { [13:13:47.792] if (!is.null(pattern)) { [13:13:47.792] computeRestarts <- base::computeRestarts [13:13:47.792] grepl <- base::grepl [13:13:47.792] restarts <- computeRestarts(cond) [13:13:47.792] for (restart in restarts) { [13:13:47.792] name <- restart$name [13:13:47.792] if (is.null(name)) [13:13:47.792] next [13:13:47.792] if (!grepl(pattern, name)) [13:13:47.792] next [13:13:47.792] invokeRestart(restart) [13:13:47.792] muffled <- TRUE [13:13:47.792] break [13:13:47.792] } [13:13:47.792] } [13:13:47.792] } [13:13:47.792] invisible(muffled) [13:13:47.792] } [13:13:47.792] muffleCondition(cond) [13:13:47.792] }) [13:13:47.792] })) [13:13:47.792] future::FutureResult(value = ...future.value$value, [13:13:47.792] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:47.792] ...future.rng), globalenv = if (FALSE) [13:13:47.792] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:47.792] ...future.globalenv.names)) [13:13:47.792] else NULL, started = ...future.startTime, version = "1.8") [13:13:47.792] }, condition = base::local({ [13:13:47.792] c <- base::c [13:13:47.792] inherits <- base::inherits [13:13:47.792] invokeRestart <- base::invokeRestart [13:13:47.792] length <- base::length [13:13:47.792] list <- base::list [13:13:47.792] seq.int <- base::seq.int [13:13:47.792] signalCondition <- base::signalCondition [13:13:47.792] sys.calls <- base::sys.calls [13:13:47.792] `[[` <- base::`[[` [13:13:47.792] `+` <- base::`+` [13:13:47.792] `<<-` <- base::`<<-` [13:13:47.792] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:47.792] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:47.792] 3L)] [13:13:47.792] } [13:13:47.792] function(cond) { [13:13:47.792] is_error <- inherits(cond, "error") [13:13:47.792] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:47.792] NULL) [13:13:47.792] if (is_error) { [13:13:47.792] sessionInformation <- function() { [13:13:47.792] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:47.792] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:47.792] search = base::search(), system = base::Sys.info()) [13:13:47.792] } [13:13:47.792] ...future.conditions[[length(...future.conditions) + [13:13:47.792] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:47.792] cond$call), session = sessionInformation(), [13:13:47.792] timestamp = base::Sys.time(), signaled = 0L) [13:13:47.792] signalCondition(cond) [13:13:47.792] } [13:13:47.792] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:47.792] "immediateCondition"))) { [13:13:47.792] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:47.792] ...future.conditions[[length(...future.conditions) + [13:13:47.792] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:47.792] if (TRUE && !signal) { [13:13:47.792] muffleCondition <- function (cond, pattern = "^muffle") [13:13:47.792] { [13:13:47.792] inherits <- base::inherits [13:13:47.792] invokeRestart <- base::invokeRestart [13:13:47.792] is.null <- base::is.null [13:13:47.792] muffled <- FALSE [13:13:47.792] if (inherits(cond, "message")) { [13:13:47.792] muffled <- grepl(pattern, "muffleMessage") [13:13:47.792] if (muffled) [13:13:47.792] invokeRestart("muffleMessage") [13:13:47.792] } [13:13:47.792] else if (inherits(cond, "warning")) { [13:13:47.792] muffled <- grepl(pattern, "muffleWarning") [13:13:47.792] if (muffled) [13:13:47.792] invokeRestart("muffleWarning") [13:13:47.792] } [13:13:47.792] else if (inherits(cond, "condition")) { [13:13:47.792] if (!is.null(pattern)) { [13:13:47.792] computeRestarts <- base::computeRestarts [13:13:47.792] grepl <- base::grepl [13:13:47.792] restarts <- computeRestarts(cond) [13:13:47.792] for (restart in restarts) { [13:13:47.792] name <- restart$name [13:13:47.792] if (is.null(name)) [13:13:47.792] next [13:13:47.792] if (!grepl(pattern, name)) [13:13:47.792] next [13:13:47.792] invokeRestart(restart) [13:13:47.792] muffled <- TRUE [13:13:47.792] break [13:13:47.792] } [13:13:47.792] } [13:13:47.792] } [13:13:47.792] invisible(muffled) [13:13:47.792] } [13:13:47.792] muffleCondition(cond, pattern = "^muffle") [13:13:47.792] } [13:13:47.792] } [13:13:47.792] else { [13:13:47.792] if (TRUE) { [13:13:47.792] muffleCondition <- function (cond, pattern = "^muffle") [13:13:47.792] { [13:13:47.792] inherits <- base::inherits [13:13:47.792] invokeRestart <- base::invokeRestart [13:13:47.792] is.null <- base::is.null [13:13:47.792] muffled <- FALSE [13:13:47.792] if (inherits(cond, "message")) { [13:13:47.792] muffled <- grepl(pattern, "muffleMessage") [13:13:47.792] if (muffled) [13:13:47.792] invokeRestart("muffleMessage") [13:13:47.792] } [13:13:47.792] else if (inherits(cond, "warning")) { [13:13:47.792] muffled <- grepl(pattern, "muffleWarning") [13:13:47.792] if (muffled) [13:13:47.792] invokeRestart("muffleWarning") [13:13:47.792] } [13:13:47.792] else if (inherits(cond, "condition")) { [13:13:47.792] if (!is.null(pattern)) { [13:13:47.792] computeRestarts <- base::computeRestarts [13:13:47.792] grepl <- base::grepl [13:13:47.792] restarts <- computeRestarts(cond) [13:13:47.792] for (restart in restarts) { [13:13:47.792] name <- restart$name [13:13:47.792] if (is.null(name)) [13:13:47.792] next [13:13:47.792] if (!grepl(pattern, name)) [13:13:47.792] next [13:13:47.792] invokeRestart(restart) [13:13:47.792] muffled <- TRUE [13:13:47.792] break [13:13:47.792] } [13:13:47.792] } [13:13:47.792] } [13:13:47.792] invisible(muffled) [13:13:47.792] } [13:13:47.792] muffleCondition(cond, pattern = "^muffle") [13:13:47.792] } [13:13:47.792] } [13:13:47.792] } [13:13:47.792] })) [13:13:47.792] }, error = function(ex) { [13:13:47.792] base::structure(base::list(value = NULL, visible = NULL, [13:13:47.792] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:47.792] ...future.rng), started = ...future.startTime, [13:13:47.792] finished = Sys.time(), session_uuid = NA_character_, [13:13:47.792] version = "1.8"), class = "FutureResult") [13:13:47.792] }, finally = { [13:13:47.792] if (!identical(...future.workdir, getwd())) [13:13:47.792] setwd(...future.workdir) [13:13:47.792] { [13:13:47.792] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:47.792] ...future.oldOptions$nwarnings <- NULL [13:13:47.792] } [13:13:47.792] base::options(...future.oldOptions) [13:13:47.792] if (.Platform$OS.type == "windows") { [13:13:47.792] old_names <- names(...future.oldEnvVars) [13:13:47.792] envs <- base::Sys.getenv() [13:13:47.792] names <- names(envs) [13:13:47.792] common <- intersect(names, old_names) [13:13:47.792] added <- setdiff(names, old_names) [13:13:47.792] removed <- setdiff(old_names, names) [13:13:47.792] changed <- common[...future.oldEnvVars[common] != [13:13:47.792] envs[common]] [13:13:47.792] NAMES <- toupper(changed) [13:13:47.792] args <- list() [13:13:47.792] for (kk in seq_along(NAMES)) { [13:13:47.792] name <- changed[[kk]] [13:13:47.792] NAME <- NAMES[[kk]] [13:13:47.792] if (name != NAME && is.element(NAME, old_names)) [13:13:47.792] next [13:13:47.792] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:47.792] } [13:13:47.792] NAMES <- toupper(added) [13:13:47.792] for (kk in seq_along(NAMES)) { [13:13:47.792] name <- added[[kk]] [13:13:47.792] NAME <- NAMES[[kk]] [13:13:47.792] if (name != NAME && is.element(NAME, old_names)) [13:13:47.792] next [13:13:47.792] args[[name]] <- "" [13:13:47.792] } [13:13:47.792] NAMES <- toupper(removed) [13:13:47.792] for (kk in seq_along(NAMES)) { [13:13:47.792] name <- removed[[kk]] [13:13:47.792] NAME <- NAMES[[kk]] [13:13:47.792] if (name != NAME && is.element(NAME, old_names)) [13:13:47.792] next [13:13:47.792] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:47.792] } [13:13:47.792] if (length(args) > 0) [13:13:47.792] base::do.call(base::Sys.setenv, args = args) [13:13:47.792] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:47.792] } [13:13:47.792] else { [13:13:47.792] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:47.792] } [13:13:47.792] { [13:13:47.792] if (base::length(...future.futureOptionsAdded) > [13:13:47.792] 0L) { [13:13:47.792] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:47.792] base::names(opts) <- ...future.futureOptionsAdded [13:13:47.792] base::options(opts) [13:13:47.792] } [13:13:47.792] { [13:13:47.792] { [13:13:47.792] base::options(mc.cores = ...future.mc.cores.old) [13:13:47.792] NULL [13:13:47.792] } [13:13:47.792] options(future.plan = NULL) [13:13:47.792] if (is.na(NA_character_)) [13:13:47.792] Sys.unsetenv("R_FUTURE_PLAN") [13:13:47.792] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:47.792] future::plan(list(function (..., workers = availableCores(), [13:13:47.792] lazy = FALSE, rscript_libs = .libPaths(), [13:13:47.792] envir = parent.frame()) [13:13:47.792] { [13:13:47.792] if (is.function(workers)) [13:13:47.792] workers <- workers() [13:13:47.792] workers <- structure(as.integer(workers), [13:13:47.792] class = class(workers)) [13:13:47.792] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:47.792] workers >= 1) [13:13:47.792] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:47.792] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:47.792] } [13:13:47.792] future <- MultisessionFuture(..., workers = workers, [13:13:47.792] lazy = lazy, rscript_libs = rscript_libs, [13:13:47.792] envir = envir) [13:13:47.792] if (!future$lazy) [13:13:47.792] future <- run(future) [13:13:47.792] invisible(future) [13:13:47.792] }), .cleanup = FALSE, .init = FALSE) [13:13:47.792] } [13:13:47.792] } [13:13:47.792] } [13:13:47.792] }) [13:13:47.792] if (TRUE) { [13:13:47.792] base::sink(type = "output", split = FALSE) [13:13:47.792] if (TRUE) { [13:13:47.792] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:47.792] } [13:13:47.792] else { [13:13:47.792] ...future.result["stdout"] <- base::list(NULL) [13:13:47.792] } [13:13:47.792] base::close(...future.stdout) [13:13:47.792] ...future.stdout <- NULL [13:13:47.792] } [13:13:47.792] ...future.result$conditions <- ...future.conditions [13:13:47.792] ...future.result$finished <- base::Sys.time() [13:13:47.792] ...future.result [13:13:47.792] } [13:13:47.798] Exporting 5 global objects (69.78 KiB) to cluster node #1 ... [13:13:47.798] Exporting '...future.FUN' (69.62 KiB) to cluster node #1 ... [13:13:47.798] Exporting '...future.FUN' (69.62 KiB) to cluster node #1 ... DONE [13:13:47.799] Exporting 'future.call.arguments' (168 bytes) to cluster node #1 ... [13:13:47.799] Exporting 'future.call.arguments' (168 bytes) to cluster node #1 ... DONE [13:13:47.799] Exporting '...future.elements_ii' (12.83 KiB) to cluster node #1 ... [13:13:47.800] Exporting '...future.elements_ii' (12.83 KiB) to cluster node #1 ... DONE [13:13:47.800] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:13:47.800] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:13:47.801] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:13:47.801] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:13:47.801] Exporting 5 global objects (69.78 KiB) to cluster node #1 ... DONE [13:13:47.802] MultisessionFuture started [13:13:47.802] - Launch lazy future ... done [13:13:47.802] run() for 'MultisessionFuture' ... done [13:13:47.802] Created future: [13:13:47.819] receiveMessageFromWorker() for ClusterFuture ... [13:13:47.819] - Validating connection of MultisessionFuture [13:13:47.819] - received message: FutureResult [13:13:47.819] - Received FutureResult [13:13:47.820] - Erased future from FutureRegistry [13:13:47.820] result() for ClusterFuture ... [13:13:47.820] - result already collected: FutureResult [13:13:47.820] result() for ClusterFuture ... done [13:13:47.820] receiveMessageFromWorker() for ClusterFuture ... done [13:13:47.803] MultisessionFuture: [13:13:47.803] Label: 'future_lapply-1' [13:13:47.803] Expression: [13:13:47.803] { [13:13:47.803] do.call(function(...) { [13:13:47.803] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:47.803] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:47.803] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:47.803] on.exit(options(oopts), add = TRUE) [13:13:47.803] } [13:13:47.803] { [13:13:47.803] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:47.803] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:47.803] ...future.FUN(...future.X_jj, ...) [13:13:47.803] }) [13:13:47.803] } [13:13:47.803] }, args = future.call.arguments) [13:13:47.803] } [13:13:47.803] Lazy evaluation: FALSE [13:13:47.803] Asynchronous evaluation: TRUE [13:13:47.803] Local evaluation: TRUE [13:13:47.803] Environment: R_GlobalEnv [13:13:47.803] Capture standard output: TRUE [13:13:47.803] Capture condition classes: 'condition' (excluding 'nothing') [13:13:47.803] 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) [13:13:47.803] Packages: 1 packages ('future') [13:13:47.803] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:47.803] Resolved: TRUE [13:13:47.803] Value: [13:13:47.803] Conditions captured: [13:13:47.803] Early signaling: FALSE [13:13:47.803] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:47.803] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:47.821] Chunk #1 of 1 ... DONE [13:13:47.821] Launching 1 futures (chunks) ... DONE [13:13:47.821] Resolving 1 futures (chunks) ... [13:13:47.821] resolve() on list ... [13:13:47.821] recursive: 0 [13:13:47.822] length: 1 [13:13:47.822] [13:13:47.822] Future #1 [13:13:47.822] result() for ClusterFuture ... [13:13:47.822] - result already collected: FutureResult [13:13:47.822] result() for ClusterFuture ... done [13:13:47.823] result() for ClusterFuture ... [13:13:47.823] - result already collected: FutureResult [13:13:47.823] result() for ClusterFuture ... done [13:13:47.823] signalConditionsASAP(MultisessionFuture, pos=1) ... [13:13:47.823] - nx: 1 [13:13:47.823] - relay: TRUE [13:13:47.823] - stdout: TRUE [13:13:47.824] - signal: TRUE [13:13:47.824] - resignal: FALSE [13:13:47.824] - force: TRUE [13:13:47.824] - relayed: [n=1] FALSE [13:13:47.824] - queued futures: [n=1] FALSE [13:13:47.824] - until=1 [13:13:47.825] - relaying element #1 [13:13:47.825] result() for ClusterFuture ... [13:13:47.825] - result already collected: FutureResult [13:13:47.825] result() for ClusterFuture ... done [13:13:47.825] result() for ClusterFuture ... [13:13:47.825] - result already collected: FutureResult [13:13:47.825] result() for ClusterFuture ... done [13:13:47.826] result() for ClusterFuture ... [13:13:47.826] - result already collected: FutureResult [13:13:47.826] result() for ClusterFuture ... done [13:13:47.826] result() for ClusterFuture ... [13:13:47.826] - result already collected: FutureResult [13:13:47.826] result() for ClusterFuture ... done [13:13:47.827] - relayed: [n=1] TRUE [13:13:47.827] - queued futures: [n=1] TRUE [13:13:47.827] signalConditionsASAP(MultisessionFuture, pos=1) ... done [13:13:47.827] length: 0 (resolved future 1) [13:13:47.827] Relaying remaining futures [13:13:47.827] signalConditionsASAP(NULL, pos=0) ... [13:13:47.827] - nx: 1 [13:13:47.828] - relay: TRUE [13:13:47.828] - stdout: TRUE [13:13:47.828] - signal: TRUE [13:13:47.828] - resignal: FALSE [13:13:47.828] - force: TRUE [13:13:47.828] - relayed: [n=1] TRUE [13:13:47.829] - queued futures: [n=1] TRUE - flush all [13:13:47.829] - relayed: [n=1] TRUE [13:13:47.829] - queued futures: [n=1] TRUE [13:13:47.829] signalConditionsASAP(NULL, pos=0) ... done [13:13:47.829] resolve() on list ... DONE [13:13:47.830] result() for ClusterFuture ... [13:13:47.830] - result already collected: FutureResult [13:13:47.830] result() for ClusterFuture ... done [13:13:47.830] result() for ClusterFuture ... [13:13:47.830] - result already collected: FutureResult [13:13:47.830] result() for ClusterFuture ... done [13:13:47.830] - Number of value chunks collected: 1 [13:13:47.831] Resolving 1 futures (chunks) ... DONE [13:13:47.831] Reducing values from 1 chunks ... [13:13:47.831] - Number of values collected after concatenation: 1 [13:13:47.831] - Number of values expected: 1 [13:13:47.831] Reducing values from 1 chunks ... DONE [13:13:47.831] future_lapply() ... DONE List of 1 $ y:List of 1 ..$ a: chr "hello; 1; 2; ...; 100" - future_lapply(x, FUN = listenv::listenv, ...) ... [13:13:47.833] future_lapply() ... [13:13:47.836] Number of chunks: 2 [13:13:47.836] Index remapping (attribute 'ordering'): [n = 2] 2, 1 [13:13:47.836] getGlobalsAndPackagesXApply() ... [13:13:47.836] - future.globals: TRUE [13:13:47.836] getGlobalsAndPackages() ... [13:13:47.836] Searching for globals... [13:13:47.838] - globals found: [4] 'FUN', '{', 'get', 'parent.env' [13:13:47.838] Searching for globals ... DONE [13:13:47.838] Resolving globals: FALSE [13:13:47.839] The total size of the 1 globals is 4.85 KiB (4968 bytes) [13:13:47.839] 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') [13:13:47.839] - globals: [1] 'FUN' [13:13:47.840] - packages: [1] 'listenv' [13:13:47.840] getGlobalsAndPackages() ... DONE [13:13:47.840] - globals found/used: [n=1] 'FUN' [13:13:47.840] - needed namespaces: [n=1] 'listenv' [13:13:47.840] Finding globals ... DONE [13:13:47.840] - use_args: TRUE [13:13:47.841] - Getting '...' globals ... [13:13:47.841] resolve() on list ... [13:13:47.841] recursive: 0 [13:13:47.841] length: 1 [13:13:47.841] elements: '...' [13:13:47.842] length: 0 (resolved future 1) [13:13:47.842] resolve() on list ... DONE [13:13:47.842] - '...' content: [n=0] [13:13:47.842] List of 1 [13:13:47.842] $ ...: list() [13:13:47.842] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:47.842] - attr(*, "where")=List of 1 [13:13:47.842] ..$ ...: [13:13:47.842] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:47.842] - attr(*, "resolved")= logi TRUE [13:13:47.842] - attr(*, "total_size")= num NA [13:13:47.845] - Getting '...' globals ... DONE [13:13:47.845] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:47.845] List of 2 [13:13:47.845] $ ...future.FUN:function (x, ...) [13:13:47.845] $ ... : list() [13:13:47.845] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:47.845] - attr(*, "where")=List of 2 [13:13:47.845] ..$ ...future.FUN: [13:13:47.845] ..$ ... : [13:13:47.845] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:47.845] - attr(*, "resolved")= logi FALSE [13:13:47.845] - attr(*, "total_size")= num 4968 [13:13:47.849] Packages to be attached in all futures: [n=1] 'listenv' [13:13:47.849] getGlobalsAndPackagesXApply() ... DONE [13:13:47.849] Number of futures (= number of chunks): 2 [13:13:47.849] Launching 2 futures (chunks) ... [13:13:47.850] Chunk #1 of 2 ... [13:13:47.850] - Finding globals in 'X' for chunk #1 ... [13:13:47.850] getGlobalsAndPackages() ... [13:13:47.850] Searching for globals... [13:13:47.851] [13:13:47.851] Searching for globals ... DONE [13:13:47.851] - globals: [0] [13:13:47.851] getGlobalsAndPackages() ... DONE [13:13:47.851] + additional globals found: [n=0] [13:13:47.851] + additional namespaces needed: [n=0] [13:13:47.852] - Finding globals in 'X' for chunk #1 ... DONE [13:13:47.852] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:13:47.852] - seeds: [13:13:47.852] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:47.852] getGlobalsAndPackages() ... [13:13:47.852] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:47.853] Resolving globals: FALSE [13:13:47.853] Tweak future expression to call with '...' arguments ... [13:13:47.853] { [13:13:47.853] do.call(function(...) { [13:13:47.853] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:47.853] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:47.853] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:47.853] on.exit(options(oopts), add = TRUE) [13:13:47.853] } [13:13:47.853] { [13:13:47.853] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:47.853] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:47.853] ...future.FUN(...future.X_jj, ...) [13:13:47.853] }) [13:13:47.853] } [13:13:47.853] }, args = future.call.arguments) [13:13:47.853] } [13:13:47.853] Tweak future expression to call with '...' arguments ... DONE [13:13:47.854] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:47.854] - packages: [1] 'listenv' [13:13:47.854] getGlobalsAndPackages() ... DONE [13:13:47.855] run() for 'Future' ... [13:13:47.855] - state: 'created' [13:13:47.855] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:47.868] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:47.869] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:13:47.869] - Field: 'node' [13:13:47.869] - Field: 'label' [13:13:47.869] - Field: 'local' [13:13:47.869] - Field: 'owner' [13:13:47.870] - Field: 'envir' [13:13:47.870] - Field: 'workers' [13:13:47.870] - Field: 'packages' [13:13:47.870] - Field: 'gc' [13:13:47.870] - Field: 'conditions' [13:13:47.870] - Field: 'persistent' [13:13:47.871] - Field: 'expr' [13:13:47.871] - Field: 'uuid' [13:13:47.871] - Field: 'seed' [13:13:47.871] - Field: 'version' [13:13:47.871] - Field: 'result' [13:13:47.871] - Field: 'asynchronous' [13:13:47.872] - Field: 'calls' [13:13:47.872] - Field: 'globals' [13:13:47.872] - Field: 'stdout' [13:13:47.872] - Field: 'earlySignal' [13:13:47.872] - Field: 'lazy' [13:13:47.873] - Field: 'state' [13:13:47.873] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:13:47.873] - Launch lazy future ... [13:13:47.873] Packages needed by the future expression (n = 1): 'listenv' [13:13:47.873] Packages needed by future strategies (n = 0): [13:13:47.874] { [13:13:47.874] { [13:13:47.874] { [13:13:47.874] ...future.startTime <- base::Sys.time() [13:13:47.874] { [13:13:47.874] { [13:13:47.874] { [13:13:47.874] { [13:13:47.874] { [13:13:47.874] base::local({ [13:13:47.874] has_future <- base::requireNamespace("future", [13:13:47.874] quietly = TRUE) [13:13:47.874] if (has_future) { [13:13:47.874] ns <- base::getNamespace("future") [13:13:47.874] version <- ns[[".package"]][["version"]] [13:13:47.874] if (is.null(version)) [13:13:47.874] version <- utils::packageVersion("future") [13:13:47.874] } [13:13:47.874] else { [13:13:47.874] version <- NULL [13:13:47.874] } [13:13:47.874] if (!has_future || version < "1.8.0") { [13:13:47.874] info <- base::c(r_version = base::gsub("R version ", [13:13:47.874] "", base::R.version$version.string), [13:13:47.874] platform = base::sprintf("%s (%s-bit)", [13:13:47.874] base::R.version$platform, 8 * [13:13:47.874] base::.Machine$sizeof.pointer), [13:13:47.874] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:47.874] "release", "version")], collapse = " "), [13:13:47.874] hostname = base::Sys.info()[["nodename"]]) [13:13:47.874] info <- base::sprintf("%s: %s", base::names(info), [13:13:47.874] info) [13:13:47.874] info <- base::paste(info, collapse = "; ") [13:13:47.874] if (!has_future) { [13:13:47.874] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:47.874] info) [13:13:47.874] } [13:13:47.874] else { [13:13:47.874] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:47.874] info, version) [13:13:47.874] } [13:13:47.874] base::stop(msg) [13:13:47.874] } [13:13:47.874] }) [13:13:47.874] } [13:13:47.874] ...future.mc.cores.old <- base::getOption("mc.cores") [13:13:47.874] base::options(mc.cores = 1L) [13:13:47.874] } [13:13:47.874] base::local({ [13:13:47.874] for (pkg in "listenv") { [13:13:47.874] base::loadNamespace(pkg) [13:13:47.874] base::library(pkg, character.only = TRUE) [13:13:47.874] } [13:13:47.874] }) [13:13:47.874] } [13:13:47.874] options(future.plan = NULL) [13:13:47.874] Sys.unsetenv("R_FUTURE_PLAN") [13:13:47.874] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:47.874] } [13:13:47.874] ...future.workdir <- getwd() [13:13:47.874] } [13:13:47.874] ...future.oldOptions <- base::as.list(base::.Options) [13:13:47.874] ...future.oldEnvVars <- base::Sys.getenv() [13:13:47.874] } [13:13:47.874] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:47.874] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:13:47.874] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:47.874] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:47.874] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:47.874] future.stdout.windows.reencode = NULL, width = 80L) [13:13:47.874] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:47.874] base::names(...future.oldOptions)) [13:13:47.874] } [13:13:47.874] if (FALSE) { [13:13:47.874] } [13:13:47.874] else { [13:13:47.874] if (TRUE) { [13:13:47.874] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:47.874] open = "w") [13:13:47.874] } [13:13:47.874] else { [13:13:47.874] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:47.874] windows = "NUL", "/dev/null"), open = "w") [13:13:47.874] } [13:13:47.874] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:47.874] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:47.874] base::sink(type = "output", split = FALSE) [13:13:47.874] base::close(...future.stdout) [13:13:47.874] }, add = TRUE) [13:13:47.874] } [13:13:47.874] ...future.frame <- base::sys.nframe() [13:13:47.874] ...future.conditions <- base::list() [13:13:47.874] ...future.rng <- base::globalenv()$.Random.seed [13:13:47.874] if (FALSE) { [13:13:47.874] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:47.874] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:47.874] } [13:13:47.874] ...future.result <- base::tryCatch({ [13:13:47.874] base::withCallingHandlers({ [13:13:47.874] ...future.value <- base::withVisible(base::local({ [13:13:47.874] ...future.makeSendCondition <- local({ [13:13:47.874] sendCondition <- NULL [13:13:47.874] function(frame = 1L) { [13:13:47.874] if (is.function(sendCondition)) [13:13:47.874] return(sendCondition) [13:13:47.874] ns <- getNamespace("parallel") [13:13:47.874] if (exists("sendData", mode = "function", [13:13:47.874] envir = ns)) { [13:13:47.874] parallel_sendData <- get("sendData", mode = "function", [13:13:47.874] envir = ns) [13:13:47.874] envir <- sys.frame(frame) [13:13:47.874] master <- NULL [13:13:47.874] while (!identical(envir, .GlobalEnv) && [13:13:47.874] !identical(envir, emptyenv())) { [13:13:47.874] if (exists("master", mode = "list", envir = envir, [13:13:47.874] inherits = FALSE)) { [13:13:47.874] master <- get("master", mode = "list", [13:13:47.874] envir = envir, inherits = FALSE) [13:13:47.874] if (inherits(master, c("SOCKnode", [13:13:47.874] "SOCK0node"))) { [13:13:47.874] sendCondition <<- function(cond) { [13:13:47.874] data <- list(type = "VALUE", value = cond, [13:13:47.874] success = TRUE) [13:13:47.874] parallel_sendData(master, data) [13:13:47.874] } [13:13:47.874] return(sendCondition) [13:13:47.874] } [13:13:47.874] } [13:13:47.874] frame <- frame + 1L [13:13:47.874] envir <- sys.frame(frame) [13:13:47.874] } [13:13:47.874] } [13:13:47.874] sendCondition <<- function(cond) NULL [13:13:47.874] } [13:13:47.874] }) [13:13:47.874] withCallingHandlers({ [13:13:47.874] { [13:13:47.874] do.call(function(...) { [13:13:47.874] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:47.874] if (!identical(...future.globals.maxSize.org, [13:13:47.874] ...future.globals.maxSize)) { [13:13:47.874] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:47.874] on.exit(options(oopts), add = TRUE) [13:13:47.874] } [13:13:47.874] { [13:13:47.874] lapply(seq_along(...future.elements_ii), [13:13:47.874] FUN = function(jj) { [13:13:47.874] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:47.874] ...future.FUN(...future.X_jj, ...) [13:13:47.874] }) [13:13:47.874] } [13:13:47.874] }, args = future.call.arguments) [13:13:47.874] } [13:13:47.874] }, immediateCondition = function(cond) { [13:13:47.874] sendCondition <- ...future.makeSendCondition() [13:13:47.874] sendCondition(cond) [13:13:47.874] muffleCondition <- function (cond, pattern = "^muffle") [13:13:47.874] { [13:13:47.874] inherits <- base::inherits [13:13:47.874] invokeRestart <- base::invokeRestart [13:13:47.874] is.null <- base::is.null [13:13:47.874] muffled <- FALSE [13:13:47.874] if (inherits(cond, "message")) { [13:13:47.874] muffled <- grepl(pattern, "muffleMessage") [13:13:47.874] if (muffled) [13:13:47.874] invokeRestart("muffleMessage") [13:13:47.874] } [13:13:47.874] else if (inherits(cond, "warning")) { [13:13:47.874] muffled <- grepl(pattern, "muffleWarning") [13:13:47.874] if (muffled) [13:13:47.874] invokeRestart("muffleWarning") [13:13:47.874] } [13:13:47.874] else if (inherits(cond, "condition")) { [13:13:47.874] if (!is.null(pattern)) { [13:13:47.874] computeRestarts <- base::computeRestarts [13:13:47.874] grepl <- base::grepl [13:13:47.874] restarts <- computeRestarts(cond) [13:13:47.874] for (restart in restarts) { [13:13:47.874] name <- restart$name [13:13:47.874] if (is.null(name)) [13:13:47.874] next [13:13:47.874] if (!grepl(pattern, name)) [13:13:47.874] next [13:13:47.874] invokeRestart(restart) [13:13:47.874] muffled <- TRUE [13:13:47.874] break [13:13:47.874] } [13:13:47.874] } [13:13:47.874] } [13:13:47.874] invisible(muffled) [13:13:47.874] } [13:13:47.874] muffleCondition(cond) [13:13:47.874] }) [13:13:47.874] })) [13:13:47.874] future::FutureResult(value = ...future.value$value, [13:13:47.874] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:47.874] ...future.rng), globalenv = if (FALSE) [13:13:47.874] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:47.874] ...future.globalenv.names)) [13:13:47.874] else NULL, started = ...future.startTime, version = "1.8") [13:13:47.874] }, condition = base::local({ [13:13:47.874] c <- base::c [13:13:47.874] inherits <- base::inherits [13:13:47.874] invokeRestart <- base::invokeRestart [13:13:47.874] length <- base::length [13:13:47.874] list <- base::list [13:13:47.874] seq.int <- base::seq.int [13:13:47.874] signalCondition <- base::signalCondition [13:13:47.874] sys.calls <- base::sys.calls [13:13:47.874] `[[` <- base::`[[` [13:13:47.874] `+` <- base::`+` [13:13:47.874] `<<-` <- base::`<<-` [13:13:47.874] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:47.874] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:47.874] 3L)] [13:13:47.874] } [13:13:47.874] function(cond) { [13:13:47.874] is_error <- inherits(cond, "error") [13:13:47.874] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:47.874] NULL) [13:13:47.874] if (is_error) { [13:13:47.874] sessionInformation <- function() { [13:13:47.874] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:47.874] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:47.874] search = base::search(), system = base::Sys.info()) [13:13:47.874] } [13:13:47.874] ...future.conditions[[length(...future.conditions) + [13:13:47.874] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:47.874] cond$call), session = sessionInformation(), [13:13:47.874] timestamp = base::Sys.time(), signaled = 0L) [13:13:47.874] signalCondition(cond) [13:13:47.874] } [13:13:47.874] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:47.874] "immediateCondition"))) { [13:13:47.874] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:47.874] ...future.conditions[[length(...future.conditions) + [13:13:47.874] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:47.874] if (TRUE && !signal) { [13:13:47.874] muffleCondition <- function (cond, pattern = "^muffle") [13:13:47.874] { [13:13:47.874] inherits <- base::inherits [13:13:47.874] invokeRestart <- base::invokeRestart [13:13:47.874] is.null <- base::is.null [13:13:47.874] muffled <- FALSE [13:13:47.874] if (inherits(cond, "message")) { [13:13:47.874] muffled <- grepl(pattern, "muffleMessage") [13:13:47.874] if (muffled) [13:13:47.874] invokeRestart("muffleMessage") [13:13:47.874] } [13:13:47.874] else if (inherits(cond, "warning")) { [13:13:47.874] muffled <- grepl(pattern, "muffleWarning") [13:13:47.874] if (muffled) [13:13:47.874] invokeRestart("muffleWarning") [13:13:47.874] } [13:13:47.874] else if (inherits(cond, "condition")) { [13:13:47.874] if (!is.null(pattern)) { [13:13:47.874] computeRestarts <- base::computeRestarts [13:13:47.874] grepl <- base::grepl [13:13:47.874] restarts <- computeRestarts(cond) [13:13:47.874] for (restart in restarts) { [13:13:47.874] name <- restart$name [13:13:47.874] if (is.null(name)) [13:13:47.874] next [13:13:47.874] if (!grepl(pattern, name)) [13:13:47.874] next [13:13:47.874] invokeRestart(restart) [13:13:47.874] muffled <- TRUE [13:13:47.874] break [13:13:47.874] } [13:13:47.874] } [13:13:47.874] } [13:13:47.874] invisible(muffled) [13:13:47.874] } [13:13:47.874] muffleCondition(cond, pattern = "^muffle") [13:13:47.874] } [13:13:47.874] } [13:13:47.874] else { [13:13:47.874] if (TRUE) { [13:13:47.874] muffleCondition <- function (cond, pattern = "^muffle") [13:13:47.874] { [13:13:47.874] inherits <- base::inherits [13:13:47.874] invokeRestart <- base::invokeRestart [13:13:47.874] is.null <- base::is.null [13:13:47.874] muffled <- FALSE [13:13:47.874] if (inherits(cond, "message")) { [13:13:47.874] muffled <- grepl(pattern, "muffleMessage") [13:13:47.874] if (muffled) [13:13:47.874] invokeRestart("muffleMessage") [13:13:47.874] } [13:13:47.874] else if (inherits(cond, "warning")) { [13:13:47.874] muffled <- grepl(pattern, "muffleWarning") [13:13:47.874] if (muffled) [13:13:47.874] invokeRestart("muffleWarning") [13:13:47.874] } [13:13:47.874] else if (inherits(cond, "condition")) { [13:13:47.874] if (!is.null(pattern)) { [13:13:47.874] computeRestarts <- base::computeRestarts [13:13:47.874] grepl <- base::grepl [13:13:47.874] restarts <- computeRestarts(cond) [13:13:47.874] for (restart in restarts) { [13:13:47.874] name <- restart$name [13:13:47.874] if (is.null(name)) [13:13:47.874] next [13:13:47.874] if (!grepl(pattern, name)) [13:13:47.874] next [13:13:47.874] invokeRestart(restart) [13:13:47.874] muffled <- TRUE [13:13:47.874] break [13:13:47.874] } [13:13:47.874] } [13:13:47.874] } [13:13:47.874] invisible(muffled) [13:13:47.874] } [13:13:47.874] muffleCondition(cond, pattern = "^muffle") [13:13:47.874] } [13:13:47.874] } [13:13:47.874] } [13:13:47.874] })) [13:13:47.874] }, error = function(ex) { [13:13:47.874] base::structure(base::list(value = NULL, visible = NULL, [13:13:47.874] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:47.874] ...future.rng), started = ...future.startTime, [13:13:47.874] finished = Sys.time(), session_uuid = NA_character_, [13:13:47.874] version = "1.8"), class = "FutureResult") [13:13:47.874] }, finally = { [13:13:47.874] if (!identical(...future.workdir, getwd())) [13:13:47.874] setwd(...future.workdir) [13:13:47.874] { [13:13:47.874] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:47.874] ...future.oldOptions$nwarnings <- NULL [13:13:47.874] } [13:13:47.874] base::options(...future.oldOptions) [13:13:47.874] if (.Platform$OS.type == "windows") { [13:13:47.874] old_names <- names(...future.oldEnvVars) [13:13:47.874] envs <- base::Sys.getenv() [13:13:47.874] names <- names(envs) [13:13:47.874] common <- intersect(names, old_names) [13:13:47.874] added <- setdiff(names, old_names) [13:13:47.874] removed <- setdiff(old_names, names) [13:13:47.874] changed <- common[...future.oldEnvVars[common] != [13:13:47.874] envs[common]] [13:13:47.874] NAMES <- toupper(changed) [13:13:47.874] args <- list() [13:13:47.874] for (kk in seq_along(NAMES)) { [13:13:47.874] name <- changed[[kk]] [13:13:47.874] NAME <- NAMES[[kk]] [13:13:47.874] if (name != NAME && is.element(NAME, old_names)) [13:13:47.874] next [13:13:47.874] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:47.874] } [13:13:47.874] NAMES <- toupper(added) [13:13:47.874] for (kk in seq_along(NAMES)) { [13:13:47.874] name <- added[[kk]] [13:13:47.874] NAME <- NAMES[[kk]] [13:13:47.874] if (name != NAME && is.element(NAME, old_names)) [13:13:47.874] next [13:13:47.874] args[[name]] <- "" [13:13:47.874] } [13:13:47.874] NAMES <- toupper(removed) [13:13:47.874] for (kk in seq_along(NAMES)) { [13:13:47.874] name <- removed[[kk]] [13:13:47.874] NAME <- NAMES[[kk]] [13:13:47.874] if (name != NAME && is.element(NAME, old_names)) [13:13:47.874] next [13:13:47.874] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:47.874] } [13:13:47.874] if (length(args) > 0) [13:13:47.874] base::do.call(base::Sys.setenv, args = args) [13:13:47.874] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:47.874] } [13:13:47.874] else { [13:13:47.874] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:47.874] } [13:13:47.874] { [13:13:47.874] if (base::length(...future.futureOptionsAdded) > [13:13:47.874] 0L) { [13:13:47.874] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:47.874] base::names(opts) <- ...future.futureOptionsAdded [13:13:47.874] base::options(opts) [13:13:47.874] } [13:13:47.874] { [13:13:47.874] { [13:13:47.874] base::options(mc.cores = ...future.mc.cores.old) [13:13:47.874] NULL [13:13:47.874] } [13:13:47.874] options(future.plan = NULL) [13:13:47.874] if (is.na(NA_character_)) [13:13:47.874] Sys.unsetenv("R_FUTURE_PLAN") [13:13:47.874] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:47.874] future::plan(list(function (..., workers = availableCores(), [13:13:47.874] lazy = FALSE, rscript_libs = .libPaths(), [13:13:47.874] envir = parent.frame()) [13:13:47.874] { [13:13:47.874] if (is.function(workers)) [13:13:47.874] workers <- workers() [13:13:47.874] workers <- structure(as.integer(workers), [13:13:47.874] class = class(workers)) [13:13:47.874] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:47.874] workers >= 1) [13:13:47.874] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:47.874] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:47.874] } [13:13:47.874] future <- MultisessionFuture(..., workers = workers, [13:13:47.874] lazy = lazy, rscript_libs = rscript_libs, [13:13:47.874] envir = envir) [13:13:47.874] if (!future$lazy) [13:13:47.874] future <- run(future) [13:13:47.874] invisible(future) [13:13:47.874] }), .cleanup = FALSE, .init = FALSE) [13:13:47.874] } [13:13:47.874] } [13:13:47.874] } [13:13:47.874] }) [13:13:47.874] if (TRUE) { [13:13:47.874] base::sink(type = "output", split = FALSE) [13:13:47.874] if (TRUE) { [13:13:47.874] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:47.874] } [13:13:47.874] else { [13:13:47.874] ...future.result["stdout"] <- base::list(NULL) [13:13:47.874] } [13:13:47.874] base::close(...future.stdout) [13:13:47.874] ...future.stdout <- NULL [13:13:47.874] } [13:13:47.874] ...future.result$conditions <- ...future.conditions [13:13:47.874] ...future.result$finished <- base::Sys.time() [13:13:47.874] ...future.result [13:13:47.874] } [13:13:47.880] Exporting 5 global objects (4.85 KiB) to cluster node #1 ... [13:13:47.880] Exporting '...future.FUN' (4.85 KiB) to cluster node #1 ... [13:13:47.880] Exporting '...future.FUN' (4.85 KiB) to cluster node #1 ... DONE [13:13:47.881] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... [13:13:47.881] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... DONE [13:13:47.881] Exporting '...future.elements_ii' (12.94 KiB) to cluster node #1 ... [13:13:47.882] Exporting '...future.elements_ii' (12.94 KiB) to cluster node #1 ... DONE [13:13:47.882] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:13:47.883] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:13:47.883] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:13:47.883] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:13:47.883] Exporting 5 global objects (4.85 KiB) to cluster node #1 ... DONE [13:13:47.884] MultisessionFuture started [13:13:47.884] - Launch lazy future ... done [13:13:47.884] run() for 'MultisessionFuture' ... done [13:13:47.885] Created future: [13:13:47.900] receiveMessageFromWorker() for ClusterFuture ... [13:13:47.900] - Validating connection of MultisessionFuture [13:13:47.900] - received message: FutureResult [13:13:47.901] - Received FutureResult [13:13:47.901] - Erased future from FutureRegistry [13:13:47.901] result() for ClusterFuture ... [13:13:47.901] - result already collected: FutureResult [13:13:47.901] result() for ClusterFuture ... done [13:13:47.901] receiveMessageFromWorker() for ClusterFuture ... done [13:13:47.885] MultisessionFuture: [13:13:47.885] Label: 'future_lapply-1' [13:13:47.885] Expression: [13:13:47.885] { [13:13:47.885] do.call(function(...) { [13:13:47.885] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:47.885] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:47.885] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:47.885] on.exit(options(oopts), add = TRUE) [13:13:47.885] } [13:13:47.885] { [13:13:47.885] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:47.885] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:47.885] ...future.FUN(...future.X_jj, ...) [13:13:47.885] }) [13:13:47.885] } [13:13:47.885] }, args = future.call.arguments) [13:13:47.885] } [13:13:47.885] Lazy evaluation: FALSE [13:13:47.885] Asynchronous evaluation: TRUE [13:13:47.885] Local evaluation: TRUE [13:13:47.885] Environment: R_GlobalEnv [13:13:47.885] Capture standard output: TRUE [13:13:47.885] Capture condition classes: 'condition' (excluding 'nothing') [13:13:47.885] 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) [13:13:47.885] Packages: 1 packages ('listenv') [13:13:47.885] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:47.885] Resolved: TRUE [13:13:47.885] Value: [13:13:47.885] Conditions captured: [13:13:47.885] Early signaling: FALSE [13:13:47.885] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:47.885] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:47.902] Chunk #1 of 2 ... DONE [13:13:47.902] Chunk #2 of 2 ... [13:13:47.902] - Finding globals in 'X' for chunk #2 ... [13:13:47.902] getGlobalsAndPackages() ... [13:13:47.903] Searching for globals... [13:13:47.903] [13:13:47.903] Searching for globals ... DONE [13:13:47.903] - globals: [0] [13:13:47.904] getGlobalsAndPackages() ... DONE [13:13:47.904] + additional globals found: [n=0] [13:13:47.904] + additional namespaces needed: [n=0] [13:13:47.904] - Finding globals in 'X' for chunk #2 ... DONE [13:13:47.904] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:13:47.904] - seeds: [13:13:47.905] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:47.905] getGlobalsAndPackages() ... [13:13:47.905] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:47.905] Resolving globals: FALSE [13:13:47.905] Tweak future expression to call with '...' arguments ... [13:13:47.905] { [13:13:47.905] do.call(function(...) { [13:13:47.905] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:47.905] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:47.905] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:47.905] on.exit(options(oopts), add = TRUE) [13:13:47.905] } [13:13:47.905] { [13:13:47.905] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:47.905] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:47.905] ...future.FUN(...future.X_jj, ...) [13:13:47.905] }) [13:13:47.905] } [13:13:47.905] }, args = future.call.arguments) [13:13:47.905] } [13:13:47.906] Tweak future expression to call with '...' arguments ... DONE [13:13:47.906] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:47.907] - packages: [1] 'listenv' [13:13:47.907] getGlobalsAndPackages() ... DONE [13:13:47.907] run() for 'Future' ... [13:13:47.907] - state: 'created' [13:13:47.907] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:47.921] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:47.921] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:13:47.921] - Field: 'node' [13:13:47.922] - Field: 'label' [13:13:47.922] - Field: 'local' [13:13:47.922] - Field: 'owner' [13:13:47.922] - Field: 'envir' [13:13:47.922] - Field: 'workers' [13:13:47.923] - Field: 'packages' [13:13:47.923] - Field: 'gc' [13:13:47.923] - Field: 'conditions' [13:13:47.923] - Field: 'persistent' [13:13:47.923] - Field: 'expr' [13:13:47.923] - Field: 'uuid' [13:13:47.924] - Field: 'seed' [13:13:47.924] - Field: 'version' [13:13:47.924] - Field: 'result' [13:13:47.924] - Field: 'asynchronous' [13:13:47.924] - Field: 'calls' [13:13:47.924] - Field: 'globals' [13:13:47.925] - Field: 'stdout' [13:13:47.925] - Field: 'earlySignal' [13:13:47.925] - Field: 'lazy' [13:13:47.925] - Field: 'state' [13:13:47.925] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:13:47.925] - Launch lazy future ... [13:13:47.926] Packages needed by the future expression (n = 1): 'listenv' [13:13:47.926] Packages needed by future strategies (n = 0): [13:13:47.927] { [13:13:47.927] { [13:13:47.927] { [13:13:47.927] ...future.startTime <- base::Sys.time() [13:13:47.927] { [13:13:47.927] { [13:13:47.927] { [13:13:47.927] { [13:13:47.927] { [13:13:47.927] base::local({ [13:13:47.927] has_future <- base::requireNamespace("future", [13:13:47.927] quietly = TRUE) [13:13:47.927] if (has_future) { [13:13:47.927] ns <- base::getNamespace("future") [13:13:47.927] version <- ns[[".package"]][["version"]] [13:13:47.927] if (is.null(version)) [13:13:47.927] version <- utils::packageVersion("future") [13:13:47.927] } [13:13:47.927] else { [13:13:47.927] version <- NULL [13:13:47.927] } [13:13:47.927] if (!has_future || version < "1.8.0") { [13:13:47.927] info <- base::c(r_version = base::gsub("R version ", [13:13:47.927] "", base::R.version$version.string), [13:13:47.927] platform = base::sprintf("%s (%s-bit)", [13:13:47.927] base::R.version$platform, 8 * [13:13:47.927] base::.Machine$sizeof.pointer), [13:13:47.927] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:47.927] "release", "version")], collapse = " "), [13:13:47.927] hostname = base::Sys.info()[["nodename"]]) [13:13:47.927] info <- base::sprintf("%s: %s", base::names(info), [13:13:47.927] info) [13:13:47.927] info <- base::paste(info, collapse = "; ") [13:13:47.927] if (!has_future) { [13:13:47.927] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:47.927] info) [13:13:47.927] } [13:13:47.927] else { [13:13:47.927] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:47.927] info, version) [13:13:47.927] } [13:13:47.927] base::stop(msg) [13:13:47.927] } [13:13:47.927] }) [13:13:47.927] } [13:13:47.927] ...future.mc.cores.old <- base::getOption("mc.cores") [13:13:47.927] base::options(mc.cores = 1L) [13:13:47.927] } [13:13:47.927] base::local({ [13:13:47.927] for (pkg in "listenv") { [13:13:47.927] base::loadNamespace(pkg) [13:13:47.927] base::library(pkg, character.only = TRUE) [13:13:47.927] } [13:13:47.927] }) [13:13:47.927] } [13:13:47.927] options(future.plan = NULL) [13:13:47.927] Sys.unsetenv("R_FUTURE_PLAN") [13:13:47.927] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:47.927] } [13:13:47.927] ...future.workdir <- getwd() [13:13:47.927] } [13:13:47.927] ...future.oldOptions <- base::as.list(base::.Options) [13:13:47.927] ...future.oldEnvVars <- base::Sys.getenv() [13:13:47.927] } [13:13:47.927] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:47.927] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:13:47.927] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:47.927] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:47.927] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:47.927] future.stdout.windows.reencode = NULL, width = 80L) [13:13:47.927] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:47.927] base::names(...future.oldOptions)) [13:13:47.927] } [13:13:47.927] if (FALSE) { [13:13:47.927] } [13:13:47.927] else { [13:13:47.927] if (TRUE) { [13:13:47.927] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:47.927] open = "w") [13:13:47.927] } [13:13:47.927] else { [13:13:47.927] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:47.927] windows = "NUL", "/dev/null"), open = "w") [13:13:47.927] } [13:13:47.927] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:47.927] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:47.927] base::sink(type = "output", split = FALSE) [13:13:47.927] base::close(...future.stdout) [13:13:47.927] }, add = TRUE) [13:13:47.927] } [13:13:47.927] ...future.frame <- base::sys.nframe() [13:13:47.927] ...future.conditions <- base::list() [13:13:47.927] ...future.rng <- base::globalenv()$.Random.seed [13:13:47.927] if (FALSE) { [13:13:47.927] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:47.927] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:47.927] } [13:13:47.927] ...future.result <- base::tryCatch({ [13:13:47.927] base::withCallingHandlers({ [13:13:47.927] ...future.value <- base::withVisible(base::local({ [13:13:47.927] ...future.makeSendCondition <- local({ [13:13:47.927] sendCondition <- NULL [13:13:47.927] function(frame = 1L) { [13:13:47.927] if (is.function(sendCondition)) [13:13:47.927] return(sendCondition) [13:13:47.927] ns <- getNamespace("parallel") [13:13:47.927] if (exists("sendData", mode = "function", [13:13:47.927] envir = ns)) { [13:13:47.927] parallel_sendData <- get("sendData", mode = "function", [13:13:47.927] envir = ns) [13:13:47.927] envir <- sys.frame(frame) [13:13:47.927] master <- NULL [13:13:47.927] while (!identical(envir, .GlobalEnv) && [13:13:47.927] !identical(envir, emptyenv())) { [13:13:47.927] if (exists("master", mode = "list", envir = envir, [13:13:47.927] inherits = FALSE)) { [13:13:47.927] master <- get("master", mode = "list", [13:13:47.927] envir = envir, inherits = FALSE) [13:13:47.927] if (inherits(master, c("SOCKnode", [13:13:47.927] "SOCK0node"))) { [13:13:47.927] sendCondition <<- function(cond) { [13:13:47.927] data <- list(type = "VALUE", value = cond, [13:13:47.927] success = TRUE) [13:13:47.927] parallel_sendData(master, data) [13:13:47.927] } [13:13:47.927] return(sendCondition) [13:13:47.927] } [13:13:47.927] } [13:13:47.927] frame <- frame + 1L [13:13:47.927] envir <- sys.frame(frame) [13:13:47.927] } [13:13:47.927] } [13:13:47.927] sendCondition <<- function(cond) NULL [13:13:47.927] } [13:13:47.927] }) [13:13:47.927] withCallingHandlers({ [13:13:47.927] { [13:13:47.927] do.call(function(...) { [13:13:47.927] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:47.927] if (!identical(...future.globals.maxSize.org, [13:13:47.927] ...future.globals.maxSize)) { [13:13:47.927] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:47.927] on.exit(options(oopts), add = TRUE) [13:13:47.927] } [13:13:47.927] { [13:13:47.927] lapply(seq_along(...future.elements_ii), [13:13:47.927] FUN = function(jj) { [13:13:47.927] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:47.927] ...future.FUN(...future.X_jj, ...) [13:13:47.927] }) [13:13:47.927] } [13:13:47.927] }, args = future.call.arguments) [13:13:47.927] } [13:13:47.927] }, immediateCondition = function(cond) { [13:13:47.927] sendCondition <- ...future.makeSendCondition() [13:13:47.927] sendCondition(cond) [13:13:47.927] muffleCondition <- function (cond, pattern = "^muffle") [13:13:47.927] { [13:13:47.927] inherits <- base::inherits [13:13:47.927] invokeRestart <- base::invokeRestart [13:13:47.927] is.null <- base::is.null [13:13:47.927] muffled <- FALSE [13:13:47.927] if (inherits(cond, "message")) { [13:13:47.927] muffled <- grepl(pattern, "muffleMessage") [13:13:47.927] if (muffled) [13:13:47.927] invokeRestart("muffleMessage") [13:13:47.927] } [13:13:47.927] else if (inherits(cond, "warning")) { [13:13:47.927] muffled <- grepl(pattern, "muffleWarning") [13:13:47.927] if (muffled) [13:13:47.927] invokeRestart("muffleWarning") [13:13:47.927] } [13:13:47.927] else if (inherits(cond, "condition")) { [13:13:47.927] if (!is.null(pattern)) { [13:13:47.927] computeRestarts <- base::computeRestarts [13:13:47.927] grepl <- base::grepl [13:13:47.927] restarts <- computeRestarts(cond) [13:13:47.927] for (restart in restarts) { [13:13:47.927] name <- restart$name [13:13:47.927] if (is.null(name)) [13:13:47.927] next [13:13:47.927] if (!grepl(pattern, name)) [13:13:47.927] next [13:13:47.927] invokeRestart(restart) [13:13:47.927] muffled <- TRUE [13:13:47.927] break [13:13:47.927] } [13:13:47.927] } [13:13:47.927] } [13:13:47.927] invisible(muffled) [13:13:47.927] } [13:13:47.927] muffleCondition(cond) [13:13:47.927] }) [13:13:47.927] })) [13:13:47.927] future::FutureResult(value = ...future.value$value, [13:13:47.927] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:47.927] ...future.rng), globalenv = if (FALSE) [13:13:47.927] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:47.927] ...future.globalenv.names)) [13:13:47.927] else NULL, started = ...future.startTime, version = "1.8") [13:13:47.927] }, condition = base::local({ [13:13:47.927] c <- base::c [13:13:47.927] inherits <- base::inherits [13:13:47.927] invokeRestart <- base::invokeRestart [13:13:47.927] length <- base::length [13:13:47.927] list <- base::list [13:13:47.927] seq.int <- base::seq.int [13:13:47.927] signalCondition <- base::signalCondition [13:13:47.927] sys.calls <- base::sys.calls [13:13:47.927] `[[` <- base::`[[` [13:13:47.927] `+` <- base::`+` [13:13:47.927] `<<-` <- base::`<<-` [13:13:47.927] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:47.927] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:47.927] 3L)] [13:13:47.927] } [13:13:47.927] function(cond) { [13:13:47.927] is_error <- inherits(cond, "error") [13:13:47.927] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:47.927] NULL) [13:13:47.927] if (is_error) { [13:13:47.927] sessionInformation <- function() { [13:13:47.927] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:47.927] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:47.927] search = base::search(), system = base::Sys.info()) [13:13:47.927] } [13:13:47.927] ...future.conditions[[length(...future.conditions) + [13:13:47.927] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:47.927] cond$call), session = sessionInformation(), [13:13:47.927] timestamp = base::Sys.time(), signaled = 0L) [13:13:47.927] signalCondition(cond) [13:13:47.927] } [13:13:47.927] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:47.927] "immediateCondition"))) { [13:13:47.927] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:47.927] ...future.conditions[[length(...future.conditions) + [13:13:47.927] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:47.927] if (TRUE && !signal) { [13:13:47.927] muffleCondition <- function (cond, pattern = "^muffle") [13:13:47.927] { [13:13:47.927] inherits <- base::inherits [13:13:47.927] invokeRestart <- base::invokeRestart [13:13:47.927] is.null <- base::is.null [13:13:47.927] muffled <- FALSE [13:13:47.927] if (inherits(cond, "message")) { [13:13:47.927] muffled <- grepl(pattern, "muffleMessage") [13:13:47.927] if (muffled) [13:13:47.927] invokeRestart("muffleMessage") [13:13:47.927] } [13:13:47.927] else if (inherits(cond, "warning")) { [13:13:47.927] muffled <- grepl(pattern, "muffleWarning") [13:13:47.927] if (muffled) [13:13:47.927] invokeRestart("muffleWarning") [13:13:47.927] } [13:13:47.927] else if (inherits(cond, "condition")) { [13:13:47.927] if (!is.null(pattern)) { [13:13:47.927] computeRestarts <- base::computeRestarts [13:13:47.927] grepl <- base::grepl [13:13:47.927] restarts <- computeRestarts(cond) [13:13:47.927] for (restart in restarts) { [13:13:47.927] name <- restart$name [13:13:47.927] if (is.null(name)) [13:13:47.927] next [13:13:47.927] if (!grepl(pattern, name)) [13:13:47.927] next [13:13:47.927] invokeRestart(restart) [13:13:47.927] muffled <- TRUE [13:13:47.927] break [13:13:47.927] } [13:13:47.927] } [13:13:47.927] } [13:13:47.927] invisible(muffled) [13:13:47.927] } [13:13:47.927] muffleCondition(cond, pattern = "^muffle") [13:13:47.927] } [13:13:47.927] } [13:13:47.927] else { [13:13:47.927] if (TRUE) { [13:13:47.927] muffleCondition <- function (cond, pattern = "^muffle") [13:13:47.927] { [13:13:47.927] inherits <- base::inherits [13:13:47.927] invokeRestart <- base::invokeRestart [13:13:47.927] is.null <- base::is.null [13:13:47.927] muffled <- FALSE [13:13:47.927] if (inherits(cond, "message")) { [13:13:47.927] muffled <- grepl(pattern, "muffleMessage") [13:13:47.927] if (muffled) [13:13:47.927] invokeRestart("muffleMessage") [13:13:47.927] } [13:13:47.927] else if (inherits(cond, "warning")) { [13:13:47.927] muffled <- grepl(pattern, "muffleWarning") [13:13:47.927] if (muffled) [13:13:47.927] invokeRestart("muffleWarning") [13:13:47.927] } [13:13:47.927] else if (inherits(cond, "condition")) { [13:13:47.927] if (!is.null(pattern)) { [13:13:47.927] computeRestarts <- base::computeRestarts [13:13:47.927] grepl <- base::grepl [13:13:47.927] restarts <- computeRestarts(cond) [13:13:47.927] for (restart in restarts) { [13:13:47.927] name <- restart$name [13:13:47.927] if (is.null(name)) [13:13:47.927] next [13:13:47.927] if (!grepl(pattern, name)) [13:13:47.927] next [13:13:47.927] invokeRestart(restart) [13:13:47.927] muffled <- TRUE [13:13:47.927] break [13:13:47.927] } [13:13:47.927] } [13:13:47.927] } [13:13:47.927] invisible(muffled) [13:13:47.927] } [13:13:47.927] muffleCondition(cond, pattern = "^muffle") [13:13:47.927] } [13:13:47.927] } [13:13:47.927] } [13:13:47.927] })) [13:13:47.927] }, error = function(ex) { [13:13:47.927] base::structure(base::list(value = NULL, visible = NULL, [13:13:47.927] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:47.927] ...future.rng), started = ...future.startTime, [13:13:47.927] finished = Sys.time(), session_uuid = NA_character_, [13:13:47.927] version = "1.8"), class = "FutureResult") [13:13:47.927] }, finally = { [13:13:47.927] if (!identical(...future.workdir, getwd())) [13:13:47.927] setwd(...future.workdir) [13:13:47.927] { [13:13:47.927] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:47.927] ...future.oldOptions$nwarnings <- NULL [13:13:47.927] } [13:13:47.927] base::options(...future.oldOptions) [13:13:47.927] if (.Platform$OS.type == "windows") { [13:13:47.927] old_names <- names(...future.oldEnvVars) [13:13:47.927] envs <- base::Sys.getenv() [13:13:47.927] names <- names(envs) [13:13:47.927] common <- intersect(names, old_names) [13:13:47.927] added <- setdiff(names, old_names) [13:13:47.927] removed <- setdiff(old_names, names) [13:13:47.927] changed <- common[...future.oldEnvVars[common] != [13:13:47.927] envs[common]] [13:13:47.927] NAMES <- toupper(changed) [13:13:47.927] args <- list() [13:13:47.927] for (kk in seq_along(NAMES)) { [13:13:47.927] name <- changed[[kk]] [13:13:47.927] NAME <- NAMES[[kk]] [13:13:47.927] if (name != NAME && is.element(NAME, old_names)) [13:13:47.927] next [13:13:47.927] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:47.927] } [13:13:47.927] NAMES <- toupper(added) [13:13:47.927] for (kk in seq_along(NAMES)) { [13:13:47.927] name <- added[[kk]] [13:13:47.927] NAME <- NAMES[[kk]] [13:13:47.927] if (name != NAME && is.element(NAME, old_names)) [13:13:47.927] next [13:13:47.927] args[[name]] <- "" [13:13:47.927] } [13:13:47.927] NAMES <- toupper(removed) [13:13:47.927] for (kk in seq_along(NAMES)) { [13:13:47.927] name <- removed[[kk]] [13:13:47.927] NAME <- NAMES[[kk]] [13:13:47.927] if (name != NAME && is.element(NAME, old_names)) [13:13:47.927] next [13:13:47.927] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:47.927] } [13:13:47.927] if (length(args) > 0) [13:13:47.927] base::do.call(base::Sys.setenv, args = args) [13:13:47.927] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:47.927] } [13:13:47.927] else { [13:13:47.927] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:47.927] } [13:13:47.927] { [13:13:47.927] if (base::length(...future.futureOptionsAdded) > [13:13:47.927] 0L) { [13:13:47.927] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:47.927] base::names(opts) <- ...future.futureOptionsAdded [13:13:47.927] base::options(opts) [13:13:47.927] } [13:13:47.927] { [13:13:47.927] { [13:13:47.927] base::options(mc.cores = ...future.mc.cores.old) [13:13:47.927] NULL [13:13:47.927] } [13:13:47.927] options(future.plan = NULL) [13:13:47.927] if (is.na(NA_character_)) [13:13:47.927] Sys.unsetenv("R_FUTURE_PLAN") [13:13:47.927] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:47.927] future::plan(list(function (..., workers = availableCores(), [13:13:47.927] lazy = FALSE, rscript_libs = .libPaths(), [13:13:47.927] envir = parent.frame()) [13:13:47.927] { [13:13:47.927] if (is.function(workers)) [13:13:47.927] workers <- workers() [13:13:47.927] workers <- structure(as.integer(workers), [13:13:47.927] class = class(workers)) [13:13:47.927] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:47.927] workers >= 1) [13:13:47.927] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:47.927] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:47.927] } [13:13:47.927] future <- MultisessionFuture(..., workers = workers, [13:13:47.927] lazy = lazy, rscript_libs = rscript_libs, [13:13:47.927] envir = envir) [13:13:47.927] if (!future$lazy) [13:13:47.927] future <- run(future) [13:13:47.927] invisible(future) [13:13:47.927] }), .cleanup = FALSE, .init = FALSE) [13:13:47.927] } [13:13:47.927] } [13:13:47.927] } [13:13:47.927] }) [13:13:47.927] if (TRUE) { [13:13:47.927] base::sink(type = "output", split = FALSE) [13:13:47.927] if (TRUE) { [13:13:47.927] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:47.927] } [13:13:47.927] else { [13:13:47.927] ...future.result["stdout"] <- base::list(NULL) [13:13:47.927] } [13:13:47.927] base::close(...future.stdout) [13:13:47.927] ...future.stdout <- NULL [13:13:47.927] } [13:13:47.927] ...future.result$conditions <- ...future.conditions [13:13:47.927] ...future.result$finished <- base::Sys.time() [13:13:47.927] ...future.result [13:13:47.927] } [13:13:47.932] Exporting 5 global objects (4.85 KiB) to cluster node #1 ... [13:13:47.932] Exporting '...future.FUN' (4.85 KiB) to cluster node #1 ... [13:13:47.933] Exporting '...future.FUN' (4.85 KiB) to cluster node #1 ... DONE [13:13:47.933] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... [13:13:47.934] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... DONE [13:13:47.934] Exporting '...future.elements_ii' (112 bytes) to cluster node #1 ... [13:13:47.934] Exporting '...future.elements_ii' (112 bytes) to cluster node #1 ... DONE [13:13:47.935] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:13:47.935] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:13:47.935] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:13:47.935] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:13:47.936] Exporting 5 global objects (4.85 KiB) to cluster node #1 ... DONE [13:13:47.936] MultisessionFuture started [13:13:47.937] - Launch lazy future ... done [13:13:47.937] run() for 'MultisessionFuture' ... done [13:13:47.937] Created future: [13:13:47.953] receiveMessageFromWorker() for ClusterFuture ... [13:13:47.953] - Validating connection of MultisessionFuture [13:13:47.954] - received message: FutureResult [13:13:47.954] - Received FutureResult [13:13:47.954] - Erased future from FutureRegistry [13:13:47.954] result() for ClusterFuture ... [13:13:47.954] - result already collected: FutureResult [13:13:47.955] result() for ClusterFuture ... done [13:13:47.955] receiveMessageFromWorker() for ClusterFuture ... done [13:13:47.937] MultisessionFuture: [13:13:47.937] Label: 'future_lapply-2' [13:13:47.937] Expression: [13:13:47.937] { [13:13:47.937] do.call(function(...) { [13:13:47.937] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:47.937] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:47.937] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:47.937] on.exit(options(oopts), add = TRUE) [13:13:47.937] } [13:13:47.937] { [13:13:47.937] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:47.937] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:47.937] ...future.FUN(...future.X_jj, ...) [13:13:47.937] }) [13:13:47.937] } [13:13:47.937] }, args = future.call.arguments) [13:13:47.937] } [13:13:47.937] Lazy evaluation: FALSE [13:13:47.937] Asynchronous evaluation: TRUE [13:13:47.937] Local evaluation: TRUE [13:13:47.937] Environment: R_GlobalEnv [13:13:47.937] Capture standard output: TRUE [13:13:47.937] Capture condition classes: 'condition' (excluding 'nothing') [13:13:47.937] 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) [13:13:47.937] Packages: 1 packages ('listenv') [13:13:47.937] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:47.937] Resolved: TRUE [13:13:47.937] Value: [13:13:47.937] Conditions captured: [13:13:47.937] Early signaling: FALSE [13:13:47.937] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:47.937] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:47.955] Chunk #2 of 2 ... DONE [13:13:47.955] Launching 2 futures (chunks) ... DONE [13:13:47.955] Resolving 2 futures (chunks) ... [13:13:47.956] resolve() on list ... [13:13:47.956] recursive: 0 [13:13:47.956] length: 2 [13:13:47.956] [13:13:47.956] Future #1 [13:13:47.956] result() for ClusterFuture ... [13:13:47.957] - result already collected: FutureResult [13:13:47.957] result() for ClusterFuture ... done [13:13:47.957] result() for ClusterFuture ... [13:13:47.957] - result already collected: FutureResult [13:13:47.957] result() for ClusterFuture ... done [13:13:47.957] signalConditionsASAP(MultisessionFuture, pos=1) ... [13:13:47.958] - nx: 2 [13:13:47.958] - relay: TRUE [13:13:47.958] - stdout: TRUE [13:13:47.958] - signal: TRUE [13:13:47.958] - resignal: FALSE [13:13:47.958] - force: TRUE [13:13:47.958] - relayed: [n=2] FALSE, FALSE [13:13:47.959] - queued futures: [n=2] FALSE, FALSE [13:13:47.959] - until=1 [13:13:47.959] - relaying element #1 [13:13:47.959] result() for ClusterFuture ... [13:13:47.959] - result already collected: FutureResult [13:13:47.959] result() for ClusterFuture ... done [13:13:47.960] result() for ClusterFuture ... [13:13:47.960] - result already collected: FutureResult [13:13:47.960] result() for ClusterFuture ... done [13:13:47.960] result() for ClusterFuture ... [13:13:47.960] - result already collected: FutureResult [13:13:47.960] result() for ClusterFuture ... done [13:13:47.961] result() for ClusterFuture ... [13:13:47.961] - result already collected: FutureResult [13:13:47.961] result() for ClusterFuture ... done [13:13:47.961] - relayed: [n=2] TRUE, FALSE [13:13:47.961] - queued futures: [n=2] TRUE, FALSE [13:13:47.961] signalConditionsASAP(MultisessionFuture, pos=1) ... done [13:13:47.962] length: 1 (resolved future 1) [13:13:47.962] Future #2 [13:13:47.962] result() for ClusterFuture ... [13:13:47.962] - result already collected: FutureResult [13:13:47.962] result() for ClusterFuture ... done [13:13:47.962] result() for ClusterFuture ... [13:13:47.963] - result already collected: FutureResult [13:13:47.963] result() for ClusterFuture ... done [13:13:47.963] signalConditionsASAP(MultisessionFuture, pos=2) ... [13:13:47.963] - nx: 2 [13:13:47.963] - relay: TRUE [13:13:47.963] - stdout: TRUE [13:13:47.963] - signal: TRUE [13:13:47.964] - resignal: FALSE [13:13:47.964] - force: TRUE [13:13:47.964] - relayed: [n=2] TRUE, FALSE [13:13:47.964] - queued futures: [n=2] TRUE, FALSE [13:13:47.964] - until=2 [13:13:47.964] - relaying element #2 [13:13:47.965] result() for ClusterFuture ... [13:13:47.965] - result already collected: FutureResult [13:13:47.965] result() for ClusterFuture ... done [13:13:47.965] result() for ClusterFuture ... [13:13:47.965] - result already collected: FutureResult [13:13:47.965] result() for ClusterFuture ... done [13:13:47.966] result() for ClusterFuture ... [13:13:47.966] - result already collected: FutureResult [13:13:47.966] result() for ClusterFuture ... done [13:13:47.966] result() for ClusterFuture ... [13:13:47.966] - result already collected: FutureResult [13:13:47.966] result() for ClusterFuture ... done [13:13:47.966] - relayed: [n=2] TRUE, TRUE [13:13:47.967] - queued futures: [n=2] TRUE, TRUE [13:13:47.967] signalConditionsASAP(MultisessionFuture, pos=2) ... done [13:13:47.967] length: 0 (resolved future 2) [13:13:47.967] Relaying remaining futures [13:13:47.967] signalConditionsASAP(NULL, pos=0) ... [13:13:47.967] - nx: 2 [13:13:47.968] - relay: TRUE [13:13:47.968] - stdout: TRUE [13:13:47.968] - signal: TRUE [13:13:47.968] - resignal: FALSE [13:13:47.968] - force: TRUE [13:13:47.968] - relayed: [n=2] TRUE, TRUE [13:13:47.968] - queued futures: [n=2] TRUE, TRUE - flush all [13:13:47.969] - relayed: [n=2] TRUE, TRUE [13:13:47.969] - queued futures: [n=2] TRUE, TRUE [13:13:47.969] signalConditionsASAP(NULL, pos=0) ... done [13:13:47.969] resolve() on list ... DONE [13:13:47.969] result() for ClusterFuture ... [13:13:47.969] - result already collected: FutureResult [13:13:47.970] result() for ClusterFuture ... done [13:13:47.970] result() for ClusterFuture ... [13:13:47.970] - result already collected: FutureResult [13:13:47.970] result() for ClusterFuture ... done [13:13:47.970] result() for ClusterFuture ... [13:13:47.970] - result already collected: FutureResult [13:13:47.971] result() for ClusterFuture ... done [13:13:47.971] result() for ClusterFuture ... [13:13:47.971] - result already collected: FutureResult [13:13:47.971] result() for ClusterFuture ... done [13:13:47.971] - Number of value chunks collected: 2 [13:13:47.971] Resolving 2 futures (chunks) ... DONE [13:13:47.972] Reducing values from 2 chunks ... [13:13:47.972] - Number of values collected after concatenation: 2 [13:13:47.972] - Number of values expected: 2 [13:13:47.972] Reverse index remapping (attribute 'ordering'): [n = 2] 2, 1 [13:13:47.972] Reducing values from 2 chunks ... DONE [13:13:47.972] 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) ... [13:13:47.977] future_lapply() ... [13:13:47.981] Number of chunks: 2 [13:13:47.981] getGlobalsAndPackagesXApply() ... [13:13:47.981] - future.globals: TRUE [13:13:47.981] getGlobalsAndPackages() ... [13:13:47.981] Searching for globals... [13:13:47.983] - globals found: [4] 'FUN', 'sqrt', '+', 'a' [13:13:47.983] Searching for globals ... DONE [13:13:47.983] Resolving globals: FALSE [13:13:47.984] The total size of the 2 globals is 1.93 KiB (1976 bytes) [13:13:47.984] 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') [13:13:47.984] - globals: [2] 'FUN', 'a' [13:13:47.985] [13:13:47.985] getGlobalsAndPackages() ... DONE [13:13:47.985] - globals found/used: [n=2] 'FUN', 'a' [13:13:47.985] - needed namespaces: [n=0] [13:13:47.985] Finding globals ... DONE [13:13:47.985] - use_args: TRUE [13:13:47.986] - Getting '...' globals ... [13:13:47.986] resolve() on list ... [13:13:47.986] recursive: 0 [13:13:47.986] length: 1 [13:13:47.986] elements: '...' [13:13:47.987] length: 0 (resolved future 1) [13:13:47.987] resolve() on list ... DONE [13:13:47.987] - '...' content: [n=0] [13:13:47.987] List of 1 [13:13:47.987] $ ...: list() [13:13:47.987] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:47.987] - attr(*, "where")=List of 1 [13:13:47.987] ..$ ...: [13:13:47.987] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:47.987] - attr(*, "resolved")= logi TRUE [13:13:47.987] - attr(*, "total_size")= num NA [13:13:47.990] - Getting '...' globals ... DONE [13:13:47.990] Globals to be used in all futures (chunks): [n=3] '...future.FUN', 'a', '...' [13:13:47.990] List of 3 [13:13:47.990] $ ...future.FUN:function (z) [13:13:47.990] $ a : num 3.14 [13:13:47.990] $ ... : list() [13:13:47.990] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:47.990] - attr(*, "where")=List of 3 [13:13:47.990] ..$ ...future.FUN: [13:13:47.990] ..$ a : [13:13:47.990] ..$ ... : [13:13:47.990] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:47.990] - attr(*, "resolved")= logi FALSE [13:13:47.990] - attr(*, "total_size")= num 1976 [13:13:47.994] Packages to be attached in all futures: [n=0] [13:13:47.995] getGlobalsAndPackagesXApply() ... DONE [13:13:47.995] Number of futures (= number of chunks): 2 [13:13:47.995] Launching 2 futures (chunks) ... [13:13:47.995] Chunk #1 of 2 ... [13:13:47.996] - Finding globals in 'X' for chunk #1 ... [13:13:47.996] getGlobalsAndPackages() ... [13:13:47.996] Searching for globals... [13:13:48.001] [13:13:48.001] Searching for globals ... DONE [13:13:48.001] - globals: [0] [13:13:48.001] getGlobalsAndPackages() ... DONE [13:13:48.001] + additional globals found: [n=0] [13:13:48.001] + additional namespaces needed: [n=0] [13:13:48.001] - Finding globals in 'X' for chunk #1 ... DONE [13:13:48.002] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:13:48.002] - seeds: [13:13:48.002] - All globals exported: [n=6] '...future.FUN', 'a', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:48.002] getGlobalsAndPackages() ... [13:13:48.002] - globals passed as-is: [6] '...future.FUN', 'a', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:48.002] Resolving globals: FALSE [13:13:48.003] Tweak future expression to call with '...' arguments ... [13:13:48.003] { [13:13:48.003] do.call(function(...) { [13:13:48.003] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:48.003] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:48.003] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:48.003] on.exit(options(oopts), add = TRUE) [13:13:48.003] } [13:13:48.003] { [13:13:48.003] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:48.003] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:48.003] ...future.FUN(...future.X_jj, ...) [13:13:48.003] }) [13:13:48.003] } [13:13:48.003] }, args = future.call.arguments) [13:13:48.003] } [13:13:48.003] Tweak future expression to call with '...' arguments ... DONE [13:13:48.004] - globals: [6] '...future.FUN', 'a', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:48.004] [13:13:48.004] getGlobalsAndPackages() ... DONE [13:13:48.004] run() for 'Future' ... [13:13:48.005] - state: 'created' [13:13:48.005] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:48.019] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:48.019] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:13:48.019] - Field: 'node' [13:13:48.019] - Field: 'label' [13:13:48.019] - Field: 'local' [13:13:48.020] - Field: 'owner' [13:13:48.020] - Field: 'envir' [13:13:48.020] - Field: 'workers' [13:13:48.020] - Field: 'packages' [13:13:48.020] - Field: 'gc' [13:13:48.020] - Field: 'conditions' [13:13:48.021] - Field: 'persistent' [13:13:48.021] - Field: 'expr' [13:13:48.021] - Field: 'uuid' [13:13:48.021] - Field: 'seed' [13:13:48.021] - Field: 'version' [13:13:48.021] - Field: 'result' [13:13:48.022] - Field: 'asynchronous' [13:13:48.022] - Field: 'calls' [13:13:48.022] - Field: 'globals' [13:13:48.022] - Field: 'stdout' [13:13:48.022] - Field: 'earlySignal' [13:13:48.023] - Field: 'lazy' [13:13:48.023] - Field: 'state' [13:13:48.023] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:13:48.023] - Launch lazy future ... [13:13:48.024] Packages needed by the future expression (n = 0): [13:13:48.024] Packages needed by future strategies (n = 0): [13:13:48.024] { [13:13:48.024] { [13:13:48.024] { [13:13:48.024] ...future.startTime <- base::Sys.time() [13:13:48.024] { [13:13:48.024] { [13:13:48.024] { [13:13:48.024] { [13:13:48.024] base::local({ [13:13:48.024] has_future <- base::requireNamespace("future", [13:13:48.024] quietly = TRUE) [13:13:48.024] if (has_future) { [13:13:48.024] ns <- base::getNamespace("future") [13:13:48.024] version <- ns[[".package"]][["version"]] [13:13:48.024] if (is.null(version)) [13:13:48.024] version <- utils::packageVersion("future") [13:13:48.024] } [13:13:48.024] else { [13:13:48.024] version <- NULL [13:13:48.024] } [13:13:48.024] if (!has_future || version < "1.8.0") { [13:13:48.024] info <- base::c(r_version = base::gsub("R version ", [13:13:48.024] "", base::R.version$version.string), [13:13:48.024] platform = base::sprintf("%s (%s-bit)", [13:13:48.024] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:48.024] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:48.024] "release", "version")], collapse = " "), [13:13:48.024] hostname = base::Sys.info()[["nodename"]]) [13:13:48.024] info <- base::sprintf("%s: %s", base::names(info), [13:13:48.024] info) [13:13:48.024] info <- base::paste(info, collapse = "; ") [13:13:48.024] if (!has_future) { [13:13:48.024] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:48.024] info) [13:13:48.024] } [13:13:48.024] else { [13:13:48.024] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:48.024] info, version) [13:13:48.024] } [13:13:48.024] base::stop(msg) [13:13:48.024] } [13:13:48.024] }) [13:13:48.024] } [13:13:48.024] ...future.mc.cores.old <- base::getOption("mc.cores") [13:13:48.024] base::options(mc.cores = 1L) [13:13:48.024] } [13:13:48.024] options(future.plan = NULL) [13:13:48.024] Sys.unsetenv("R_FUTURE_PLAN") [13:13:48.024] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:48.024] } [13:13:48.024] ...future.workdir <- getwd() [13:13:48.024] } [13:13:48.024] ...future.oldOptions <- base::as.list(base::.Options) [13:13:48.024] ...future.oldEnvVars <- base::Sys.getenv() [13:13:48.024] } [13:13:48.024] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:48.024] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:13:48.024] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:48.024] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:48.024] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:48.024] future.stdout.windows.reencode = NULL, width = 80L) [13:13:48.024] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:48.024] base::names(...future.oldOptions)) [13:13:48.024] } [13:13:48.024] if (FALSE) { [13:13:48.024] } [13:13:48.024] else { [13:13:48.024] if (TRUE) { [13:13:48.024] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:48.024] open = "w") [13:13:48.024] } [13:13:48.024] else { [13:13:48.024] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:48.024] windows = "NUL", "/dev/null"), open = "w") [13:13:48.024] } [13:13:48.024] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:48.024] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:48.024] base::sink(type = "output", split = FALSE) [13:13:48.024] base::close(...future.stdout) [13:13:48.024] }, add = TRUE) [13:13:48.024] } [13:13:48.024] ...future.frame <- base::sys.nframe() [13:13:48.024] ...future.conditions <- base::list() [13:13:48.024] ...future.rng <- base::globalenv()$.Random.seed [13:13:48.024] if (FALSE) { [13:13:48.024] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:48.024] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:48.024] } [13:13:48.024] ...future.result <- base::tryCatch({ [13:13:48.024] base::withCallingHandlers({ [13:13:48.024] ...future.value <- base::withVisible(base::local({ [13:13:48.024] ...future.makeSendCondition <- local({ [13:13:48.024] sendCondition <- NULL [13:13:48.024] function(frame = 1L) { [13:13:48.024] if (is.function(sendCondition)) [13:13:48.024] return(sendCondition) [13:13:48.024] ns <- getNamespace("parallel") [13:13:48.024] if (exists("sendData", mode = "function", [13:13:48.024] envir = ns)) { [13:13:48.024] parallel_sendData <- get("sendData", mode = "function", [13:13:48.024] envir = ns) [13:13:48.024] envir <- sys.frame(frame) [13:13:48.024] master <- NULL [13:13:48.024] while (!identical(envir, .GlobalEnv) && [13:13:48.024] !identical(envir, emptyenv())) { [13:13:48.024] if (exists("master", mode = "list", envir = envir, [13:13:48.024] inherits = FALSE)) { [13:13:48.024] master <- get("master", mode = "list", [13:13:48.024] envir = envir, inherits = FALSE) [13:13:48.024] if (inherits(master, c("SOCKnode", [13:13:48.024] "SOCK0node"))) { [13:13:48.024] sendCondition <<- function(cond) { [13:13:48.024] data <- list(type = "VALUE", value = cond, [13:13:48.024] success = TRUE) [13:13:48.024] parallel_sendData(master, data) [13:13:48.024] } [13:13:48.024] return(sendCondition) [13:13:48.024] } [13:13:48.024] } [13:13:48.024] frame <- frame + 1L [13:13:48.024] envir <- sys.frame(frame) [13:13:48.024] } [13:13:48.024] } [13:13:48.024] sendCondition <<- function(cond) NULL [13:13:48.024] } [13:13:48.024] }) [13:13:48.024] withCallingHandlers({ [13:13:48.024] { [13:13:48.024] do.call(function(...) { [13:13:48.024] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:48.024] if (!identical(...future.globals.maxSize.org, [13:13:48.024] ...future.globals.maxSize)) { [13:13:48.024] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:48.024] on.exit(options(oopts), add = TRUE) [13:13:48.024] } [13:13:48.024] { [13:13:48.024] lapply(seq_along(...future.elements_ii), [13:13:48.024] FUN = function(jj) { [13:13:48.024] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:48.024] ...future.FUN(...future.X_jj, ...) [13:13:48.024] }) [13:13:48.024] } [13:13:48.024] }, args = future.call.arguments) [13:13:48.024] } [13:13:48.024] }, immediateCondition = function(cond) { [13:13:48.024] sendCondition <- ...future.makeSendCondition() [13:13:48.024] sendCondition(cond) [13:13:48.024] muffleCondition <- function (cond, pattern = "^muffle") [13:13:48.024] { [13:13:48.024] inherits <- base::inherits [13:13:48.024] invokeRestart <- base::invokeRestart [13:13:48.024] is.null <- base::is.null [13:13:48.024] muffled <- FALSE [13:13:48.024] if (inherits(cond, "message")) { [13:13:48.024] muffled <- grepl(pattern, "muffleMessage") [13:13:48.024] if (muffled) [13:13:48.024] invokeRestart("muffleMessage") [13:13:48.024] } [13:13:48.024] else if (inherits(cond, "warning")) { [13:13:48.024] muffled <- grepl(pattern, "muffleWarning") [13:13:48.024] if (muffled) [13:13:48.024] invokeRestart("muffleWarning") [13:13:48.024] } [13:13:48.024] else if (inherits(cond, "condition")) { [13:13:48.024] if (!is.null(pattern)) { [13:13:48.024] computeRestarts <- base::computeRestarts [13:13:48.024] grepl <- base::grepl [13:13:48.024] restarts <- computeRestarts(cond) [13:13:48.024] for (restart in restarts) { [13:13:48.024] name <- restart$name [13:13:48.024] if (is.null(name)) [13:13:48.024] next [13:13:48.024] if (!grepl(pattern, name)) [13:13:48.024] next [13:13:48.024] invokeRestart(restart) [13:13:48.024] muffled <- TRUE [13:13:48.024] break [13:13:48.024] } [13:13:48.024] } [13:13:48.024] } [13:13:48.024] invisible(muffled) [13:13:48.024] } [13:13:48.024] muffleCondition(cond) [13:13:48.024] }) [13:13:48.024] })) [13:13:48.024] future::FutureResult(value = ...future.value$value, [13:13:48.024] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:48.024] ...future.rng), globalenv = if (FALSE) [13:13:48.024] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:48.024] ...future.globalenv.names)) [13:13:48.024] else NULL, started = ...future.startTime, version = "1.8") [13:13:48.024] }, condition = base::local({ [13:13:48.024] c <- base::c [13:13:48.024] inherits <- base::inherits [13:13:48.024] invokeRestart <- base::invokeRestart [13:13:48.024] length <- base::length [13:13:48.024] list <- base::list [13:13:48.024] seq.int <- base::seq.int [13:13:48.024] signalCondition <- base::signalCondition [13:13:48.024] sys.calls <- base::sys.calls [13:13:48.024] `[[` <- base::`[[` [13:13:48.024] `+` <- base::`+` [13:13:48.024] `<<-` <- base::`<<-` [13:13:48.024] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:48.024] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:48.024] 3L)] [13:13:48.024] } [13:13:48.024] function(cond) { [13:13:48.024] is_error <- inherits(cond, "error") [13:13:48.024] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:48.024] NULL) [13:13:48.024] if (is_error) { [13:13:48.024] sessionInformation <- function() { [13:13:48.024] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:48.024] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:48.024] search = base::search(), system = base::Sys.info()) [13:13:48.024] } [13:13:48.024] ...future.conditions[[length(...future.conditions) + [13:13:48.024] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:48.024] cond$call), session = sessionInformation(), [13:13:48.024] timestamp = base::Sys.time(), signaled = 0L) [13:13:48.024] signalCondition(cond) [13:13:48.024] } [13:13:48.024] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:48.024] "immediateCondition"))) { [13:13:48.024] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:48.024] ...future.conditions[[length(...future.conditions) + [13:13:48.024] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:48.024] if (TRUE && !signal) { [13:13:48.024] muffleCondition <- function (cond, pattern = "^muffle") [13:13:48.024] { [13:13:48.024] inherits <- base::inherits [13:13:48.024] invokeRestart <- base::invokeRestart [13:13:48.024] is.null <- base::is.null [13:13:48.024] muffled <- FALSE [13:13:48.024] if (inherits(cond, "message")) { [13:13:48.024] muffled <- grepl(pattern, "muffleMessage") [13:13:48.024] if (muffled) [13:13:48.024] invokeRestart("muffleMessage") [13:13:48.024] } [13:13:48.024] else if (inherits(cond, "warning")) { [13:13:48.024] muffled <- grepl(pattern, "muffleWarning") [13:13:48.024] if (muffled) [13:13:48.024] invokeRestart("muffleWarning") [13:13:48.024] } [13:13:48.024] else if (inherits(cond, "condition")) { [13:13:48.024] if (!is.null(pattern)) { [13:13:48.024] computeRestarts <- base::computeRestarts [13:13:48.024] grepl <- base::grepl [13:13:48.024] restarts <- computeRestarts(cond) [13:13:48.024] for (restart in restarts) { [13:13:48.024] name <- restart$name [13:13:48.024] if (is.null(name)) [13:13:48.024] next [13:13:48.024] if (!grepl(pattern, name)) [13:13:48.024] next [13:13:48.024] invokeRestart(restart) [13:13:48.024] muffled <- TRUE [13:13:48.024] break [13:13:48.024] } [13:13:48.024] } [13:13:48.024] } [13:13:48.024] invisible(muffled) [13:13:48.024] } [13:13:48.024] muffleCondition(cond, pattern = "^muffle") [13:13:48.024] } [13:13:48.024] } [13:13:48.024] else { [13:13:48.024] if (TRUE) { [13:13:48.024] muffleCondition <- function (cond, pattern = "^muffle") [13:13:48.024] { [13:13:48.024] inherits <- base::inherits [13:13:48.024] invokeRestart <- base::invokeRestart [13:13:48.024] is.null <- base::is.null [13:13:48.024] muffled <- FALSE [13:13:48.024] if (inherits(cond, "message")) { [13:13:48.024] muffled <- grepl(pattern, "muffleMessage") [13:13:48.024] if (muffled) [13:13:48.024] invokeRestart("muffleMessage") [13:13:48.024] } [13:13:48.024] else if (inherits(cond, "warning")) { [13:13:48.024] muffled <- grepl(pattern, "muffleWarning") [13:13:48.024] if (muffled) [13:13:48.024] invokeRestart("muffleWarning") [13:13:48.024] } [13:13:48.024] else if (inherits(cond, "condition")) { [13:13:48.024] if (!is.null(pattern)) { [13:13:48.024] computeRestarts <- base::computeRestarts [13:13:48.024] grepl <- base::grepl [13:13:48.024] restarts <- computeRestarts(cond) [13:13:48.024] for (restart in restarts) { [13:13:48.024] name <- restart$name [13:13:48.024] if (is.null(name)) [13:13:48.024] next [13:13:48.024] if (!grepl(pattern, name)) [13:13:48.024] next [13:13:48.024] invokeRestart(restart) [13:13:48.024] muffled <- TRUE [13:13:48.024] break [13:13:48.024] } [13:13:48.024] } [13:13:48.024] } [13:13:48.024] invisible(muffled) [13:13:48.024] } [13:13:48.024] muffleCondition(cond, pattern = "^muffle") [13:13:48.024] } [13:13:48.024] } [13:13:48.024] } [13:13:48.024] })) [13:13:48.024] }, error = function(ex) { [13:13:48.024] base::structure(base::list(value = NULL, visible = NULL, [13:13:48.024] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:48.024] ...future.rng), started = ...future.startTime, [13:13:48.024] finished = Sys.time(), session_uuid = NA_character_, [13:13:48.024] version = "1.8"), class = "FutureResult") [13:13:48.024] }, finally = { [13:13:48.024] if (!identical(...future.workdir, getwd())) [13:13:48.024] setwd(...future.workdir) [13:13:48.024] { [13:13:48.024] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:48.024] ...future.oldOptions$nwarnings <- NULL [13:13:48.024] } [13:13:48.024] base::options(...future.oldOptions) [13:13:48.024] if (.Platform$OS.type == "windows") { [13:13:48.024] old_names <- names(...future.oldEnvVars) [13:13:48.024] envs <- base::Sys.getenv() [13:13:48.024] names <- names(envs) [13:13:48.024] common <- intersect(names, old_names) [13:13:48.024] added <- setdiff(names, old_names) [13:13:48.024] removed <- setdiff(old_names, names) [13:13:48.024] changed <- common[...future.oldEnvVars[common] != [13:13:48.024] envs[common]] [13:13:48.024] NAMES <- toupper(changed) [13:13:48.024] args <- list() [13:13:48.024] for (kk in seq_along(NAMES)) { [13:13:48.024] name <- changed[[kk]] [13:13:48.024] NAME <- NAMES[[kk]] [13:13:48.024] if (name != NAME && is.element(NAME, old_names)) [13:13:48.024] next [13:13:48.024] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:48.024] } [13:13:48.024] NAMES <- toupper(added) [13:13:48.024] for (kk in seq_along(NAMES)) { [13:13:48.024] name <- added[[kk]] [13:13:48.024] NAME <- NAMES[[kk]] [13:13:48.024] if (name != NAME && is.element(NAME, old_names)) [13:13:48.024] next [13:13:48.024] args[[name]] <- "" [13:13:48.024] } [13:13:48.024] NAMES <- toupper(removed) [13:13:48.024] for (kk in seq_along(NAMES)) { [13:13:48.024] name <- removed[[kk]] [13:13:48.024] NAME <- NAMES[[kk]] [13:13:48.024] if (name != NAME && is.element(NAME, old_names)) [13:13:48.024] next [13:13:48.024] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:48.024] } [13:13:48.024] if (length(args) > 0) [13:13:48.024] base::do.call(base::Sys.setenv, args = args) [13:13:48.024] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:48.024] } [13:13:48.024] else { [13:13:48.024] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:48.024] } [13:13:48.024] { [13:13:48.024] if (base::length(...future.futureOptionsAdded) > [13:13:48.024] 0L) { [13:13:48.024] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:48.024] base::names(opts) <- ...future.futureOptionsAdded [13:13:48.024] base::options(opts) [13:13:48.024] } [13:13:48.024] { [13:13:48.024] { [13:13:48.024] base::options(mc.cores = ...future.mc.cores.old) [13:13:48.024] NULL [13:13:48.024] } [13:13:48.024] options(future.plan = NULL) [13:13:48.024] if (is.na(NA_character_)) [13:13:48.024] Sys.unsetenv("R_FUTURE_PLAN") [13:13:48.024] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:48.024] future::plan(list(function (..., workers = availableCores(), [13:13:48.024] lazy = FALSE, rscript_libs = .libPaths(), [13:13:48.024] envir = parent.frame()) [13:13:48.024] { [13:13:48.024] if (is.function(workers)) [13:13:48.024] workers <- workers() [13:13:48.024] workers <- structure(as.integer(workers), [13:13:48.024] class = class(workers)) [13:13:48.024] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:48.024] workers >= 1) [13:13:48.024] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:48.024] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:48.024] } [13:13:48.024] future <- MultisessionFuture(..., workers = workers, [13:13:48.024] lazy = lazy, rscript_libs = rscript_libs, [13:13:48.024] envir = envir) [13:13:48.024] if (!future$lazy) [13:13:48.024] future <- run(future) [13:13:48.024] invisible(future) [13:13:48.024] }), .cleanup = FALSE, .init = FALSE) [13:13:48.024] } [13:13:48.024] } [13:13:48.024] } [13:13:48.024] }) [13:13:48.024] if (TRUE) { [13:13:48.024] base::sink(type = "output", split = FALSE) [13:13:48.024] if (TRUE) { [13:13:48.024] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:48.024] } [13:13:48.024] else { [13:13:48.024] ...future.result["stdout"] <- base::list(NULL) [13:13:48.024] } [13:13:48.024] base::close(...future.stdout) [13:13:48.024] ...future.stdout <- NULL [13:13:48.024] } [13:13:48.024] ...future.result$conditions <- ...future.conditions [13:13:48.024] ...future.result$finished <- base::Sys.time() [13:13:48.024] ...future.result [13:13:48.024] } [13:13:48.030] Exporting 6 global objects (1.93 KiB) to cluster node #1 ... [13:13:48.030] Exporting '...future.FUN' (1.88 KiB) to cluster node #1 ... [13:13:48.030] Exporting '...future.FUN' (1.88 KiB) to cluster node #1 ... DONE [13:13:48.031] Exporting 'a' (56 bytes) to cluster node #1 ... [13:13:48.031] Exporting 'a' (56 bytes) to cluster node #1 ... DONE [13:13:48.031] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... [13:13:48.032] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... DONE [13:13:48.064] Exporting '...future.elements_ii' (273.44 KiB) to cluster node #1 ... [13:13:48.064] Exporting '...future.elements_ii' (273.44 KiB) to cluster node #1 ... DONE [13:13:48.065] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:13:48.065] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:13:48.065] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:13:48.066] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:13:48.066] Exporting 6 global objects (1.93 KiB) to cluster node #1 ... DONE [13:13:48.067] MultisessionFuture started [13:13:48.067] - Launch lazy future ... done [13:13:48.067] run() for 'MultisessionFuture' ... done [13:13:48.067] Created future: [13:13:48.092] receiveMessageFromWorker() for ClusterFuture ... [13:13:48.092] - Validating connection of MultisessionFuture [13:13:48.093] - received message: FutureResult [13:13:48.093] - Received FutureResult [13:13:48.093] - Erased future from FutureRegistry [13:13:48.093] result() for ClusterFuture ... [13:13:48.093] - result already collected: FutureResult [13:13:48.094] result() for ClusterFuture ... done [13:13:48.094] receiveMessageFromWorker() for ClusterFuture ... done [13:13:48.067] MultisessionFuture: [13:13:48.067] Label: 'future_lapply-1' [13:13:48.067] Expression: [13:13:48.067] { [13:13:48.067] do.call(function(...) { [13:13:48.067] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:48.067] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:48.067] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:48.067] on.exit(options(oopts), add = TRUE) [13:13:48.067] } [13:13:48.067] { [13:13:48.067] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:48.067] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:48.067] ...future.FUN(...future.X_jj, ...) [13:13:48.067] }) [13:13:48.067] } [13:13:48.067] }, args = future.call.arguments) [13:13:48.067] } [13:13:48.067] Lazy evaluation: FALSE [13:13:48.067] Asynchronous evaluation: TRUE [13:13:48.067] Local evaluation: TRUE [13:13:48.067] Environment: R_GlobalEnv [13:13:48.067] Capture standard output: TRUE [13:13:48.067] Capture condition classes: 'condition' (excluding 'nothing') [13:13:48.067] 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, ...) [13:13:48.067] Packages: [13:13:48.067] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:48.067] Resolved: TRUE [13:13:48.067] Value: [13:13:48.067] Conditions captured: [13:13:48.067] Early signaling: FALSE [13:13:48.067] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:48.067] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:48.094] Chunk #1 of 2 ... DONE [13:13:48.094] Chunk #2 of 2 ... [13:13:48.095] - Finding globals in 'X' for chunk #2 ... [13:13:48.095] getGlobalsAndPackages() ... [13:13:48.096] Searching for globals... [13:13:48.100] [13:13:48.100] Searching for globals ... DONE [13:13:48.100] - globals: [0] [13:13:48.100] getGlobalsAndPackages() ... DONE [13:13:48.101] + additional globals found: [n=0] [13:13:48.101] + additional namespaces needed: [n=0] [13:13:48.101] - Finding globals in 'X' for chunk #2 ... DONE [13:13:48.101] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:13:48.101] - seeds: [13:13:48.101] - All globals exported: [n=6] '...future.FUN', 'a', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:48.102] getGlobalsAndPackages() ... [13:13:48.102] - globals passed as-is: [6] '...future.FUN', 'a', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:48.102] Resolving globals: FALSE [13:13:48.102] Tweak future expression to call with '...' arguments ... [13:13:48.102] { [13:13:48.102] do.call(function(...) { [13:13:48.102] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:48.102] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:48.102] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:48.102] on.exit(options(oopts), add = TRUE) [13:13:48.102] } [13:13:48.102] { [13:13:48.102] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:48.102] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:48.102] ...future.FUN(...future.X_jj, ...) [13:13:48.102] }) [13:13:48.102] } [13:13:48.102] }, args = future.call.arguments) [13:13:48.102] } [13:13:48.103] Tweak future expression to call with '...' arguments ... DONE [13:13:48.103] - globals: [6] '...future.FUN', 'a', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:48.103] [13:13:48.104] getGlobalsAndPackages() ... DONE [13:13:48.104] run() for 'Future' ... [13:13:48.104] - state: 'created' [13:13:48.104] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:48.119] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:48.119] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:13:48.119] - Field: 'node' [13:13:48.119] - Field: 'label' [13:13:48.119] - Field: 'local' [13:13:48.120] - Field: 'owner' [13:13:48.120] - Field: 'envir' [13:13:48.120] - Field: 'workers' [13:13:48.120] - Field: 'packages' [13:13:48.120] - Field: 'gc' [13:13:48.120] - Field: 'conditions' [13:13:48.121] - Field: 'persistent' [13:13:48.121] - Field: 'expr' [13:13:48.121] - Field: 'uuid' [13:13:48.121] - Field: 'seed' [13:13:48.121] - Field: 'version' [13:13:48.122] - Field: 'result' [13:13:48.122] - Field: 'asynchronous' [13:13:48.122] - Field: 'calls' [13:13:48.122] - Field: 'globals' [13:13:48.122] - Field: 'stdout' [13:13:48.122] - Field: 'earlySignal' [13:13:48.123] - Field: 'lazy' [13:13:48.123] - Field: 'state' [13:13:48.123] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:13:48.123] - Launch lazy future ... [13:13:48.123] Packages needed by the future expression (n = 0): [13:13:48.124] Packages needed by future strategies (n = 0): [13:13:48.124] { [13:13:48.124] { [13:13:48.124] { [13:13:48.124] ...future.startTime <- base::Sys.time() [13:13:48.124] { [13:13:48.124] { [13:13:48.124] { [13:13:48.124] { [13:13:48.124] base::local({ [13:13:48.124] has_future <- base::requireNamespace("future", [13:13:48.124] quietly = TRUE) [13:13:48.124] if (has_future) { [13:13:48.124] ns <- base::getNamespace("future") [13:13:48.124] version <- ns[[".package"]][["version"]] [13:13:48.124] if (is.null(version)) [13:13:48.124] version <- utils::packageVersion("future") [13:13:48.124] } [13:13:48.124] else { [13:13:48.124] version <- NULL [13:13:48.124] } [13:13:48.124] if (!has_future || version < "1.8.0") { [13:13:48.124] info <- base::c(r_version = base::gsub("R version ", [13:13:48.124] "", base::R.version$version.string), [13:13:48.124] platform = base::sprintf("%s (%s-bit)", [13:13:48.124] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:48.124] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:48.124] "release", "version")], collapse = " "), [13:13:48.124] hostname = base::Sys.info()[["nodename"]]) [13:13:48.124] info <- base::sprintf("%s: %s", base::names(info), [13:13:48.124] info) [13:13:48.124] info <- base::paste(info, collapse = "; ") [13:13:48.124] if (!has_future) { [13:13:48.124] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:48.124] info) [13:13:48.124] } [13:13:48.124] else { [13:13:48.124] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:48.124] info, version) [13:13:48.124] } [13:13:48.124] base::stop(msg) [13:13:48.124] } [13:13:48.124] }) [13:13:48.124] } [13:13:48.124] ...future.mc.cores.old <- base::getOption("mc.cores") [13:13:48.124] base::options(mc.cores = 1L) [13:13:48.124] } [13:13:48.124] options(future.plan = NULL) [13:13:48.124] Sys.unsetenv("R_FUTURE_PLAN") [13:13:48.124] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:48.124] } [13:13:48.124] ...future.workdir <- getwd() [13:13:48.124] } [13:13:48.124] ...future.oldOptions <- base::as.list(base::.Options) [13:13:48.124] ...future.oldEnvVars <- base::Sys.getenv() [13:13:48.124] } [13:13:48.124] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:48.124] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:13:48.124] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:48.124] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:48.124] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:48.124] future.stdout.windows.reencode = NULL, width = 80L) [13:13:48.124] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:48.124] base::names(...future.oldOptions)) [13:13:48.124] } [13:13:48.124] if (FALSE) { [13:13:48.124] } [13:13:48.124] else { [13:13:48.124] if (TRUE) { [13:13:48.124] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:48.124] open = "w") [13:13:48.124] } [13:13:48.124] else { [13:13:48.124] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:48.124] windows = "NUL", "/dev/null"), open = "w") [13:13:48.124] } [13:13:48.124] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:48.124] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:48.124] base::sink(type = "output", split = FALSE) [13:13:48.124] base::close(...future.stdout) [13:13:48.124] }, add = TRUE) [13:13:48.124] } [13:13:48.124] ...future.frame <- base::sys.nframe() [13:13:48.124] ...future.conditions <- base::list() [13:13:48.124] ...future.rng <- base::globalenv()$.Random.seed [13:13:48.124] if (FALSE) { [13:13:48.124] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:48.124] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:48.124] } [13:13:48.124] ...future.result <- base::tryCatch({ [13:13:48.124] base::withCallingHandlers({ [13:13:48.124] ...future.value <- base::withVisible(base::local({ [13:13:48.124] ...future.makeSendCondition <- local({ [13:13:48.124] sendCondition <- NULL [13:13:48.124] function(frame = 1L) { [13:13:48.124] if (is.function(sendCondition)) [13:13:48.124] return(sendCondition) [13:13:48.124] ns <- getNamespace("parallel") [13:13:48.124] if (exists("sendData", mode = "function", [13:13:48.124] envir = ns)) { [13:13:48.124] parallel_sendData <- get("sendData", mode = "function", [13:13:48.124] envir = ns) [13:13:48.124] envir <- sys.frame(frame) [13:13:48.124] master <- NULL [13:13:48.124] while (!identical(envir, .GlobalEnv) && [13:13:48.124] !identical(envir, emptyenv())) { [13:13:48.124] if (exists("master", mode = "list", envir = envir, [13:13:48.124] inherits = FALSE)) { [13:13:48.124] master <- get("master", mode = "list", [13:13:48.124] envir = envir, inherits = FALSE) [13:13:48.124] if (inherits(master, c("SOCKnode", [13:13:48.124] "SOCK0node"))) { [13:13:48.124] sendCondition <<- function(cond) { [13:13:48.124] data <- list(type = "VALUE", value = cond, [13:13:48.124] success = TRUE) [13:13:48.124] parallel_sendData(master, data) [13:13:48.124] } [13:13:48.124] return(sendCondition) [13:13:48.124] } [13:13:48.124] } [13:13:48.124] frame <- frame + 1L [13:13:48.124] envir <- sys.frame(frame) [13:13:48.124] } [13:13:48.124] } [13:13:48.124] sendCondition <<- function(cond) NULL [13:13:48.124] } [13:13:48.124] }) [13:13:48.124] withCallingHandlers({ [13:13:48.124] { [13:13:48.124] do.call(function(...) { [13:13:48.124] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:48.124] if (!identical(...future.globals.maxSize.org, [13:13:48.124] ...future.globals.maxSize)) { [13:13:48.124] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:48.124] on.exit(options(oopts), add = TRUE) [13:13:48.124] } [13:13:48.124] { [13:13:48.124] lapply(seq_along(...future.elements_ii), [13:13:48.124] FUN = function(jj) { [13:13:48.124] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:48.124] ...future.FUN(...future.X_jj, ...) [13:13:48.124] }) [13:13:48.124] } [13:13:48.124] }, args = future.call.arguments) [13:13:48.124] } [13:13:48.124] }, immediateCondition = function(cond) { [13:13:48.124] sendCondition <- ...future.makeSendCondition() [13:13:48.124] sendCondition(cond) [13:13:48.124] muffleCondition <- function (cond, pattern = "^muffle") [13:13:48.124] { [13:13:48.124] inherits <- base::inherits [13:13:48.124] invokeRestart <- base::invokeRestart [13:13:48.124] is.null <- base::is.null [13:13:48.124] muffled <- FALSE [13:13:48.124] if (inherits(cond, "message")) { [13:13:48.124] muffled <- grepl(pattern, "muffleMessage") [13:13:48.124] if (muffled) [13:13:48.124] invokeRestart("muffleMessage") [13:13:48.124] } [13:13:48.124] else if (inherits(cond, "warning")) { [13:13:48.124] muffled <- grepl(pattern, "muffleWarning") [13:13:48.124] if (muffled) [13:13:48.124] invokeRestart("muffleWarning") [13:13:48.124] } [13:13:48.124] else if (inherits(cond, "condition")) { [13:13:48.124] if (!is.null(pattern)) { [13:13:48.124] computeRestarts <- base::computeRestarts [13:13:48.124] grepl <- base::grepl [13:13:48.124] restarts <- computeRestarts(cond) [13:13:48.124] for (restart in restarts) { [13:13:48.124] name <- restart$name [13:13:48.124] if (is.null(name)) [13:13:48.124] next [13:13:48.124] if (!grepl(pattern, name)) [13:13:48.124] next [13:13:48.124] invokeRestart(restart) [13:13:48.124] muffled <- TRUE [13:13:48.124] break [13:13:48.124] } [13:13:48.124] } [13:13:48.124] } [13:13:48.124] invisible(muffled) [13:13:48.124] } [13:13:48.124] muffleCondition(cond) [13:13:48.124] }) [13:13:48.124] })) [13:13:48.124] future::FutureResult(value = ...future.value$value, [13:13:48.124] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:48.124] ...future.rng), globalenv = if (FALSE) [13:13:48.124] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:48.124] ...future.globalenv.names)) [13:13:48.124] else NULL, started = ...future.startTime, version = "1.8") [13:13:48.124] }, condition = base::local({ [13:13:48.124] c <- base::c [13:13:48.124] inherits <- base::inherits [13:13:48.124] invokeRestart <- base::invokeRestart [13:13:48.124] length <- base::length [13:13:48.124] list <- base::list [13:13:48.124] seq.int <- base::seq.int [13:13:48.124] signalCondition <- base::signalCondition [13:13:48.124] sys.calls <- base::sys.calls [13:13:48.124] `[[` <- base::`[[` [13:13:48.124] `+` <- base::`+` [13:13:48.124] `<<-` <- base::`<<-` [13:13:48.124] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:48.124] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:48.124] 3L)] [13:13:48.124] } [13:13:48.124] function(cond) { [13:13:48.124] is_error <- inherits(cond, "error") [13:13:48.124] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:48.124] NULL) [13:13:48.124] if (is_error) { [13:13:48.124] sessionInformation <- function() { [13:13:48.124] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:48.124] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:48.124] search = base::search(), system = base::Sys.info()) [13:13:48.124] } [13:13:48.124] ...future.conditions[[length(...future.conditions) + [13:13:48.124] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:48.124] cond$call), session = sessionInformation(), [13:13:48.124] timestamp = base::Sys.time(), signaled = 0L) [13:13:48.124] signalCondition(cond) [13:13:48.124] } [13:13:48.124] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:48.124] "immediateCondition"))) { [13:13:48.124] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:48.124] ...future.conditions[[length(...future.conditions) + [13:13:48.124] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:48.124] if (TRUE && !signal) { [13:13:48.124] muffleCondition <- function (cond, pattern = "^muffle") [13:13:48.124] { [13:13:48.124] inherits <- base::inherits [13:13:48.124] invokeRestart <- base::invokeRestart [13:13:48.124] is.null <- base::is.null [13:13:48.124] muffled <- FALSE [13:13:48.124] if (inherits(cond, "message")) { [13:13:48.124] muffled <- grepl(pattern, "muffleMessage") [13:13:48.124] if (muffled) [13:13:48.124] invokeRestart("muffleMessage") [13:13:48.124] } [13:13:48.124] else if (inherits(cond, "warning")) { [13:13:48.124] muffled <- grepl(pattern, "muffleWarning") [13:13:48.124] if (muffled) [13:13:48.124] invokeRestart("muffleWarning") [13:13:48.124] } [13:13:48.124] else if (inherits(cond, "condition")) { [13:13:48.124] if (!is.null(pattern)) { [13:13:48.124] computeRestarts <- base::computeRestarts [13:13:48.124] grepl <- base::grepl [13:13:48.124] restarts <- computeRestarts(cond) [13:13:48.124] for (restart in restarts) { [13:13:48.124] name <- restart$name [13:13:48.124] if (is.null(name)) [13:13:48.124] next [13:13:48.124] if (!grepl(pattern, name)) [13:13:48.124] next [13:13:48.124] invokeRestart(restart) [13:13:48.124] muffled <- TRUE [13:13:48.124] break [13:13:48.124] } [13:13:48.124] } [13:13:48.124] } [13:13:48.124] invisible(muffled) [13:13:48.124] } [13:13:48.124] muffleCondition(cond, pattern = "^muffle") [13:13:48.124] } [13:13:48.124] } [13:13:48.124] else { [13:13:48.124] if (TRUE) { [13:13:48.124] muffleCondition <- function (cond, pattern = "^muffle") [13:13:48.124] { [13:13:48.124] inherits <- base::inherits [13:13:48.124] invokeRestart <- base::invokeRestart [13:13:48.124] is.null <- base::is.null [13:13:48.124] muffled <- FALSE [13:13:48.124] if (inherits(cond, "message")) { [13:13:48.124] muffled <- grepl(pattern, "muffleMessage") [13:13:48.124] if (muffled) [13:13:48.124] invokeRestart("muffleMessage") [13:13:48.124] } [13:13:48.124] else if (inherits(cond, "warning")) { [13:13:48.124] muffled <- grepl(pattern, "muffleWarning") [13:13:48.124] if (muffled) [13:13:48.124] invokeRestart("muffleWarning") [13:13:48.124] } [13:13:48.124] else if (inherits(cond, "condition")) { [13:13:48.124] if (!is.null(pattern)) { [13:13:48.124] computeRestarts <- base::computeRestarts [13:13:48.124] grepl <- base::grepl [13:13:48.124] restarts <- computeRestarts(cond) [13:13:48.124] for (restart in restarts) { [13:13:48.124] name <- restart$name [13:13:48.124] if (is.null(name)) [13:13:48.124] next [13:13:48.124] if (!grepl(pattern, name)) [13:13:48.124] next [13:13:48.124] invokeRestart(restart) [13:13:48.124] muffled <- TRUE [13:13:48.124] break [13:13:48.124] } [13:13:48.124] } [13:13:48.124] } [13:13:48.124] invisible(muffled) [13:13:48.124] } [13:13:48.124] muffleCondition(cond, pattern = "^muffle") [13:13:48.124] } [13:13:48.124] } [13:13:48.124] } [13:13:48.124] })) [13:13:48.124] }, error = function(ex) { [13:13:48.124] base::structure(base::list(value = NULL, visible = NULL, [13:13:48.124] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:48.124] ...future.rng), started = ...future.startTime, [13:13:48.124] finished = Sys.time(), session_uuid = NA_character_, [13:13:48.124] version = "1.8"), class = "FutureResult") [13:13:48.124] }, finally = { [13:13:48.124] if (!identical(...future.workdir, getwd())) [13:13:48.124] setwd(...future.workdir) [13:13:48.124] { [13:13:48.124] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:48.124] ...future.oldOptions$nwarnings <- NULL [13:13:48.124] } [13:13:48.124] base::options(...future.oldOptions) [13:13:48.124] if (.Platform$OS.type == "windows") { [13:13:48.124] old_names <- names(...future.oldEnvVars) [13:13:48.124] envs <- base::Sys.getenv() [13:13:48.124] names <- names(envs) [13:13:48.124] common <- intersect(names, old_names) [13:13:48.124] added <- setdiff(names, old_names) [13:13:48.124] removed <- setdiff(old_names, names) [13:13:48.124] changed <- common[...future.oldEnvVars[common] != [13:13:48.124] envs[common]] [13:13:48.124] NAMES <- toupper(changed) [13:13:48.124] args <- list() [13:13:48.124] for (kk in seq_along(NAMES)) { [13:13:48.124] name <- changed[[kk]] [13:13:48.124] NAME <- NAMES[[kk]] [13:13:48.124] if (name != NAME && is.element(NAME, old_names)) [13:13:48.124] next [13:13:48.124] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:48.124] } [13:13:48.124] NAMES <- toupper(added) [13:13:48.124] for (kk in seq_along(NAMES)) { [13:13:48.124] name <- added[[kk]] [13:13:48.124] NAME <- NAMES[[kk]] [13:13:48.124] if (name != NAME && is.element(NAME, old_names)) [13:13:48.124] next [13:13:48.124] args[[name]] <- "" [13:13:48.124] } [13:13:48.124] NAMES <- toupper(removed) [13:13:48.124] for (kk in seq_along(NAMES)) { [13:13:48.124] name <- removed[[kk]] [13:13:48.124] NAME <- NAMES[[kk]] [13:13:48.124] if (name != NAME && is.element(NAME, old_names)) [13:13:48.124] next [13:13:48.124] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:48.124] } [13:13:48.124] if (length(args) > 0) [13:13:48.124] base::do.call(base::Sys.setenv, args = args) [13:13:48.124] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:48.124] } [13:13:48.124] else { [13:13:48.124] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:48.124] } [13:13:48.124] { [13:13:48.124] if (base::length(...future.futureOptionsAdded) > [13:13:48.124] 0L) { [13:13:48.124] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:48.124] base::names(opts) <- ...future.futureOptionsAdded [13:13:48.124] base::options(opts) [13:13:48.124] } [13:13:48.124] { [13:13:48.124] { [13:13:48.124] base::options(mc.cores = ...future.mc.cores.old) [13:13:48.124] NULL [13:13:48.124] } [13:13:48.124] options(future.plan = NULL) [13:13:48.124] if (is.na(NA_character_)) [13:13:48.124] Sys.unsetenv("R_FUTURE_PLAN") [13:13:48.124] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:48.124] future::plan(list(function (..., workers = availableCores(), [13:13:48.124] lazy = FALSE, rscript_libs = .libPaths(), [13:13:48.124] envir = parent.frame()) [13:13:48.124] { [13:13:48.124] if (is.function(workers)) [13:13:48.124] workers <- workers() [13:13:48.124] workers <- structure(as.integer(workers), [13:13:48.124] class = class(workers)) [13:13:48.124] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:48.124] workers >= 1) [13:13:48.124] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:48.124] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:48.124] } [13:13:48.124] future <- MultisessionFuture(..., workers = workers, [13:13:48.124] lazy = lazy, rscript_libs = rscript_libs, [13:13:48.124] envir = envir) [13:13:48.124] if (!future$lazy) [13:13:48.124] future <- run(future) [13:13:48.124] invisible(future) [13:13:48.124] }), .cleanup = FALSE, .init = FALSE) [13:13:48.124] } [13:13:48.124] } [13:13:48.124] } [13:13:48.124] }) [13:13:48.124] if (TRUE) { [13:13:48.124] base::sink(type = "output", split = FALSE) [13:13:48.124] if (TRUE) { [13:13:48.124] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:48.124] } [13:13:48.124] else { [13:13:48.124] ...future.result["stdout"] <- base::list(NULL) [13:13:48.124] } [13:13:48.124] base::close(...future.stdout) [13:13:48.124] ...future.stdout <- NULL [13:13:48.124] } [13:13:48.124] ...future.result$conditions <- ...future.conditions [13:13:48.124] ...future.result$finished <- base::Sys.time() [13:13:48.124] ...future.result [13:13:48.124] } [13:13:48.130] Exporting 6 global objects (1.93 KiB) to cluster node #1 ... [13:13:48.130] Exporting '...future.FUN' (1.88 KiB) to cluster node #1 ... [13:13:48.130] Exporting '...future.FUN' (1.88 KiB) to cluster node #1 ... DONE [13:13:48.130] Exporting 'a' (56 bytes) to cluster node #1 ... [13:13:48.131] Exporting 'a' (56 bytes) to cluster node #1 ... DONE [13:13:48.131] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... [13:13:48.132] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... DONE [13:13:48.155] Exporting '...future.elements_ii' (273.44 KiB) to cluster node #1 ... [13:13:48.157] Exporting '...future.elements_ii' (273.44 KiB) to cluster node #1 ... DONE [13:13:48.157] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:13:48.157] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:13:48.158] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:13:48.158] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:13:48.158] Exporting 6 global objects (1.93 KiB) to cluster node #1 ... DONE [13:13:48.159] MultisessionFuture started [13:13:48.159] - Launch lazy future ... done [13:13:48.159] run() for 'MultisessionFuture' ... done [13:13:48.159] Created future: [13:13:48.184] receiveMessageFromWorker() for ClusterFuture ... [13:13:48.184] - Validating connection of MultisessionFuture [13:13:48.185] - received message: FutureResult [13:13:48.185] - Received FutureResult [13:13:48.185] - Erased future from FutureRegistry [13:13:48.186] result() for ClusterFuture ... [13:13:48.186] - result already collected: FutureResult [13:13:48.186] result() for ClusterFuture ... done [13:13:48.186] receiveMessageFromWorker() for ClusterFuture ... done [13:13:48.160] MultisessionFuture: [13:13:48.160] Label: 'future_lapply-2' [13:13:48.160] Expression: [13:13:48.160] { [13:13:48.160] do.call(function(...) { [13:13:48.160] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:48.160] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:48.160] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:48.160] on.exit(options(oopts), add = TRUE) [13:13:48.160] } [13:13:48.160] { [13:13:48.160] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:48.160] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:48.160] ...future.FUN(...future.X_jj, ...) [13:13:48.160] }) [13:13:48.160] } [13:13:48.160] }, args = future.call.arguments) [13:13:48.160] } [13:13:48.160] Lazy evaluation: FALSE [13:13:48.160] Asynchronous evaluation: TRUE [13:13:48.160] Local evaluation: TRUE [13:13:48.160] Environment: R_GlobalEnv [13:13:48.160] Capture standard output: TRUE [13:13:48.160] Capture condition classes: 'condition' (excluding 'nothing') [13:13:48.160] 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, ...) [13:13:48.160] Packages: [13:13:48.160] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:48.160] Resolved: TRUE [13:13:48.160] Value: [13:13:48.160] Conditions captured: [13:13:48.160] Early signaling: FALSE [13:13:48.160] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:48.160] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:48.186] Chunk #2 of 2 ... DONE [13:13:48.187] Launching 2 futures (chunks) ... DONE [13:13:48.187] Resolving 2 futures (chunks) ... [13:13:48.187] resolve() on list ... [13:13:48.187] recursive: 0 [13:13:48.187] length: 2 [13:13:48.187] [13:13:48.187] Future #1 [13:13:48.188] result() for ClusterFuture ... [13:13:48.188] - result already collected: FutureResult [13:13:48.188] result() for ClusterFuture ... done [13:13:48.188] result() for ClusterFuture ... [13:13:48.188] - result already collected: FutureResult [13:13:48.188] result() for ClusterFuture ... done [13:13:48.188] signalConditionsASAP(MultisessionFuture, pos=1) ... [13:13:48.189] - nx: 2 [13:13:48.189] - relay: TRUE [13:13:48.189] - stdout: TRUE [13:13:48.189] - signal: TRUE [13:13:48.189] - resignal: FALSE [13:13:48.189] - force: TRUE [13:13:48.189] - relayed: [n=2] FALSE, FALSE [13:13:48.190] - queued futures: [n=2] FALSE, FALSE [13:13:48.190] - until=1 [13:13:48.190] - relaying element #1 [13:13:48.190] result() for ClusterFuture ... [13:13:48.190] - result already collected: FutureResult [13:13:48.190] result() for ClusterFuture ... done [13:13:48.190] result() for ClusterFuture ... [13:13:48.191] - result already collected: FutureResult [13:13:48.191] result() for ClusterFuture ... done [13:13:48.191] result() for ClusterFuture ... [13:13:48.191] - result already collected: FutureResult [13:13:48.191] result() for ClusterFuture ... done [13:13:48.191] result() for ClusterFuture ... [13:13:48.191] - result already collected: FutureResult [13:13:48.192] result() for ClusterFuture ... done [13:13:48.192] - relayed: [n=2] TRUE, FALSE [13:13:48.192] - queued futures: [n=2] TRUE, FALSE [13:13:48.192] signalConditionsASAP(MultisessionFuture, pos=1) ... done [13:13:48.192] length: 1 (resolved future 1) [13:13:48.192] Future #2 [13:13:48.193] result() for ClusterFuture ... [13:13:48.193] - result already collected: FutureResult [13:13:48.193] result() for ClusterFuture ... done [13:13:48.193] result() for ClusterFuture ... [13:13:48.193] - result already collected: FutureResult [13:13:48.193] result() for ClusterFuture ... done [13:13:48.193] signalConditionsASAP(MultisessionFuture, pos=2) ... [13:13:48.194] - nx: 2 [13:13:48.194] - relay: TRUE [13:13:48.194] - stdout: TRUE [13:13:48.194] - signal: TRUE [13:13:48.194] - resignal: FALSE [13:13:48.194] - force: TRUE [13:13:48.194] - relayed: [n=2] TRUE, FALSE [13:13:48.194] - queued futures: [n=2] TRUE, FALSE [13:13:48.195] - until=2 [13:13:48.195] - relaying element #2 [13:13:48.195] result() for ClusterFuture ... [13:13:48.195] - result already collected: FutureResult [13:13:48.195] result() for ClusterFuture ... done [13:13:48.195] result() for ClusterFuture ... [13:13:48.195] - result already collected: FutureResult [13:13:48.196] result() for ClusterFuture ... done [13:13:48.196] result() for ClusterFuture ... [13:13:48.196] - result already collected: FutureResult [13:13:48.196] result() for ClusterFuture ... done [13:13:48.196] result() for ClusterFuture ... [13:13:48.196] - result already collected: FutureResult [13:13:48.196] result() for ClusterFuture ... done [13:13:48.197] - relayed: [n=2] TRUE, TRUE [13:13:48.197] - queued futures: [n=2] TRUE, TRUE [13:13:48.197] signalConditionsASAP(MultisessionFuture, pos=2) ... done [13:13:48.197] length: 0 (resolved future 2) [13:13:48.197] Relaying remaining futures [13:13:48.197] signalConditionsASAP(NULL, pos=0) ... [13:13:48.197] - nx: 2 [13:13:48.198] - relay: TRUE [13:13:48.198] - stdout: TRUE [13:13:48.198] - signal: TRUE [13:13:48.198] - resignal: FALSE [13:13:48.198] - force: TRUE [13:13:48.198] - relayed: [n=2] TRUE, TRUE [13:13:48.198] - queued futures: [n=2] TRUE, TRUE - flush all [13:13:48.199] - relayed: [n=2] TRUE, TRUE [13:13:48.199] - queued futures: [n=2] TRUE, TRUE [13:13:48.199] signalConditionsASAP(NULL, pos=0) ... done [13:13:48.199] resolve() on list ... DONE [13:13:48.199] result() for ClusterFuture ... [13:13:48.199] - result already collected: FutureResult [13:13:48.199] result() for ClusterFuture ... done [13:13:48.200] result() for ClusterFuture ... [13:13:48.200] - result already collected: FutureResult [13:13:48.200] result() for ClusterFuture ... done [13:13:48.200] result() for ClusterFuture ... [13:13:48.200] - result already collected: FutureResult [13:13:48.200] result() for ClusterFuture ... done [13:13:48.201] result() for ClusterFuture ... [13:13:48.201] - result already collected: FutureResult [13:13:48.201] result() for ClusterFuture ... done [13:13:48.201] - Number of value chunks collected: 2 [13:13:48.201] Resolving 2 futures (chunks) ... DONE [13:13:48.201] Reducing values from 2 chunks ... [13:13:48.202] - Number of values collected after concatenation: 10000 [13:13:48.202] - Number of values expected: 10000 [13:13:48.202] Reducing values from 2 chunks ... DONE [13:13:48.202] future_lapply() ... DONE - future_lapply(x, FUN = table, ...) ... [13:13:48.203] future_lapply() ... [13:13:48.245] Number of chunks: 2 [13:13:48.246] getGlobalsAndPackagesXApply() ... [13:13:48.246] - future.globals: TRUE [13:13:48.246] getGlobalsAndPackages() ... [13:13:48.246] Searching for globals... [13:13:48.288] - 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<-' [13:13:48.289] Searching for globals ... DONE [13:13:48.289] Resolving globals: FALSE [13:13:48.291] The total size of the 1 globals is 345.92 KiB (354224 bytes) [13:13:48.291] 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') [13:13:48.291] - globals: [1] 'FUN' [13:13:48.291] [13:13:48.292] getGlobalsAndPackages() ... DONE [13:13:48.292] - globals found/used: [n=1] 'FUN' [13:13:48.292] - needed namespaces: [n=0] [13:13:48.292] Finding globals ... DONE [13:13:48.292] - use_args: TRUE [13:13:48.292] - Getting '...' globals ... [13:13:48.293] resolve() on list ... [13:13:48.293] recursive: 0 [13:13:48.293] length: 1 [13:13:48.293] elements: '...' [13:13:48.293] length: 0 (resolved future 1) [13:13:48.293] resolve() on list ... DONE [13:13:48.293] - '...' content: [n=0] [13:13:48.294] List of 1 [13:13:48.294] $ ...: list() [13:13:48.294] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:48.294] - attr(*, "where")=List of 1 [13:13:48.294] ..$ ...: [13:13:48.294] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:48.294] - attr(*, "resolved")= logi TRUE [13:13:48.294] - attr(*, "total_size")= num NA [13:13:48.296] - Getting '...' globals ... DONE [13:13:48.297] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:48.297] List of 2 [13:13:48.297] $ ...future.FUN:function (..., exclude = if (useNA == "no") c(NA, NaN), useNA = c("no", [13:13:48.297] "ifany", "always"), dnn = list.names(...), deparse.level = 1) [13:13:48.297] $ ... : list() [13:13:48.297] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:48.297] - attr(*, "where")=List of 2 [13:13:48.297] ..$ ...future.FUN: [13:13:48.297] ..$ ... : [13:13:48.297] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:48.297] - attr(*, "resolved")= logi FALSE [13:13:48.297] - attr(*, "total_size")= num 354224 [13:13:48.299] Packages to be attached in all futures: [n=0] [13:13:48.300] getGlobalsAndPackagesXApply() ... DONE [13:13:48.300] Number of futures (= number of chunks): 2 [13:13:48.300] Launching 2 futures (chunks) ... [13:13:48.300] Chunk #1 of 2 ... [13:13:48.300] - Finding globals in 'X' for chunk #1 ... [13:13:48.300] getGlobalsAndPackages() ... [13:13:48.301] Searching for globals... [13:13:48.301] [13:13:48.301] Searching for globals ... DONE [13:13:48.301] - globals: [0] [13:13:48.301] getGlobalsAndPackages() ... DONE [13:13:48.301] + additional globals found: [n=0] [13:13:48.302] + additional namespaces needed: [n=0] [13:13:48.302] - Finding globals in 'X' for chunk #1 ... DONE [13:13:48.302] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:13:48.302] - seeds: [13:13:48.302] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:48.302] getGlobalsAndPackages() ... [13:13:48.302] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:48.303] Resolving globals: FALSE [13:13:48.303] Tweak future expression to call with '...' arguments ... [13:13:48.303] { [13:13:48.303] do.call(function(...) { [13:13:48.303] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:48.303] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:48.303] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:48.303] on.exit(options(oopts), add = TRUE) [13:13:48.303] } [13:13:48.303] { [13:13:48.303] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:48.303] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:48.303] ...future.FUN(...future.X_jj, ...) [13:13:48.303] }) [13:13:48.303] } [13:13:48.303] }, args = future.call.arguments) [13:13:48.303] } [13:13:48.303] Tweak future expression to call with '...' arguments ... DONE [13:13:48.304] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:48.304] [13:13:48.304] getGlobalsAndPackages() ... DONE [13:13:48.304] run() for 'Future' ... [13:13:48.304] - state: 'created' [13:13:48.305] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:48.317] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:48.317] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:13:48.317] - Field: 'node' [13:13:48.317] - Field: 'label' [13:13:48.317] - Field: 'local' [13:13:48.317] - Field: 'owner' [13:13:48.318] - Field: 'envir' [13:13:48.318] - Field: 'workers' [13:13:48.318] - Field: 'packages' [13:13:48.318] - Field: 'gc' [13:13:48.318] - Field: 'conditions' [13:13:48.318] - Field: 'persistent' [13:13:48.318] - Field: 'expr' [13:13:48.319] - Field: 'uuid' [13:13:48.319] - Field: 'seed' [13:13:48.319] - Field: 'version' [13:13:48.319] - Field: 'result' [13:13:48.319] - Field: 'asynchronous' [13:13:48.319] - Field: 'calls' [13:13:48.320] - Field: 'globals' [13:13:48.320] - Field: 'stdout' [13:13:48.320] - Field: 'earlySignal' [13:13:48.320] - Field: 'lazy' [13:13:48.320] - Field: 'state' [13:13:48.320] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:13:48.320] - Launch lazy future ... [13:13:48.321] Packages needed by the future expression (n = 0): [13:13:48.321] Packages needed by future strategies (n = 0): [13:13:48.322] { [13:13:48.322] { [13:13:48.322] { [13:13:48.322] ...future.startTime <- base::Sys.time() [13:13:48.322] { [13:13:48.322] { [13:13:48.322] { [13:13:48.322] { [13:13:48.322] base::local({ [13:13:48.322] has_future <- base::requireNamespace("future", [13:13:48.322] quietly = TRUE) [13:13:48.322] if (has_future) { [13:13:48.322] ns <- base::getNamespace("future") [13:13:48.322] version <- ns[[".package"]][["version"]] [13:13:48.322] if (is.null(version)) [13:13:48.322] version <- utils::packageVersion("future") [13:13:48.322] } [13:13:48.322] else { [13:13:48.322] version <- NULL [13:13:48.322] } [13:13:48.322] if (!has_future || version < "1.8.0") { [13:13:48.322] info <- base::c(r_version = base::gsub("R version ", [13:13:48.322] "", base::R.version$version.string), [13:13:48.322] platform = base::sprintf("%s (%s-bit)", [13:13:48.322] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:48.322] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:48.322] "release", "version")], collapse = " "), [13:13:48.322] hostname = base::Sys.info()[["nodename"]]) [13:13:48.322] info <- base::sprintf("%s: %s", base::names(info), [13:13:48.322] info) [13:13:48.322] info <- base::paste(info, collapse = "; ") [13:13:48.322] if (!has_future) { [13:13:48.322] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:48.322] info) [13:13:48.322] } [13:13:48.322] else { [13:13:48.322] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:48.322] info, version) [13:13:48.322] } [13:13:48.322] base::stop(msg) [13:13:48.322] } [13:13:48.322] }) [13:13:48.322] } [13:13:48.322] ...future.mc.cores.old <- base::getOption("mc.cores") [13:13:48.322] base::options(mc.cores = 1L) [13:13:48.322] } [13:13:48.322] options(future.plan = NULL) [13:13:48.322] Sys.unsetenv("R_FUTURE_PLAN") [13:13:48.322] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:48.322] } [13:13:48.322] ...future.workdir <- getwd() [13:13:48.322] } [13:13:48.322] ...future.oldOptions <- base::as.list(base::.Options) [13:13:48.322] ...future.oldEnvVars <- base::Sys.getenv() [13:13:48.322] } [13:13:48.322] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:48.322] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:13:48.322] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:48.322] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:48.322] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:48.322] future.stdout.windows.reencode = NULL, width = 80L) [13:13:48.322] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:48.322] base::names(...future.oldOptions)) [13:13:48.322] } [13:13:48.322] if (FALSE) { [13:13:48.322] } [13:13:48.322] else { [13:13:48.322] if (TRUE) { [13:13:48.322] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:48.322] open = "w") [13:13:48.322] } [13:13:48.322] else { [13:13:48.322] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:48.322] windows = "NUL", "/dev/null"), open = "w") [13:13:48.322] } [13:13:48.322] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:48.322] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:48.322] base::sink(type = "output", split = FALSE) [13:13:48.322] base::close(...future.stdout) [13:13:48.322] }, add = TRUE) [13:13:48.322] } [13:13:48.322] ...future.frame <- base::sys.nframe() [13:13:48.322] ...future.conditions <- base::list() [13:13:48.322] ...future.rng <- base::globalenv()$.Random.seed [13:13:48.322] if (FALSE) { [13:13:48.322] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:48.322] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:48.322] } [13:13:48.322] ...future.result <- base::tryCatch({ [13:13:48.322] base::withCallingHandlers({ [13:13:48.322] ...future.value <- base::withVisible(base::local({ [13:13:48.322] ...future.makeSendCondition <- local({ [13:13:48.322] sendCondition <- NULL [13:13:48.322] function(frame = 1L) { [13:13:48.322] if (is.function(sendCondition)) [13:13:48.322] return(sendCondition) [13:13:48.322] ns <- getNamespace("parallel") [13:13:48.322] if (exists("sendData", mode = "function", [13:13:48.322] envir = ns)) { [13:13:48.322] parallel_sendData <- get("sendData", mode = "function", [13:13:48.322] envir = ns) [13:13:48.322] envir <- sys.frame(frame) [13:13:48.322] master <- NULL [13:13:48.322] while (!identical(envir, .GlobalEnv) && [13:13:48.322] !identical(envir, emptyenv())) { [13:13:48.322] if (exists("master", mode = "list", envir = envir, [13:13:48.322] inherits = FALSE)) { [13:13:48.322] master <- get("master", mode = "list", [13:13:48.322] envir = envir, inherits = FALSE) [13:13:48.322] if (inherits(master, c("SOCKnode", [13:13:48.322] "SOCK0node"))) { [13:13:48.322] sendCondition <<- function(cond) { [13:13:48.322] data <- list(type = "VALUE", value = cond, [13:13:48.322] success = TRUE) [13:13:48.322] parallel_sendData(master, data) [13:13:48.322] } [13:13:48.322] return(sendCondition) [13:13:48.322] } [13:13:48.322] } [13:13:48.322] frame <- frame + 1L [13:13:48.322] envir <- sys.frame(frame) [13:13:48.322] } [13:13:48.322] } [13:13:48.322] sendCondition <<- function(cond) NULL [13:13:48.322] } [13:13:48.322] }) [13:13:48.322] withCallingHandlers({ [13:13:48.322] { [13:13:48.322] do.call(function(...) { [13:13:48.322] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:48.322] if (!identical(...future.globals.maxSize.org, [13:13:48.322] ...future.globals.maxSize)) { [13:13:48.322] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:48.322] on.exit(options(oopts), add = TRUE) [13:13:48.322] } [13:13:48.322] { [13:13:48.322] lapply(seq_along(...future.elements_ii), [13:13:48.322] FUN = function(jj) { [13:13:48.322] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:48.322] ...future.FUN(...future.X_jj, ...) [13:13:48.322] }) [13:13:48.322] } [13:13:48.322] }, args = future.call.arguments) [13:13:48.322] } [13:13:48.322] }, immediateCondition = function(cond) { [13:13:48.322] sendCondition <- ...future.makeSendCondition() [13:13:48.322] sendCondition(cond) [13:13:48.322] muffleCondition <- function (cond, pattern = "^muffle") [13:13:48.322] { [13:13:48.322] inherits <- base::inherits [13:13:48.322] invokeRestart <- base::invokeRestart [13:13:48.322] is.null <- base::is.null [13:13:48.322] muffled <- FALSE [13:13:48.322] if (inherits(cond, "message")) { [13:13:48.322] muffled <- grepl(pattern, "muffleMessage") [13:13:48.322] if (muffled) [13:13:48.322] invokeRestart("muffleMessage") [13:13:48.322] } [13:13:48.322] else if (inherits(cond, "warning")) { [13:13:48.322] muffled <- grepl(pattern, "muffleWarning") [13:13:48.322] if (muffled) [13:13:48.322] invokeRestart("muffleWarning") [13:13:48.322] } [13:13:48.322] else if (inherits(cond, "condition")) { [13:13:48.322] if (!is.null(pattern)) { [13:13:48.322] computeRestarts <- base::computeRestarts [13:13:48.322] grepl <- base::grepl [13:13:48.322] restarts <- computeRestarts(cond) [13:13:48.322] for (restart in restarts) { [13:13:48.322] name <- restart$name [13:13:48.322] if (is.null(name)) [13:13:48.322] next [13:13:48.322] if (!grepl(pattern, name)) [13:13:48.322] next [13:13:48.322] invokeRestart(restart) [13:13:48.322] muffled <- TRUE [13:13:48.322] break [13:13:48.322] } [13:13:48.322] } [13:13:48.322] } [13:13:48.322] invisible(muffled) [13:13:48.322] } [13:13:48.322] muffleCondition(cond) [13:13:48.322] }) [13:13:48.322] })) [13:13:48.322] future::FutureResult(value = ...future.value$value, [13:13:48.322] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:48.322] ...future.rng), globalenv = if (FALSE) [13:13:48.322] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:48.322] ...future.globalenv.names)) [13:13:48.322] else NULL, started = ...future.startTime, version = "1.8") [13:13:48.322] }, condition = base::local({ [13:13:48.322] c <- base::c [13:13:48.322] inherits <- base::inherits [13:13:48.322] invokeRestart <- base::invokeRestart [13:13:48.322] length <- base::length [13:13:48.322] list <- base::list [13:13:48.322] seq.int <- base::seq.int [13:13:48.322] signalCondition <- base::signalCondition [13:13:48.322] sys.calls <- base::sys.calls [13:13:48.322] `[[` <- base::`[[` [13:13:48.322] `+` <- base::`+` [13:13:48.322] `<<-` <- base::`<<-` [13:13:48.322] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:48.322] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:48.322] 3L)] [13:13:48.322] } [13:13:48.322] function(cond) { [13:13:48.322] is_error <- inherits(cond, "error") [13:13:48.322] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:48.322] NULL) [13:13:48.322] if (is_error) { [13:13:48.322] sessionInformation <- function() { [13:13:48.322] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:48.322] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:48.322] search = base::search(), system = base::Sys.info()) [13:13:48.322] } [13:13:48.322] ...future.conditions[[length(...future.conditions) + [13:13:48.322] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:48.322] cond$call), session = sessionInformation(), [13:13:48.322] timestamp = base::Sys.time(), signaled = 0L) [13:13:48.322] signalCondition(cond) [13:13:48.322] } [13:13:48.322] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:48.322] "immediateCondition"))) { [13:13:48.322] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:48.322] ...future.conditions[[length(...future.conditions) + [13:13:48.322] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:48.322] if (TRUE && !signal) { [13:13:48.322] muffleCondition <- function (cond, pattern = "^muffle") [13:13:48.322] { [13:13:48.322] inherits <- base::inherits [13:13:48.322] invokeRestart <- base::invokeRestart [13:13:48.322] is.null <- base::is.null [13:13:48.322] muffled <- FALSE [13:13:48.322] if (inherits(cond, "message")) { [13:13:48.322] muffled <- grepl(pattern, "muffleMessage") [13:13:48.322] if (muffled) [13:13:48.322] invokeRestart("muffleMessage") [13:13:48.322] } [13:13:48.322] else if (inherits(cond, "warning")) { [13:13:48.322] muffled <- grepl(pattern, "muffleWarning") [13:13:48.322] if (muffled) [13:13:48.322] invokeRestart("muffleWarning") [13:13:48.322] } [13:13:48.322] else if (inherits(cond, "condition")) { [13:13:48.322] if (!is.null(pattern)) { [13:13:48.322] computeRestarts <- base::computeRestarts [13:13:48.322] grepl <- base::grepl [13:13:48.322] restarts <- computeRestarts(cond) [13:13:48.322] for (restart in restarts) { [13:13:48.322] name <- restart$name [13:13:48.322] if (is.null(name)) [13:13:48.322] next [13:13:48.322] if (!grepl(pattern, name)) [13:13:48.322] next [13:13:48.322] invokeRestart(restart) [13:13:48.322] muffled <- TRUE [13:13:48.322] break [13:13:48.322] } [13:13:48.322] } [13:13:48.322] } [13:13:48.322] invisible(muffled) [13:13:48.322] } [13:13:48.322] muffleCondition(cond, pattern = "^muffle") [13:13:48.322] } [13:13:48.322] } [13:13:48.322] else { [13:13:48.322] if (TRUE) { [13:13:48.322] muffleCondition <- function (cond, pattern = "^muffle") [13:13:48.322] { [13:13:48.322] inherits <- base::inherits [13:13:48.322] invokeRestart <- base::invokeRestart [13:13:48.322] is.null <- base::is.null [13:13:48.322] muffled <- FALSE [13:13:48.322] if (inherits(cond, "message")) { [13:13:48.322] muffled <- grepl(pattern, "muffleMessage") [13:13:48.322] if (muffled) [13:13:48.322] invokeRestart("muffleMessage") [13:13:48.322] } [13:13:48.322] else if (inherits(cond, "warning")) { [13:13:48.322] muffled <- grepl(pattern, "muffleWarning") [13:13:48.322] if (muffled) [13:13:48.322] invokeRestart("muffleWarning") [13:13:48.322] } [13:13:48.322] else if (inherits(cond, "condition")) { [13:13:48.322] if (!is.null(pattern)) { [13:13:48.322] computeRestarts <- base::computeRestarts [13:13:48.322] grepl <- base::grepl [13:13:48.322] restarts <- computeRestarts(cond) [13:13:48.322] for (restart in restarts) { [13:13:48.322] name <- restart$name [13:13:48.322] if (is.null(name)) [13:13:48.322] next [13:13:48.322] if (!grepl(pattern, name)) [13:13:48.322] next [13:13:48.322] invokeRestart(restart) [13:13:48.322] muffled <- TRUE [13:13:48.322] break [13:13:48.322] } [13:13:48.322] } [13:13:48.322] } [13:13:48.322] invisible(muffled) [13:13:48.322] } [13:13:48.322] muffleCondition(cond, pattern = "^muffle") [13:13:48.322] } [13:13:48.322] } [13:13:48.322] } [13:13:48.322] })) [13:13:48.322] }, error = function(ex) { [13:13:48.322] base::structure(base::list(value = NULL, visible = NULL, [13:13:48.322] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:48.322] ...future.rng), started = ...future.startTime, [13:13:48.322] finished = Sys.time(), session_uuid = NA_character_, [13:13:48.322] version = "1.8"), class = "FutureResult") [13:13:48.322] }, finally = { [13:13:48.322] if (!identical(...future.workdir, getwd())) [13:13:48.322] setwd(...future.workdir) [13:13:48.322] { [13:13:48.322] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:48.322] ...future.oldOptions$nwarnings <- NULL [13:13:48.322] } [13:13:48.322] base::options(...future.oldOptions) [13:13:48.322] if (.Platform$OS.type == "windows") { [13:13:48.322] old_names <- names(...future.oldEnvVars) [13:13:48.322] envs <- base::Sys.getenv() [13:13:48.322] names <- names(envs) [13:13:48.322] common <- intersect(names, old_names) [13:13:48.322] added <- setdiff(names, old_names) [13:13:48.322] removed <- setdiff(old_names, names) [13:13:48.322] changed <- common[...future.oldEnvVars[common] != [13:13:48.322] envs[common]] [13:13:48.322] NAMES <- toupper(changed) [13:13:48.322] args <- list() [13:13:48.322] for (kk in seq_along(NAMES)) { [13:13:48.322] name <- changed[[kk]] [13:13:48.322] NAME <- NAMES[[kk]] [13:13:48.322] if (name != NAME && is.element(NAME, old_names)) [13:13:48.322] next [13:13:48.322] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:48.322] } [13:13:48.322] NAMES <- toupper(added) [13:13:48.322] for (kk in seq_along(NAMES)) { [13:13:48.322] name <- added[[kk]] [13:13:48.322] NAME <- NAMES[[kk]] [13:13:48.322] if (name != NAME && is.element(NAME, old_names)) [13:13:48.322] next [13:13:48.322] args[[name]] <- "" [13:13:48.322] } [13:13:48.322] NAMES <- toupper(removed) [13:13:48.322] for (kk in seq_along(NAMES)) { [13:13:48.322] name <- removed[[kk]] [13:13:48.322] NAME <- NAMES[[kk]] [13:13:48.322] if (name != NAME && is.element(NAME, old_names)) [13:13:48.322] next [13:13:48.322] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:48.322] } [13:13:48.322] if (length(args) > 0) [13:13:48.322] base::do.call(base::Sys.setenv, args = args) [13:13:48.322] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:48.322] } [13:13:48.322] else { [13:13:48.322] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:48.322] } [13:13:48.322] { [13:13:48.322] if (base::length(...future.futureOptionsAdded) > [13:13:48.322] 0L) { [13:13:48.322] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:48.322] base::names(opts) <- ...future.futureOptionsAdded [13:13:48.322] base::options(opts) [13:13:48.322] } [13:13:48.322] { [13:13:48.322] { [13:13:48.322] base::options(mc.cores = ...future.mc.cores.old) [13:13:48.322] NULL [13:13:48.322] } [13:13:48.322] options(future.plan = NULL) [13:13:48.322] if (is.na(NA_character_)) [13:13:48.322] Sys.unsetenv("R_FUTURE_PLAN") [13:13:48.322] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:48.322] future::plan(list(function (..., workers = availableCores(), [13:13:48.322] lazy = FALSE, rscript_libs = .libPaths(), [13:13:48.322] envir = parent.frame()) [13:13:48.322] { [13:13:48.322] if (is.function(workers)) [13:13:48.322] workers <- workers() [13:13:48.322] workers <- structure(as.integer(workers), [13:13:48.322] class = class(workers)) [13:13:48.322] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:48.322] workers >= 1) [13:13:48.322] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:48.322] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:48.322] } [13:13:48.322] future <- MultisessionFuture(..., workers = workers, [13:13:48.322] lazy = lazy, rscript_libs = rscript_libs, [13:13:48.322] envir = envir) [13:13:48.322] if (!future$lazy) [13:13:48.322] future <- run(future) [13:13:48.322] invisible(future) [13:13:48.322] }), .cleanup = FALSE, .init = FALSE) [13:13:48.322] } [13:13:48.322] } [13:13:48.322] } [13:13:48.322] }) [13:13:48.322] if (TRUE) { [13:13:48.322] base::sink(type = "output", split = FALSE) [13:13:48.322] if (TRUE) { [13:13:48.322] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:48.322] } [13:13:48.322] else { [13:13:48.322] ...future.result["stdout"] <- base::list(NULL) [13:13:48.322] } [13:13:48.322] base::close(...future.stdout) [13:13:48.322] ...future.stdout <- NULL [13:13:48.322] } [13:13:48.322] ...future.result$conditions <- ...future.conditions [13:13:48.322] ...future.result$finished <- base::Sys.time() [13:13:48.322] ...future.result [13:13:48.322] } [13:13:48.326] Exporting 5 global objects (345.92 KiB) to cluster node #1 ... [13:13:48.326] Exporting '...future.FUN' (345.92 KiB) to cluster node #1 ... [13:13:48.327] Exporting '...future.FUN' (345.92 KiB) to cluster node #1 ... DONE [13:13:48.327] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... [13:13:48.328] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... DONE [13:13:48.328] Exporting '...future.elements_ii' (64 bytes) to cluster node #1 ... [13:13:48.328] Exporting '...future.elements_ii' (64 bytes) to cluster node #1 ... DONE [13:13:48.329] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:13:48.329] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:13:48.329] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:13:48.329] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:13:48.330] Exporting 5 global objects (345.92 KiB) to cluster node #1 ... DONE [13:13:48.330] MultisessionFuture started [13:13:48.330] - Launch lazy future ... done [13:13:48.330] run() for 'MultisessionFuture' ... done [13:13:48.331] Created future: [13:13:48.347] receiveMessageFromWorker() for ClusterFuture ... [13:13:48.348] - Validating connection of MultisessionFuture [13:13:48.348] - received message: FutureResult [13:13:48.348] - Received FutureResult [13:13:48.348] - Erased future from FutureRegistry [13:13:48.348] result() for ClusterFuture ... [13:13:48.349] - result already collected: FutureResult [13:13:48.349] result() for ClusterFuture ... done [13:13:48.349] receiveMessageFromWorker() for ClusterFuture ... done [13:13:48.331] MultisessionFuture: [13:13:48.331] Label: 'future_lapply-1' [13:13:48.331] Expression: [13:13:48.331] { [13:13:48.331] do.call(function(...) { [13:13:48.331] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:48.331] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:48.331] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:48.331] on.exit(options(oopts), add = TRUE) [13:13:48.331] } [13:13:48.331] { [13:13:48.331] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:48.331] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:48.331] ...future.FUN(...future.X_jj, ...) [13:13:48.331] }) [13:13:48.331] } [13:13:48.331] }, args = future.call.arguments) [13:13:48.331] } [13:13:48.331] Lazy evaluation: FALSE [13:13:48.331] Asynchronous evaluation: TRUE [13:13:48.331] Local evaluation: TRUE [13:13:48.331] Environment: R_GlobalEnv [13:13:48.331] Capture standard output: TRUE [13:13:48.331] Capture condition classes: 'condition' (excluding 'nothing') [13:13:48.331] 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) [13:13:48.331] Packages: [13:13:48.331] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:48.331] Resolved: TRUE [13:13:48.331] Value: [13:13:48.331] Conditions captured: [13:13:48.331] Early signaling: FALSE [13:13:48.331] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:48.331] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:48.349] Chunk #1 of 2 ... DONE [13:13:48.349] Chunk #2 of 2 ... [13:13:48.349] - Finding globals in 'X' for chunk #2 ... [13:13:48.350] getGlobalsAndPackages() ... [13:13:48.350] Searching for globals... [13:13:48.350] [13:13:48.350] Searching for globals ... DONE [13:13:48.350] - globals: [0] [13:13:48.350] getGlobalsAndPackages() ... DONE [13:13:48.350] + additional globals found: [n=0] [13:13:48.351] + additional namespaces needed: [n=0] [13:13:48.351] - Finding globals in 'X' for chunk #2 ... DONE [13:13:48.351] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:13:48.351] - seeds: [13:13:48.351] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:48.351] getGlobalsAndPackages() ... [13:13:48.351] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:48.352] Resolving globals: FALSE [13:13:48.352] Tweak future expression to call with '...' arguments ... [13:13:48.352] { [13:13:48.352] do.call(function(...) { [13:13:48.352] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:48.352] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:48.352] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:48.352] on.exit(options(oopts), add = TRUE) [13:13:48.352] } [13:13:48.352] { [13:13:48.352] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:48.352] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:48.352] ...future.FUN(...future.X_jj, ...) [13:13:48.352] }) [13:13:48.352] } [13:13:48.352] }, args = future.call.arguments) [13:13:48.352] } [13:13:48.352] Tweak future expression to call with '...' arguments ... DONE [13:13:48.353] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:48.353] [13:13:48.353] getGlobalsAndPackages() ... DONE [13:13:48.353] run() for 'Future' ... [13:13:48.353] - state: 'created' [13:13:48.354] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:48.367] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:48.367] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:13:48.367] - Field: 'node' [13:13:48.367] - Field: 'label' [13:13:48.368] - Field: 'local' [13:13:48.368] - Field: 'owner' [13:13:48.368] - Field: 'envir' [13:13:48.368] - Field: 'workers' [13:13:48.368] - Field: 'packages' [13:13:48.368] - Field: 'gc' [13:13:48.368] - Field: 'conditions' [13:13:48.369] - Field: 'persistent' [13:13:48.369] - Field: 'expr' [13:13:48.369] - Field: 'uuid' [13:13:48.369] - Field: 'seed' [13:13:48.369] - Field: 'version' [13:13:48.369] - Field: 'result' [13:13:48.369] - Field: 'asynchronous' [13:13:48.370] - Field: 'calls' [13:13:48.370] - Field: 'globals' [13:13:48.370] - Field: 'stdout' [13:13:48.370] - Field: 'earlySignal' [13:13:48.370] - Field: 'lazy' [13:13:48.370] - Field: 'state' [13:13:48.370] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:13:48.370] - Launch lazy future ... [13:13:48.371] Packages needed by the future expression (n = 0): [13:13:48.371] Packages needed by future strategies (n = 0): [13:13:48.371] { [13:13:48.371] { [13:13:48.371] { [13:13:48.371] ...future.startTime <- base::Sys.time() [13:13:48.371] { [13:13:48.371] { [13:13:48.371] { [13:13:48.371] { [13:13:48.371] base::local({ [13:13:48.371] has_future <- base::requireNamespace("future", [13:13:48.371] quietly = TRUE) [13:13:48.371] if (has_future) { [13:13:48.371] ns <- base::getNamespace("future") [13:13:48.371] version <- ns[[".package"]][["version"]] [13:13:48.371] if (is.null(version)) [13:13:48.371] version <- utils::packageVersion("future") [13:13:48.371] } [13:13:48.371] else { [13:13:48.371] version <- NULL [13:13:48.371] } [13:13:48.371] if (!has_future || version < "1.8.0") { [13:13:48.371] info <- base::c(r_version = base::gsub("R version ", [13:13:48.371] "", base::R.version$version.string), [13:13:48.371] platform = base::sprintf("%s (%s-bit)", [13:13:48.371] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:48.371] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:48.371] "release", "version")], collapse = " "), [13:13:48.371] hostname = base::Sys.info()[["nodename"]]) [13:13:48.371] info <- base::sprintf("%s: %s", base::names(info), [13:13:48.371] info) [13:13:48.371] info <- base::paste(info, collapse = "; ") [13:13:48.371] if (!has_future) { [13:13:48.371] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:48.371] info) [13:13:48.371] } [13:13:48.371] else { [13:13:48.371] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:48.371] info, version) [13:13:48.371] } [13:13:48.371] base::stop(msg) [13:13:48.371] } [13:13:48.371] }) [13:13:48.371] } [13:13:48.371] ...future.mc.cores.old <- base::getOption("mc.cores") [13:13:48.371] base::options(mc.cores = 1L) [13:13:48.371] } [13:13:48.371] options(future.plan = NULL) [13:13:48.371] Sys.unsetenv("R_FUTURE_PLAN") [13:13:48.371] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:48.371] } [13:13:48.371] ...future.workdir <- getwd() [13:13:48.371] } [13:13:48.371] ...future.oldOptions <- base::as.list(base::.Options) [13:13:48.371] ...future.oldEnvVars <- base::Sys.getenv() [13:13:48.371] } [13:13:48.371] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:48.371] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:13:48.371] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:48.371] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:48.371] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:48.371] future.stdout.windows.reencode = NULL, width = 80L) [13:13:48.371] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:48.371] base::names(...future.oldOptions)) [13:13:48.371] } [13:13:48.371] if (FALSE) { [13:13:48.371] } [13:13:48.371] else { [13:13:48.371] if (TRUE) { [13:13:48.371] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:48.371] open = "w") [13:13:48.371] } [13:13:48.371] else { [13:13:48.371] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:48.371] windows = "NUL", "/dev/null"), open = "w") [13:13:48.371] } [13:13:48.371] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:48.371] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:48.371] base::sink(type = "output", split = FALSE) [13:13:48.371] base::close(...future.stdout) [13:13:48.371] }, add = TRUE) [13:13:48.371] } [13:13:48.371] ...future.frame <- base::sys.nframe() [13:13:48.371] ...future.conditions <- base::list() [13:13:48.371] ...future.rng <- base::globalenv()$.Random.seed [13:13:48.371] if (FALSE) { [13:13:48.371] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:48.371] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:48.371] } [13:13:48.371] ...future.result <- base::tryCatch({ [13:13:48.371] base::withCallingHandlers({ [13:13:48.371] ...future.value <- base::withVisible(base::local({ [13:13:48.371] ...future.makeSendCondition <- local({ [13:13:48.371] sendCondition <- NULL [13:13:48.371] function(frame = 1L) { [13:13:48.371] if (is.function(sendCondition)) [13:13:48.371] return(sendCondition) [13:13:48.371] ns <- getNamespace("parallel") [13:13:48.371] if (exists("sendData", mode = "function", [13:13:48.371] envir = ns)) { [13:13:48.371] parallel_sendData <- get("sendData", mode = "function", [13:13:48.371] envir = ns) [13:13:48.371] envir <- sys.frame(frame) [13:13:48.371] master <- NULL [13:13:48.371] while (!identical(envir, .GlobalEnv) && [13:13:48.371] !identical(envir, emptyenv())) { [13:13:48.371] if (exists("master", mode = "list", envir = envir, [13:13:48.371] inherits = FALSE)) { [13:13:48.371] master <- get("master", mode = "list", [13:13:48.371] envir = envir, inherits = FALSE) [13:13:48.371] if (inherits(master, c("SOCKnode", [13:13:48.371] "SOCK0node"))) { [13:13:48.371] sendCondition <<- function(cond) { [13:13:48.371] data <- list(type = "VALUE", value = cond, [13:13:48.371] success = TRUE) [13:13:48.371] parallel_sendData(master, data) [13:13:48.371] } [13:13:48.371] return(sendCondition) [13:13:48.371] } [13:13:48.371] } [13:13:48.371] frame <- frame + 1L [13:13:48.371] envir <- sys.frame(frame) [13:13:48.371] } [13:13:48.371] } [13:13:48.371] sendCondition <<- function(cond) NULL [13:13:48.371] } [13:13:48.371] }) [13:13:48.371] withCallingHandlers({ [13:13:48.371] { [13:13:48.371] do.call(function(...) { [13:13:48.371] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:48.371] if (!identical(...future.globals.maxSize.org, [13:13:48.371] ...future.globals.maxSize)) { [13:13:48.371] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:48.371] on.exit(options(oopts), add = TRUE) [13:13:48.371] } [13:13:48.371] { [13:13:48.371] lapply(seq_along(...future.elements_ii), [13:13:48.371] FUN = function(jj) { [13:13:48.371] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:48.371] ...future.FUN(...future.X_jj, ...) [13:13:48.371] }) [13:13:48.371] } [13:13:48.371] }, args = future.call.arguments) [13:13:48.371] } [13:13:48.371] }, immediateCondition = function(cond) { [13:13:48.371] sendCondition <- ...future.makeSendCondition() [13:13:48.371] sendCondition(cond) [13:13:48.371] muffleCondition <- function (cond, pattern = "^muffle") [13:13:48.371] { [13:13:48.371] inherits <- base::inherits [13:13:48.371] invokeRestart <- base::invokeRestart [13:13:48.371] is.null <- base::is.null [13:13:48.371] muffled <- FALSE [13:13:48.371] if (inherits(cond, "message")) { [13:13:48.371] muffled <- grepl(pattern, "muffleMessage") [13:13:48.371] if (muffled) [13:13:48.371] invokeRestart("muffleMessage") [13:13:48.371] } [13:13:48.371] else if (inherits(cond, "warning")) { [13:13:48.371] muffled <- grepl(pattern, "muffleWarning") [13:13:48.371] if (muffled) [13:13:48.371] invokeRestart("muffleWarning") [13:13:48.371] } [13:13:48.371] else if (inherits(cond, "condition")) { [13:13:48.371] if (!is.null(pattern)) { [13:13:48.371] computeRestarts <- base::computeRestarts [13:13:48.371] grepl <- base::grepl [13:13:48.371] restarts <- computeRestarts(cond) [13:13:48.371] for (restart in restarts) { [13:13:48.371] name <- restart$name [13:13:48.371] if (is.null(name)) [13:13:48.371] next [13:13:48.371] if (!grepl(pattern, name)) [13:13:48.371] next [13:13:48.371] invokeRestart(restart) [13:13:48.371] muffled <- TRUE [13:13:48.371] break [13:13:48.371] } [13:13:48.371] } [13:13:48.371] } [13:13:48.371] invisible(muffled) [13:13:48.371] } [13:13:48.371] muffleCondition(cond) [13:13:48.371] }) [13:13:48.371] })) [13:13:48.371] future::FutureResult(value = ...future.value$value, [13:13:48.371] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:48.371] ...future.rng), globalenv = if (FALSE) [13:13:48.371] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:48.371] ...future.globalenv.names)) [13:13:48.371] else NULL, started = ...future.startTime, version = "1.8") [13:13:48.371] }, condition = base::local({ [13:13:48.371] c <- base::c [13:13:48.371] inherits <- base::inherits [13:13:48.371] invokeRestart <- base::invokeRestart [13:13:48.371] length <- base::length [13:13:48.371] list <- base::list [13:13:48.371] seq.int <- base::seq.int [13:13:48.371] signalCondition <- base::signalCondition [13:13:48.371] sys.calls <- base::sys.calls [13:13:48.371] `[[` <- base::`[[` [13:13:48.371] `+` <- base::`+` [13:13:48.371] `<<-` <- base::`<<-` [13:13:48.371] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:48.371] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:48.371] 3L)] [13:13:48.371] } [13:13:48.371] function(cond) { [13:13:48.371] is_error <- inherits(cond, "error") [13:13:48.371] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:48.371] NULL) [13:13:48.371] if (is_error) { [13:13:48.371] sessionInformation <- function() { [13:13:48.371] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:48.371] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:48.371] search = base::search(), system = base::Sys.info()) [13:13:48.371] } [13:13:48.371] ...future.conditions[[length(...future.conditions) + [13:13:48.371] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:48.371] cond$call), session = sessionInformation(), [13:13:48.371] timestamp = base::Sys.time(), signaled = 0L) [13:13:48.371] signalCondition(cond) [13:13:48.371] } [13:13:48.371] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:48.371] "immediateCondition"))) { [13:13:48.371] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:48.371] ...future.conditions[[length(...future.conditions) + [13:13:48.371] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:48.371] if (TRUE && !signal) { [13:13:48.371] muffleCondition <- function (cond, pattern = "^muffle") [13:13:48.371] { [13:13:48.371] inherits <- base::inherits [13:13:48.371] invokeRestart <- base::invokeRestart [13:13:48.371] is.null <- base::is.null [13:13:48.371] muffled <- FALSE [13:13:48.371] if (inherits(cond, "message")) { [13:13:48.371] muffled <- grepl(pattern, "muffleMessage") [13:13:48.371] if (muffled) [13:13:48.371] invokeRestart("muffleMessage") [13:13:48.371] } [13:13:48.371] else if (inherits(cond, "warning")) { [13:13:48.371] muffled <- grepl(pattern, "muffleWarning") [13:13:48.371] if (muffled) [13:13:48.371] invokeRestart("muffleWarning") [13:13:48.371] } [13:13:48.371] else if (inherits(cond, "condition")) { [13:13:48.371] if (!is.null(pattern)) { [13:13:48.371] computeRestarts <- base::computeRestarts [13:13:48.371] grepl <- base::grepl [13:13:48.371] restarts <- computeRestarts(cond) [13:13:48.371] for (restart in restarts) { [13:13:48.371] name <- restart$name [13:13:48.371] if (is.null(name)) [13:13:48.371] next [13:13:48.371] if (!grepl(pattern, name)) [13:13:48.371] next [13:13:48.371] invokeRestart(restart) [13:13:48.371] muffled <- TRUE [13:13:48.371] break [13:13:48.371] } [13:13:48.371] } [13:13:48.371] } [13:13:48.371] invisible(muffled) [13:13:48.371] } [13:13:48.371] muffleCondition(cond, pattern = "^muffle") [13:13:48.371] } [13:13:48.371] } [13:13:48.371] else { [13:13:48.371] if (TRUE) { [13:13:48.371] muffleCondition <- function (cond, pattern = "^muffle") [13:13:48.371] { [13:13:48.371] inherits <- base::inherits [13:13:48.371] invokeRestart <- base::invokeRestart [13:13:48.371] is.null <- base::is.null [13:13:48.371] muffled <- FALSE [13:13:48.371] if (inherits(cond, "message")) { [13:13:48.371] muffled <- grepl(pattern, "muffleMessage") [13:13:48.371] if (muffled) [13:13:48.371] invokeRestart("muffleMessage") [13:13:48.371] } [13:13:48.371] else if (inherits(cond, "warning")) { [13:13:48.371] muffled <- grepl(pattern, "muffleWarning") [13:13:48.371] if (muffled) [13:13:48.371] invokeRestart("muffleWarning") [13:13:48.371] } [13:13:48.371] else if (inherits(cond, "condition")) { [13:13:48.371] if (!is.null(pattern)) { [13:13:48.371] computeRestarts <- base::computeRestarts [13:13:48.371] grepl <- base::grepl [13:13:48.371] restarts <- computeRestarts(cond) [13:13:48.371] for (restart in restarts) { [13:13:48.371] name <- restart$name [13:13:48.371] if (is.null(name)) [13:13:48.371] next [13:13:48.371] if (!grepl(pattern, name)) [13:13:48.371] next [13:13:48.371] invokeRestart(restart) [13:13:48.371] muffled <- TRUE [13:13:48.371] break [13:13:48.371] } [13:13:48.371] } [13:13:48.371] } [13:13:48.371] invisible(muffled) [13:13:48.371] } [13:13:48.371] muffleCondition(cond, pattern = "^muffle") [13:13:48.371] } [13:13:48.371] } [13:13:48.371] } [13:13:48.371] })) [13:13:48.371] }, error = function(ex) { [13:13:48.371] base::structure(base::list(value = NULL, visible = NULL, [13:13:48.371] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:48.371] ...future.rng), started = ...future.startTime, [13:13:48.371] finished = Sys.time(), session_uuid = NA_character_, [13:13:48.371] version = "1.8"), class = "FutureResult") [13:13:48.371] }, finally = { [13:13:48.371] if (!identical(...future.workdir, getwd())) [13:13:48.371] setwd(...future.workdir) [13:13:48.371] { [13:13:48.371] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:48.371] ...future.oldOptions$nwarnings <- NULL [13:13:48.371] } [13:13:48.371] base::options(...future.oldOptions) [13:13:48.371] if (.Platform$OS.type == "windows") { [13:13:48.371] old_names <- names(...future.oldEnvVars) [13:13:48.371] envs <- base::Sys.getenv() [13:13:48.371] names <- names(envs) [13:13:48.371] common <- intersect(names, old_names) [13:13:48.371] added <- setdiff(names, old_names) [13:13:48.371] removed <- setdiff(old_names, names) [13:13:48.371] changed <- common[...future.oldEnvVars[common] != [13:13:48.371] envs[common]] [13:13:48.371] NAMES <- toupper(changed) [13:13:48.371] args <- list() [13:13:48.371] for (kk in seq_along(NAMES)) { [13:13:48.371] name <- changed[[kk]] [13:13:48.371] NAME <- NAMES[[kk]] [13:13:48.371] if (name != NAME && is.element(NAME, old_names)) [13:13:48.371] next [13:13:48.371] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:48.371] } [13:13:48.371] NAMES <- toupper(added) [13:13:48.371] for (kk in seq_along(NAMES)) { [13:13:48.371] name <- added[[kk]] [13:13:48.371] NAME <- NAMES[[kk]] [13:13:48.371] if (name != NAME && is.element(NAME, old_names)) [13:13:48.371] next [13:13:48.371] args[[name]] <- "" [13:13:48.371] } [13:13:48.371] NAMES <- toupper(removed) [13:13:48.371] for (kk in seq_along(NAMES)) { [13:13:48.371] name <- removed[[kk]] [13:13:48.371] NAME <- NAMES[[kk]] [13:13:48.371] if (name != NAME && is.element(NAME, old_names)) [13:13:48.371] next [13:13:48.371] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:48.371] } [13:13:48.371] if (length(args) > 0) [13:13:48.371] base::do.call(base::Sys.setenv, args = args) [13:13:48.371] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:48.371] } [13:13:48.371] else { [13:13:48.371] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:48.371] } [13:13:48.371] { [13:13:48.371] if (base::length(...future.futureOptionsAdded) > [13:13:48.371] 0L) { [13:13:48.371] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:48.371] base::names(opts) <- ...future.futureOptionsAdded [13:13:48.371] base::options(opts) [13:13:48.371] } [13:13:48.371] { [13:13:48.371] { [13:13:48.371] base::options(mc.cores = ...future.mc.cores.old) [13:13:48.371] NULL [13:13:48.371] } [13:13:48.371] options(future.plan = NULL) [13:13:48.371] if (is.na(NA_character_)) [13:13:48.371] Sys.unsetenv("R_FUTURE_PLAN") [13:13:48.371] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:48.371] future::plan(list(function (..., workers = availableCores(), [13:13:48.371] lazy = FALSE, rscript_libs = .libPaths(), [13:13:48.371] envir = parent.frame()) [13:13:48.371] { [13:13:48.371] if (is.function(workers)) [13:13:48.371] workers <- workers() [13:13:48.371] workers <- structure(as.integer(workers), [13:13:48.371] class = class(workers)) [13:13:48.371] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:48.371] workers >= 1) [13:13:48.371] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:48.371] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:48.371] } [13:13:48.371] future <- MultisessionFuture(..., workers = workers, [13:13:48.371] lazy = lazy, rscript_libs = rscript_libs, [13:13:48.371] envir = envir) [13:13:48.371] if (!future$lazy) [13:13:48.371] future <- run(future) [13:13:48.371] invisible(future) [13:13:48.371] }), .cleanup = FALSE, .init = FALSE) [13:13:48.371] } [13:13:48.371] } [13:13:48.371] } [13:13:48.371] }) [13:13:48.371] if (TRUE) { [13:13:48.371] base::sink(type = "output", split = FALSE) [13:13:48.371] if (TRUE) { [13:13:48.371] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:48.371] } [13:13:48.371] else { [13:13:48.371] ...future.result["stdout"] <- base::list(NULL) [13:13:48.371] } [13:13:48.371] base::close(...future.stdout) [13:13:48.371] ...future.stdout <- NULL [13:13:48.371] } [13:13:48.371] ...future.result$conditions <- ...future.conditions [13:13:48.371] ...future.result$finished <- base::Sys.time() [13:13:48.371] ...future.result [13:13:48.371] } [13:13:48.376] Exporting 5 global objects (345.92 KiB) to cluster node #1 ... [13:13:48.376] Exporting '...future.FUN' (345.92 KiB) to cluster node #1 ... [13:13:48.377] Exporting '...future.FUN' (345.92 KiB) to cluster node #1 ... DONE [13:13:48.377] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... [13:13:48.378] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... DONE [13:13:48.378] Exporting '...future.elements_ii' (64 bytes) to cluster node #1 ... [13:13:48.378] Exporting '...future.elements_ii' (64 bytes) to cluster node #1 ... DONE [13:13:48.378] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:13:48.379] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:13:48.379] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:13:48.379] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:13:48.379] Exporting 5 global objects (345.92 KiB) to cluster node #1 ... DONE [13:13:48.380] MultisessionFuture started [13:13:48.380] - Launch lazy future ... done [13:13:48.380] run() for 'MultisessionFuture' ... done [13:13:48.380] Created future: [13:13:48.397] receiveMessageFromWorker() for ClusterFuture ... [13:13:48.397] - Validating connection of MultisessionFuture [13:13:48.397] - received message: FutureResult [13:13:48.397] - Received FutureResult [13:13:48.398] - Erased future from FutureRegistry [13:13:48.398] result() for ClusterFuture ... [13:13:48.398] - result already collected: FutureResult [13:13:48.398] result() for ClusterFuture ... done [13:13:48.398] receiveMessageFromWorker() for ClusterFuture ... done [13:13:48.380] MultisessionFuture: [13:13:48.380] Label: 'future_lapply-2' [13:13:48.380] Expression: [13:13:48.380] { [13:13:48.380] do.call(function(...) { [13:13:48.380] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:48.380] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:48.380] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:48.380] on.exit(options(oopts), add = TRUE) [13:13:48.380] } [13:13:48.380] { [13:13:48.380] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:48.380] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:48.380] ...future.FUN(...future.X_jj, ...) [13:13:48.380] }) [13:13:48.380] } [13:13:48.380] }, args = future.call.arguments) [13:13:48.380] } [13:13:48.380] Lazy evaluation: FALSE [13:13:48.380] Asynchronous evaluation: TRUE [13:13:48.380] Local evaluation: TRUE [13:13:48.380] Environment: R_GlobalEnv [13:13:48.380] Capture standard output: TRUE [13:13:48.380] Capture condition classes: 'condition' (excluding 'nothing') [13:13:48.380] 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) [13:13:48.380] Packages: [13:13:48.380] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:48.380] Resolved: TRUE [13:13:48.380] Value: [13:13:48.380] Conditions captured: [13:13:48.380] Early signaling: FALSE [13:13:48.380] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:48.380] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:48.398] Chunk #2 of 2 ... DONE [13:13:48.399] Launching 2 futures (chunks) ... DONE [13:13:48.399] Resolving 2 futures (chunks) ... [13:13:48.399] resolve() on list ... [13:13:48.399] recursive: 0 [13:13:48.399] length: 2 [13:13:48.399] [13:13:48.399] Future #1 [13:13:48.400] result() for ClusterFuture ... [13:13:48.400] - result already collected: FutureResult [13:13:48.400] result() for ClusterFuture ... done [13:13:48.400] result() for ClusterFuture ... [13:13:48.400] - result already collected: FutureResult [13:13:48.400] result() for ClusterFuture ... done [13:13:48.400] signalConditionsASAP(MultisessionFuture, pos=1) ... [13:13:48.400] - nx: 2 [13:13:48.401] - relay: TRUE [13:13:48.401] - stdout: TRUE [13:13:48.401] - signal: TRUE [13:13:48.401] - resignal: FALSE [13:13:48.401] - force: TRUE [13:13:48.401] - relayed: [n=2] FALSE, FALSE [13:13:48.401] - queued futures: [n=2] FALSE, FALSE [13:13:48.401] - until=1 [13:13:48.402] - relaying element #1 [13:13:48.402] result() for ClusterFuture ... [13:13:48.402] - result already collected: FutureResult [13:13:48.402] result() for ClusterFuture ... done [13:13:48.402] result() for ClusterFuture ... [13:13:48.402] - result already collected: FutureResult [13:13:48.402] result() for ClusterFuture ... done [13:13:48.402] result() for ClusterFuture ... [13:13:48.403] - result already collected: FutureResult [13:13:48.403] result() for ClusterFuture ... done [13:13:48.403] result() for ClusterFuture ... [13:13:48.403] - result already collected: FutureResult [13:13:48.403] result() for ClusterFuture ... done [13:13:48.403] - relayed: [n=2] TRUE, FALSE [13:13:48.403] - queued futures: [n=2] TRUE, FALSE [13:13:48.403] signalConditionsASAP(MultisessionFuture, pos=1) ... done [13:13:48.404] length: 1 (resolved future 1) [13:13:48.404] Future #2 [13:13:48.404] result() for ClusterFuture ... [13:13:48.404] - result already collected: FutureResult [13:13:48.404] result() for ClusterFuture ... done [13:13:48.404] result() for ClusterFuture ... [13:13:48.404] - result already collected: FutureResult [13:13:48.405] result() for ClusterFuture ... done [13:13:48.405] signalConditionsASAP(MultisessionFuture, pos=2) ... [13:13:48.405] - nx: 2 [13:13:48.405] - relay: TRUE [13:13:48.405] - stdout: TRUE [13:13:48.405] - signal: TRUE [13:13:48.405] - resignal: FALSE [13:13:48.405] - force: TRUE [13:13:48.405] - relayed: [n=2] TRUE, FALSE [13:13:48.406] - queued futures: [n=2] TRUE, FALSE [13:13:48.406] - until=2 [13:13:48.406] - relaying element #2 [13:13:48.406] result() for ClusterFuture ... [13:13:48.406] - result already collected: FutureResult [13:13:48.406] result() for ClusterFuture ... done [13:13:48.406] result() for ClusterFuture ... [13:13:48.406] - result already collected: FutureResult [13:13:48.407] result() for ClusterFuture ... done [13:13:48.407] result() for ClusterFuture ... [13:13:48.407] - result already collected: FutureResult [13:13:48.407] result() for ClusterFuture ... done [13:13:48.407] result() for ClusterFuture ... [13:13:48.407] - result already collected: FutureResult [13:13:48.407] result() for ClusterFuture ... done [13:13:48.408] - relayed: [n=2] TRUE, TRUE [13:13:48.408] - queued futures: [n=2] TRUE, TRUE [13:13:48.408] signalConditionsASAP(MultisessionFuture, pos=2) ... done [13:13:48.408] length: 0 (resolved future 2) [13:13:48.408] Relaying remaining futures [13:13:48.408] signalConditionsASAP(NULL, pos=0) ... [13:13:48.408] - nx: 2 [13:13:48.408] - relay: TRUE [13:13:48.409] - stdout: TRUE [13:13:48.409] - signal: TRUE [13:13:48.409] - resignal: FALSE [13:13:48.409] - force: TRUE [13:13:48.409] - relayed: [n=2] TRUE, TRUE [13:13:48.409] - queued futures: [n=2] TRUE, TRUE - flush all [13:13:48.409] - relayed: [n=2] TRUE, TRUE [13:13:48.409] - queued futures: [n=2] TRUE, TRUE [13:13:48.410] signalConditionsASAP(NULL, pos=0) ... done [13:13:48.410] resolve() on list ... DONE [13:13:48.410] result() for ClusterFuture ... [13:13:48.410] - result already collected: FutureResult [13:13:48.410] result() for ClusterFuture ... done [13:13:48.410] result() for ClusterFuture ... [13:13:48.410] - result already collected: FutureResult [13:13:48.410] result() for ClusterFuture ... done [13:13:48.411] result() for ClusterFuture ... [13:13:48.411] - result already collected: FutureResult [13:13:48.411] result() for ClusterFuture ... done [13:13:48.411] result() for ClusterFuture ... [13:13:48.411] - result already collected: FutureResult [13:13:48.411] result() for ClusterFuture ... done [13:13:48.411] - Number of value chunks collected: 2 [13:13:48.411] Resolving 2 futures (chunks) ... DONE [13:13:48.412] Reducing values from 2 chunks ... [13:13:48.412] - Number of values collected after concatenation: 2 [13:13:48.412] - Number of values expected: 2 [13:13:48.412] Reducing values from 2 chunks ... DONE [13:13:48.412] future_lapply() ... DONE - future_lapply(x, ...) where length(x) != length(as.list(x)) ... [13:13:48.412] future_lapply() ... [13:13:48.415] Number of chunks: 2 [13:13:48.415] getGlobalsAndPackagesXApply() ... [13:13:48.415] - future.globals: TRUE [13:13:48.415] getGlobalsAndPackages() ... [13:13:48.415] Searching for globals... [13:13:48.416] - globals found: [1] 'FUN' [13:13:48.416] Searching for globals ... DONE [13:13:48.416] Resolving globals: FALSE [13:13:48.417] The total size of the 1 globals is 56 bytes (56 bytes) [13:13:48.417] 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') [13:13:48.417] - globals: [1] 'FUN' [13:13:48.418] [13:13:48.418] getGlobalsAndPackages() ... DONE [13:13:48.418] - globals found/used: [n=1] 'FUN' [13:13:48.418] - needed namespaces: [n=0] [13:13:48.418] Finding globals ... DONE [13:13:48.418] - use_args: TRUE [13:13:48.419] - Getting '...' globals ... [13:13:48.419] resolve() on list ... [13:13:48.419] recursive: 0 [13:13:48.419] length: 1 [13:13:48.419] elements: '...' [13:13:48.420] length: 0 (resolved future 1) [13:13:48.420] resolve() on list ... DONE [13:13:48.420] - '...' content: [n=0] [13:13:48.420] List of 1 [13:13:48.420] $ ...: list() [13:13:48.420] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:48.420] - attr(*, "where")=List of 1 [13:13:48.420] ..$ ...: [13:13:48.420] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:48.420] - attr(*, "resolved")= logi TRUE [13:13:48.420] - attr(*, "total_size")= num NA [13:13:48.423] - Getting '...' globals ... DONE [13:13:48.424] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:48.424] List of 2 [13:13:48.424] $ ...future.FUN:function (x) [13:13:48.424] $ ... : list() [13:13:48.424] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:48.424] - attr(*, "where")=List of 2 [13:13:48.424] ..$ ...future.FUN: [13:13:48.424] ..$ ... : [13:13:48.424] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:48.424] - attr(*, "resolved")= logi FALSE [13:13:48.424] - attr(*, "total_size")= num 56 [13:13:48.427] Packages to be attached in all futures: [n=0] [13:13:48.427] getGlobalsAndPackagesXApply() ... DONE [13:13:48.427] Number of futures (= number of chunks): 2 [13:13:48.428] Launching 2 futures (chunks) ... [13:13:48.428] Chunk #1 of 2 ... [13:13:48.428] - Finding globals in 'X' for chunk #1 ... [13:13:48.428] getGlobalsAndPackages() ... [13:13:48.428] Searching for globals... [13:13:48.429] [13:13:48.429] Searching for globals ... DONE [13:13:48.429] - globals: [0] [13:13:48.429] getGlobalsAndPackages() ... DONE [13:13:48.429] + additional globals found: [n=0] [13:13:48.430] + additional namespaces needed: [n=0] [13:13:48.430] - Finding globals in 'X' for chunk #1 ... DONE [13:13:48.430] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:13:48.430] - seeds: [13:13:48.430] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:48.430] getGlobalsAndPackages() ... [13:13:48.431] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:48.431] Resolving globals: FALSE [13:13:48.431] Tweak future expression to call with '...' arguments ... [13:13:48.431] { [13:13:48.431] do.call(function(...) { [13:13:48.431] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:48.431] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:48.431] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:48.431] on.exit(options(oopts), add = TRUE) [13:13:48.431] } [13:13:48.431] { [13:13:48.431] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:48.431] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:48.431] ...future.FUN(...future.X_jj, ...) [13:13:48.431] }) [13:13:48.431] } [13:13:48.431] }, args = future.call.arguments) [13:13:48.431] } [13:13:48.432] Tweak future expression to call with '...' arguments ... DONE [13:13:48.432] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:48.432] [13:13:48.432] getGlobalsAndPackages() ... DONE [13:13:48.433] run() for 'Future' ... [13:13:48.433] - state: 'created' [13:13:48.433] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:48.447] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:48.447] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:13:48.448] - Field: 'node' [13:13:48.448] - Field: 'label' [13:13:48.448] - Field: 'local' [13:13:48.448] - Field: 'owner' [13:13:48.448] - Field: 'envir' [13:13:48.448] - Field: 'workers' [13:13:48.449] - Field: 'packages' [13:13:48.449] - Field: 'gc' [13:13:48.449] - Field: 'conditions' [13:13:48.449] - Field: 'persistent' [13:13:48.449] - Field: 'expr' [13:13:48.450] - Field: 'uuid' [13:13:48.450] - Field: 'seed' [13:13:48.450] - Field: 'version' [13:13:48.450] - Field: 'result' [13:13:48.450] - Field: 'asynchronous' [13:13:48.450] - Field: 'calls' [13:13:48.451] - Field: 'globals' [13:13:48.451] - Field: 'stdout' [13:13:48.451] - Field: 'earlySignal' [13:13:48.451] - Field: 'lazy' [13:13:48.451] - Field: 'state' [13:13:48.451] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:13:48.452] - Launch lazy future ... [13:13:48.452] Packages needed by the future expression (n = 0): [13:13:48.452] Packages needed by future strategies (n = 0): [13:13:48.453] { [13:13:48.453] { [13:13:48.453] { [13:13:48.453] ...future.startTime <- base::Sys.time() [13:13:48.453] { [13:13:48.453] { [13:13:48.453] { [13:13:48.453] { [13:13:48.453] base::local({ [13:13:48.453] has_future <- base::requireNamespace("future", [13:13:48.453] quietly = TRUE) [13:13:48.453] if (has_future) { [13:13:48.453] ns <- base::getNamespace("future") [13:13:48.453] version <- ns[[".package"]][["version"]] [13:13:48.453] if (is.null(version)) [13:13:48.453] version <- utils::packageVersion("future") [13:13:48.453] } [13:13:48.453] else { [13:13:48.453] version <- NULL [13:13:48.453] } [13:13:48.453] if (!has_future || version < "1.8.0") { [13:13:48.453] info <- base::c(r_version = base::gsub("R version ", [13:13:48.453] "", base::R.version$version.string), [13:13:48.453] platform = base::sprintf("%s (%s-bit)", [13:13:48.453] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:48.453] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:48.453] "release", "version")], collapse = " "), [13:13:48.453] hostname = base::Sys.info()[["nodename"]]) [13:13:48.453] info <- base::sprintf("%s: %s", base::names(info), [13:13:48.453] info) [13:13:48.453] info <- base::paste(info, collapse = "; ") [13:13:48.453] if (!has_future) { [13:13:48.453] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:48.453] info) [13:13:48.453] } [13:13:48.453] else { [13:13:48.453] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:48.453] info, version) [13:13:48.453] } [13:13:48.453] base::stop(msg) [13:13:48.453] } [13:13:48.453] }) [13:13:48.453] } [13:13:48.453] ...future.mc.cores.old <- base::getOption("mc.cores") [13:13:48.453] base::options(mc.cores = 1L) [13:13:48.453] } [13:13:48.453] options(future.plan = NULL) [13:13:48.453] Sys.unsetenv("R_FUTURE_PLAN") [13:13:48.453] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:48.453] } [13:13:48.453] ...future.workdir <- getwd() [13:13:48.453] } [13:13:48.453] ...future.oldOptions <- base::as.list(base::.Options) [13:13:48.453] ...future.oldEnvVars <- base::Sys.getenv() [13:13:48.453] } [13:13:48.453] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:48.453] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:13:48.453] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:48.453] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:48.453] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:48.453] future.stdout.windows.reencode = NULL, width = 80L) [13:13:48.453] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:48.453] base::names(...future.oldOptions)) [13:13:48.453] } [13:13:48.453] if (FALSE) { [13:13:48.453] } [13:13:48.453] else { [13:13:48.453] if (TRUE) { [13:13:48.453] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:48.453] open = "w") [13:13:48.453] } [13:13:48.453] else { [13:13:48.453] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:48.453] windows = "NUL", "/dev/null"), open = "w") [13:13:48.453] } [13:13:48.453] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:48.453] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:48.453] base::sink(type = "output", split = FALSE) [13:13:48.453] base::close(...future.stdout) [13:13:48.453] }, add = TRUE) [13:13:48.453] } [13:13:48.453] ...future.frame <- base::sys.nframe() [13:13:48.453] ...future.conditions <- base::list() [13:13:48.453] ...future.rng <- base::globalenv()$.Random.seed [13:13:48.453] if (FALSE) { [13:13:48.453] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:48.453] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:48.453] } [13:13:48.453] ...future.result <- base::tryCatch({ [13:13:48.453] base::withCallingHandlers({ [13:13:48.453] ...future.value <- base::withVisible(base::local({ [13:13:48.453] ...future.makeSendCondition <- local({ [13:13:48.453] sendCondition <- NULL [13:13:48.453] function(frame = 1L) { [13:13:48.453] if (is.function(sendCondition)) [13:13:48.453] return(sendCondition) [13:13:48.453] ns <- getNamespace("parallel") [13:13:48.453] if (exists("sendData", mode = "function", [13:13:48.453] envir = ns)) { [13:13:48.453] parallel_sendData <- get("sendData", mode = "function", [13:13:48.453] envir = ns) [13:13:48.453] envir <- sys.frame(frame) [13:13:48.453] master <- NULL [13:13:48.453] while (!identical(envir, .GlobalEnv) && [13:13:48.453] !identical(envir, emptyenv())) { [13:13:48.453] if (exists("master", mode = "list", envir = envir, [13:13:48.453] inherits = FALSE)) { [13:13:48.453] master <- get("master", mode = "list", [13:13:48.453] envir = envir, inherits = FALSE) [13:13:48.453] if (inherits(master, c("SOCKnode", [13:13:48.453] "SOCK0node"))) { [13:13:48.453] sendCondition <<- function(cond) { [13:13:48.453] data <- list(type = "VALUE", value = cond, [13:13:48.453] success = TRUE) [13:13:48.453] parallel_sendData(master, data) [13:13:48.453] } [13:13:48.453] return(sendCondition) [13:13:48.453] } [13:13:48.453] } [13:13:48.453] frame <- frame + 1L [13:13:48.453] envir <- sys.frame(frame) [13:13:48.453] } [13:13:48.453] } [13:13:48.453] sendCondition <<- function(cond) NULL [13:13:48.453] } [13:13:48.453] }) [13:13:48.453] withCallingHandlers({ [13:13:48.453] { [13:13:48.453] do.call(function(...) { [13:13:48.453] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:48.453] if (!identical(...future.globals.maxSize.org, [13:13:48.453] ...future.globals.maxSize)) { [13:13:48.453] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:48.453] on.exit(options(oopts), add = TRUE) [13:13:48.453] } [13:13:48.453] { [13:13:48.453] lapply(seq_along(...future.elements_ii), [13:13:48.453] FUN = function(jj) { [13:13:48.453] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:48.453] ...future.FUN(...future.X_jj, ...) [13:13:48.453] }) [13:13:48.453] } [13:13:48.453] }, args = future.call.arguments) [13:13:48.453] } [13:13:48.453] }, immediateCondition = function(cond) { [13:13:48.453] sendCondition <- ...future.makeSendCondition() [13:13:48.453] sendCondition(cond) [13:13:48.453] muffleCondition <- function (cond, pattern = "^muffle") [13:13:48.453] { [13:13:48.453] inherits <- base::inherits [13:13:48.453] invokeRestart <- base::invokeRestart [13:13:48.453] is.null <- base::is.null [13:13:48.453] muffled <- FALSE [13:13:48.453] if (inherits(cond, "message")) { [13:13:48.453] muffled <- grepl(pattern, "muffleMessage") [13:13:48.453] if (muffled) [13:13:48.453] invokeRestart("muffleMessage") [13:13:48.453] } [13:13:48.453] else if (inherits(cond, "warning")) { [13:13:48.453] muffled <- grepl(pattern, "muffleWarning") [13:13:48.453] if (muffled) [13:13:48.453] invokeRestart("muffleWarning") [13:13:48.453] } [13:13:48.453] else if (inherits(cond, "condition")) { [13:13:48.453] if (!is.null(pattern)) { [13:13:48.453] computeRestarts <- base::computeRestarts [13:13:48.453] grepl <- base::grepl [13:13:48.453] restarts <- computeRestarts(cond) [13:13:48.453] for (restart in restarts) { [13:13:48.453] name <- restart$name [13:13:48.453] if (is.null(name)) [13:13:48.453] next [13:13:48.453] if (!grepl(pattern, name)) [13:13:48.453] next [13:13:48.453] invokeRestart(restart) [13:13:48.453] muffled <- TRUE [13:13:48.453] break [13:13:48.453] } [13:13:48.453] } [13:13:48.453] } [13:13:48.453] invisible(muffled) [13:13:48.453] } [13:13:48.453] muffleCondition(cond) [13:13:48.453] }) [13:13:48.453] })) [13:13:48.453] future::FutureResult(value = ...future.value$value, [13:13:48.453] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:48.453] ...future.rng), globalenv = if (FALSE) [13:13:48.453] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:48.453] ...future.globalenv.names)) [13:13:48.453] else NULL, started = ...future.startTime, version = "1.8") [13:13:48.453] }, condition = base::local({ [13:13:48.453] c <- base::c [13:13:48.453] inherits <- base::inherits [13:13:48.453] invokeRestart <- base::invokeRestart [13:13:48.453] length <- base::length [13:13:48.453] list <- base::list [13:13:48.453] seq.int <- base::seq.int [13:13:48.453] signalCondition <- base::signalCondition [13:13:48.453] sys.calls <- base::sys.calls [13:13:48.453] `[[` <- base::`[[` [13:13:48.453] `+` <- base::`+` [13:13:48.453] `<<-` <- base::`<<-` [13:13:48.453] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:48.453] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:48.453] 3L)] [13:13:48.453] } [13:13:48.453] function(cond) { [13:13:48.453] is_error <- inherits(cond, "error") [13:13:48.453] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:48.453] NULL) [13:13:48.453] if (is_error) { [13:13:48.453] sessionInformation <- function() { [13:13:48.453] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:48.453] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:48.453] search = base::search(), system = base::Sys.info()) [13:13:48.453] } [13:13:48.453] ...future.conditions[[length(...future.conditions) + [13:13:48.453] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:48.453] cond$call), session = sessionInformation(), [13:13:48.453] timestamp = base::Sys.time(), signaled = 0L) [13:13:48.453] signalCondition(cond) [13:13:48.453] } [13:13:48.453] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:48.453] "immediateCondition"))) { [13:13:48.453] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:48.453] ...future.conditions[[length(...future.conditions) + [13:13:48.453] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:48.453] if (TRUE && !signal) { [13:13:48.453] muffleCondition <- function (cond, pattern = "^muffle") [13:13:48.453] { [13:13:48.453] inherits <- base::inherits [13:13:48.453] invokeRestart <- base::invokeRestart [13:13:48.453] is.null <- base::is.null [13:13:48.453] muffled <- FALSE [13:13:48.453] if (inherits(cond, "message")) { [13:13:48.453] muffled <- grepl(pattern, "muffleMessage") [13:13:48.453] if (muffled) [13:13:48.453] invokeRestart("muffleMessage") [13:13:48.453] } [13:13:48.453] else if (inherits(cond, "warning")) { [13:13:48.453] muffled <- grepl(pattern, "muffleWarning") [13:13:48.453] if (muffled) [13:13:48.453] invokeRestart("muffleWarning") [13:13:48.453] } [13:13:48.453] else if (inherits(cond, "condition")) { [13:13:48.453] if (!is.null(pattern)) { [13:13:48.453] computeRestarts <- base::computeRestarts [13:13:48.453] grepl <- base::grepl [13:13:48.453] restarts <- computeRestarts(cond) [13:13:48.453] for (restart in restarts) { [13:13:48.453] name <- restart$name [13:13:48.453] if (is.null(name)) [13:13:48.453] next [13:13:48.453] if (!grepl(pattern, name)) [13:13:48.453] next [13:13:48.453] invokeRestart(restart) [13:13:48.453] muffled <- TRUE [13:13:48.453] break [13:13:48.453] } [13:13:48.453] } [13:13:48.453] } [13:13:48.453] invisible(muffled) [13:13:48.453] } [13:13:48.453] muffleCondition(cond, pattern = "^muffle") [13:13:48.453] } [13:13:48.453] } [13:13:48.453] else { [13:13:48.453] if (TRUE) { [13:13:48.453] muffleCondition <- function (cond, pattern = "^muffle") [13:13:48.453] { [13:13:48.453] inherits <- base::inherits [13:13:48.453] invokeRestart <- base::invokeRestart [13:13:48.453] is.null <- base::is.null [13:13:48.453] muffled <- FALSE [13:13:48.453] if (inherits(cond, "message")) { [13:13:48.453] muffled <- grepl(pattern, "muffleMessage") [13:13:48.453] if (muffled) [13:13:48.453] invokeRestart("muffleMessage") [13:13:48.453] } [13:13:48.453] else if (inherits(cond, "warning")) { [13:13:48.453] muffled <- grepl(pattern, "muffleWarning") [13:13:48.453] if (muffled) [13:13:48.453] invokeRestart("muffleWarning") [13:13:48.453] } [13:13:48.453] else if (inherits(cond, "condition")) { [13:13:48.453] if (!is.null(pattern)) { [13:13:48.453] computeRestarts <- base::computeRestarts [13:13:48.453] grepl <- base::grepl [13:13:48.453] restarts <- computeRestarts(cond) [13:13:48.453] for (restart in restarts) { [13:13:48.453] name <- restart$name [13:13:48.453] if (is.null(name)) [13:13:48.453] next [13:13:48.453] if (!grepl(pattern, name)) [13:13:48.453] next [13:13:48.453] invokeRestart(restart) [13:13:48.453] muffled <- TRUE [13:13:48.453] break [13:13:48.453] } [13:13:48.453] } [13:13:48.453] } [13:13:48.453] invisible(muffled) [13:13:48.453] } [13:13:48.453] muffleCondition(cond, pattern = "^muffle") [13:13:48.453] } [13:13:48.453] } [13:13:48.453] } [13:13:48.453] })) [13:13:48.453] }, error = function(ex) { [13:13:48.453] base::structure(base::list(value = NULL, visible = NULL, [13:13:48.453] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:48.453] ...future.rng), started = ...future.startTime, [13:13:48.453] finished = Sys.time(), session_uuid = NA_character_, [13:13:48.453] version = "1.8"), class = "FutureResult") [13:13:48.453] }, finally = { [13:13:48.453] if (!identical(...future.workdir, getwd())) [13:13:48.453] setwd(...future.workdir) [13:13:48.453] { [13:13:48.453] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:48.453] ...future.oldOptions$nwarnings <- NULL [13:13:48.453] } [13:13:48.453] base::options(...future.oldOptions) [13:13:48.453] if (.Platform$OS.type == "windows") { [13:13:48.453] old_names <- names(...future.oldEnvVars) [13:13:48.453] envs <- base::Sys.getenv() [13:13:48.453] names <- names(envs) [13:13:48.453] common <- intersect(names, old_names) [13:13:48.453] added <- setdiff(names, old_names) [13:13:48.453] removed <- setdiff(old_names, names) [13:13:48.453] changed <- common[...future.oldEnvVars[common] != [13:13:48.453] envs[common]] [13:13:48.453] NAMES <- toupper(changed) [13:13:48.453] args <- list() [13:13:48.453] for (kk in seq_along(NAMES)) { [13:13:48.453] name <- changed[[kk]] [13:13:48.453] NAME <- NAMES[[kk]] [13:13:48.453] if (name != NAME && is.element(NAME, old_names)) [13:13:48.453] next [13:13:48.453] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:48.453] } [13:13:48.453] NAMES <- toupper(added) [13:13:48.453] for (kk in seq_along(NAMES)) { [13:13:48.453] name <- added[[kk]] [13:13:48.453] NAME <- NAMES[[kk]] [13:13:48.453] if (name != NAME && is.element(NAME, old_names)) [13:13:48.453] next [13:13:48.453] args[[name]] <- "" [13:13:48.453] } [13:13:48.453] NAMES <- toupper(removed) [13:13:48.453] for (kk in seq_along(NAMES)) { [13:13:48.453] name <- removed[[kk]] [13:13:48.453] NAME <- NAMES[[kk]] [13:13:48.453] if (name != NAME && is.element(NAME, old_names)) [13:13:48.453] next [13:13:48.453] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:48.453] } [13:13:48.453] if (length(args) > 0) [13:13:48.453] base::do.call(base::Sys.setenv, args = args) [13:13:48.453] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:48.453] } [13:13:48.453] else { [13:13:48.453] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:48.453] } [13:13:48.453] { [13:13:48.453] if (base::length(...future.futureOptionsAdded) > [13:13:48.453] 0L) { [13:13:48.453] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:48.453] base::names(opts) <- ...future.futureOptionsAdded [13:13:48.453] base::options(opts) [13:13:48.453] } [13:13:48.453] { [13:13:48.453] { [13:13:48.453] base::options(mc.cores = ...future.mc.cores.old) [13:13:48.453] NULL [13:13:48.453] } [13:13:48.453] options(future.plan = NULL) [13:13:48.453] if (is.na(NA_character_)) [13:13:48.453] Sys.unsetenv("R_FUTURE_PLAN") [13:13:48.453] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:48.453] future::plan(list(function (..., workers = availableCores(), [13:13:48.453] lazy = FALSE, rscript_libs = .libPaths(), [13:13:48.453] envir = parent.frame()) [13:13:48.453] { [13:13:48.453] if (is.function(workers)) [13:13:48.453] workers <- workers() [13:13:48.453] workers <- structure(as.integer(workers), [13:13:48.453] class = class(workers)) [13:13:48.453] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:48.453] workers >= 1) [13:13:48.453] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:48.453] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:48.453] } [13:13:48.453] future <- MultisessionFuture(..., workers = workers, [13:13:48.453] lazy = lazy, rscript_libs = rscript_libs, [13:13:48.453] envir = envir) [13:13:48.453] if (!future$lazy) [13:13:48.453] future <- run(future) [13:13:48.453] invisible(future) [13:13:48.453] }), .cleanup = FALSE, .init = FALSE) [13:13:48.453] } [13:13:48.453] } [13:13:48.453] } [13:13:48.453] }) [13:13:48.453] if (TRUE) { [13:13:48.453] base::sink(type = "output", split = FALSE) [13:13:48.453] if (TRUE) { [13:13:48.453] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:48.453] } [13:13:48.453] else { [13:13:48.453] ...future.result["stdout"] <- base::list(NULL) [13:13:48.453] } [13:13:48.453] base::close(...future.stdout) [13:13:48.453] ...future.stdout <- NULL [13:13:48.453] } [13:13:48.453] ...future.result$conditions <- ...future.conditions [13:13:48.453] ...future.result$finished <- base::Sys.time() [13:13:48.453] ...future.result [13:13:48.453] } [13:13:48.458] Exporting 5 global objects (56 bytes) to cluster node #1 ... [13:13:48.458] Exporting '...future.FUN' (56 bytes) to cluster node #1 ... [13:13:48.459] Exporting '...future.FUN' (56 bytes) to cluster node #1 ... DONE [13:13:48.459] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... [13:13:48.459] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... DONE [13:13:48.460] Exporting '...future.elements_ii' (56 bytes) to cluster node #1 ... [13:13:48.460] Exporting '...future.elements_ii' (56 bytes) to cluster node #1 ... DONE [13:13:48.460] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:13:48.461] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:13:48.461] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:13:48.461] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:13:48.462] Exporting 5 global objects (56 bytes) to cluster node #1 ... DONE [13:13:48.462] MultisessionFuture started [13:13:48.463] - Launch lazy future ... done [13:13:48.463] run() for 'MultisessionFuture' ... done [13:13:48.463] Created future: [13:13:48.479] receiveMessageFromWorker() for ClusterFuture ... [13:13:48.479] - Validating connection of MultisessionFuture [13:13:48.480] - received message: FutureResult [13:13:48.480] - Received FutureResult [13:13:48.480] - Erased future from FutureRegistry [13:13:48.480] result() for ClusterFuture ... [13:13:48.480] - result already collected: FutureResult [13:13:48.480] result() for ClusterFuture ... done [13:13:48.481] receiveMessageFromWorker() for ClusterFuture ... done [13:13:48.463] MultisessionFuture: [13:13:48.463] Label: 'future_lapply-1' [13:13:48.463] Expression: [13:13:48.463] { [13:13:48.463] do.call(function(...) { [13:13:48.463] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:48.463] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:48.463] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:48.463] on.exit(options(oopts), add = TRUE) [13:13:48.463] } [13:13:48.463] { [13:13:48.463] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:48.463] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:48.463] ...future.FUN(...future.X_jj, ...) [13:13:48.463] }) [13:13:48.463] } [13:13:48.463] }, args = future.call.arguments) [13:13:48.463] } [13:13:48.463] Lazy evaluation: FALSE [13:13:48.463] Asynchronous evaluation: TRUE [13:13:48.463] Local evaluation: TRUE [13:13:48.463] Environment: R_GlobalEnv [13:13:48.463] Capture standard output: TRUE [13:13:48.463] Capture condition classes: 'condition' (excluding 'nothing') [13:13:48.463] 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) [13:13:48.463] Packages: [13:13:48.463] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:48.463] Resolved: TRUE [13:13:48.463] Value: [13:13:48.463] Conditions captured: [13:13:48.463] Early signaling: FALSE [13:13:48.463] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:48.463] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:48.481] Chunk #1 of 2 ... DONE [13:13:48.481] Chunk #2 of 2 ... [13:13:48.481] - Finding globals in 'X' for chunk #2 ... [13:13:48.482] getGlobalsAndPackages() ... [13:13:48.482] Searching for globals... [13:13:48.482] [13:13:48.482] Searching for globals ... DONE [13:13:48.482] - globals: [0] [13:13:48.483] getGlobalsAndPackages() ... DONE [13:13:48.483] + additional globals found: [n=0] [13:13:48.483] + additional namespaces needed: [n=0] [13:13:48.483] - Finding globals in 'X' for chunk #2 ... DONE [13:13:48.483] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:13:48.483] - seeds: [13:13:48.483] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:48.484] getGlobalsAndPackages() ... [13:13:48.484] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:48.484] Resolving globals: FALSE [13:13:48.484] Tweak future expression to call with '...' arguments ... [13:13:48.484] { [13:13:48.484] do.call(function(...) { [13:13:48.484] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:48.484] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:48.484] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:48.484] on.exit(options(oopts), add = TRUE) [13:13:48.484] } [13:13:48.484] { [13:13:48.484] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:48.484] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:48.484] ...future.FUN(...future.X_jj, ...) [13:13:48.484] }) [13:13:48.484] } [13:13:48.484] }, args = future.call.arguments) [13:13:48.484] } [13:13:48.485] Tweak future expression to call with '...' arguments ... DONE [13:13:48.485] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:48.485] [13:13:48.486] getGlobalsAndPackages() ... DONE [13:13:48.486] run() for 'Future' ... [13:13:48.486] - state: 'created' [13:13:48.486] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:48.500] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:48.501] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:13:48.501] - Field: 'node' [13:13:48.501] - Field: 'label' [13:13:48.501] - Field: 'local' [13:13:48.501] - Field: 'owner' [13:13:48.502] - Field: 'envir' [13:13:48.502] - Field: 'workers' [13:13:48.502] - Field: 'packages' [13:13:48.502] - Field: 'gc' [13:13:48.502] - Field: 'conditions' [13:13:48.502] - Field: 'persistent' [13:13:48.503] - Field: 'expr' [13:13:48.503] - Field: 'uuid' [13:13:48.503] - Field: 'seed' [13:13:48.503] - Field: 'version' [13:13:48.503] - Field: 'result' [13:13:48.504] - Field: 'asynchronous' [13:13:48.504] - Field: 'calls' [13:13:48.504] - Field: 'globals' [13:13:48.504] - Field: 'stdout' [13:13:48.504] - Field: 'earlySignal' [13:13:48.504] - Field: 'lazy' [13:13:48.505] - Field: 'state' [13:13:48.505] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:13:48.505] - Launch lazy future ... [13:13:48.505] Packages needed by the future expression (n = 0): [13:13:48.505] Packages needed by future strategies (n = 0): [13:13:48.506] { [13:13:48.506] { [13:13:48.506] { [13:13:48.506] ...future.startTime <- base::Sys.time() [13:13:48.506] { [13:13:48.506] { [13:13:48.506] { [13:13:48.506] { [13:13:48.506] base::local({ [13:13:48.506] has_future <- base::requireNamespace("future", [13:13:48.506] quietly = TRUE) [13:13:48.506] if (has_future) { [13:13:48.506] ns <- base::getNamespace("future") [13:13:48.506] version <- ns[[".package"]][["version"]] [13:13:48.506] if (is.null(version)) [13:13:48.506] version <- utils::packageVersion("future") [13:13:48.506] } [13:13:48.506] else { [13:13:48.506] version <- NULL [13:13:48.506] } [13:13:48.506] if (!has_future || version < "1.8.0") { [13:13:48.506] info <- base::c(r_version = base::gsub("R version ", [13:13:48.506] "", base::R.version$version.string), [13:13:48.506] platform = base::sprintf("%s (%s-bit)", [13:13:48.506] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:48.506] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:48.506] "release", "version")], collapse = " "), [13:13:48.506] hostname = base::Sys.info()[["nodename"]]) [13:13:48.506] info <- base::sprintf("%s: %s", base::names(info), [13:13:48.506] info) [13:13:48.506] info <- base::paste(info, collapse = "; ") [13:13:48.506] if (!has_future) { [13:13:48.506] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:48.506] info) [13:13:48.506] } [13:13:48.506] else { [13:13:48.506] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:48.506] info, version) [13:13:48.506] } [13:13:48.506] base::stop(msg) [13:13:48.506] } [13:13:48.506] }) [13:13:48.506] } [13:13:48.506] ...future.mc.cores.old <- base::getOption("mc.cores") [13:13:48.506] base::options(mc.cores = 1L) [13:13:48.506] } [13:13:48.506] options(future.plan = NULL) [13:13:48.506] Sys.unsetenv("R_FUTURE_PLAN") [13:13:48.506] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:48.506] } [13:13:48.506] ...future.workdir <- getwd() [13:13:48.506] } [13:13:48.506] ...future.oldOptions <- base::as.list(base::.Options) [13:13:48.506] ...future.oldEnvVars <- base::Sys.getenv() [13:13:48.506] } [13:13:48.506] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:48.506] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:13:48.506] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:48.506] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:48.506] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:48.506] future.stdout.windows.reencode = NULL, width = 80L) [13:13:48.506] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:48.506] base::names(...future.oldOptions)) [13:13:48.506] } [13:13:48.506] if (FALSE) { [13:13:48.506] } [13:13:48.506] else { [13:13:48.506] if (TRUE) { [13:13:48.506] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:48.506] open = "w") [13:13:48.506] } [13:13:48.506] else { [13:13:48.506] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:48.506] windows = "NUL", "/dev/null"), open = "w") [13:13:48.506] } [13:13:48.506] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:48.506] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:48.506] base::sink(type = "output", split = FALSE) [13:13:48.506] base::close(...future.stdout) [13:13:48.506] }, add = TRUE) [13:13:48.506] } [13:13:48.506] ...future.frame <- base::sys.nframe() [13:13:48.506] ...future.conditions <- base::list() [13:13:48.506] ...future.rng <- base::globalenv()$.Random.seed [13:13:48.506] if (FALSE) { [13:13:48.506] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:48.506] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:48.506] } [13:13:48.506] ...future.result <- base::tryCatch({ [13:13:48.506] base::withCallingHandlers({ [13:13:48.506] ...future.value <- base::withVisible(base::local({ [13:13:48.506] ...future.makeSendCondition <- local({ [13:13:48.506] sendCondition <- NULL [13:13:48.506] function(frame = 1L) { [13:13:48.506] if (is.function(sendCondition)) [13:13:48.506] return(sendCondition) [13:13:48.506] ns <- getNamespace("parallel") [13:13:48.506] if (exists("sendData", mode = "function", [13:13:48.506] envir = ns)) { [13:13:48.506] parallel_sendData <- get("sendData", mode = "function", [13:13:48.506] envir = ns) [13:13:48.506] envir <- sys.frame(frame) [13:13:48.506] master <- NULL [13:13:48.506] while (!identical(envir, .GlobalEnv) && [13:13:48.506] !identical(envir, emptyenv())) { [13:13:48.506] if (exists("master", mode = "list", envir = envir, [13:13:48.506] inherits = FALSE)) { [13:13:48.506] master <- get("master", mode = "list", [13:13:48.506] envir = envir, inherits = FALSE) [13:13:48.506] if (inherits(master, c("SOCKnode", [13:13:48.506] "SOCK0node"))) { [13:13:48.506] sendCondition <<- function(cond) { [13:13:48.506] data <- list(type = "VALUE", value = cond, [13:13:48.506] success = TRUE) [13:13:48.506] parallel_sendData(master, data) [13:13:48.506] } [13:13:48.506] return(sendCondition) [13:13:48.506] } [13:13:48.506] } [13:13:48.506] frame <- frame + 1L [13:13:48.506] envir <- sys.frame(frame) [13:13:48.506] } [13:13:48.506] } [13:13:48.506] sendCondition <<- function(cond) NULL [13:13:48.506] } [13:13:48.506] }) [13:13:48.506] withCallingHandlers({ [13:13:48.506] { [13:13:48.506] do.call(function(...) { [13:13:48.506] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:48.506] if (!identical(...future.globals.maxSize.org, [13:13:48.506] ...future.globals.maxSize)) { [13:13:48.506] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:48.506] on.exit(options(oopts), add = TRUE) [13:13:48.506] } [13:13:48.506] { [13:13:48.506] lapply(seq_along(...future.elements_ii), [13:13:48.506] FUN = function(jj) { [13:13:48.506] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:48.506] ...future.FUN(...future.X_jj, ...) [13:13:48.506] }) [13:13:48.506] } [13:13:48.506] }, args = future.call.arguments) [13:13:48.506] } [13:13:48.506] }, immediateCondition = function(cond) { [13:13:48.506] sendCondition <- ...future.makeSendCondition() [13:13:48.506] sendCondition(cond) [13:13:48.506] muffleCondition <- function (cond, pattern = "^muffle") [13:13:48.506] { [13:13:48.506] inherits <- base::inherits [13:13:48.506] invokeRestart <- base::invokeRestart [13:13:48.506] is.null <- base::is.null [13:13:48.506] muffled <- FALSE [13:13:48.506] if (inherits(cond, "message")) { [13:13:48.506] muffled <- grepl(pattern, "muffleMessage") [13:13:48.506] if (muffled) [13:13:48.506] invokeRestart("muffleMessage") [13:13:48.506] } [13:13:48.506] else if (inherits(cond, "warning")) { [13:13:48.506] muffled <- grepl(pattern, "muffleWarning") [13:13:48.506] if (muffled) [13:13:48.506] invokeRestart("muffleWarning") [13:13:48.506] } [13:13:48.506] else if (inherits(cond, "condition")) { [13:13:48.506] if (!is.null(pattern)) { [13:13:48.506] computeRestarts <- base::computeRestarts [13:13:48.506] grepl <- base::grepl [13:13:48.506] restarts <- computeRestarts(cond) [13:13:48.506] for (restart in restarts) { [13:13:48.506] name <- restart$name [13:13:48.506] if (is.null(name)) [13:13:48.506] next [13:13:48.506] if (!grepl(pattern, name)) [13:13:48.506] next [13:13:48.506] invokeRestart(restart) [13:13:48.506] muffled <- TRUE [13:13:48.506] break [13:13:48.506] } [13:13:48.506] } [13:13:48.506] } [13:13:48.506] invisible(muffled) [13:13:48.506] } [13:13:48.506] muffleCondition(cond) [13:13:48.506] }) [13:13:48.506] })) [13:13:48.506] future::FutureResult(value = ...future.value$value, [13:13:48.506] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:48.506] ...future.rng), globalenv = if (FALSE) [13:13:48.506] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:48.506] ...future.globalenv.names)) [13:13:48.506] else NULL, started = ...future.startTime, version = "1.8") [13:13:48.506] }, condition = base::local({ [13:13:48.506] c <- base::c [13:13:48.506] inherits <- base::inherits [13:13:48.506] invokeRestart <- base::invokeRestart [13:13:48.506] length <- base::length [13:13:48.506] list <- base::list [13:13:48.506] seq.int <- base::seq.int [13:13:48.506] signalCondition <- base::signalCondition [13:13:48.506] sys.calls <- base::sys.calls [13:13:48.506] `[[` <- base::`[[` [13:13:48.506] `+` <- base::`+` [13:13:48.506] `<<-` <- base::`<<-` [13:13:48.506] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:48.506] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:48.506] 3L)] [13:13:48.506] } [13:13:48.506] function(cond) { [13:13:48.506] is_error <- inherits(cond, "error") [13:13:48.506] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:48.506] NULL) [13:13:48.506] if (is_error) { [13:13:48.506] sessionInformation <- function() { [13:13:48.506] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:48.506] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:48.506] search = base::search(), system = base::Sys.info()) [13:13:48.506] } [13:13:48.506] ...future.conditions[[length(...future.conditions) + [13:13:48.506] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:48.506] cond$call), session = sessionInformation(), [13:13:48.506] timestamp = base::Sys.time(), signaled = 0L) [13:13:48.506] signalCondition(cond) [13:13:48.506] } [13:13:48.506] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:48.506] "immediateCondition"))) { [13:13:48.506] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:48.506] ...future.conditions[[length(...future.conditions) + [13:13:48.506] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:48.506] if (TRUE && !signal) { [13:13:48.506] muffleCondition <- function (cond, pattern = "^muffle") [13:13:48.506] { [13:13:48.506] inherits <- base::inherits [13:13:48.506] invokeRestart <- base::invokeRestart [13:13:48.506] is.null <- base::is.null [13:13:48.506] muffled <- FALSE [13:13:48.506] if (inherits(cond, "message")) { [13:13:48.506] muffled <- grepl(pattern, "muffleMessage") [13:13:48.506] if (muffled) [13:13:48.506] invokeRestart("muffleMessage") [13:13:48.506] } [13:13:48.506] else if (inherits(cond, "warning")) { [13:13:48.506] muffled <- grepl(pattern, "muffleWarning") [13:13:48.506] if (muffled) [13:13:48.506] invokeRestart("muffleWarning") [13:13:48.506] } [13:13:48.506] else if (inherits(cond, "condition")) { [13:13:48.506] if (!is.null(pattern)) { [13:13:48.506] computeRestarts <- base::computeRestarts [13:13:48.506] grepl <- base::grepl [13:13:48.506] restarts <- computeRestarts(cond) [13:13:48.506] for (restart in restarts) { [13:13:48.506] name <- restart$name [13:13:48.506] if (is.null(name)) [13:13:48.506] next [13:13:48.506] if (!grepl(pattern, name)) [13:13:48.506] next [13:13:48.506] invokeRestart(restart) [13:13:48.506] muffled <- TRUE [13:13:48.506] break [13:13:48.506] } [13:13:48.506] } [13:13:48.506] } [13:13:48.506] invisible(muffled) [13:13:48.506] } [13:13:48.506] muffleCondition(cond, pattern = "^muffle") [13:13:48.506] } [13:13:48.506] } [13:13:48.506] else { [13:13:48.506] if (TRUE) { [13:13:48.506] muffleCondition <- function (cond, pattern = "^muffle") [13:13:48.506] { [13:13:48.506] inherits <- base::inherits [13:13:48.506] invokeRestart <- base::invokeRestart [13:13:48.506] is.null <- base::is.null [13:13:48.506] muffled <- FALSE [13:13:48.506] if (inherits(cond, "message")) { [13:13:48.506] muffled <- grepl(pattern, "muffleMessage") [13:13:48.506] if (muffled) [13:13:48.506] invokeRestart("muffleMessage") [13:13:48.506] } [13:13:48.506] else if (inherits(cond, "warning")) { [13:13:48.506] muffled <- grepl(pattern, "muffleWarning") [13:13:48.506] if (muffled) [13:13:48.506] invokeRestart("muffleWarning") [13:13:48.506] } [13:13:48.506] else if (inherits(cond, "condition")) { [13:13:48.506] if (!is.null(pattern)) { [13:13:48.506] computeRestarts <- base::computeRestarts [13:13:48.506] grepl <- base::grepl [13:13:48.506] restarts <- computeRestarts(cond) [13:13:48.506] for (restart in restarts) { [13:13:48.506] name <- restart$name [13:13:48.506] if (is.null(name)) [13:13:48.506] next [13:13:48.506] if (!grepl(pattern, name)) [13:13:48.506] next [13:13:48.506] invokeRestart(restart) [13:13:48.506] muffled <- TRUE [13:13:48.506] break [13:13:48.506] } [13:13:48.506] } [13:13:48.506] } [13:13:48.506] invisible(muffled) [13:13:48.506] } [13:13:48.506] muffleCondition(cond, pattern = "^muffle") [13:13:48.506] } [13:13:48.506] } [13:13:48.506] } [13:13:48.506] })) [13:13:48.506] }, error = function(ex) { [13:13:48.506] base::structure(base::list(value = NULL, visible = NULL, [13:13:48.506] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:48.506] ...future.rng), started = ...future.startTime, [13:13:48.506] finished = Sys.time(), session_uuid = NA_character_, [13:13:48.506] version = "1.8"), class = "FutureResult") [13:13:48.506] }, finally = { [13:13:48.506] if (!identical(...future.workdir, getwd())) [13:13:48.506] setwd(...future.workdir) [13:13:48.506] { [13:13:48.506] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:48.506] ...future.oldOptions$nwarnings <- NULL [13:13:48.506] } [13:13:48.506] base::options(...future.oldOptions) [13:13:48.506] if (.Platform$OS.type == "windows") { [13:13:48.506] old_names <- names(...future.oldEnvVars) [13:13:48.506] envs <- base::Sys.getenv() [13:13:48.506] names <- names(envs) [13:13:48.506] common <- intersect(names, old_names) [13:13:48.506] added <- setdiff(names, old_names) [13:13:48.506] removed <- setdiff(old_names, names) [13:13:48.506] changed <- common[...future.oldEnvVars[common] != [13:13:48.506] envs[common]] [13:13:48.506] NAMES <- toupper(changed) [13:13:48.506] args <- list() [13:13:48.506] for (kk in seq_along(NAMES)) { [13:13:48.506] name <- changed[[kk]] [13:13:48.506] NAME <- NAMES[[kk]] [13:13:48.506] if (name != NAME && is.element(NAME, old_names)) [13:13:48.506] next [13:13:48.506] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:48.506] } [13:13:48.506] NAMES <- toupper(added) [13:13:48.506] for (kk in seq_along(NAMES)) { [13:13:48.506] name <- added[[kk]] [13:13:48.506] NAME <- NAMES[[kk]] [13:13:48.506] if (name != NAME && is.element(NAME, old_names)) [13:13:48.506] next [13:13:48.506] args[[name]] <- "" [13:13:48.506] } [13:13:48.506] NAMES <- toupper(removed) [13:13:48.506] for (kk in seq_along(NAMES)) { [13:13:48.506] name <- removed[[kk]] [13:13:48.506] NAME <- NAMES[[kk]] [13:13:48.506] if (name != NAME && is.element(NAME, old_names)) [13:13:48.506] next [13:13:48.506] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:48.506] } [13:13:48.506] if (length(args) > 0) [13:13:48.506] base::do.call(base::Sys.setenv, args = args) [13:13:48.506] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:48.506] } [13:13:48.506] else { [13:13:48.506] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:48.506] } [13:13:48.506] { [13:13:48.506] if (base::length(...future.futureOptionsAdded) > [13:13:48.506] 0L) { [13:13:48.506] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:48.506] base::names(opts) <- ...future.futureOptionsAdded [13:13:48.506] base::options(opts) [13:13:48.506] } [13:13:48.506] { [13:13:48.506] { [13:13:48.506] base::options(mc.cores = ...future.mc.cores.old) [13:13:48.506] NULL [13:13:48.506] } [13:13:48.506] options(future.plan = NULL) [13:13:48.506] if (is.na(NA_character_)) [13:13:48.506] Sys.unsetenv("R_FUTURE_PLAN") [13:13:48.506] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:48.506] future::plan(list(function (..., workers = availableCores(), [13:13:48.506] lazy = FALSE, rscript_libs = .libPaths(), [13:13:48.506] envir = parent.frame()) [13:13:48.506] { [13:13:48.506] if (is.function(workers)) [13:13:48.506] workers <- workers() [13:13:48.506] workers <- structure(as.integer(workers), [13:13:48.506] class = class(workers)) [13:13:48.506] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:48.506] workers >= 1) [13:13:48.506] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:48.506] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:48.506] } [13:13:48.506] future <- MultisessionFuture(..., workers = workers, [13:13:48.506] lazy = lazy, rscript_libs = rscript_libs, [13:13:48.506] envir = envir) [13:13:48.506] if (!future$lazy) [13:13:48.506] future <- run(future) [13:13:48.506] invisible(future) [13:13:48.506] }), .cleanup = FALSE, .init = FALSE) [13:13:48.506] } [13:13:48.506] } [13:13:48.506] } [13:13:48.506] }) [13:13:48.506] if (TRUE) { [13:13:48.506] base::sink(type = "output", split = FALSE) [13:13:48.506] if (TRUE) { [13:13:48.506] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:48.506] } [13:13:48.506] else { [13:13:48.506] ...future.result["stdout"] <- base::list(NULL) [13:13:48.506] } [13:13:48.506] base::close(...future.stdout) [13:13:48.506] ...future.stdout <- NULL [13:13:48.506] } [13:13:48.506] ...future.result$conditions <- ...future.conditions [13:13:48.506] ...future.result$finished <- base::Sys.time() [13:13:48.506] ...future.result [13:13:48.506] } [13:13:48.511] Exporting 5 global objects (56 bytes) to cluster node #1 ... [13:13:48.512] Exporting '...future.FUN' (56 bytes) to cluster node #1 ... [13:13:48.512] Exporting '...future.FUN' (56 bytes) to cluster node #1 ... DONE [13:13:48.512] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... [13:13:48.513] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... DONE [13:13:48.513] Exporting '...future.elements_ii' (112 bytes) to cluster node #1 ... [13:13:48.514] Exporting '...future.elements_ii' (112 bytes) to cluster node #1 ... DONE [13:13:48.514] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:13:48.514] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:13:48.514] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:13:48.515] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:13:48.515] Exporting 5 global objects (56 bytes) to cluster node #1 ... DONE [13:13:48.516] MultisessionFuture started [13:13:48.516] - Launch lazy future ... done [13:13:48.516] run() for 'MultisessionFuture' ... done [13:13:48.516] Created future: [13:13:48.532] receiveMessageFromWorker() for ClusterFuture ... [13:13:48.532] - Validating connection of MultisessionFuture [13:13:48.533] - received message: FutureResult [13:13:48.533] - Received FutureResult [13:13:48.533] - Erased future from FutureRegistry [13:13:48.533] result() for ClusterFuture ... [13:13:48.533] - result already collected: FutureResult [13:13:48.534] result() for ClusterFuture ... done [13:13:48.534] receiveMessageFromWorker() for ClusterFuture ... done [13:13:48.516] MultisessionFuture: [13:13:48.516] Label: 'future_lapply-2' [13:13:48.516] Expression: [13:13:48.516] { [13:13:48.516] do.call(function(...) { [13:13:48.516] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:48.516] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:48.516] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:48.516] on.exit(options(oopts), add = TRUE) [13:13:48.516] } [13:13:48.516] { [13:13:48.516] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:48.516] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:48.516] ...future.FUN(...future.X_jj, ...) [13:13:48.516] }) [13:13:48.516] } [13:13:48.516] }, args = future.call.arguments) [13:13:48.516] } [13:13:48.516] Lazy evaluation: FALSE [13:13:48.516] Asynchronous evaluation: TRUE [13:13:48.516] Local evaluation: TRUE [13:13:48.516] Environment: R_GlobalEnv [13:13:48.516] Capture standard output: TRUE [13:13:48.516] Capture condition classes: 'condition' (excluding 'nothing') [13:13:48.516] 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) [13:13:48.516] Packages: [13:13:48.516] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:48.516] Resolved: TRUE [13:13:48.516] Value: [13:13:48.516] Conditions captured: [13:13:48.516] Early signaling: FALSE [13:13:48.516] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:48.516] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:48.534] Chunk #2 of 2 ... DONE [13:13:48.534] Launching 2 futures (chunks) ... DONE [13:13:48.534] Resolving 2 futures (chunks) ... [13:13:48.535] resolve() on list ... [13:13:48.535] recursive: 0 [13:13:48.535] length: 2 [13:13:48.535] [13:13:48.535] Future #1 [13:13:48.535] result() for ClusterFuture ... [13:13:48.536] - result already collected: FutureResult [13:13:48.536] result() for ClusterFuture ... done [13:13:48.536] result() for ClusterFuture ... [13:13:48.536] - result already collected: FutureResult [13:13:48.536] result() for ClusterFuture ... done [13:13:48.536] signalConditionsASAP(MultisessionFuture, pos=1) ... [13:13:48.537] - nx: 2 [13:13:48.537] - relay: TRUE [13:13:48.537] - stdout: TRUE [13:13:48.537] - signal: TRUE [13:13:48.537] - resignal: FALSE [13:13:48.537] - force: TRUE [13:13:48.537] - relayed: [n=2] FALSE, FALSE [13:13:48.538] - queued futures: [n=2] FALSE, FALSE [13:13:48.538] - until=1 [13:13:48.538] - relaying element #1 [13:13:48.538] result() for ClusterFuture ... [13:13:48.538] - result already collected: FutureResult [13:13:48.538] result() for ClusterFuture ... done [13:13:48.539] result() for ClusterFuture ... [13:13:48.539] - result already collected: FutureResult [13:13:48.539] result() for ClusterFuture ... done [13:13:48.539] result() for ClusterFuture ... [13:13:48.539] - result already collected: FutureResult [13:13:48.539] result() for ClusterFuture ... done [13:13:48.540] result() for ClusterFuture ... [13:13:48.540] - result already collected: FutureResult [13:13:48.540] result() for ClusterFuture ... done [13:13:48.540] - relayed: [n=2] TRUE, FALSE [13:13:48.540] - queued futures: [n=2] TRUE, FALSE [13:13:48.540] signalConditionsASAP(MultisessionFuture, pos=1) ... done [13:13:48.541] length: 1 (resolved future 1) [13:13:48.541] Future #2 [13:13:48.541] result() for ClusterFuture ... [13:13:48.541] - result already collected: FutureResult [13:13:48.541] result() for ClusterFuture ... done [13:13:48.541] result() for ClusterFuture ... [13:13:48.542] - result already collected: FutureResult [13:13:48.542] result() for ClusterFuture ... done [13:13:48.542] signalConditionsASAP(MultisessionFuture, pos=2) ... [13:13:48.542] - nx: 2 [13:13:48.542] - relay: TRUE [13:13:48.542] - stdout: TRUE [13:13:48.542] - signal: TRUE [13:13:48.543] - resignal: FALSE [13:13:48.543] - force: TRUE [13:13:48.543] - relayed: [n=2] TRUE, FALSE [13:13:48.543] - queued futures: [n=2] TRUE, FALSE [13:13:48.543] - until=2 [13:13:48.543] - relaying element #2 [13:13:48.544] result() for ClusterFuture ... [13:13:48.544] - result already collected: FutureResult [13:13:48.544] result() for ClusterFuture ... done [13:13:48.544] result() for ClusterFuture ... [13:13:48.544] - result already collected: FutureResult [13:13:48.544] result() for ClusterFuture ... done [13:13:48.545] result() for ClusterFuture ... [13:13:48.545] - result already collected: FutureResult [13:13:48.545] result() for ClusterFuture ... done [13:13:48.545] result() for ClusterFuture ... [13:13:48.545] - result already collected: FutureResult [13:13:48.545] result() for ClusterFuture ... done [13:13:48.545] - relayed: [n=2] TRUE, TRUE [13:13:48.546] - queued futures: [n=2] TRUE, TRUE [13:13:48.546] signalConditionsASAP(MultisessionFuture, pos=2) ... done [13:13:48.548] length: 0 (resolved future 2) [13:13:48.548] Relaying remaining futures [13:13:48.549] signalConditionsASAP(NULL, pos=0) ... [13:13:48.549] - nx: 2 [13:13:48.549] - relay: TRUE [13:13:48.549] - stdout: TRUE [13:13:48.549] - signal: TRUE [13:13:48.549] - resignal: FALSE [13:13:48.550] - force: TRUE [13:13:48.550] - relayed: [n=2] TRUE, TRUE [13:13:48.550] - queued futures: [n=2] TRUE, TRUE - flush all [13:13:48.550] - relayed: [n=2] TRUE, TRUE [13:13:48.550] - queued futures: [n=2] TRUE, TRUE [13:13:48.550] signalConditionsASAP(NULL, pos=0) ... done [13:13:48.551] resolve() on list ... DONE [13:13:48.551] result() for ClusterFuture ... [13:13:48.551] - result already collected: FutureResult [13:13:48.551] result() for ClusterFuture ... done [13:13:48.551] result() for ClusterFuture ... [13:13:48.551] - result already collected: FutureResult [13:13:48.552] result() for ClusterFuture ... done [13:13:48.552] result() for ClusterFuture ... [13:13:48.552] - result already collected: FutureResult [13:13:48.552] result() for ClusterFuture ... done [13:13:48.552] result() for ClusterFuture ... [13:13:48.552] - result already collected: FutureResult [13:13:48.553] result() for ClusterFuture ... done [13:13:48.553] - Number of value chunks collected: 2 [13:13:48.553] Resolving 2 futures (chunks) ... DONE [13:13:48.553] Reducing values from 2 chunks ... [13:13:48.553] - Number of values collected after concatenation: 3 [13:13:48.553] - Number of values expected: 3 [13:13:48.554] Reducing values from 2 chunks ... DONE [13:13:48.554] future_lapply() ... DONE - future_lapply(x, ...) where x[[i]] subsets via S3 method ... [13:13:48.554] future_lapply() ... [13:13:48.557] Number of chunks: 2 [13:13:48.557] getGlobalsAndPackagesXApply() ... [13:13:48.557] - future.globals: TRUE [13:13:48.557] getGlobalsAndPackages() ... [13:13:48.557] Searching for globals... [13:13:48.559] - globals found: [1] 'FUN' [13:13:48.559] Searching for globals ... DONE [13:13:48.559] Resolving globals: FALSE [13:13:48.559] The total size of the 1 globals is 848 bytes (848 bytes) [13:13:48.560] 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') [13:13:48.560] - globals: [1] 'FUN' [13:13:48.560] [13:13:48.560] getGlobalsAndPackages() ... DONE [13:13:48.560] - globals found/used: [n=1] 'FUN' [13:13:48.561] - needed namespaces: [n=0] [13:13:48.561] Finding globals ... DONE [13:13:48.561] - use_args: TRUE [13:13:48.561] - Getting '...' globals ... [13:13:48.561] resolve() on list ... [13:13:48.562] recursive: 0 [13:13:48.562] length: 1 [13:13:48.562] elements: '...' [13:13:48.562] length: 0 (resolved future 1) [13:13:48.562] resolve() on list ... DONE [13:13:48.562] - '...' content: [n=0] [13:13:48.563] List of 1 [13:13:48.563] $ ...: list() [13:13:48.563] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:48.563] - attr(*, "where")=List of 1 [13:13:48.563] ..$ ...: [13:13:48.563] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:48.563] - attr(*, "resolved")= logi TRUE [13:13:48.563] - attr(*, "total_size")= num NA [13:13:48.566] - Getting '...' globals ... DONE [13:13:48.566] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:48.566] List of 2 [13:13:48.566] $ ...future.FUN:function (x) [13:13:48.566] $ ... : list() [13:13:48.566] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:48.566] - attr(*, "where")=List of 2 [13:13:48.566] ..$ ...future.FUN: [13:13:48.566] ..$ ... : [13:13:48.566] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:48.566] - attr(*, "resolved")= logi FALSE [13:13:48.566] - attr(*, "total_size")= num 848 [13:13:48.569] Packages to be attached in all futures: [n=0] [13:13:48.570] getGlobalsAndPackagesXApply() ... DONE [13:13:48.570] Number of futures (= number of chunks): 2 [13:13:48.570] Launching 2 futures (chunks) ... [13:13:48.570] Chunk #1 of 2 ... [13:13:48.570] - Finding globals in 'X' for chunk #1 ... [13:13:48.571] getGlobalsAndPackages() ... [13:13:48.571] Searching for globals... [13:13:48.571] [13:13:48.571] Searching for globals ... DONE [13:13:48.571] - globals: [0] [13:13:48.571] getGlobalsAndPackages() ... DONE [13:13:48.572] + additional globals found: [n=0] [13:13:48.572] + additional namespaces needed: [n=0] [13:13:48.572] - Finding globals in 'X' for chunk #1 ... DONE [13:13:48.572] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:13:48.572] - seeds: [13:13:48.572] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:48.573] getGlobalsAndPackages() ... [13:13:48.573] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:48.573] Resolving globals: FALSE [13:13:48.573] Tweak future expression to call with '...' arguments ... [13:13:48.573] { [13:13:48.573] do.call(function(...) { [13:13:48.573] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:48.573] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:48.573] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:48.573] on.exit(options(oopts), add = TRUE) [13:13:48.573] } [13:13:48.573] { [13:13:48.573] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:48.573] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:48.573] ...future.FUN(...future.X_jj, ...) [13:13:48.573] }) [13:13:48.573] } [13:13:48.573] }, args = future.call.arguments) [13:13:48.573] } [13:13:48.574] Tweak future expression to call with '...' arguments ... DONE [13:13:48.574] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:48.574] [13:13:48.575] getGlobalsAndPackages() ... DONE [13:13:48.575] run() for 'Future' ... [13:13:48.575] - state: 'created' [13:13:48.575] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:48.589] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:48.590] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:13:48.590] - Field: 'node' [13:13:48.590] - Field: 'label' [13:13:48.590] - Field: 'local' [13:13:48.590] - Field: 'owner' [13:13:48.591] - Field: 'envir' [13:13:48.591] - Field: 'workers' [13:13:48.591] - Field: 'packages' [13:13:48.591] - Field: 'gc' [13:13:48.591] - Field: 'conditions' [13:13:48.591] - Field: 'persistent' [13:13:48.592] - Field: 'expr' [13:13:48.592] - Field: 'uuid' [13:13:48.592] - Field: 'seed' [13:13:48.592] - Field: 'version' [13:13:48.592] - Field: 'result' [13:13:48.592] - Field: 'asynchronous' [13:13:48.593] - Field: 'calls' [13:13:48.593] - Field: 'globals' [13:13:48.593] - Field: 'stdout' [13:13:48.593] - Field: 'earlySignal' [13:13:48.593] - Field: 'lazy' [13:13:48.593] - Field: 'state' [13:13:48.594] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:13:48.594] - Launch lazy future ... [13:13:48.594] Packages needed by the future expression (n = 0): [13:13:48.594] Packages needed by future strategies (n = 0): [13:13:48.595] { [13:13:48.595] { [13:13:48.595] { [13:13:48.595] ...future.startTime <- base::Sys.time() [13:13:48.595] { [13:13:48.595] { [13:13:48.595] { [13:13:48.595] { [13:13:48.595] base::local({ [13:13:48.595] has_future <- base::requireNamespace("future", [13:13:48.595] quietly = TRUE) [13:13:48.595] if (has_future) { [13:13:48.595] ns <- base::getNamespace("future") [13:13:48.595] version <- ns[[".package"]][["version"]] [13:13:48.595] if (is.null(version)) [13:13:48.595] version <- utils::packageVersion("future") [13:13:48.595] } [13:13:48.595] else { [13:13:48.595] version <- NULL [13:13:48.595] } [13:13:48.595] if (!has_future || version < "1.8.0") { [13:13:48.595] info <- base::c(r_version = base::gsub("R version ", [13:13:48.595] "", base::R.version$version.string), [13:13:48.595] platform = base::sprintf("%s (%s-bit)", [13:13:48.595] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:48.595] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:48.595] "release", "version")], collapse = " "), [13:13:48.595] hostname = base::Sys.info()[["nodename"]]) [13:13:48.595] info <- base::sprintf("%s: %s", base::names(info), [13:13:48.595] info) [13:13:48.595] info <- base::paste(info, collapse = "; ") [13:13:48.595] if (!has_future) { [13:13:48.595] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:48.595] info) [13:13:48.595] } [13:13:48.595] else { [13:13:48.595] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:48.595] info, version) [13:13:48.595] } [13:13:48.595] base::stop(msg) [13:13:48.595] } [13:13:48.595] }) [13:13:48.595] } [13:13:48.595] ...future.mc.cores.old <- base::getOption("mc.cores") [13:13:48.595] base::options(mc.cores = 1L) [13:13:48.595] } [13:13:48.595] options(future.plan = NULL) [13:13:48.595] Sys.unsetenv("R_FUTURE_PLAN") [13:13:48.595] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:48.595] } [13:13:48.595] ...future.workdir <- getwd() [13:13:48.595] } [13:13:48.595] ...future.oldOptions <- base::as.list(base::.Options) [13:13:48.595] ...future.oldEnvVars <- base::Sys.getenv() [13:13:48.595] } [13:13:48.595] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:48.595] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:13:48.595] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:48.595] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:48.595] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:48.595] future.stdout.windows.reencode = NULL, width = 80L) [13:13:48.595] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:48.595] base::names(...future.oldOptions)) [13:13:48.595] } [13:13:48.595] if (FALSE) { [13:13:48.595] } [13:13:48.595] else { [13:13:48.595] if (TRUE) { [13:13:48.595] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:48.595] open = "w") [13:13:48.595] } [13:13:48.595] else { [13:13:48.595] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:48.595] windows = "NUL", "/dev/null"), open = "w") [13:13:48.595] } [13:13:48.595] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:48.595] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:48.595] base::sink(type = "output", split = FALSE) [13:13:48.595] base::close(...future.stdout) [13:13:48.595] }, add = TRUE) [13:13:48.595] } [13:13:48.595] ...future.frame <- base::sys.nframe() [13:13:48.595] ...future.conditions <- base::list() [13:13:48.595] ...future.rng <- base::globalenv()$.Random.seed [13:13:48.595] if (FALSE) { [13:13:48.595] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:48.595] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:48.595] } [13:13:48.595] ...future.result <- base::tryCatch({ [13:13:48.595] base::withCallingHandlers({ [13:13:48.595] ...future.value <- base::withVisible(base::local({ [13:13:48.595] ...future.makeSendCondition <- local({ [13:13:48.595] sendCondition <- NULL [13:13:48.595] function(frame = 1L) { [13:13:48.595] if (is.function(sendCondition)) [13:13:48.595] return(sendCondition) [13:13:48.595] ns <- getNamespace("parallel") [13:13:48.595] if (exists("sendData", mode = "function", [13:13:48.595] envir = ns)) { [13:13:48.595] parallel_sendData <- get("sendData", mode = "function", [13:13:48.595] envir = ns) [13:13:48.595] envir <- sys.frame(frame) [13:13:48.595] master <- NULL [13:13:48.595] while (!identical(envir, .GlobalEnv) && [13:13:48.595] !identical(envir, emptyenv())) { [13:13:48.595] if (exists("master", mode = "list", envir = envir, [13:13:48.595] inherits = FALSE)) { [13:13:48.595] master <- get("master", mode = "list", [13:13:48.595] envir = envir, inherits = FALSE) [13:13:48.595] if (inherits(master, c("SOCKnode", [13:13:48.595] "SOCK0node"))) { [13:13:48.595] sendCondition <<- function(cond) { [13:13:48.595] data <- list(type = "VALUE", value = cond, [13:13:48.595] success = TRUE) [13:13:48.595] parallel_sendData(master, data) [13:13:48.595] } [13:13:48.595] return(sendCondition) [13:13:48.595] } [13:13:48.595] } [13:13:48.595] frame <- frame + 1L [13:13:48.595] envir <- sys.frame(frame) [13:13:48.595] } [13:13:48.595] } [13:13:48.595] sendCondition <<- function(cond) NULL [13:13:48.595] } [13:13:48.595] }) [13:13:48.595] withCallingHandlers({ [13:13:48.595] { [13:13:48.595] do.call(function(...) { [13:13:48.595] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:48.595] if (!identical(...future.globals.maxSize.org, [13:13:48.595] ...future.globals.maxSize)) { [13:13:48.595] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:48.595] on.exit(options(oopts), add = TRUE) [13:13:48.595] } [13:13:48.595] { [13:13:48.595] lapply(seq_along(...future.elements_ii), [13:13:48.595] FUN = function(jj) { [13:13:48.595] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:48.595] ...future.FUN(...future.X_jj, ...) [13:13:48.595] }) [13:13:48.595] } [13:13:48.595] }, args = future.call.arguments) [13:13:48.595] } [13:13:48.595] }, immediateCondition = function(cond) { [13:13:48.595] sendCondition <- ...future.makeSendCondition() [13:13:48.595] sendCondition(cond) [13:13:48.595] muffleCondition <- function (cond, pattern = "^muffle") [13:13:48.595] { [13:13:48.595] inherits <- base::inherits [13:13:48.595] invokeRestart <- base::invokeRestart [13:13:48.595] is.null <- base::is.null [13:13:48.595] muffled <- FALSE [13:13:48.595] if (inherits(cond, "message")) { [13:13:48.595] muffled <- grepl(pattern, "muffleMessage") [13:13:48.595] if (muffled) [13:13:48.595] invokeRestart("muffleMessage") [13:13:48.595] } [13:13:48.595] else if (inherits(cond, "warning")) { [13:13:48.595] muffled <- grepl(pattern, "muffleWarning") [13:13:48.595] if (muffled) [13:13:48.595] invokeRestart("muffleWarning") [13:13:48.595] } [13:13:48.595] else if (inherits(cond, "condition")) { [13:13:48.595] if (!is.null(pattern)) { [13:13:48.595] computeRestarts <- base::computeRestarts [13:13:48.595] grepl <- base::grepl [13:13:48.595] restarts <- computeRestarts(cond) [13:13:48.595] for (restart in restarts) { [13:13:48.595] name <- restart$name [13:13:48.595] if (is.null(name)) [13:13:48.595] next [13:13:48.595] if (!grepl(pattern, name)) [13:13:48.595] next [13:13:48.595] invokeRestart(restart) [13:13:48.595] muffled <- TRUE [13:13:48.595] break [13:13:48.595] } [13:13:48.595] } [13:13:48.595] } [13:13:48.595] invisible(muffled) [13:13:48.595] } [13:13:48.595] muffleCondition(cond) [13:13:48.595] }) [13:13:48.595] })) [13:13:48.595] future::FutureResult(value = ...future.value$value, [13:13:48.595] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:48.595] ...future.rng), globalenv = if (FALSE) [13:13:48.595] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:48.595] ...future.globalenv.names)) [13:13:48.595] else NULL, started = ...future.startTime, version = "1.8") [13:13:48.595] }, condition = base::local({ [13:13:48.595] c <- base::c [13:13:48.595] inherits <- base::inherits [13:13:48.595] invokeRestart <- base::invokeRestart [13:13:48.595] length <- base::length [13:13:48.595] list <- base::list [13:13:48.595] seq.int <- base::seq.int [13:13:48.595] signalCondition <- base::signalCondition [13:13:48.595] sys.calls <- base::sys.calls [13:13:48.595] `[[` <- base::`[[` [13:13:48.595] `+` <- base::`+` [13:13:48.595] `<<-` <- base::`<<-` [13:13:48.595] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:48.595] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:48.595] 3L)] [13:13:48.595] } [13:13:48.595] function(cond) { [13:13:48.595] is_error <- inherits(cond, "error") [13:13:48.595] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:48.595] NULL) [13:13:48.595] if (is_error) { [13:13:48.595] sessionInformation <- function() { [13:13:48.595] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:48.595] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:48.595] search = base::search(), system = base::Sys.info()) [13:13:48.595] } [13:13:48.595] ...future.conditions[[length(...future.conditions) + [13:13:48.595] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:48.595] cond$call), session = sessionInformation(), [13:13:48.595] timestamp = base::Sys.time(), signaled = 0L) [13:13:48.595] signalCondition(cond) [13:13:48.595] } [13:13:48.595] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:48.595] "immediateCondition"))) { [13:13:48.595] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:48.595] ...future.conditions[[length(...future.conditions) + [13:13:48.595] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:48.595] if (TRUE && !signal) { [13:13:48.595] muffleCondition <- function (cond, pattern = "^muffle") [13:13:48.595] { [13:13:48.595] inherits <- base::inherits [13:13:48.595] invokeRestart <- base::invokeRestart [13:13:48.595] is.null <- base::is.null [13:13:48.595] muffled <- FALSE [13:13:48.595] if (inherits(cond, "message")) { [13:13:48.595] muffled <- grepl(pattern, "muffleMessage") [13:13:48.595] if (muffled) [13:13:48.595] invokeRestart("muffleMessage") [13:13:48.595] } [13:13:48.595] else if (inherits(cond, "warning")) { [13:13:48.595] muffled <- grepl(pattern, "muffleWarning") [13:13:48.595] if (muffled) [13:13:48.595] invokeRestart("muffleWarning") [13:13:48.595] } [13:13:48.595] else if (inherits(cond, "condition")) { [13:13:48.595] if (!is.null(pattern)) { [13:13:48.595] computeRestarts <- base::computeRestarts [13:13:48.595] grepl <- base::grepl [13:13:48.595] restarts <- computeRestarts(cond) [13:13:48.595] for (restart in restarts) { [13:13:48.595] name <- restart$name [13:13:48.595] if (is.null(name)) [13:13:48.595] next [13:13:48.595] if (!grepl(pattern, name)) [13:13:48.595] next [13:13:48.595] invokeRestart(restart) [13:13:48.595] muffled <- TRUE [13:13:48.595] break [13:13:48.595] } [13:13:48.595] } [13:13:48.595] } [13:13:48.595] invisible(muffled) [13:13:48.595] } [13:13:48.595] muffleCondition(cond, pattern = "^muffle") [13:13:48.595] } [13:13:48.595] } [13:13:48.595] else { [13:13:48.595] if (TRUE) { [13:13:48.595] muffleCondition <- function (cond, pattern = "^muffle") [13:13:48.595] { [13:13:48.595] inherits <- base::inherits [13:13:48.595] invokeRestart <- base::invokeRestart [13:13:48.595] is.null <- base::is.null [13:13:48.595] muffled <- FALSE [13:13:48.595] if (inherits(cond, "message")) { [13:13:48.595] muffled <- grepl(pattern, "muffleMessage") [13:13:48.595] if (muffled) [13:13:48.595] invokeRestart("muffleMessage") [13:13:48.595] } [13:13:48.595] else if (inherits(cond, "warning")) { [13:13:48.595] muffled <- grepl(pattern, "muffleWarning") [13:13:48.595] if (muffled) [13:13:48.595] invokeRestart("muffleWarning") [13:13:48.595] } [13:13:48.595] else if (inherits(cond, "condition")) { [13:13:48.595] if (!is.null(pattern)) { [13:13:48.595] computeRestarts <- base::computeRestarts [13:13:48.595] grepl <- base::grepl [13:13:48.595] restarts <- computeRestarts(cond) [13:13:48.595] for (restart in restarts) { [13:13:48.595] name <- restart$name [13:13:48.595] if (is.null(name)) [13:13:48.595] next [13:13:48.595] if (!grepl(pattern, name)) [13:13:48.595] next [13:13:48.595] invokeRestart(restart) [13:13:48.595] muffled <- TRUE [13:13:48.595] break [13:13:48.595] } [13:13:48.595] } [13:13:48.595] } [13:13:48.595] invisible(muffled) [13:13:48.595] } [13:13:48.595] muffleCondition(cond, pattern = "^muffle") [13:13:48.595] } [13:13:48.595] } [13:13:48.595] } [13:13:48.595] })) [13:13:48.595] }, error = function(ex) { [13:13:48.595] base::structure(base::list(value = NULL, visible = NULL, [13:13:48.595] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:48.595] ...future.rng), started = ...future.startTime, [13:13:48.595] finished = Sys.time(), session_uuid = NA_character_, [13:13:48.595] version = "1.8"), class = "FutureResult") [13:13:48.595] }, finally = { [13:13:48.595] if (!identical(...future.workdir, getwd())) [13:13:48.595] setwd(...future.workdir) [13:13:48.595] { [13:13:48.595] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:48.595] ...future.oldOptions$nwarnings <- NULL [13:13:48.595] } [13:13:48.595] base::options(...future.oldOptions) [13:13:48.595] if (.Platform$OS.type == "windows") { [13:13:48.595] old_names <- names(...future.oldEnvVars) [13:13:48.595] envs <- base::Sys.getenv() [13:13:48.595] names <- names(envs) [13:13:48.595] common <- intersect(names, old_names) [13:13:48.595] added <- setdiff(names, old_names) [13:13:48.595] removed <- setdiff(old_names, names) [13:13:48.595] changed <- common[...future.oldEnvVars[common] != [13:13:48.595] envs[common]] [13:13:48.595] NAMES <- toupper(changed) [13:13:48.595] args <- list() [13:13:48.595] for (kk in seq_along(NAMES)) { [13:13:48.595] name <- changed[[kk]] [13:13:48.595] NAME <- NAMES[[kk]] [13:13:48.595] if (name != NAME && is.element(NAME, old_names)) [13:13:48.595] next [13:13:48.595] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:48.595] } [13:13:48.595] NAMES <- toupper(added) [13:13:48.595] for (kk in seq_along(NAMES)) { [13:13:48.595] name <- added[[kk]] [13:13:48.595] NAME <- NAMES[[kk]] [13:13:48.595] if (name != NAME && is.element(NAME, old_names)) [13:13:48.595] next [13:13:48.595] args[[name]] <- "" [13:13:48.595] } [13:13:48.595] NAMES <- toupper(removed) [13:13:48.595] for (kk in seq_along(NAMES)) { [13:13:48.595] name <- removed[[kk]] [13:13:48.595] NAME <- NAMES[[kk]] [13:13:48.595] if (name != NAME && is.element(NAME, old_names)) [13:13:48.595] next [13:13:48.595] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:48.595] } [13:13:48.595] if (length(args) > 0) [13:13:48.595] base::do.call(base::Sys.setenv, args = args) [13:13:48.595] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:48.595] } [13:13:48.595] else { [13:13:48.595] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:48.595] } [13:13:48.595] { [13:13:48.595] if (base::length(...future.futureOptionsAdded) > [13:13:48.595] 0L) { [13:13:48.595] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:48.595] base::names(opts) <- ...future.futureOptionsAdded [13:13:48.595] base::options(opts) [13:13:48.595] } [13:13:48.595] { [13:13:48.595] { [13:13:48.595] base::options(mc.cores = ...future.mc.cores.old) [13:13:48.595] NULL [13:13:48.595] } [13:13:48.595] options(future.plan = NULL) [13:13:48.595] if (is.na(NA_character_)) [13:13:48.595] Sys.unsetenv("R_FUTURE_PLAN") [13:13:48.595] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:48.595] future::plan(list(function (..., workers = availableCores(), [13:13:48.595] lazy = FALSE, rscript_libs = .libPaths(), [13:13:48.595] envir = parent.frame()) [13:13:48.595] { [13:13:48.595] if (is.function(workers)) [13:13:48.595] workers <- workers() [13:13:48.595] workers <- structure(as.integer(workers), [13:13:48.595] class = class(workers)) [13:13:48.595] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:48.595] workers >= 1) [13:13:48.595] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:48.595] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:48.595] } [13:13:48.595] future <- MultisessionFuture(..., workers = workers, [13:13:48.595] lazy = lazy, rscript_libs = rscript_libs, [13:13:48.595] envir = envir) [13:13:48.595] if (!future$lazy) [13:13:48.595] future <- run(future) [13:13:48.595] invisible(future) [13:13:48.595] }), .cleanup = FALSE, .init = FALSE) [13:13:48.595] } [13:13:48.595] } [13:13:48.595] } [13:13:48.595] }) [13:13:48.595] if (TRUE) { [13:13:48.595] base::sink(type = "output", split = FALSE) [13:13:48.595] if (TRUE) { [13:13:48.595] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:48.595] } [13:13:48.595] else { [13:13:48.595] ...future.result["stdout"] <- base::list(NULL) [13:13:48.595] } [13:13:48.595] base::close(...future.stdout) [13:13:48.595] ...future.stdout <- NULL [13:13:48.595] } [13:13:48.595] ...future.result$conditions <- ...future.conditions [13:13:48.595] ...future.result$finished <- base::Sys.time() [13:13:48.595] ...future.result [13:13:48.595] } [13:13:48.600] Exporting 5 global objects (848 bytes) to cluster node #1 ... [13:13:48.601] Exporting '...future.FUN' (848 bytes) to cluster node #1 ... [13:13:48.601] Exporting '...future.FUN' (848 bytes) to cluster node #1 ... DONE [13:13:48.601] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... [13:13:48.602] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... DONE [13:13:48.602] Exporting '...future.elements_ii' (56 bytes) to cluster node #1 ... [13:13:48.602] Exporting '...future.elements_ii' (56 bytes) to cluster node #1 ... DONE [13:13:48.603] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:13:48.603] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:13:48.603] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:13:48.604] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:13:48.604] Exporting 5 global objects (848 bytes) to cluster node #1 ... DONE [13:13:48.604] MultisessionFuture started [13:13:48.605] - Launch lazy future ... done [13:13:48.605] run() for 'MultisessionFuture' ... done [13:13:48.605] Created future: [13:13:48.621] receiveMessageFromWorker() for ClusterFuture ... [13:13:48.621] - Validating connection of MultisessionFuture [13:13:48.621] - received message: FutureResult [13:13:48.622] - Received FutureResult [13:13:48.622] - Erased future from FutureRegistry [13:13:48.622] result() for ClusterFuture ... [13:13:48.622] - result already collected: FutureResult [13:13:48.622] result() for ClusterFuture ... done [13:13:48.622] receiveMessageFromWorker() for ClusterFuture ... done [13:13:48.605] MultisessionFuture: [13:13:48.605] Label: 'future_lapply-1' [13:13:48.605] Expression: [13:13:48.605] { [13:13:48.605] do.call(function(...) { [13:13:48.605] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:48.605] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:48.605] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:48.605] on.exit(options(oopts), add = TRUE) [13:13:48.605] } [13:13:48.605] { [13:13:48.605] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:48.605] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:48.605] ...future.FUN(...future.X_jj, ...) [13:13:48.605] }) [13:13:48.605] } [13:13:48.605] }, args = future.call.arguments) [13:13:48.605] } [13:13:48.605] Lazy evaluation: FALSE [13:13:48.605] Asynchronous evaluation: TRUE [13:13:48.605] Local evaluation: TRUE [13:13:48.605] Environment: R_GlobalEnv [13:13:48.605] Capture standard output: TRUE [13:13:48.605] Capture condition classes: 'condition' (excluding 'nothing') [13:13:48.605] 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) [13:13:48.605] Packages: [13:13:48.605] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:48.605] Resolved: TRUE [13:13:48.605] Value: [13:13:48.605] Conditions captured: [13:13:48.605] Early signaling: FALSE [13:13:48.605] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:48.605] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:48.623] Chunk #1 of 2 ... DONE [13:13:48.623] Chunk #2 of 2 ... [13:13:48.623] - Finding globals in 'X' for chunk #2 ... [13:13:48.623] getGlobalsAndPackages() ... [13:13:48.623] Searching for globals... [13:13:48.624] [13:13:48.624] Searching for globals ... DONE [13:13:48.624] - globals: [0] [13:13:48.624] getGlobalsAndPackages() ... DONE [13:13:48.624] + additional globals found: [n=0] [13:13:48.625] + additional namespaces needed: [n=0] [13:13:48.625] - Finding globals in 'X' for chunk #2 ... DONE [13:13:48.625] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:13:48.625] - seeds: [13:13:48.625] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:48.625] getGlobalsAndPackages() ... [13:13:48.626] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:48.626] Resolving globals: FALSE [13:13:48.626] Tweak future expression to call with '...' arguments ... [13:13:48.626] { [13:13:48.626] do.call(function(...) { [13:13:48.626] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:48.626] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:48.626] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:48.626] on.exit(options(oopts), add = TRUE) [13:13:48.626] } [13:13:48.626] { [13:13:48.626] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:48.626] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:48.626] ...future.FUN(...future.X_jj, ...) [13:13:48.626] }) [13:13:48.626] } [13:13:48.626] }, args = future.call.arguments) [13:13:48.626] } [13:13:48.627] Tweak future expression to call with '...' arguments ... DONE [13:13:48.627] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:48.627] [13:13:48.627] getGlobalsAndPackages() ... DONE [13:13:48.628] run() for 'Future' ... [13:13:48.628] - state: 'created' [13:13:48.628] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:48.642] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:48.642] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:13:48.643] - Field: 'node' [13:13:48.643] - Field: 'label' [13:13:48.643] - Field: 'local' [13:13:48.643] - Field: 'owner' [13:13:48.643] - Field: 'envir' [13:13:48.644] - Field: 'workers' [13:13:48.644] - Field: 'packages' [13:13:48.644] - Field: 'gc' [13:13:48.644] - Field: 'conditions' [13:13:48.644] - Field: 'persistent' [13:13:48.644] - Field: 'expr' [13:13:48.645] - Field: 'uuid' [13:13:48.645] - Field: 'seed' [13:13:48.645] - Field: 'version' [13:13:48.645] - Field: 'result' [13:13:48.645] - Field: 'asynchronous' [13:13:48.646] - Field: 'calls' [13:13:48.646] - Field: 'globals' [13:13:48.646] - Field: 'stdout' [13:13:48.646] - Field: 'earlySignal' [13:13:48.646] - Field: 'lazy' [13:13:48.646] - Field: 'state' [13:13:48.647] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:13:48.647] - Launch lazy future ... [13:13:48.647] Packages needed by the future expression (n = 0): [13:13:48.647] Packages needed by future strategies (n = 0): [13:13:48.648] { [13:13:48.648] { [13:13:48.648] { [13:13:48.648] ...future.startTime <- base::Sys.time() [13:13:48.648] { [13:13:48.648] { [13:13:48.648] { [13:13:48.648] { [13:13:48.648] base::local({ [13:13:48.648] has_future <- base::requireNamespace("future", [13:13:48.648] quietly = TRUE) [13:13:48.648] if (has_future) { [13:13:48.648] ns <- base::getNamespace("future") [13:13:48.648] version <- ns[[".package"]][["version"]] [13:13:48.648] if (is.null(version)) [13:13:48.648] version <- utils::packageVersion("future") [13:13:48.648] } [13:13:48.648] else { [13:13:48.648] version <- NULL [13:13:48.648] } [13:13:48.648] if (!has_future || version < "1.8.0") { [13:13:48.648] info <- base::c(r_version = base::gsub("R version ", [13:13:48.648] "", base::R.version$version.string), [13:13:48.648] platform = base::sprintf("%s (%s-bit)", [13:13:48.648] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:48.648] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:48.648] "release", "version")], collapse = " "), [13:13:48.648] hostname = base::Sys.info()[["nodename"]]) [13:13:48.648] info <- base::sprintf("%s: %s", base::names(info), [13:13:48.648] info) [13:13:48.648] info <- base::paste(info, collapse = "; ") [13:13:48.648] if (!has_future) { [13:13:48.648] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:48.648] info) [13:13:48.648] } [13:13:48.648] else { [13:13:48.648] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:48.648] info, version) [13:13:48.648] } [13:13:48.648] base::stop(msg) [13:13:48.648] } [13:13:48.648] }) [13:13:48.648] } [13:13:48.648] ...future.mc.cores.old <- base::getOption("mc.cores") [13:13:48.648] base::options(mc.cores = 1L) [13:13:48.648] } [13:13:48.648] options(future.plan = NULL) [13:13:48.648] Sys.unsetenv("R_FUTURE_PLAN") [13:13:48.648] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:48.648] } [13:13:48.648] ...future.workdir <- getwd() [13:13:48.648] } [13:13:48.648] ...future.oldOptions <- base::as.list(base::.Options) [13:13:48.648] ...future.oldEnvVars <- base::Sys.getenv() [13:13:48.648] } [13:13:48.648] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:48.648] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:13:48.648] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:48.648] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:48.648] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:48.648] future.stdout.windows.reencode = NULL, width = 80L) [13:13:48.648] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:48.648] base::names(...future.oldOptions)) [13:13:48.648] } [13:13:48.648] if (FALSE) { [13:13:48.648] } [13:13:48.648] else { [13:13:48.648] if (TRUE) { [13:13:48.648] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:48.648] open = "w") [13:13:48.648] } [13:13:48.648] else { [13:13:48.648] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:48.648] windows = "NUL", "/dev/null"), open = "w") [13:13:48.648] } [13:13:48.648] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:48.648] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:48.648] base::sink(type = "output", split = FALSE) [13:13:48.648] base::close(...future.stdout) [13:13:48.648] }, add = TRUE) [13:13:48.648] } [13:13:48.648] ...future.frame <- base::sys.nframe() [13:13:48.648] ...future.conditions <- base::list() [13:13:48.648] ...future.rng <- base::globalenv()$.Random.seed [13:13:48.648] if (FALSE) { [13:13:48.648] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:48.648] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:48.648] } [13:13:48.648] ...future.result <- base::tryCatch({ [13:13:48.648] base::withCallingHandlers({ [13:13:48.648] ...future.value <- base::withVisible(base::local({ [13:13:48.648] ...future.makeSendCondition <- local({ [13:13:48.648] sendCondition <- NULL [13:13:48.648] function(frame = 1L) { [13:13:48.648] if (is.function(sendCondition)) [13:13:48.648] return(sendCondition) [13:13:48.648] ns <- getNamespace("parallel") [13:13:48.648] if (exists("sendData", mode = "function", [13:13:48.648] envir = ns)) { [13:13:48.648] parallel_sendData <- get("sendData", mode = "function", [13:13:48.648] envir = ns) [13:13:48.648] envir <- sys.frame(frame) [13:13:48.648] master <- NULL [13:13:48.648] while (!identical(envir, .GlobalEnv) && [13:13:48.648] !identical(envir, emptyenv())) { [13:13:48.648] if (exists("master", mode = "list", envir = envir, [13:13:48.648] inherits = FALSE)) { [13:13:48.648] master <- get("master", mode = "list", [13:13:48.648] envir = envir, inherits = FALSE) [13:13:48.648] if (inherits(master, c("SOCKnode", [13:13:48.648] "SOCK0node"))) { [13:13:48.648] sendCondition <<- function(cond) { [13:13:48.648] data <- list(type = "VALUE", value = cond, [13:13:48.648] success = TRUE) [13:13:48.648] parallel_sendData(master, data) [13:13:48.648] } [13:13:48.648] return(sendCondition) [13:13:48.648] } [13:13:48.648] } [13:13:48.648] frame <- frame + 1L [13:13:48.648] envir <- sys.frame(frame) [13:13:48.648] } [13:13:48.648] } [13:13:48.648] sendCondition <<- function(cond) NULL [13:13:48.648] } [13:13:48.648] }) [13:13:48.648] withCallingHandlers({ [13:13:48.648] { [13:13:48.648] do.call(function(...) { [13:13:48.648] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:48.648] if (!identical(...future.globals.maxSize.org, [13:13:48.648] ...future.globals.maxSize)) { [13:13:48.648] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:48.648] on.exit(options(oopts), add = TRUE) [13:13:48.648] } [13:13:48.648] { [13:13:48.648] lapply(seq_along(...future.elements_ii), [13:13:48.648] FUN = function(jj) { [13:13:48.648] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:48.648] ...future.FUN(...future.X_jj, ...) [13:13:48.648] }) [13:13:48.648] } [13:13:48.648] }, args = future.call.arguments) [13:13:48.648] } [13:13:48.648] }, immediateCondition = function(cond) { [13:13:48.648] sendCondition <- ...future.makeSendCondition() [13:13:48.648] sendCondition(cond) [13:13:48.648] muffleCondition <- function (cond, pattern = "^muffle") [13:13:48.648] { [13:13:48.648] inherits <- base::inherits [13:13:48.648] invokeRestart <- base::invokeRestart [13:13:48.648] is.null <- base::is.null [13:13:48.648] muffled <- FALSE [13:13:48.648] if (inherits(cond, "message")) { [13:13:48.648] muffled <- grepl(pattern, "muffleMessage") [13:13:48.648] if (muffled) [13:13:48.648] invokeRestart("muffleMessage") [13:13:48.648] } [13:13:48.648] else if (inherits(cond, "warning")) { [13:13:48.648] muffled <- grepl(pattern, "muffleWarning") [13:13:48.648] if (muffled) [13:13:48.648] invokeRestart("muffleWarning") [13:13:48.648] } [13:13:48.648] else if (inherits(cond, "condition")) { [13:13:48.648] if (!is.null(pattern)) { [13:13:48.648] computeRestarts <- base::computeRestarts [13:13:48.648] grepl <- base::grepl [13:13:48.648] restarts <- computeRestarts(cond) [13:13:48.648] for (restart in restarts) { [13:13:48.648] name <- restart$name [13:13:48.648] if (is.null(name)) [13:13:48.648] next [13:13:48.648] if (!grepl(pattern, name)) [13:13:48.648] next [13:13:48.648] invokeRestart(restart) [13:13:48.648] muffled <- TRUE [13:13:48.648] break [13:13:48.648] } [13:13:48.648] } [13:13:48.648] } [13:13:48.648] invisible(muffled) [13:13:48.648] } [13:13:48.648] muffleCondition(cond) [13:13:48.648] }) [13:13:48.648] })) [13:13:48.648] future::FutureResult(value = ...future.value$value, [13:13:48.648] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:48.648] ...future.rng), globalenv = if (FALSE) [13:13:48.648] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:48.648] ...future.globalenv.names)) [13:13:48.648] else NULL, started = ...future.startTime, version = "1.8") [13:13:48.648] }, condition = base::local({ [13:13:48.648] c <- base::c [13:13:48.648] inherits <- base::inherits [13:13:48.648] invokeRestart <- base::invokeRestart [13:13:48.648] length <- base::length [13:13:48.648] list <- base::list [13:13:48.648] seq.int <- base::seq.int [13:13:48.648] signalCondition <- base::signalCondition [13:13:48.648] sys.calls <- base::sys.calls [13:13:48.648] `[[` <- base::`[[` [13:13:48.648] `+` <- base::`+` [13:13:48.648] `<<-` <- base::`<<-` [13:13:48.648] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:48.648] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:48.648] 3L)] [13:13:48.648] } [13:13:48.648] function(cond) { [13:13:48.648] is_error <- inherits(cond, "error") [13:13:48.648] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:48.648] NULL) [13:13:48.648] if (is_error) { [13:13:48.648] sessionInformation <- function() { [13:13:48.648] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:48.648] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:48.648] search = base::search(), system = base::Sys.info()) [13:13:48.648] } [13:13:48.648] ...future.conditions[[length(...future.conditions) + [13:13:48.648] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:48.648] cond$call), session = sessionInformation(), [13:13:48.648] timestamp = base::Sys.time(), signaled = 0L) [13:13:48.648] signalCondition(cond) [13:13:48.648] } [13:13:48.648] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:48.648] "immediateCondition"))) { [13:13:48.648] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:48.648] ...future.conditions[[length(...future.conditions) + [13:13:48.648] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:48.648] if (TRUE && !signal) { [13:13:48.648] muffleCondition <- function (cond, pattern = "^muffle") [13:13:48.648] { [13:13:48.648] inherits <- base::inherits [13:13:48.648] invokeRestart <- base::invokeRestart [13:13:48.648] is.null <- base::is.null [13:13:48.648] muffled <- FALSE [13:13:48.648] if (inherits(cond, "message")) { [13:13:48.648] muffled <- grepl(pattern, "muffleMessage") [13:13:48.648] if (muffled) [13:13:48.648] invokeRestart("muffleMessage") [13:13:48.648] } [13:13:48.648] else if (inherits(cond, "warning")) { [13:13:48.648] muffled <- grepl(pattern, "muffleWarning") [13:13:48.648] if (muffled) [13:13:48.648] invokeRestart("muffleWarning") [13:13:48.648] } [13:13:48.648] else if (inherits(cond, "condition")) { [13:13:48.648] if (!is.null(pattern)) { [13:13:48.648] computeRestarts <- base::computeRestarts [13:13:48.648] grepl <- base::grepl [13:13:48.648] restarts <- computeRestarts(cond) [13:13:48.648] for (restart in restarts) { [13:13:48.648] name <- restart$name [13:13:48.648] if (is.null(name)) [13:13:48.648] next [13:13:48.648] if (!grepl(pattern, name)) [13:13:48.648] next [13:13:48.648] invokeRestart(restart) [13:13:48.648] muffled <- TRUE [13:13:48.648] break [13:13:48.648] } [13:13:48.648] } [13:13:48.648] } [13:13:48.648] invisible(muffled) [13:13:48.648] } [13:13:48.648] muffleCondition(cond, pattern = "^muffle") [13:13:48.648] } [13:13:48.648] } [13:13:48.648] else { [13:13:48.648] if (TRUE) { [13:13:48.648] muffleCondition <- function (cond, pattern = "^muffle") [13:13:48.648] { [13:13:48.648] inherits <- base::inherits [13:13:48.648] invokeRestart <- base::invokeRestart [13:13:48.648] is.null <- base::is.null [13:13:48.648] muffled <- FALSE [13:13:48.648] if (inherits(cond, "message")) { [13:13:48.648] muffled <- grepl(pattern, "muffleMessage") [13:13:48.648] if (muffled) [13:13:48.648] invokeRestart("muffleMessage") [13:13:48.648] } [13:13:48.648] else if (inherits(cond, "warning")) { [13:13:48.648] muffled <- grepl(pattern, "muffleWarning") [13:13:48.648] if (muffled) [13:13:48.648] invokeRestart("muffleWarning") [13:13:48.648] } [13:13:48.648] else if (inherits(cond, "condition")) { [13:13:48.648] if (!is.null(pattern)) { [13:13:48.648] computeRestarts <- base::computeRestarts [13:13:48.648] grepl <- base::grepl [13:13:48.648] restarts <- computeRestarts(cond) [13:13:48.648] for (restart in restarts) { [13:13:48.648] name <- restart$name [13:13:48.648] if (is.null(name)) [13:13:48.648] next [13:13:48.648] if (!grepl(pattern, name)) [13:13:48.648] next [13:13:48.648] invokeRestart(restart) [13:13:48.648] muffled <- TRUE [13:13:48.648] break [13:13:48.648] } [13:13:48.648] } [13:13:48.648] } [13:13:48.648] invisible(muffled) [13:13:48.648] } [13:13:48.648] muffleCondition(cond, pattern = "^muffle") [13:13:48.648] } [13:13:48.648] } [13:13:48.648] } [13:13:48.648] })) [13:13:48.648] }, error = function(ex) { [13:13:48.648] base::structure(base::list(value = NULL, visible = NULL, [13:13:48.648] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:48.648] ...future.rng), started = ...future.startTime, [13:13:48.648] finished = Sys.time(), session_uuid = NA_character_, [13:13:48.648] version = "1.8"), class = "FutureResult") [13:13:48.648] }, finally = { [13:13:48.648] if (!identical(...future.workdir, getwd())) [13:13:48.648] setwd(...future.workdir) [13:13:48.648] { [13:13:48.648] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:48.648] ...future.oldOptions$nwarnings <- NULL [13:13:48.648] } [13:13:48.648] base::options(...future.oldOptions) [13:13:48.648] if (.Platform$OS.type == "windows") { [13:13:48.648] old_names <- names(...future.oldEnvVars) [13:13:48.648] envs <- base::Sys.getenv() [13:13:48.648] names <- names(envs) [13:13:48.648] common <- intersect(names, old_names) [13:13:48.648] added <- setdiff(names, old_names) [13:13:48.648] removed <- setdiff(old_names, names) [13:13:48.648] changed <- common[...future.oldEnvVars[common] != [13:13:48.648] envs[common]] [13:13:48.648] NAMES <- toupper(changed) [13:13:48.648] args <- list() [13:13:48.648] for (kk in seq_along(NAMES)) { [13:13:48.648] name <- changed[[kk]] [13:13:48.648] NAME <- NAMES[[kk]] [13:13:48.648] if (name != NAME && is.element(NAME, old_names)) [13:13:48.648] next [13:13:48.648] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:48.648] } [13:13:48.648] NAMES <- toupper(added) [13:13:48.648] for (kk in seq_along(NAMES)) { [13:13:48.648] name <- added[[kk]] [13:13:48.648] NAME <- NAMES[[kk]] [13:13:48.648] if (name != NAME && is.element(NAME, old_names)) [13:13:48.648] next [13:13:48.648] args[[name]] <- "" [13:13:48.648] } [13:13:48.648] NAMES <- toupper(removed) [13:13:48.648] for (kk in seq_along(NAMES)) { [13:13:48.648] name <- removed[[kk]] [13:13:48.648] NAME <- NAMES[[kk]] [13:13:48.648] if (name != NAME && is.element(NAME, old_names)) [13:13:48.648] next [13:13:48.648] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:48.648] } [13:13:48.648] if (length(args) > 0) [13:13:48.648] base::do.call(base::Sys.setenv, args = args) [13:13:48.648] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:48.648] } [13:13:48.648] else { [13:13:48.648] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:48.648] } [13:13:48.648] { [13:13:48.648] if (base::length(...future.futureOptionsAdded) > [13:13:48.648] 0L) { [13:13:48.648] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:48.648] base::names(opts) <- ...future.futureOptionsAdded [13:13:48.648] base::options(opts) [13:13:48.648] } [13:13:48.648] { [13:13:48.648] { [13:13:48.648] base::options(mc.cores = ...future.mc.cores.old) [13:13:48.648] NULL [13:13:48.648] } [13:13:48.648] options(future.plan = NULL) [13:13:48.648] if (is.na(NA_character_)) [13:13:48.648] Sys.unsetenv("R_FUTURE_PLAN") [13:13:48.648] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:48.648] future::plan(list(function (..., workers = availableCores(), [13:13:48.648] lazy = FALSE, rscript_libs = .libPaths(), [13:13:48.648] envir = parent.frame()) [13:13:48.648] { [13:13:48.648] if (is.function(workers)) [13:13:48.648] workers <- workers() [13:13:48.648] workers <- structure(as.integer(workers), [13:13:48.648] class = class(workers)) [13:13:48.648] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:48.648] workers >= 1) [13:13:48.648] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:48.648] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:48.648] } [13:13:48.648] future <- MultisessionFuture(..., workers = workers, [13:13:48.648] lazy = lazy, rscript_libs = rscript_libs, [13:13:48.648] envir = envir) [13:13:48.648] if (!future$lazy) [13:13:48.648] future <- run(future) [13:13:48.648] invisible(future) [13:13:48.648] }), .cleanup = FALSE, .init = FALSE) [13:13:48.648] } [13:13:48.648] } [13:13:48.648] } [13:13:48.648] }) [13:13:48.648] if (TRUE) { [13:13:48.648] base::sink(type = "output", split = FALSE) [13:13:48.648] if (TRUE) { [13:13:48.648] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:48.648] } [13:13:48.648] else { [13:13:48.648] ...future.result["stdout"] <- base::list(NULL) [13:13:48.648] } [13:13:48.648] base::close(...future.stdout) [13:13:48.648] ...future.stdout <- NULL [13:13:48.648] } [13:13:48.648] ...future.result$conditions <- ...future.conditions [13:13:48.648] ...future.result$finished <- base::Sys.time() [13:13:48.648] ...future.result [13:13:48.648] } [13:13:48.653] Exporting 5 global objects (848 bytes) to cluster node #1 ... [13:13:48.653] Exporting '...future.FUN' (848 bytes) to cluster node #1 ... [13:13:48.654] Exporting '...future.FUN' (848 bytes) to cluster node #1 ... DONE [13:13:48.654] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... [13:13:48.655] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... DONE [13:13:48.655] Exporting '...future.elements_ii' (56 bytes) to cluster node #1 ... [13:13:48.655] Exporting '...future.elements_ii' (56 bytes) to cluster node #1 ... DONE [13:13:48.655] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:13:48.656] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:13:48.656] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:13:48.656] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:13:48.657] Exporting 5 global objects (848 bytes) to cluster node #1 ... DONE [13:13:48.657] MultisessionFuture started [13:13:48.658] - Launch lazy future ... done [13:13:48.658] run() for 'MultisessionFuture' ... done [13:13:48.658] Created future: [13:13:48.677] receiveMessageFromWorker() for ClusterFuture ... [13:13:48.677] - Validating connection of MultisessionFuture [13:13:48.677] - received message: FutureResult [13:13:48.677] - Received FutureResult [13:13:48.678] - Erased future from FutureRegistry [13:13:48.678] result() for ClusterFuture ... [13:13:48.678] - result already collected: FutureResult [13:13:48.678] result() for ClusterFuture ... done [13:13:48.678] receiveMessageFromWorker() for ClusterFuture ... done [13:13:48.658] MultisessionFuture: [13:13:48.658] Label: 'future_lapply-2' [13:13:48.658] Expression: [13:13:48.658] { [13:13:48.658] do.call(function(...) { [13:13:48.658] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:48.658] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:48.658] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:48.658] on.exit(options(oopts), add = TRUE) [13:13:48.658] } [13:13:48.658] { [13:13:48.658] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:48.658] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:48.658] ...future.FUN(...future.X_jj, ...) [13:13:48.658] }) [13:13:48.658] } [13:13:48.658] }, args = future.call.arguments) [13:13:48.658] } [13:13:48.658] Lazy evaluation: FALSE [13:13:48.658] Asynchronous evaluation: TRUE [13:13:48.658] Local evaluation: TRUE [13:13:48.658] Environment: R_GlobalEnv [13:13:48.658] Capture standard output: TRUE [13:13:48.658] Capture condition classes: 'condition' (excluding 'nothing') [13:13:48.658] 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) [13:13:48.658] Packages: [13:13:48.658] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:48.658] Resolved: TRUE [13:13:48.658] Value: [13:13:48.658] Conditions captured: [13:13:48.658] Early signaling: FALSE [13:13:48.658] Owner process: b6c1e951-acdc-782e-e52f-2858251f5044 [13:13:48.658] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:48.679] Chunk #2 of 2 ... DONE [13:13:48.679] Launching 2 futures (chunks) ... DONE [13:13:48.679] Resolving 2 futures (chunks) ... [13:13:48.679] resolve() on list ... [13:13:48.679] recursive: 0 [13:13:48.679] length: 2 [13:13:48.680] [13:13:48.680] Future #1 [13:13:48.680] result() for ClusterFuture ... [13:13:48.680] - result already collected: FutureResult [13:13:48.680] result() for ClusterFuture ... done [13:13:48.680] result() for ClusterFuture ... [13:13:48.681] - result already collected: FutureResult [13:13:48.681] result() for ClusterFuture ... done [13:13:48.681] signalConditionsASAP(MultisessionFuture, pos=1) ... [13:13:48.681] - nx: 2 [13:13:48.681] - relay: TRUE [13:13:48.681] - stdout: TRUE [13:13:48.681] - signal: TRUE [13:13:48.682] - resignal: FALSE [13:13:48.682] - force: TRUE [13:13:48.682] - relayed: [n=2] FALSE, FALSE [13:13:48.682] - queued futures: [n=2] FALSE, FALSE [13:13:48.682] - until=1 [13:13:48.682] - relaying element #1 [13:13:48.683] result() for ClusterFuture ... [13:13:48.683] - result already collected: FutureResult [13:13:48.683] result() for ClusterFuture ... done [13:13:48.683] result() for ClusterFuture ... [13:13:48.683] - result already collected: FutureResult [13:13:48.683] result() for ClusterFuture ... done [13:13:48.684] result() for ClusterFuture ... [13:13:48.684] - result already collected: FutureResult [13:13:48.684] result() for ClusterFuture ... done [13:13:48.684] result() for ClusterFuture ... [13:13:48.684] - result already collected: FutureResult [13:13:48.684] result() for ClusterFuture ... done [13:13:48.685] - relayed: [n=2] TRUE, FALSE [13:13:48.685] - queued futures: [n=2] TRUE, FALSE [13:13:48.685] signalConditionsASAP(MultisessionFuture, pos=1) ... done [13:13:48.685] length: 1 (resolved future 1) [13:13:48.685] Future #2 [13:13:48.685] result() for ClusterFuture ... [13:13:48.686] - result already collected: FutureResult [13:13:48.686] result() for ClusterFuture ... done [13:13:48.686] result() for ClusterFuture ... [13:13:48.686] - result already collected: FutureResult [13:13:48.686] result() for ClusterFuture ... done [13:13:48.686] signalConditionsASAP(MultisessionFuture, pos=2) ... [13:13:48.686] - nx: 2 [13:13:48.687] - relay: TRUE [13:13:48.687] - stdout: TRUE [13:13:48.687] - signal: TRUE [13:13:48.687] - resignal: FALSE [13:13:48.687] - force: TRUE [13:13:48.687] - relayed: [n=2] TRUE, FALSE [13:13:48.688] - queued futures: [n=2] TRUE, FALSE [13:13:48.688] - until=2 [13:13:48.688] - relaying element #2 [13:13:48.688] result() for ClusterFuture ... [13:13:48.688] - result already collected: FutureResult [13:13:48.688] result() for ClusterFuture ... done [13:13:48.688] result() for ClusterFuture ... [13:13:48.689] - result already collected: FutureResult [13:13:48.689] result() for ClusterFuture ... done [13:13:48.689] result() for ClusterFuture ... [13:13:48.689] - result already collected: FutureResult [13:13:48.689] result() for ClusterFuture ... done [13:13:48.689] result() for ClusterFuture ... [13:13:48.690] - result already collected: FutureResult [13:13:48.690] result() for ClusterFuture ... done [13:13:48.690] - relayed: [n=2] TRUE, TRUE [13:13:48.690] - queued futures: [n=2] TRUE, TRUE [13:13:48.690] signalConditionsASAP(MultisessionFuture, pos=2) ... done [13:13:48.690] length: 0 (resolved future 2) [13:13:48.691] Relaying remaining futures [13:13:48.691] signalConditionsASAP(NULL, pos=0) ... [13:13:48.691] - nx: 2 [13:13:48.691] - relay: TRUE [13:13:48.691] - stdout: TRUE [13:13:48.691] - signal: TRUE [13:13:48.691] - resignal: FALSE [13:13:48.692] - force: TRUE [13:13:48.692] - relayed: [n=2] TRUE, TRUE [13:13:48.692] - queued futures: [n=2] TRUE, TRUE - flush all [13:13:48.692] - relayed: [n=2] TRUE, TRUE [13:13:48.692] - queued futures: [n=2] TRUE, TRUE [13:13:48.692] signalConditionsASAP(NULL, pos=0) ... done [13:13:48.693] resolve() on list ... DONE [13:13:48.693] result() for ClusterFuture ... [13:13:48.693] - result already collected: FutureResult [13:13:48.693] result() for ClusterFuture ... done [13:13:48.693] result() for ClusterFuture ... [13:13:48.693] - result already collected: FutureResult [13:13:48.694] result() for ClusterFuture ... done [13:13:48.694] result() for ClusterFuture ... [13:13:48.694] - result already collected: FutureResult [13:13:48.694] result() for ClusterFuture ... done [13:13:48.694] result() for ClusterFuture ... [13:13:48.694] - result already collected: FutureResult [13:13:48.695] result() for ClusterFuture ... done [13:13:48.695] - Number of value chunks collected: 2 [13:13:48.695] Resolving 2 futures (chunks) ... DONE [13:13:48.695] Reducing values from 2 chunks ... [13:13:48.695] - Number of values collected after concatenation: 2 [13:13:48.695] - Number of values expected: 2 [13:13:48.696] Reducing values from 2 chunks ... DONE [13:13:48.696] 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) [13:13:48.697] 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") [13:13:48.700] plan(): Setting new future strategy stack: [13:13:48.701] List of future strategies: [13:13:48.701] 1. FutureStrategy: [13:13:48.701] - args: function (..., envir = parent.frame(), workers = "") [13:13:48.701] - tweaked: FALSE [13:13:48.701] - call: future::plan(oplan) [13:13:48.702] plan(): nbrOfWorkers() = 1 > > proc.time() user system elapsed 8.70 0.21 10.42