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:14:15.342] plan(): Setting new future strategy stack: [13:14:15.343] List of future strategies: [13:14:15.343] 1. sequential: [13:14:15.343] - args: function (..., envir = parent.frame(), workers = "") [13:14:15.343] - tweaked: FALSE [13:14:15.343] - call: future::plan("sequential") [13:14:15.358] plan(): nbrOfWorkers() = 1 > > > message("*** future_vapply() ...") *** future_vapply() ... > > for (strategy in supportedStrategies()) { + message(sprintf("*** strategy = %s ...", sQuote(strategy))) + plan(strategy) + + x <- NULL + fun <- is.factor + fun_name <- "is.factor" + fun_value <- logical(1L) + y0 <- vapply(x, FUN = fun, FUN.VALUE = fun_value) + str(y0) + y1 <- future_vapply(x, FUN = fun, FUN.VALUE = fun_value) + str(y1) + stopifnot(all.equal(y1, y0)) + y2 <- future_vapply(x, FUN = fun_name, FUN.VALUE = fun_value) + str(y2) + stopifnot(all.equal(y2, y0)) + + x <- list() + fun <- is.numeric + fun_value <- logical(1L) + y0 <- vapply(x, FUN = fun, FUN.VALUE = fun_value) + str(y0) + y1 <- future_vapply(x, FUN = fun, FUN.VALUE = fun_value) + str(y1) + stopifnot(all.equal(y1, y0)) + + x <- integer() + fun <- identity + fun_value <- fun(integer(1L)) + y0 <- vapply(x, FUN = fun, FUN.VALUE = fun_value) + str(y0) + y1 <- future_vapply(x, FUN = fun, FUN.VALUE = fun_value) + str(y1) + stopifnot(all.equal(y1, y0)) + + + df <- data.frame(x = 1:10, y = letters[1:10], stringsAsFactors=FALSE) + fun <- class + fun_value <- character(1L) + y0 <- vapply(df, FUN = fun, FUN.VALUE = fun_value) + str(y0) + y1 <- future_vapply(df, FUN = fun, FUN.VALUE = fun_value) + str(y1) + stopifnot(all.equal(y1, y0)) + + x <- 1:10 + fun <- function(x) double(0L) + fun_value <- fun(double(1L)) + y0 <- vapply(x, FUN = fun, FUN.VALUE = fun_value) + str(y0) + y1 <- future_vapply(x, FUN = fun, FUN.VALUE = fun_value) + str(y1) + stopifnot(all.equal(y1, y0)) + + fun <- function(x) integer(0L) + fun_value <- fun(double(1L)) + y0 <- vapply(x, FUN = fun, FUN.VALUE = fun_value) + str(y0) + y1 <- future_vapply(x, FUN = fun, FUN.VALUE = fun_value) + str(y1) + stopifnot(all.equal(y1, y0)) + + fun <- sqrt + fun_value <- fun(double(1L)) + y0 <- vapply(x, FUN = fun, FUN.VALUE = fun_value) + str(y0) + y1 <- future_vapply(x, FUN = fun, FUN.VALUE = fun_value) + str(y1) + stopifnot(all.equal(y1, y0)) + + fun <- function(x) c(x, x^2) + fun_value <- fun(double(1L)) + y0 <- vapply(x, FUN = fun, FUN.VALUE = fun_value) + str(y0) + y1 <- future_vapply(x, FUN = fun, FUN.VALUE = fun_value) + str(y1) + stopifnot(all.equal(y1, y0)) + + fun <- function(x) matrix(x, nrow = 2L, ncol = 2L) + fun_value <- fun(integer(1L)) + y0 <- vapply(x, FUN = fun, FUN.VALUE = fun_value) + str(y0) + y1 <- future_vapply(x, FUN = fun, FUN.VALUE = fun_value) + str(y1) + stopifnot(all.equal(y1, y0)) + + fun <- function(x) matrix(x, nrow = 2L, ncol = 2L) + fun_value <- fun(double(1L)) + y0 <- vapply(x, FUN = fun, FUN.VALUE = fun_value) + str(y0) + y1 <- future_vapply(x, FUN = fun, FUN.VALUE = fun_value) + str(y1) + stopifnot(all.equal(y1, y0)) + + ## Ditto with dimnames on FUN.VALUE + fun <- function(x) { + matrix(x, nrow = 2L, ncol = 2L, dimnames = list(c("a", "b"), c("A", "B"))) + } + fun_value <- fun(double(1L)) + y0 <- vapply(x, FUN = fun, FUN.VALUE = fun_value) + str(y0) + y1 <- future_vapply(x, FUN = fun, FUN.VALUE = fun_value) + str(y1) + stopifnot(all.equal(y1, y0)) + + message("- From example(vapply) ...") + x <- list(a = 1:10, beta = exp(-3:3), logic = c(TRUE, FALSE, FALSE, TRUE)) + y0 <- vapply(x, FUN = quantile, FUN.VALUE = double(5L)) + y1 <- future_vapply(x, FUN = quantile, FUN.VALUE = double(5L)) + str(y1) + stopifnot(all.equal(y1, y0)) + + i39 <- sapply(3:9, seq) + ys0 <- sapply(i39, fivenum) + ys1 <- future_sapply(i39, fivenum) + stopifnot(all.equal(ys1, ys0)) + + yv0 <- vapply(i39, fivenum, + c(Min. = 0, "1st Qu." = 0, Median = 0, "3rd Qu." = 0, Max. = 0)) + yv1 <- future_vapply(i39, fivenum, + c(Min. = 0, "1st Qu." = 0, Median = 0, "3rd Qu." = 0, Max. = 0)) + str(yv1) + stopifnot(all.equal(yv1, yv0)) + + v <- structure(10*(5:8), names = LETTERS[1:4]) + f <- function(x, y) outer(rep(x, length.out = 3L), y) + ys0 <- sapply(v, f, y = 2*(1:5), simplify = "array") + ys1 <- future_sapply(v, f, y = 2*(1:5), simplify = "array") + stopifnot(all.equal(ys1, ys0)) + + fv <- outer(1:3, 1:5) + y <- 2*(1:5) + yv0 <- vapply(v, f, fv, y = y) + yv1 <- future_vapply(v, f, fv, y = y) + str(yv1) + stopifnot(all.equal(yv1, yv0)) + + y0 <- vapply(mtcars, FUN = is.numeric, FUN.VALUE = logical(1L)) + y1 <- future_vapply(mtcars, FUN = is.numeric, FUN.VALUE = logical(1L)) + str(y1) + stopifnot(all.equal(y1, y0)) + + message("- future_vapply(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 <- vapply(x, FUN = length, FUN.VALUE = -1L) + y1 <- future_vapply(x, FUN = length, FUN.VALUE = -1L) + stopifnot(identical(y1, y0)) + + message("- exceptions ...") + res <- tryCatch({ + y0 <- vapply(1:3, FUN = identity, FUN.VALUE = c(3, 3)) + }, error = identity) + stopifnot(inherits(res, "error")) + res <- tryCatch({ + y1 <- future_vapply(1:3, FUN = identity, FUN.VALUE = c(3, 3)) + }, error = identity) + stopifnot(inherits(res, "error")) + + plan(sequential) + message(sprintf("*** strategy = %s ... done", sQuote(strategy))) + } ## for (strategy in ...) *** strategy = 'sequential' ... [13:14:15.500] plan(): Setting new future strategy stack: [13:14:15.500] List of future strategies: [13:14:15.500] 1. sequential: [13:14:15.500] - args: function (..., envir = parent.frame(), workers = "") [13:14:15.500] - tweaked: FALSE [13:14:15.500] - call: plan(strategy) [13:14:15.513] plan(): nbrOfWorkers() = 1 logi(0) logi(0) logi(0) logi(0) logi(0) int(0) int(0) Named chr [1:2] "integer" "character" - attr(*, "names")= chr [1:2] "x" "y" [13:14:15.520] future_lapply() ... [13:14:15.527] Number of chunks: 1 [13:14:15.527] getGlobalsAndPackagesXApply() ... [13:14:15.528] - future.globals: TRUE [13:14:15.528] getGlobalsAndPackages() ... [13:14:15.529] Searching for globals... [13:14:15.534] - globals found: [16] 'FUN', '{', '<-', 'x_FUN', 'if', '!=', 'length', 'times', 'stopf', 'stop_if_not', 'all', '==', 'dim', '%in%', 'typeof', 'valid_types' [13:14:15.534] Searching for globals ... DONE [13:14:15.534] Resolving globals: FALSE [13:14:15.536] The total size of the 7 globals is 92.00 KiB (94208 bytes) [13:14:15.537] The total size of the 7 globals exported for future expression ('FUN()') is 92.00 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). The three largest globals are 'stop_if_not' (44.12 KiB of class 'function'), 'stopf' (26.43 KiB of class 'function') and 'FUN' (21.22 KiB of class 'function') [13:14:15.537] - globals: [7] 'FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types' [13:14:15.537] - packages: [1] 'future.apply' [13:14:15.538] getGlobalsAndPackages() ... DONE [13:14:15.538] - globals found/used: [n=7] 'FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types' [13:14:15.538] - needed namespaces: [n=1] 'future.apply' [13:14:15.538] Finding globals ... DONE [13:14:15.538] - use_args: TRUE [13:14:15.538] - Getting '...' globals ... [13:14:15.539] resolve() on list ... [13:14:15.540] recursive: 0 [13:14:15.540] length: 1 [13:14:15.540] elements: '...' [13:14:15.540] length: 0 (resolved future 1) [13:14:15.541] resolve() on list ... DONE [13:14:15.541] - '...' content: [n=0] [13:14:15.541] List of 1 [13:14:15.541] $ ...: list() [13:14:15.541] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:14:15.541] - attr(*, "where")=List of 1 [13:14:15.541] ..$ ...: [13:14:15.541] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:14:15.541] - attr(*, "resolved")= logi TRUE [13:14:15.541] - attr(*, "total_size")= num NA [13:14:15.544] - Getting '...' globals ... DONE [13:14:15.544] Globals to be used in all futures (chunks): [n=8] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...' [13:14:15.545] List of 8 [13:14:15.545] $ ...future.FUN:function (x, ...) [13:14:15.545] $ x_FUN :function (x) [13:14:15.545] $ times : int 1 [13:14:15.545] $ stopf :function (fmt, ..., call. = TRUE, domain = NULL) [13:14:15.545] $ stop_if_not :function (...) [13:14:15.545] $ dim : NULL [13:14:15.545] $ valid_types : chr "character" [13:14:15.545] $ ... : list() [13:14:15.545] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:14:15.545] - attr(*, "where")=List of 8 [13:14:15.545] ..$ ...future.FUN: [13:14:15.545] ..$ x_FUN : [13:14:15.545] ..$ times : [13:14:15.545] ..$ stopf : [13:14:15.545] ..$ stop_if_not : [13:14:15.545] ..$ dim : [13:14:15.545] ..$ valid_types : [13:14:15.545] ..$ ... : [13:14:15.545] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:14:15.545] - attr(*, "resolved")= logi FALSE [13:14:15.545] - attr(*, "total_size")= num 94208 [13:14:15.553] Packages to be attached in all futures: [n=1] 'future.apply' [13:14:15.553] getGlobalsAndPackagesXApply() ... DONE [13:14:15.553] Number of futures (= number of chunks): 1 [13:14:15.554] Launching 1 futures (chunks) ... [13:14:15.554] Chunk #1 of 1 ... [13:14:15.554] - Finding globals in 'X' for chunk #1 ... [13:14:15.554] getGlobalsAndPackages() ... [13:14:15.554] Searching for globals... [13:14:15.555] [13:14:15.555] Searching for globals ... DONE [13:14:15.555] - globals: [0] [13:14:15.555] getGlobalsAndPackages() ... DONE [13:14:15.555] + additional globals found: [n=0] [13:14:15.556] + additional namespaces needed: [n=0] [13:14:15.556] - Finding globals in 'X' for chunk #1 ... DONE [13:14:15.556] - seeds: [13:14:15.556] - All globals exported: [n=11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:15.556] getGlobalsAndPackages() ... [13:14:15.557] - globals passed as-is: [11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:15.557] Resolving globals: FALSE [13:14:15.557] Tweak future expression to call with '...' arguments ... [13:14:15.557] { [13:14:15.557] do.call(function(...) { [13:14:15.557] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:15.557] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:15.557] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:15.557] on.exit(options(oopts), add = TRUE) [13:14:15.557] } [13:14:15.557] { [13:14:15.557] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:15.557] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:15.557] ...future.FUN(...future.X_jj, ...) [13:14:15.557] }) [13:14:15.557] } [13:14:15.557] }, args = future.call.arguments) [13:14:15.557] } [13:14:15.558] Tweak future expression to call with '...' arguments ... DONE [13:14:15.558] - globals: [11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:15.558] - packages: [1] 'future.apply' [13:14:15.559] getGlobalsAndPackages() ... DONE [13:14:15.559] run() for 'Future' ... [13:14:15.560] - state: 'created' [13:14:15.560] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:14:15.560] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:14:15.561] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:14:15.561] - Field: 'label' [13:14:15.561] - Field: 'local' [13:14:15.561] - Field: 'owner' [13:14:15.561] - Field: 'envir' [13:14:15.561] - Field: 'packages' [13:14:15.562] - Field: 'gc' [13:14:15.562] - Field: 'conditions' [13:14:15.562] - Field: 'expr' [13:14:15.562] - Field: 'uuid' [13:14:15.562] - Field: 'seed' [13:14:15.563] - Field: 'version' [13:14:15.563] - Field: 'result' [13:14:15.563] - Field: 'asynchronous' [13:14:15.563] - Field: 'calls' [13:14:15.563] - Field: 'globals' [13:14:15.563] - Field: 'stdout' [13:14:15.564] - Field: 'earlySignal' [13:14:15.564] - Field: 'lazy' [13:14:15.564] - Field: 'state' [13:14:15.564] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:14:15.564] - Launch lazy future ... [13:14:15.565] Packages needed by the future expression (n = 1): 'future.apply' [13:14:15.565] Packages needed by future strategies (n = 0): [13:14:15.566] { [13:14:15.566] { [13:14:15.566] { [13:14:15.566] ...future.startTime <- base::Sys.time() [13:14:15.566] { [13:14:15.566] { [13:14:15.566] { [13:14:15.566] { [13:14:15.566] base::local({ [13:14:15.566] has_future <- base::requireNamespace("future", [13:14:15.566] quietly = TRUE) [13:14:15.566] if (has_future) { [13:14:15.566] ns <- base::getNamespace("future") [13:14:15.566] version <- ns[[".package"]][["version"]] [13:14:15.566] if (is.null(version)) [13:14:15.566] version <- utils::packageVersion("future") [13:14:15.566] } [13:14:15.566] else { [13:14:15.566] version <- NULL [13:14:15.566] } [13:14:15.566] if (!has_future || version < "1.8.0") { [13:14:15.566] info <- base::c(r_version = base::gsub("R version ", [13:14:15.566] "", base::R.version$version.string), [13:14:15.566] platform = base::sprintf("%s (%s-bit)", [13:14:15.566] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:14:15.566] os = base::paste(base::Sys.info()[base::c("sysname", [13:14:15.566] "release", "version")], collapse = " "), [13:14:15.566] hostname = base::Sys.info()[["nodename"]]) [13:14:15.566] info <- base::sprintf("%s: %s", base::names(info), [13:14:15.566] info) [13:14:15.566] info <- base::paste(info, collapse = "; ") [13:14:15.566] if (!has_future) { [13:14:15.566] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:14:15.566] info) [13:14:15.566] } [13:14:15.566] else { [13:14:15.566] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:14:15.566] info, version) [13:14:15.566] } [13:14:15.566] base::stop(msg) [13:14:15.566] } [13:14:15.566] }) [13:14:15.566] } [13:14:15.566] base::local({ [13:14:15.566] for (pkg in "future.apply") { [13:14:15.566] base::loadNamespace(pkg) [13:14:15.566] base::library(pkg, character.only = TRUE) [13:14:15.566] } [13:14:15.566] }) [13:14:15.566] } [13:14:15.566] options(future.plan = NULL) [13:14:15.566] Sys.unsetenv("R_FUTURE_PLAN") [13:14:15.566] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:14:15.566] } [13:14:15.566] ...future.workdir <- getwd() [13:14:15.566] } [13:14:15.566] ...future.oldOptions <- base::as.list(base::.Options) [13:14:15.566] ...future.oldEnvVars <- base::Sys.getenv() [13:14:15.566] } [13:14:15.566] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:14:15.566] future.globals.maxSize = NULL, future.globals.method = NULL, [13:14:15.566] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:14:15.566] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:14:15.566] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:14:15.566] future.stdout.windows.reencode = NULL, width = 80L) [13:14:15.566] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:14:15.566] base::names(...future.oldOptions)) [13:14:15.566] } [13:14:15.566] if (FALSE) { [13:14:15.566] } [13:14:15.566] else { [13:14:15.566] if (TRUE) { [13:14:15.566] ...future.stdout <- base::rawConnection(base::raw(0L), [13:14:15.566] open = "w") [13:14:15.566] } [13:14:15.566] else { [13:14:15.566] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:14:15.566] windows = "NUL", "/dev/null"), open = "w") [13:14:15.566] } [13:14:15.566] base::sink(...future.stdout, type = "output", split = FALSE) [13:14:15.566] base::on.exit(if (!base::is.null(...future.stdout)) { [13:14:15.566] base::sink(type = "output", split = FALSE) [13:14:15.566] base::close(...future.stdout) [13:14:15.566] }, add = TRUE) [13:14:15.566] } [13:14:15.566] ...future.frame <- base::sys.nframe() [13:14:15.566] ...future.conditions <- base::list() [13:14:15.566] ...future.rng <- base::globalenv()$.Random.seed [13:14:15.566] if (FALSE) { [13:14:15.566] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:14:15.566] "...future.value", "...future.globalenv.names", ".Random.seed") [13:14:15.566] } [13:14:15.566] ...future.result <- base::tryCatch({ [13:14:15.566] base::withCallingHandlers({ [13:14:15.566] ...future.value <- base::withVisible(base::local({ [13:14:15.566] do.call(function(...) { [13:14:15.566] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:15.566] if (!identical(...future.globals.maxSize.org, [13:14:15.566] ...future.globals.maxSize)) { [13:14:15.566] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:15.566] on.exit(options(oopts), add = TRUE) [13:14:15.566] } [13:14:15.566] { [13:14:15.566] lapply(seq_along(...future.elements_ii), [13:14:15.566] FUN = function(jj) { [13:14:15.566] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:15.566] ...future.FUN(...future.X_jj, ...) [13:14:15.566] }) [13:14:15.566] } [13:14:15.566] }, args = future.call.arguments) [13:14:15.566] })) [13:14:15.566] future::FutureResult(value = ...future.value$value, [13:14:15.566] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:14:15.566] ...future.rng), globalenv = if (FALSE) [13:14:15.566] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:14:15.566] ...future.globalenv.names)) [13:14:15.566] else NULL, started = ...future.startTime, version = "1.8") [13:14:15.566] }, condition = base::local({ [13:14:15.566] c <- base::c [13:14:15.566] inherits <- base::inherits [13:14:15.566] invokeRestart <- base::invokeRestart [13:14:15.566] length <- base::length [13:14:15.566] list <- base::list [13:14:15.566] seq.int <- base::seq.int [13:14:15.566] signalCondition <- base::signalCondition [13:14:15.566] sys.calls <- base::sys.calls [13:14:15.566] `[[` <- base::`[[` [13:14:15.566] `+` <- base::`+` [13:14:15.566] `<<-` <- base::`<<-` [13:14:15.566] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:14:15.566] calls[seq.int(from = from + 12L, to = length(calls) - [13:14:15.566] 3L)] [13:14:15.566] } [13:14:15.566] function(cond) { [13:14:15.566] is_error <- inherits(cond, "error") [13:14:15.566] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:14:15.566] NULL) [13:14:15.566] if (is_error) { [13:14:15.566] sessionInformation <- function() { [13:14:15.566] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:14:15.566] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:14:15.566] search = base::search(), system = base::Sys.info()) [13:14:15.566] } [13:14:15.566] ...future.conditions[[length(...future.conditions) + [13:14:15.566] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:14:15.566] cond$call), session = sessionInformation(), [13:14:15.566] timestamp = base::Sys.time(), signaled = 0L) [13:14:15.566] signalCondition(cond) [13:14:15.566] } [13:14:15.566] else if (!ignore && TRUE && inherits(cond, c("condition", [13:14:15.566] "immediateCondition"))) { [13:14:15.566] signal <- TRUE && inherits(cond, "immediateCondition") [13:14:15.566] ...future.conditions[[length(...future.conditions) + [13:14:15.566] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:14:15.566] if (TRUE && !signal) { [13:14:15.566] muffleCondition <- function (cond, pattern = "^muffle") [13:14:15.566] { [13:14:15.566] inherits <- base::inherits [13:14:15.566] invokeRestart <- base::invokeRestart [13:14:15.566] is.null <- base::is.null [13:14:15.566] muffled <- FALSE [13:14:15.566] if (inherits(cond, "message")) { [13:14:15.566] muffled <- grepl(pattern, "muffleMessage") [13:14:15.566] if (muffled) [13:14:15.566] invokeRestart("muffleMessage") [13:14:15.566] } [13:14:15.566] else if (inherits(cond, "warning")) { [13:14:15.566] muffled <- grepl(pattern, "muffleWarning") [13:14:15.566] if (muffled) [13:14:15.566] invokeRestart("muffleWarning") [13:14:15.566] } [13:14:15.566] else if (inherits(cond, "condition")) { [13:14:15.566] if (!is.null(pattern)) { [13:14:15.566] computeRestarts <- base::computeRestarts [13:14:15.566] grepl <- base::grepl [13:14:15.566] restarts <- computeRestarts(cond) [13:14:15.566] for (restart in restarts) { [13:14:15.566] name <- restart$name [13:14:15.566] if (is.null(name)) [13:14:15.566] next [13:14:15.566] if (!grepl(pattern, name)) [13:14:15.566] next [13:14:15.566] invokeRestart(restart) [13:14:15.566] muffled <- TRUE [13:14:15.566] break [13:14:15.566] } [13:14:15.566] } [13:14:15.566] } [13:14:15.566] invisible(muffled) [13:14:15.566] } [13:14:15.566] muffleCondition(cond, pattern = "^muffle") [13:14:15.566] } [13:14:15.566] } [13:14:15.566] else { [13:14:15.566] if (TRUE) { [13:14:15.566] muffleCondition <- function (cond, pattern = "^muffle") [13:14:15.566] { [13:14:15.566] inherits <- base::inherits [13:14:15.566] invokeRestart <- base::invokeRestart [13:14:15.566] is.null <- base::is.null [13:14:15.566] muffled <- FALSE [13:14:15.566] if (inherits(cond, "message")) { [13:14:15.566] muffled <- grepl(pattern, "muffleMessage") [13:14:15.566] if (muffled) [13:14:15.566] invokeRestart("muffleMessage") [13:14:15.566] } [13:14:15.566] else if (inherits(cond, "warning")) { [13:14:15.566] muffled <- grepl(pattern, "muffleWarning") [13:14:15.566] if (muffled) [13:14:15.566] invokeRestart("muffleWarning") [13:14:15.566] } [13:14:15.566] else if (inherits(cond, "condition")) { [13:14:15.566] if (!is.null(pattern)) { [13:14:15.566] computeRestarts <- base::computeRestarts [13:14:15.566] grepl <- base::grepl [13:14:15.566] restarts <- computeRestarts(cond) [13:14:15.566] for (restart in restarts) { [13:14:15.566] name <- restart$name [13:14:15.566] if (is.null(name)) [13:14:15.566] next [13:14:15.566] if (!grepl(pattern, name)) [13:14:15.566] next [13:14:15.566] invokeRestart(restart) [13:14:15.566] muffled <- TRUE [13:14:15.566] break [13:14:15.566] } [13:14:15.566] } [13:14:15.566] } [13:14:15.566] invisible(muffled) [13:14:15.566] } [13:14:15.566] muffleCondition(cond, pattern = "^muffle") [13:14:15.566] } [13:14:15.566] } [13:14:15.566] } [13:14:15.566] })) [13:14:15.566] }, error = function(ex) { [13:14:15.566] base::structure(base::list(value = NULL, visible = NULL, [13:14:15.566] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:14:15.566] ...future.rng), started = ...future.startTime, [13:14:15.566] finished = Sys.time(), session_uuid = NA_character_, [13:14:15.566] version = "1.8"), class = "FutureResult") [13:14:15.566] }, finally = { [13:14:15.566] if (!identical(...future.workdir, getwd())) [13:14:15.566] setwd(...future.workdir) [13:14:15.566] { [13:14:15.566] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:14:15.566] ...future.oldOptions$nwarnings <- NULL [13:14:15.566] } [13:14:15.566] base::options(...future.oldOptions) [13:14:15.566] if (.Platform$OS.type == "windows") { [13:14:15.566] old_names <- names(...future.oldEnvVars) [13:14:15.566] envs <- base::Sys.getenv() [13:14:15.566] names <- names(envs) [13:14:15.566] common <- intersect(names, old_names) [13:14:15.566] added <- setdiff(names, old_names) [13:14:15.566] removed <- setdiff(old_names, names) [13:14:15.566] changed <- common[...future.oldEnvVars[common] != [13:14:15.566] envs[common]] [13:14:15.566] NAMES <- toupper(changed) [13:14:15.566] args <- list() [13:14:15.566] for (kk in seq_along(NAMES)) { [13:14:15.566] name <- changed[[kk]] [13:14:15.566] NAME <- NAMES[[kk]] [13:14:15.566] if (name != NAME && is.element(NAME, old_names)) [13:14:15.566] next [13:14:15.566] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:15.566] } [13:14:15.566] NAMES <- toupper(added) [13:14:15.566] for (kk in seq_along(NAMES)) { [13:14:15.566] name <- added[[kk]] [13:14:15.566] NAME <- NAMES[[kk]] [13:14:15.566] if (name != NAME && is.element(NAME, old_names)) [13:14:15.566] next [13:14:15.566] args[[name]] <- "" [13:14:15.566] } [13:14:15.566] NAMES <- toupper(removed) [13:14:15.566] for (kk in seq_along(NAMES)) { [13:14:15.566] name <- removed[[kk]] [13:14:15.566] NAME <- NAMES[[kk]] [13:14:15.566] if (name != NAME && is.element(NAME, old_names)) [13:14:15.566] next [13:14:15.566] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:15.566] } [13:14:15.566] if (length(args) > 0) [13:14:15.566] base::do.call(base::Sys.setenv, args = args) [13:14:15.566] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:14:15.566] } [13:14:15.566] else { [13:14:15.566] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:14:15.566] } [13:14:15.566] { [13:14:15.566] if (base::length(...future.futureOptionsAdded) > [13:14:15.566] 0L) { [13:14:15.566] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:14:15.566] base::names(opts) <- ...future.futureOptionsAdded [13:14:15.566] base::options(opts) [13:14:15.566] } [13:14:15.566] { [13:14:15.566] { [13:14:15.566] NULL [13:14:15.566] RNGkind("Mersenne-Twister") [13:14:15.566] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:14:15.566] inherits = FALSE) [13:14:15.566] } [13:14:15.566] options(future.plan = NULL) [13:14:15.566] if (is.na(NA_character_)) [13:14:15.566] Sys.unsetenv("R_FUTURE_PLAN") [13:14:15.566] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:14:15.566] future::plan(list(function (..., envir = parent.frame()) [13:14:15.566] { [13:14:15.566] future <- SequentialFuture(..., envir = envir) [13:14:15.566] if (!future$lazy) [13:14:15.566] future <- run(future) [13:14:15.566] invisible(future) [13:14:15.566] }), .cleanup = FALSE, .init = FALSE) [13:14:15.566] } [13:14:15.566] } [13:14:15.566] } [13:14:15.566] }) [13:14:15.566] if (TRUE) { [13:14:15.566] base::sink(type = "output", split = FALSE) [13:14:15.566] if (TRUE) { [13:14:15.566] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:14:15.566] } [13:14:15.566] else { [13:14:15.566] ...future.result["stdout"] <- base::list(NULL) [13:14:15.566] } [13:14:15.566] base::close(...future.stdout) [13:14:15.566] ...future.stdout <- NULL [13:14:15.566] } [13:14:15.566] ...future.result$conditions <- ...future.conditions [13:14:15.566] ...future.result$finished <- base::Sys.time() [13:14:15.566] ...future.result [13:14:15.566] } [13:14:15.571] assign_globals() ... [13:14:15.571] List of 11 [13:14:15.571] $ ...future.FUN :function (x, ...) [13:14:15.571] $ x_FUN :function (x) [13:14:15.571] $ times : int 1 [13:14:15.571] $ stopf :function (fmt, ..., call. = TRUE, domain = NULL) [13:14:15.571] $ stop_if_not :function (...) [13:14:15.571] $ dim : NULL [13:14:15.571] $ valid_types : chr "character" [13:14:15.571] $ future.call.arguments : list() [13:14:15.571] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:14:15.571] $ ...future.elements_ii :List of 2 [13:14:15.571] ..$ x: int [1:10] 1 2 3 4 5 6 7 8 9 10 [13:14:15.571] ..$ y: chr [1:10] "a" "b" "c" "d" ... [13:14:15.571] $ ...future.seeds_ii : NULL [13:14:15.571] $ ...future.globals.maxSize: NULL [13:14:15.571] - attr(*, "where")=List of 11 [13:14:15.571] ..$ ...future.FUN : [13:14:15.571] ..$ x_FUN : [13:14:15.571] ..$ times : [13:14:15.571] ..$ stopf : [13:14:15.571] ..$ stop_if_not : [13:14:15.571] ..$ dim : [13:14:15.571] ..$ valid_types : [13:14:15.571] ..$ future.call.arguments : [13:14:15.571] ..$ ...future.elements_ii : [13:14:15.571] ..$ ...future.seeds_ii : [13:14:15.571] ..$ ...future.globals.maxSize: [13:14:15.571] - attr(*, "resolved")= logi FALSE [13:14:15.571] - attr(*, "total_size")= num 94208 [13:14:15.571] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:14:15.571] - attr(*, "already-done")= logi TRUE [13:14:15.581] - copied '...future.FUN' to environment [13:14:15.581] - copied 'x_FUN' to environment [13:14:15.581] - copied 'times' to environment [13:14:15.582] - copied 'stopf' to environment [13:14:15.582] - copied 'stop_if_not' to environment [13:14:15.582] - copied 'dim' to environment [13:14:15.582] - copied 'valid_types' to environment [13:14:15.582] - copied 'future.call.arguments' to environment [13:14:15.582] - copied '...future.elements_ii' to environment [13:14:15.582] - copied '...future.seeds_ii' to environment [13:14:15.583] - copied '...future.globals.maxSize' to environment [13:14:15.583] assign_globals() ... done [13:14:15.584] plan(): Setting new future strategy stack: [13:14:15.584] List of future strategies: [13:14:15.584] 1. sequential: [13:14:15.584] - args: function (..., envir = parent.frame(), workers = "") [13:14:15.584] - tweaked: FALSE [13:14:15.584] - call: NULL [13:14:15.584] plan(): nbrOfWorkers() = 1 [13:14:15.586] plan(): Setting new future strategy stack: [13:14:15.586] List of future strategies: [13:14:15.586] 1. sequential: [13:14:15.586] - args: function (..., envir = parent.frame(), workers = "") [13:14:15.586] - tweaked: FALSE [13:14:15.586] - call: plan(strategy) [13:14:15.587] plan(): nbrOfWorkers() = 1 [13:14:15.587] SequentialFuture started (and completed) [13:14:15.588] - Launch lazy future ... done [13:14:15.588] run() for 'SequentialFuture' ... done [13:14:15.588] Created future: [13:14:15.589] SequentialFuture: [13:14:15.589] Label: 'future_vapply-1' [13:14:15.589] Expression: [13:14:15.589] { [13:14:15.589] do.call(function(...) { [13:14:15.589] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:15.589] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:15.589] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:15.589] on.exit(options(oopts), add = TRUE) [13:14:15.589] } [13:14:15.589] { [13:14:15.589] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:15.589] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:15.589] ...future.FUN(...future.X_jj, ...) [13:14:15.589] }) [13:14:15.589] } [13:14:15.589] }, args = future.call.arguments) [13:14:15.589] } [13:14:15.589] Lazy evaluation: FALSE [13:14:15.589] Asynchronous evaluation: FALSE [13:14:15.589] Local evaluation: TRUE [13:14:15.589] Environment: R_GlobalEnv [13:14:15.589] Capture standard output: TRUE [13:14:15.589] Capture condition classes: 'condition' (excluding 'nothing') [13:14:15.589] Globals: 11 objects totaling 92.81 KiB (function '...future.FUN' of 21.22 KiB, function 'x_FUN' of 56 bytes, integer 'times' of 56 bytes, function 'stopf' of 26.43 KiB, function 'stop_if_not' of 44.12 KiB, ...) [13:14:15.589] Packages: 1 packages ('future.apply') [13:14:15.589] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:14:15.589] Resolved: TRUE [13:14:15.589] Value: 232 bytes of class 'list' [13:14:15.589] Early signaling: FALSE [13:14:15.589] Owner process: 1bb7d580-628d-c90d-e38a-66de485868c4 [13:14:15.589] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:14:15.590] Chunk #1 of 1 ... DONE [13:14:15.591] Launching 1 futures (chunks) ... DONE [13:14:15.591] Resolving 1 futures (chunks) ... [13:14:15.591] resolve() on list ... [13:14:15.591] recursive: 0 [13:14:15.591] length: 1 [13:14:15.592] [13:14:15.592] resolved() for 'SequentialFuture' ... [13:14:15.592] - state: 'finished' [13:14:15.592] - run: TRUE [13:14:15.592] - result: 'FutureResult' [13:14:15.593] resolved() for 'SequentialFuture' ... done [13:14:15.593] Future #1 [13:14:15.593] signalConditionsASAP(SequentialFuture, pos=1) ... [13:14:15.593] - nx: 1 [13:14:15.594] - relay: TRUE [13:14:15.594] - stdout: TRUE [13:14:15.594] - signal: TRUE [13:14:15.594] - resignal: FALSE [13:14:15.594] - force: TRUE [13:14:15.594] - relayed: [n=1] FALSE [13:14:15.594] - queued futures: [n=1] FALSE [13:14:15.595] - until=1 [13:14:15.595] - relaying element #1 [13:14:15.595] - relayed: [n=1] TRUE [13:14:15.595] - queued futures: [n=1] TRUE [13:14:15.595] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:14:15.596] length: 0 (resolved future 1) [13:14:15.596] Relaying remaining futures [13:14:15.596] signalConditionsASAP(NULL, pos=0) ... [13:14:15.596] - nx: 1 [13:14:15.596] - relay: TRUE [13:14:15.596] - stdout: TRUE [13:14:15.597] - signal: TRUE [13:14:15.597] - resignal: FALSE [13:14:15.597] - force: TRUE [13:14:15.597] - relayed: [n=1] TRUE [13:14:15.597] - queued futures: [n=1] TRUE - flush all [13:14:15.597] - relayed: [n=1] TRUE [13:14:15.598] - queued futures: [n=1] TRUE [13:14:15.598] signalConditionsASAP(NULL, pos=0) ... done [13:14:15.598] resolve() on list ... DONE [13:14:15.598] - Number of value chunks collected: 1 [13:14:15.598] Resolving 1 futures (chunks) ... DONE [13:14:15.598] Reducing values from 1 chunks ... [13:14:15.599] - Number of values collected after concatenation: 2 [13:14:15.599] - Number of values expected: 2 [13:14:15.599] Reducing values from 1 chunks ... DONE [13:14:15.599] future_lapply() ... DONE Named chr [1:2] "integer" "character" - attr(*, "names")= chr [1:2] "x" "y" num[0 , 1:10] [13:14:15.600] future_lapply() ... [13:14:15.603] Number of chunks: 1 [13:14:15.603] getGlobalsAndPackagesXApply() ... [13:14:15.603] - future.globals: TRUE [13:14:15.603] getGlobalsAndPackages() ... [13:14:15.604] Searching for globals... [13:14:15.609] - globals found: [17] 'FUN', '{', '<-', 'x_FUN', 'if', '!=', 'length', 'times', 'stopf', 'stop_if_not', 'all', '==', 'dim', '%in%', 'typeof', 'valid_types', 'double' [13:14:15.609] Searching for globals ... DONE [13:14:15.609] Resolving globals: FALSE [13:14:15.610] The total size of the 7 globals is 93.23 KiB (95472 bytes) [13:14:15.611] The total size of the 7 globals exported for future expression ('FUN()') is 93.23 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). The three largest globals are 'stop_if_not' (44.12 KiB of class 'function'), 'stopf' (26.43 KiB of class 'function') and 'FUN' (21.22 KiB of class 'function') [13:14:15.611] - globals: [7] 'FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types' [13:14:15.611] - packages: [1] 'future.apply' [13:14:15.611] getGlobalsAndPackages() ... DONE [13:14:15.611] - globals found/used: [n=7] 'FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types' [13:14:15.612] - needed namespaces: [n=1] 'future.apply' [13:14:15.612] Finding globals ... DONE [13:14:15.612] - use_args: TRUE [13:14:15.612] - Getting '...' globals ... [13:14:15.613] resolve() on list ... [13:14:15.613] recursive: 0 [13:14:15.613] length: 1 [13:14:15.613] elements: '...' [13:14:15.613] length: 0 (resolved future 1) [13:14:15.613] resolve() on list ... DONE [13:14:15.614] - '...' content: [n=0] [13:14:15.614] List of 1 [13:14:15.614] $ ...: list() [13:14:15.614] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:14:15.614] - attr(*, "where")=List of 1 [13:14:15.614] ..$ ...: [13:14:15.614] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:14:15.614] - attr(*, "resolved")= logi TRUE [13:14:15.614] - attr(*, "total_size")= num NA [13:14:15.617] - Getting '...' globals ... DONE [13:14:15.617] Globals to be used in all futures (chunks): [n=8] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...' [13:14:15.617] List of 8 [13:14:15.617] $ ...future.FUN:function (x, ...) [13:14:15.617] $ x_FUN :function (x) [13:14:15.617] $ times : int 0 [13:14:15.617] $ stopf :function (fmt, ..., call. = TRUE, domain = NULL) [13:14:15.617] $ stop_if_not :function (...) [13:14:15.617] $ dim : NULL [13:14:15.617] $ valid_types : chr [1:3] "logical" "integer" "double" [13:14:15.617] $ ... : list() [13:14:15.617] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:14:15.617] - attr(*, "where")=List of 8 [13:14:15.617] ..$ ...future.FUN: [13:14:15.617] ..$ x_FUN : [13:14:15.617] ..$ times : [13:14:15.617] ..$ stopf : [13:14:15.617] ..$ stop_if_not : [13:14:15.617] ..$ dim : [13:14:15.617] ..$ valid_types : [13:14:15.617] ..$ ... : [13:14:15.617] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:14:15.617] - attr(*, "resolved")= logi FALSE [13:14:15.617] - attr(*, "total_size")= num 95472 [13:14:15.623] Packages to be attached in all futures: [n=1] 'future.apply' [13:14:15.623] getGlobalsAndPackagesXApply() ... DONE [13:14:15.624] Number of futures (= number of chunks): 1 [13:14:15.624] Launching 1 futures (chunks) ... [13:14:15.624] Chunk #1 of 1 ... [13:14:15.624] - Finding globals in 'X' for chunk #1 ... [13:14:15.624] getGlobalsAndPackages() ... [13:14:15.625] Searching for globals... [13:14:15.625] [13:14:15.625] Searching for globals ... DONE [13:14:15.625] - globals: [0] [13:14:15.625] getGlobalsAndPackages() ... DONE [13:14:15.625] + additional globals found: [n=0] [13:14:15.626] + additional namespaces needed: [n=0] [13:14:15.626] - Finding globals in 'X' for chunk #1 ... DONE [13:14:15.626] - seeds: [13:14:15.626] - All globals exported: [n=11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:15.626] getGlobalsAndPackages() ... [13:14:15.626] - globals passed as-is: [11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:15.627] Resolving globals: FALSE [13:14:15.627] Tweak future expression to call with '...' arguments ... [13:14:15.627] { [13:14:15.627] do.call(function(...) { [13:14:15.627] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:15.627] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:15.627] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:15.627] on.exit(options(oopts), add = TRUE) [13:14:15.627] } [13:14:15.627] { [13:14:15.627] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:15.627] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:15.627] ...future.FUN(...future.X_jj, ...) [13:14:15.627] }) [13:14:15.627] } [13:14:15.627] }, args = future.call.arguments) [13:14:15.627] } [13:14:15.627] Tweak future expression to call with '...' arguments ... DONE [13:14:15.629] - globals: [11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:15.629] - packages: [1] 'future.apply' [13:14:15.629] getGlobalsAndPackages() ... DONE [13:14:15.630] run() for 'Future' ... [13:14:15.630] - state: 'created' [13:14:15.630] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:14:15.630] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:14:15.631] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:14:15.631] - Field: 'label' [13:14:15.631] - Field: 'local' [13:14:15.631] - Field: 'owner' [13:14:15.631] - Field: 'envir' [13:14:15.631] - Field: 'packages' [13:14:15.632] - Field: 'gc' [13:14:15.632] - Field: 'conditions' [13:14:15.632] - Field: 'expr' [13:14:15.632] - Field: 'uuid' [13:14:15.632] - Field: 'seed' [13:14:15.632] - Field: 'version' [13:14:15.633] - Field: 'result' [13:14:15.633] - Field: 'asynchronous' [13:14:15.633] - Field: 'calls' [13:14:15.633] - Field: 'globals' [13:14:15.633] - Field: 'stdout' [13:14:15.633] - Field: 'earlySignal' [13:14:15.634] - Field: 'lazy' [13:14:15.634] - Field: 'state' [13:14:15.634] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:14:15.634] - Launch lazy future ... [13:14:15.634] Packages needed by the future expression (n = 1): 'future.apply' [13:14:15.635] Packages needed by future strategies (n = 0): [13:14:15.635] { [13:14:15.635] { [13:14:15.635] { [13:14:15.635] ...future.startTime <- base::Sys.time() [13:14:15.635] { [13:14:15.635] { [13:14:15.635] { [13:14:15.635] { [13:14:15.635] base::local({ [13:14:15.635] has_future <- base::requireNamespace("future", [13:14:15.635] quietly = TRUE) [13:14:15.635] if (has_future) { [13:14:15.635] ns <- base::getNamespace("future") [13:14:15.635] version <- ns[[".package"]][["version"]] [13:14:15.635] if (is.null(version)) [13:14:15.635] version <- utils::packageVersion("future") [13:14:15.635] } [13:14:15.635] else { [13:14:15.635] version <- NULL [13:14:15.635] } [13:14:15.635] if (!has_future || version < "1.8.0") { [13:14:15.635] info <- base::c(r_version = base::gsub("R version ", [13:14:15.635] "", base::R.version$version.string), [13:14:15.635] platform = base::sprintf("%s (%s-bit)", [13:14:15.635] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:14:15.635] os = base::paste(base::Sys.info()[base::c("sysname", [13:14:15.635] "release", "version")], collapse = " "), [13:14:15.635] hostname = base::Sys.info()[["nodename"]]) [13:14:15.635] info <- base::sprintf("%s: %s", base::names(info), [13:14:15.635] info) [13:14:15.635] info <- base::paste(info, collapse = "; ") [13:14:15.635] if (!has_future) { [13:14:15.635] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:14:15.635] info) [13:14:15.635] } [13:14:15.635] else { [13:14:15.635] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:14:15.635] info, version) [13:14:15.635] } [13:14:15.635] base::stop(msg) [13:14:15.635] } [13:14:15.635] }) [13:14:15.635] } [13:14:15.635] base::local({ [13:14:15.635] for (pkg in "future.apply") { [13:14:15.635] base::loadNamespace(pkg) [13:14:15.635] base::library(pkg, character.only = TRUE) [13:14:15.635] } [13:14:15.635] }) [13:14:15.635] } [13:14:15.635] options(future.plan = NULL) [13:14:15.635] Sys.unsetenv("R_FUTURE_PLAN") [13:14:15.635] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:14:15.635] } [13:14:15.635] ...future.workdir <- getwd() [13:14:15.635] } [13:14:15.635] ...future.oldOptions <- base::as.list(base::.Options) [13:14:15.635] ...future.oldEnvVars <- base::Sys.getenv() [13:14:15.635] } [13:14:15.635] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:14:15.635] future.globals.maxSize = NULL, future.globals.method = NULL, [13:14:15.635] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:14:15.635] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:14:15.635] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:14:15.635] future.stdout.windows.reencode = NULL, width = 80L) [13:14:15.635] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:14:15.635] base::names(...future.oldOptions)) [13:14:15.635] } [13:14:15.635] if (FALSE) { [13:14:15.635] } [13:14:15.635] else { [13:14:15.635] if (TRUE) { [13:14:15.635] ...future.stdout <- base::rawConnection(base::raw(0L), [13:14:15.635] open = "w") [13:14:15.635] } [13:14:15.635] else { [13:14:15.635] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:14:15.635] windows = "NUL", "/dev/null"), open = "w") [13:14:15.635] } [13:14:15.635] base::sink(...future.stdout, type = "output", split = FALSE) [13:14:15.635] base::on.exit(if (!base::is.null(...future.stdout)) { [13:14:15.635] base::sink(type = "output", split = FALSE) [13:14:15.635] base::close(...future.stdout) [13:14:15.635] }, add = TRUE) [13:14:15.635] } [13:14:15.635] ...future.frame <- base::sys.nframe() [13:14:15.635] ...future.conditions <- base::list() [13:14:15.635] ...future.rng <- base::globalenv()$.Random.seed [13:14:15.635] if (FALSE) { [13:14:15.635] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:14:15.635] "...future.value", "...future.globalenv.names", ".Random.seed") [13:14:15.635] } [13:14:15.635] ...future.result <- base::tryCatch({ [13:14:15.635] base::withCallingHandlers({ [13:14:15.635] ...future.value <- base::withVisible(base::local({ [13:14:15.635] do.call(function(...) { [13:14:15.635] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:15.635] if (!identical(...future.globals.maxSize.org, [13:14:15.635] ...future.globals.maxSize)) { [13:14:15.635] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:15.635] on.exit(options(oopts), add = TRUE) [13:14:15.635] } [13:14:15.635] { [13:14:15.635] lapply(seq_along(...future.elements_ii), [13:14:15.635] FUN = function(jj) { [13:14:15.635] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:15.635] ...future.FUN(...future.X_jj, ...) [13:14:15.635] }) [13:14:15.635] } [13:14:15.635] }, args = future.call.arguments) [13:14:15.635] })) [13:14:15.635] future::FutureResult(value = ...future.value$value, [13:14:15.635] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:14:15.635] ...future.rng), globalenv = if (FALSE) [13:14:15.635] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:14:15.635] ...future.globalenv.names)) [13:14:15.635] else NULL, started = ...future.startTime, version = "1.8") [13:14:15.635] }, condition = base::local({ [13:14:15.635] c <- base::c [13:14:15.635] inherits <- base::inherits [13:14:15.635] invokeRestart <- base::invokeRestart [13:14:15.635] length <- base::length [13:14:15.635] list <- base::list [13:14:15.635] seq.int <- base::seq.int [13:14:15.635] signalCondition <- base::signalCondition [13:14:15.635] sys.calls <- base::sys.calls [13:14:15.635] `[[` <- base::`[[` [13:14:15.635] `+` <- base::`+` [13:14:15.635] `<<-` <- base::`<<-` [13:14:15.635] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:14:15.635] calls[seq.int(from = from + 12L, to = length(calls) - [13:14:15.635] 3L)] [13:14:15.635] } [13:14:15.635] function(cond) { [13:14:15.635] is_error <- inherits(cond, "error") [13:14:15.635] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:14:15.635] NULL) [13:14:15.635] if (is_error) { [13:14:15.635] sessionInformation <- function() { [13:14:15.635] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:14:15.635] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:14:15.635] search = base::search(), system = base::Sys.info()) [13:14:15.635] } [13:14:15.635] ...future.conditions[[length(...future.conditions) + [13:14:15.635] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:14:15.635] cond$call), session = sessionInformation(), [13:14:15.635] timestamp = base::Sys.time(), signaled = 0L) [13:14:15.635] signalCondition(cond) [13:14:15.635] } [13:14:15.635] else if (!ignore && TRUE && inherits(cond, c("condition", [13:14:15.635] "immediateCondition"))) { [13:14:15.635] signal <- TRUE && inherits(cond, "immediateCondition") [13:14:15.635] ...future.conditions[[length(...future.conditions) + [13:14:15.635] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:14:15.635] if (TRUE && !signal) { [13:14:15.635] muffleCondition <- function (cond, pattern = "^muffle") [13:14:15.635] { [13:14:15.635] inherits <- base::inherits [13:14:15.635] invokeRestart <- base::invokeRestart [13:14:15.635] is.null <- base::is.null [13:14:15.635] muffled <- FALSE [13:14:15.635] if (inherits(cond, "message")) { [13:14:15.635] muffled <- grepl(pattern, "muffleMessage") [13:14:15.635] if (muffled) [13:14:15.635] invokeRestart("muffleMessage") [13:14:15.635] } [13:14:15.635] else if (inherits(cond, "warning")) { [13:14:15.635] muffled <- grepl(pattern, "muffleWarning") [13:14:15.635] if (muffled) [13:14:15.635] invokeRestart("muffleWarning") [13:14:15.635] } [13:14:15.635] else if (inherits(cond, "condition")) { [13:14:15.635] if (!is.null(pattern)) { [13:14:15.635] computeRestarts <- base::computeRestarts [13:14:15.635] grepl <- base::grepl [13:14:15.635] restarts <- computeRestarts(cond) [13:14:15.635] for (restart in restarts) { [13:14:15.635] name <- restart$name [13:14:15.635] if (is.null(name)) [13:14:15.635] next [13:14:15.635] if (!grepl(pattern, name)) [13:14:15.635] next [13:14:15.635] invokeRestart(restart) [13:14:15.635] muffled <- TRUE [13:14:15.635] break [13:14:15.635] } [13:14:15.635] } [13:14:15.635] } [13:14:15.635] invisible(muffled) [13:14:15.635] } [13:14:15.635] muffleCondition(cond, pattern = "^muffle") [13:14:15.635] } [13:14:15.635] } [13:14:15.635] else { [13:14:15.635] if (TRUE) { [13:14:15.635] muffleCondition <- function (cond, pattern = "^muffle") [13:14:15.635] { [13:14:15.635] inherits <- base::inherits [13:14:15.635] invokeRestart <- base::invokeRestart [13:14:15.635] is.null <- base::is.null [13:14:15.635] muffled <- FALSE [13:14:15.635] if (inherits(cond, "message")) { [13:14:15.635] muffled <- grepl(pattern, "muffleMessage") [13:14:15.635] if (muffled) [13:14:15.635] invokeRestart("muffleMessage") [13:14:15.635] } [13:14:15.635] else if (inherits(cond, "warning")) { [13:14:15.635] muffled <- grepl(pattern, "muffleWarning") [13:14:15.635] if (muffled) [13:14:15.635] invokeRestart("muffleWarning") [13:14:15.635] } [13:14:15.635] else if (inherits(cond, "condition")) { [13:14:15.635] if (!is.null(pattern)) { [13:14:15.635] computeRestarts <- base::computeRestarts [13:14:15.635] grepl <- base::grepl [13:14:15.635] restarts <- computeRestarts(cond) [13:14:15.635] for (restart in restarts) { [13:14:15.635] name <- restart$name [13:14:15.635] if (is.null(name)) [13:14:15.635] next [13:14:15.635] if (!grepl(pattern, name)) [13:14:15.635] next [13:14:15.635] invokeRestart(restart) [13:14:15.635] muffled <- TRUE [13:14:15.635] break [13:14:15.635] } [13:14:15.635] } [13:14:15.635] } [13:14:15.635] invisible(muffled) [13:14:15.635] } [13:14:15.635] muffleCondition(cond, pattern = "^muffle") [13:14:15.635] } [13:14:15.635] } [13:14:15.635] } [13:14:15.635] })) [13:14:15.635] }, error = function(ex) { [13:14:15.635] base::structure(base::list(value = NULL, visible = NULL, [13:14:15.635] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:14:15.635] ...future.rng), started = ...future.startTime, [13:14:15.635] finished = Sys.time(), session_uuid = NA_character_, [13:14:15.635] version = "1.8"), class = "FutureResult") [13:14:15.635] }, finally = { [13:14:15.635] if (!identical(...future.workdir, getwd())) [13:14:15.635] setwd(...future.workdir) [13:14:15.635] { [13:14:15.635] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:14:15.635] ...future.oldOptions$nwarnings <- NULL [13:14:15.635] } [13:14:15.635] base::options(...future.oldOptions) [13:14:15.635] if (.Platform$OS.type == "windows") { [13:14:15.635] old_names <- names(...future.oldEnvVars) [13:14:15.635] envs <- base::Sys.getenv() [13:14:15.635] names <- names(envs) [13:14:15.635] common <- intersect(names, old_names) [13:14:15.635] added <- setdiff(names, old_names) [13:14:15.635] removed <- setdiff(old_names, names) [13:14:15.635] changed <- common[...future.oldEnvVars[common] != [13:14:15.635] envs[common]] [13:14:15.635] NAMES <- toupper(changed) [13:14:15.635] args <- list() [13:14:15.635] for (kk in seq_along(NAMES)) { [13:14:15.635] name <- changed[[kk]] [13:14:15.635] NAME <- NAMES[[kk]] [13:14:15.635] if (name != NAME && is.element(NAME, old_names)) [13:14:15.635] next [13:14:15.635] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:15.635] } [13:14:15.635] NAMES <- toupper(added) [13:14:15.635] for (kk in seq_along(NAMES)) { [13:14:15.635] name <- added[[kk]] [13:14:15.635] NAME <- NAMES[[kk]] [13:14:15.635] if (name != NAME && is.element(NAME, old_names)) [13:14:15.635] next [13:14:15.635] args[[name]] <- "" [13:14:15.635] } [13:14:15.635] NAMES <- toupper(removed) [13:14:15.635] for (kk in seq_along(NAMES)) { [13:14:15.635] name <- removed[[kk]] [13:14:15.635] NAME <- NAMES[[kk]] [13:14:15.635] if (name != NAME && is.element(NAME, old_names)) [13:14:15.635] next [13:14:15.635] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:15.635] } [13:14:15.635] if (length(args) > 0) [13:14:15.635] base::do.call(base::Sys.setenv, args = args) [13:14:15.635] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:14:15.635] } [13:14:15.635] else { [13:14:15.635] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:14:15.635] } [13:14:15.635] { [13:14:15.635] if (base::length(...future.futureOptionsAdded) > [13:14:15.635] 0L) { [13:14:15.635] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:14:15.635] base::names(opts) <- ...future.futureOptionsAdded [13:14:15.635] base::options(opts) [13:14:15.635] } [13:14:15.635] { [13:14:15.635] { [13:14:15.635] NULL [13:14:15.635] RNGkind("Mersenne-Twister") [13:14:15.635] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:14:15.635] inherits = FALSE) [13:14:15.635] } [13:14:15.635] options(future.plan = NULL) [13:14:15.635] if (is.na(NA_character_)) [13:14:15.635] Sys.unsetenv("R_FUTURE_PLAN") [13:14:15.635] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:14:15.635] future::plan(list(function (..., envir = parent.frame()) [13:14:15.635] { [13:14:15.635] future <- SequentialFuture(..., envir = envir) [13:14:15.635] if (!future$lazy) [13:14:15.635] future <- run(future) [13:14:15.635] invisible(future) [13:14:15.635] }), .cleanup = FALSE, .init = FALSE) [13:14:15.635] } [13:14:15.635] } [13:14:15.635] } [13:14:15.635] }) [13:14:15.635] if (TRUE) { [13:14:15.635] base::sink(type = "output", split = FALSE) [13:14:15.635] if (TRUE) { [13:14:15.635] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:14:15.635] } [13:14:15.635] else { [13:14:15.635] ...future.result["stdout"] <- base::list(NULL) [13:14:15.635] } [13:14:15.635] base::close(...future.stdout) [13:14:15.635] ...future.stdout <- NULL [13:14:15.635] } [13:14:15.635] ...future.result$conditions <- ...future.conditions [13:14:15.635] ...future.result$finished <- base::Sys.time() [13:14:15.635] ...future.result [13:14:15.635] } [13:14:15.639] assign_globals() ... [13:14:15.639] List of 11 [13:14:15.639] $ ...future.FUN :function (x, ...) [13:14:15.639] $ x_FUN :function (x) [13:14:15.639] $ times : int 0 [13:14:15.639] $ stopf :function (fmt, ..., call. = TRUE, domain = NULL) [13:14:15.639] $ stop_if_not :function (...) [13:14:15.639] $ dim : NULL [13:14:15.639] $ valid_types : chr [1:3] "logical" "integer" "double" [13:14:15.639] $ future.call.arguments : list() [13:14:15.639] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:14:15.639] $ ...future.elements_ii :List of 10 [13:14:15.639] ..$ : int 1 [13:14:15.639] ..$ : int 2 [13:14:15.639] ..$ : int 3 [13:14:15.639] ..$ : int 4 [13:14:15.639] ..$ : int 5 [13:14:15.639] ..$ : int 6 [13:14:15.639] ..$ : int 7 [13:14:15.639] ..$ : int 8 [13:14:15.639] ..$ : int 9 [13:14:15.639] ..$ : int 10 [13:14:15.639] $ ...future.seeds_ii : NULL [13:14:15.639] $ ...future.globals.maxSize: NULL [13:14:15.639] - attr(*, "where")=List of 11 [13:14:15.639] ..$ ...future.FUN : [13:14:15.639] ..$ x_FUN : [13:14:15.639] ..$ times : [13:14:15.639] ..$ stopf : [13:14:15.639] ..$ stop_if_not : [13:14:15.639] ..$ dim : [13:14:15.639] ..$ valid_types : [13:14:15.639] ..$ future.call.arguments : [13:14:15.639] ..$ ...future.elements_ii : [13:14:15.639] ..$ ...future.seeds_ii : [13:14:15.639] ..$ ...future.globals.maxSize: [13:14:15.639] - attr(*, "resolved")= logi FALSE [13:14:15.639] - attr(*, "total_size")= num 95472 [13:14:15.639] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:14:15.639] - attr(*, "already-done")= logi TRUE [13:14:15.651] - copied '...future.FUN' to environment [13:14:15.651] - reassign environment for 'x_FUN' [13:14:15.651] - copied 'x_FUN' to environment [13:14:15.652] - copied 'times' to environment [13:14:15.652] - copied 'stopf' to environment [13:14:15.652] - copied 'stop_if_not' to environment [13:14:15.652] - copied 'dim' to environment [13:14:15.652] - copied 'valid_types' to environment [13:14:15.652] - copied 'future.call.arguments' to environment [13:14:15.653] - copied '...future.elements_ii' to environment [13:14:15.653] - copied '...future.seeds_ii' to environment [13:14:15.653] - copied '...future.globals.maxSize' to environment [13:14:15.653] assign_globals() ... done [13:14:15.654] plan(): Setting new future strategy stack: [13:14:15.654] List of future strategies: [13:14:15.654] 1. sequential: [13:14:15.654] - args: function (..., envir = parent.frame(), workers = "") [13:14:15.654] - tweaked: FALSE [13:14:15.654] - call: NULL [13:14:15.655] plan(): nbrOfWorkers() = 1 [13:14:15.656] plan(): Setting new future strategy stack: [13:14:15.656] List of future strategies: [13:14:15.656] 1. sequential: [13:14:15.656] - args: function (..., envir = parent.frame(), workers = "") [13:14:15.656] - tweaked: FALSE [13:14:15.656] - call: plan(strategy) [13:14:15.657] plan(): nbrOfWorkers() = 1 [13:14:15.657] SequentialFuture started (and completed) [13:14:15.658] - Launch lazy future ... done [13:14:15.658] run() for 'SequentialFuture' ... done [13:14:15.658] Created future: [13:14:15.658] SequentialFuture: [13:14:15.658] Label: 'future_vapply-1' [13:14:15.658] Expression: [13:14:15.658] { [13:14:15.658] do.call(function(...) { [13:14:15.658] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:15.658] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:15.658] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:15.658] on.exit(options(oopts), add = TRUE) [13:14:15.658] } [13:14:15.658] { [13:14:15.658] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:15.658] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:15.658] ...future.FUN(...future.X_jj, ...) [13:14:15.658] }) [13:14:15.658] } [13:14:15.658] }, args = future.call.arguments) [13:14:15.658] } [13:14:15.658] Lazy evaluation: FALSE [13:14:15.658] Asynchronous evaluation: FALSE [13:14:15.658] Local evaluation: TRUE [13:14:15.658] Environment: R_GlobalEnv [13:14:15.658] Capture standard output: TRUE [13:14:15.658] Capture condition classes: 'condition' (excluding 'nothing') [13:14:15.658] Globals: 11 objects totaling 93.78 KiB (function '...future.FUN' of 21.22 KiB, function 'x_FUN' of 1.16 KiB, integer 'times' of 56 bytes, function 'stopf' of 26.43 KiB, function 'stop_if_not' of 44.12 KiB, ...) [13:14:15.658] Packages: 1 packages ('future.apply') [13:14:15.658] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:14:15.658] Resolved: TRUE [13:14:15.658] Value: 480 bytes of class 'list' [13:14:15.658] Early signaling: FALSE [13:14:15.658] Owner process: 1bb7d580-628d-c90d-e38a-66de485868c4 [13:14:15.658] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:14:15.659] Chunk #1 of 1 ... DONE [13:14:15.660] Launching 1 futures (chunks) ... DONE [13:14:15.660] Resolving 1 futures (chunks) ... [13:14:15.660] resolve() on list ... [13:14:15.660] recursive: 0 [13:14:15.660] length: 1 [13:14:15.660] [13:14:15.661] resolved() for 'SequentialFuture' ... [13:14:15.661] - state: 'finished' [13:14:15.661] - run: TRUE [13:14:15.661] - result: 'FutureResult' [13:14:15.661] resolved() for 'SequentialFuture' ... done [13:14:15.662] Future #1 [13:14:15.662] signalConditionsASAP(SequentialFuture, pos=1) ... [13:14:15.662] - nx: 1 [13:14:15.662] - relay: TRUE [13:14:15.662] - stdout: TRUE [13:14:15.662] - signal: TRUE [13:14:15.662] - resignal: FALSE [13:14:15.663] - force: TRUE [13:14:15.663] - relayed: [n=1] FALSE [13:14:15.663] - queued futures: [n=1] FALSE [13:14:15.663] - until=1 [13:14:15.663] - relaying element #1 [13:14:15.664] - relayed: [n=1] TRUE [13:14:15.664] - queued futures: [n=1] TRUE [13:14:15.664] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:14:15.664] length: 0 (resolved future 1) [13:14:15.664] Relaying remaining futures [13:14:15.664] signalConditionsASAP(NULL, pos=0) ... [13:14:15.664] - nx: 1 [13:14:15.665] - relay: TRUE [13:14:15.665] - stdout: TRUE [13:14:15.665] - signal: TRUE [13:14:15.665] - resignal: FALSE [13:14:15.665] - force: TRUE [13:14:15.665] - relayed: [n=1] TRUE [13:14:15.665] - queued futures: [n=1] TRUE - flush all [13:14:15.666] - relayed: [n=1] TRUE [13:14:15.666] - queued futures: [n=1] TRUE [13:14:15.666] signalConditionsASAP(NULL, pos=0) ... done [13:14:15.666] resolve() on list ... DONE [13:14:15.666] - Number of value chunks collected: 1 [13:14:15.667] Resolving 1 futures (chunks) ... DONE [13:14:15.667] Reducing values from 1 chunks ... [13:14:15.667] - Number of values collected after concatenation: 10 [13:14:15.667] - Number of values expected: 10 [13:14:15.667] Reducing values from 1 chunks ... DONE [13:14:15.667] future_lapply() ... DONE num[0 , 1:10] int[0 , 1:10] [13:14:15.668] future_lapply() ... [13:14:15.671] Number of chunks: 1 [13:14:15.671] getGlobalsAndPackagesXApply() ... [13:14:15.671] - future.globals: TRUE [13:14:15.671] getGlobalsAndPackages() ... [13:14:15.671] Searching for globals... [13:14:15.676] - globals found: [17] 'FUN', '{', '<-', 'x_FUN', 'if', '!=', 'length', 'times', 'stopf', 'stop_if_not', 'all', '==', 'dim', '%in%', 'typeof', 'valid_types', 'integer' [13:14:15.676] Searching for globals ... DONE [13:14:15.676] Resolving globals: FALSE [13:14:15.677] The total size of the 7 globals is 93.16 KiB (95400 bytes) [13:14:15.677] The total size of the 7 globals exported for future expression ('FUN()') is 93.16 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). The three largest globals are 'stop_if_not' (44.12 KiB of class 'function'), 'stopf' (26.43 KiB of class 'function') and 'FUN' (21.22 KiB of class 'function') [13:14:15.678] - globals: [7] 'FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types' [13:14:15.679] - packages: [1] 'future.apply' [13:14:15.679] getGlobalsAndPackages() ... DONE [13:14:15.679] - globals found/used: [n=7] 'FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types' [13:14:15.679] - needed namespaces: [n=1] 'future.apply' [13:14:15.679] Finding globals ... DONE [13:14:15.679] - use_args: TRUE [13:14:15.680] - Getting '...' globals ... [13:14:15.680] resolve() on list ... [13:14:15.680] recursive: 0 [13:14:15.680] length: 1 [13:14:15.680] elements: '...' [13:14:15.681] length: 0 (resolved future 1) [13:14:15.681] resolve() on list ... DONE [13:14:15.681] - '...' content: [n=0] [13:14:15.681] List of 1 [13:14:15.681] $ ...: list() [13:14:15.681] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:14:15.681] - attr(*, "where")=List of 1 [13:14:15.681] ..$ ...: [13:14:15.681] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:14:15.681] - attr(*, "resolved")= logi TRUE [13:14:15.681] - attr(*, "total_size")= num NA [13:14:15.684] - Getting '...' globals ... DONE [13:14:15.684] Globals to be used in all futures (chunks): [n=8] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...' [13:14:15.684] List of 8 [13:14:15.684] $ ...future.FUN:function (x, ...) [13:14:15.684] $ x_FUN :function (x) [13:14:15.684] $ times : int 0 [13:14:15.684] $ stopf :function (fmt, ..., call. = TRUE, domain = NULL) [13:14:15.684] $ stop_if_not :function (...) [13:14:15.684] $ dim : NULL [13:14:15.684] $ valid_types : chr [1:2] "logical" "integer" [13:14:15.684] $ ... : list() [13:14:15.684] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:14:15.684] - attr(*, "where")=List of 8 [13:14:15.684] ..$ ...future.FUN: [13:14:15.684] ..$ x_FUN : [13:14:15.684] ..$ times : [13:14:15.684] ..$ stopf : [13:14:15.684] ..$ stop_if_not : [13:14:15.684] ..$ dim : [13:14:15.684] ..$ valid_types : [13:14:15.684] ..$ ... : [13:14:15.684] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:14:15.684] - attr(*, "resolved")= logi FALSE [13:14:15.684] - attr(*, "total_size")= num 95400 [13:14:15.691] Packages to be attached in all futures: [n=1] 'future.apply' [13:14:15.691] getGlobalsAndPackagesXApply() ... DONE [13:14:15.691] Number of futures (= number of chunks): 1 [13:14:15.691] Launching 1 futures (chunks) ... [13:14:15.692] Chunk #1 of 1 ... [13:14:15.692] - Finding globals in 'X' for chunk #1 ... [13:14:15.692] getGlobalsAndPackages() ... [13:14:15.692] Searching for globals... [13:14:15.692] [13:14:15.692] Searching for globals ... DONE [13:14:15.693] - globals: [0] [13:14:15.693] getGlobalsAndPackages() ... DONE [13:14:15.693] + additional globals found: [n=0] [13:14:15.693] + additional namespaces needed: [n=0] [13:14:15.693] - Finding globals in 'X' for chunk #1 ... DONE [13:14:15.693] - seeds: [13:14:15.694] - All globals exported: [n=11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:15.694] getGlobalsAndPackages() ... [13:14:15.694] - globals passed as-is: [11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:15.694] Resolving globals: FALSE [13:14:15.694] Tweak future expression to call with '...' arguments ... [13:14:15.694] { [13:14:15.694] do.call(function(...) { [13:14:15.694] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:15.694] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:15.694] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:15.694] on.exit(options(oopts), add = TRUE) [13:14:15.694] } [13:14:15.694] { [13:14:15.694] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:15.694] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:15.694] ...future.FUN(...future.X_jj, ...) [13:14:15.694] }) [13:14:15.694] } [13:14:15.694] }, args = future.call.arguments) [13:14:15.694] } [13:14:15.695] Tweak future expression to call with '...' arguments ... DONE [13:14:15.696] - globals: [11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:15.696] - packages: [1] 'future.apply' [13:14:15.696] getGlobalsAndPackages() ... DONE [13:14:15.696] run() for 'Future' ... [13:14:15.696] - state: 'created' [13:14:15.697] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:14:15.697] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:14:15.697] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:14:15.697] - Field: 'label' [13:14:15.698] - Field: 'local' [13:14:15.698] - Field: 'owner' [13:14:15.698] - Field: 'envir' [13:14:15.698] - Field: 'packages' [13:14:15.698] - Field: 'gc' [13:14:15.698] - Field: 'conditions' [13:14:15.699] - Field: 'expr' [13:14:15.699] - Field: 'uuid' [13:14:15.699] - Field: 'seed' [13:14:15.699] - Field: 'version' [13:14:15.699] - Field: 'result' [13:14:15.699] - Field: 'asynchronous' [13:14:15.700] - Field: 'calls' [13:14:15.700] - Field: 'globals' [13:14:15.700] - Field: 'stdout' [13:14:15.700] - Field: 'earlySignal' [13:14:15.700] - Field: 'lazy' [13:14:15.700] - Field: 'state' [13:14:15.701] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:14:15.701] - Launch lazy future ... [13:14:15.702] Packages needed by the future expression (n = 1): 'future.apply' [13:14:15.702] Packages needed by future strategies (n = 0): [13:14:15.703] { [13:14:15.703] { [13:14:15.703] { [13:14:15.703] ...future.startTime <- base::Sys.time() [13:14:15.703] { [13:14:15.703] { [13:14:15.703] { [13:14:15.703] { [13:14:15.703] base::local({ [13:14:15.703] has_future <- base::requireNamespace("future", [13:14:15.703] quietly = TRUE) [13:14:15.703] if (has_future) { [13:14:15.703] ns <- base::getNamespace("future") [13:14:15.703] version <- ns[[".package"]][["version"]] [13:14:15.703] if (is.null(version)) [13:14:15.703] version <- utils::packageVersion("future") [13:14:15.703] } [13:14:15.703] else { [13:14:15.703] version <- NULL [13:14:15.703] } [13:14:15.703] if (!has_future || version < "1.8.0") { [13:14:15.703] info <- base::c(r_version = base::gsub("R version ", [13:14:15.703] "", base::R.version$version.string), [13:14:15.703] platform = base::sprintf("%s (%s-bit)", [13:14:15.703] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:14:15.703] os = base::paste(base::Sys.info()[base::c("sysname", [13:14:15.703] "release", "version")], collapse = " "), [13:14:15.703] hostname = base::Sys.info()[["nodename"]]) [13:14:15.703] info <- base::sprintf("%s: %s", base::names(info), [13:14:15.703] info) [13:14:15.703] info <- base::paste(info, collapse = "; ") [13:14:15.703] if (!has_future) { [13:14:15.703] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:14:15.703] info) [13:14:15.703] } [13:14:15.703] else { [13:14:15.703] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:14:15.703] info, version) [13:14:15.703] } [13:14:15.703] base::stop(msg) [13:14:15.703] } [13:14:15.703] }) [13:14:15.703] } [13:14:15.703] base::local({ [13:14:15.703] for (pkg in "future.apply") { [13:14:15.703] base::loadNamespace(pkg) [13:14:15.703] base::library(pkg, character.only = TRUE) [13:14:15.703] } [13:14:15.703] }) [13:14:15.703] } [13:14:15.703] options(future.plan = NULL) [13:14:15.703] Sys.unsetenv("R_FUTURE_PLAN") [13:14:15.703] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:14:15.703] } [13:14:15.703] ...future.workdir <- getwd() [13:14:15.703] } [13:14:15.703] ...future.oldOptions <- base::as.list(base::.Options) [13:14:15.703] ...future.oldEnvVars <- base::Sys.getenv() [13:14:15.703] } [13:14:15.703] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:14:15.703] future.globals.maxSize = NULL, future.globals.method = NULL, [13:14:15.703] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:14:15.703] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:14:15.703] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:14:15.703] future.stdout.windows.reencode = NULL, width = 80L) [13:14:15.703] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:14:15.703] base::names(...future.oldOptions)) [13:14:15.703] } [13:14:15.703] if (FALSE) { [13:14:15.703] } [13:14:15.703] else { [13:14:15.703] if (TRUE) { [13:14:15.703] ...future.stdout <- base::rawConnection(base::raw(0L), [13:14:15.703] open = "w") [13:14:15.703] } [13:14:15.703] else { [13:14:15.703] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:14:15.703] windows = "NUL", "/dev/null"), open = "w") [13:14:15.703] } [13:14:15.703] base::sink(...future.stdout, type = "output", split = FALSE) [13:14:15.703] base::on.exit(if (!base::is.null(...future.stdout)) { [13:14:15.703] base::sink(type = "output", split = FALSE) [13:14:15.703] base::close(...future.stdout) [13:14:15.703] }, add = TRUE) [13:14:15.703] } [13:14:15.703] ...future.frame <- base::sys.nframe() [13:14:15.703] ...future.conditions <- base::list() [13:14:15.703] ...future.rng <- base::globalenv()$.Random.seed [13:14:15.703] if (FALSE) { [13:14:15.703] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:14:15.703] "...future.value", "...future.globalenv.names", ".Random.seed") [13:14:15.703] } [13:14:15.703] ...future.result <- base::tryCatch({ [13:14:15.703] base::withCallingHandlers({ [13:14:15.703] ...future.value <- base::withVisible(base::local({ [13:14:15.703] do.call(function(...) { [13:14:15.703] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:15.703] if (!identical(...future.globals.maxSize.org, [13:14:15.703] ...future.globals.maxSize)) { [13:14:15.703] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:15.703] on.exit(options(oopts), add = TRUE) [13:14:15.703] } [13:14:15.703] { [13:14:15.703] lapply(seq_along(...future.elements_ii), [13:14:15.703] FUN = function(jj) { [13:14:15.703] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:15.703] ...future.FUN(...future.X_jj, ...) [13:14:15.703] }) [13:14:15.703] } [13:14:15.703] }, args = future.call.arguments) [13:14:15.703] })) [13:14:15.703] future::FutureResult(value = ...future.value$value, [13:14:15.703] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:14:15.703] ...future.rng), globalenv = if (FALSE) [13:14:15.703] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:14:15.703] ...future.globalenv.names)) [13:14:15.703] else NULL, started = ...future.startTime, version = "1.8") [13:14:15.703] }, condition = base::local({ [13:14:15.703] c <- base::c [13:14:15.703] inherits <- base::inherits [13:14:15.703] invokeRestart <- base::invokeRestart [13:14:15.703] length <- base::length [13:14:15.703] list <- base::list [13:14:15.703] seq.int <- base::seq.int [13:14:15.703] signalCondition <- base::signalCondition [13:14:15.703] sys.calls <- base::sys.calls [13:14:15.703] `[[` <- base::`[[` [13:14:15.703] `+` <- base::`+` [13:14:15.703] `<<-` <- base::`<<-` [13:14:15.703] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:14:15.703] calls[seq.int(from = from + 12L, to = length(calls) - [13:14:15.703] 3L)] [13:14:15.703] } [13:14:15.703] function(cond) { [13:14:15.703] is_error <- inherits(cond, "error") [13:14:15.703] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:14:15.703] NULL) [13:14:15.703] if (is_error) { [13:14:15.703] sessionInformation <- function() { [13:14:15.703] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:14:15.703] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:14:15.703] search = base::search(), system = base::Sys.info()) [13:14:15.703] } [13:14:15.703] ...future.conditions[[length(...future.conditions) + [13:14:15.703] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:14:15.703] cond$call), session = sessionInformation(), [13:14:15.703] timestamp = base::Sys.time(), signaled = 0L) [13:14:15.703] signalCondition(cond) [13:14:15.703] } [13:14:15.703] else if (!ignore && TRUE && inherits(cond, c("condition", [13:14:15.703] "immediateCondition"))) { [13:14:15.703] signal <- TRUE && inherits(cond, "immediateCondition") [13:14:15.703] ...future.conditions[[length(...future.conditions) + [13:14:15.703] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:14:15.703] if (TRUE && !signal) { [13:14:15.703] muffleCondition <- function (cond, pattern = "^muffle") [13:14:15.703] { [13:14:15.703] inherits <- base::inherits [13:14:15.703] invokeRestart <- base::invokeRestart [13:14:15.703] is.null <- base::is.null [13:14:15.703] muffled <- FALSE [13:14:15.703] if (inherits(cond, "message")) { [13:14:15.703] muffled <- grepl(pattern, "muffleMessage") [13:14:15.703] if (muffled) [13:14:15.703] invokeRestart("muffleMessage") [13:14:15.703] } [13:14:15.703] else if (inherits(cond, "warning")) { [13:14:15.703] muffled <- grepl(pattern, "muffleWarning") [13:14:15.703] if (muffled) [13:14:15.703] invokeRestart("muffleWarning") [13:14:15.703] } [13:14:15.703] else if (inherits(cond, "condition")) { [13:14:15.703] if (!is.null(pattern)) { [13:14:15.703] computeRestarts <- base::computeRestarts [13:14:15.703] grepl <- base::grepl [13:14:15.703] restarts <- computeRestarts(cond) [13:14:15.703] for (restart in restarts) { [13:14:15.703] name <- restart$name [13:14:15.703] if (is.null(name)) [13:14:15.703] next [13:14:15.703] if (!grepl(pattern, name)) [13:14:15.703] next [13:14:15.703] invokeRestart(restart) [13:14:15.703] muffled <- TRUE [13:14:15.703] break [13:14:15.703] } [13:14:15.703] } [13:14:15.703] } [13:14:15.703] invisible(muffled) [13:14:15.703] } [13:14:15.703] muffleCondition(cond, pattern = "^muffle") [13:14:15.703] } [13:14:15.703] } [13:14:15.703] else { [13:14:15.703] if (TRUE) { [13:14:15.703] muffleCondition <- function (cond, pattern = "^muffle") [13:14:15.703] { [13:14:15.703] inherits <- base::inherits [13:14:15.703] invokeRestart <- base::invokeRestart [13:14:15.703] is.null <- base::is.null [13:14:15.703] muffled <- FALSE [13:14:15.703] if (inherits(cond, "message")) { [13:14:15.703] muffled <- grepl(pattern, "muffleMessage") [13:14:15.703] if (muffled) [13:14:15.703] invokeRestart("muffleMessage") [13:14:15.703] } [13:14:15.703] else if (inherits(cond, "warning")) { [13:14:15.703] muffled <- grepl(pattern, "muffleWarning") [13:14:15.703] if (muffled) [13:14:15.703] invokeRestart("muffleWarning") [13:14:15.703] } [13:14:15.703] else if (inherits(cond, "condition")) { [13:14:15.703] if (!is.null(pattern)) { [13:14:15.703] computeRestarts <- base::computeRestarts [13:14:15.703] grepl <- base::grepl [13:14:15.703] restarts <- computeRestarts(cond) [13:14:15.703] for (restart in restarts) { [13:14:15.703] name <- restart$name [13:14:15.703] if (is.null(name)) [13:14:15.703] next [13:14:15.703] if (!grepl(pattern, name)) [13:14:15.703] next [13:14:15.703] invokeRestart(restart) [13:14:15.703] muffled <- TRUE [13:14:15.703] break [13:14:15.703] } [13:14:15.703] } [13:14:15.703] } [13:14:15.703] invisible(muffled) [13:14:15.703] } [13:14:15.703] muffleCondition(cond, pattern = "^muffle") [13:14:15.703] } [13:14:15.703] } [13:14:15.703] } [13:14:15.703] })) [13:14:15.703] }, error = function(ex) { [13:14:15.703] base::structure(base::list(value = NULL, visible = NULL, [13:14:15.703] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:14:15.703] ...future.rng), started = ...future.startTime, [13:14:15.703] finished = Sys.time(), session_uuid = NA_character_, [13:14:15.703] version = "1.8"), class = "FutureResult") [13:14:15.703] }, finally = { [13:14:15.703] if (!identical(...future.workdir, getwd())) [13:14:15.703] setwd(...future.workdir) [13:14:15.703] { [13:14:15.703] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:14:15.703] ...future.oldOptions$nwarnings <- NULL [13:14:15.703] } [13:14:15.703] base::options(...future.oldOptions) [13:14:15.703] if (.Platform$OS.type == "windows") { [13:14:15.703] old_names <- names(...future.oldEnvVars) [13:14:15.703] envs <- base::Sys.getenv() [13:14:15.703] names <- names(envs) [13:14:15.703] common <- intersect(names, old_names) [13:14:15.703] added <- setdiff(names, old_names) [13:14:15.703] removed <- setdiff(old_names, names) [13:14:15.703] changed <- common[...future.oldEnvVars[common] != [13:14:15.703] envs[common]] [13:14:15.703] NAMES <- toupper(changed) [13:14:15.703] args <- list() [13:14:15.703] for (kk in seq_along(NAMES)) { [13:14:15.703] name <- changed[[kk]] [13:14:15.703] NAME <- NAMES[[kk]] [13:14:15.703] if (name != NAME && is.element(NAME, old_names)) [13:14:15.703] next [13:14:15.703] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:15.703] } [13:14:15.703] NAMES <- toupper(added) [13:14:15.703] for (kk in seq_along(NAMES)) { [13:14:15.703] name <- added[[kk]] [13:14:15.703] NAME <- NAMES[[kk]] [13:14:15.703] if (name != NAME && is.element(NAME, old_names)) [13:14:15.703] next [13:14:15.703] args[[name]] <- "" [13:14:15.703] } [13:14:15.703] NAMES <- toupper(removed) [13:14:15.703] for (kk in seq_along(NAMES)) { [13:14:15.703] name <- removed[[kk]] [13:14:15.703] NAME <- NAMES[[kk]] [13:14:15.703] if (name != NAME && is.element(NAME, old_names)) [13:14:15.703] next [13:14:15.703] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:15.703] } [13:14:15.703] if (length(args) > 0) [13:14:15.703] base::do.call(base::Sys.setenv, args = args) [13:14:15.703] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:14:15.703] } [13:14:15.703] else { [13:14:15.703] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:14:15.703] } [13:14:15.703] { [13:14:15.703] if (base::length(...future.futureOptionsAdded) > [13:14:15.703] 0L) { [13:14:15.703] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:14:15.703] base::names(opts) <- ...future.futureOptionsAdded [13:14:15.703] base::options(opts) [13:14:15.703] } [13:14:15.703] { [13:14:15.703] { [13:14:15.703] NULL [13:14:15.703] RNGkind("Mersenne-Twister") [13:14:15.703] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:14:15.703] inherits = FALSE) [13:14:15.703] } [13:14:15.703] options(future.plan = NULL) [13:14:15.703] if (is.na(NA_character_)) [13:14:15.703] Sys.unsetenv("R_FUTURE_PLAN") [13:14:15.703] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:14:15.703] future::plan(list(function (..., envir = parent.frame()) [13:14:15.703] { [13:14:15.703] future <- SequentialFuture(..., envir = envir) [13:14:15.703] if (!future$lazy) [13:14:15.703] future <- run(future) [13:14:15.703] invisible(future) [13:14:15.703] }), .cleanup = FALSE, .init = FALSE) [13:14:15.703] } [13:14:15.703] } [13:14:15.703] } [13:14:15.703] }) [13:14:15.703] if (TRUE) { [13:14:15.703] base::sink(type = "output", split = FALSE) [13:14:15.703] if (TRUE) { [13:14:15.703] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:14:15.703] } [13:14:15.703] else { [13:14:15.703] ...future.result["stdout"] <- base::list(NULL) [13:14:15.703] } [13:14:15.703] base::close(...future.stdout) [13:14:15.703] ...future.stdout <- NULL [13:14:15.703] } [13:14:15.703] ...future.result$conditions <- ...future.conditions [13:14:15.703] ...future.result$finished <- base::Sys.time() [13:14:15.703] ...future.result [13:14:15.703] } [13:14:15.706] assign_globals() ... [13:14:15.707] List of 11 [13:14:15.707] $ ...future.FUN :function (x, ...) [13:14:15.707] $ x_FUN :function (x) [13:14:15.707] $ times : int 0 [13:14:15.707] $ stopf :function (fmt, ..., call. = TRUE, domain = NULL) [13:14:15.707] $ stop_if_not :function (...) [13:14:15.707] $ dim : NULL [13:14:15.707] $ valid_types : chr [1:2] "logical" "integer" [13:14:15.707] $ future.call.arguments : list() [13:14:15.707] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:14:15.707] $ ...future.elements_ii :List of 10 [13:14:15.707] ..$ : int 1 [13:14:15.707] ..$ : int 2 [13:14:15.707] ..$ : int 3 [13:14:15.707] ..$ : int 4 [13:14:15.707] ..$ : int 5 [13:14:15.707] ..$ : int 6 [13:14:15.707] ..$ : int 7 [13:14:15.707] ..$ : int 8 [13:14:15.707] ..$ : int 9 [13:14:15.707] ..$ : int 10 [13:14:15.707] $ ...future.seeds_ii : NULL [13:14:15.707] $ ...future.globals.maxSize: NULL [13:14:15.707] - attr(*, "where")=List of 11 [13:14:15.707] ..$ ...future.FUN : [13:14:15.707] ..$ x_FUN : [13:14:15.707] ..$ times : [13:14:15.707] ..$ stopf : [13:14:15.707] ..$ stop_if_not : [13:14:15.707] ..$ dim : [13:14:15.707] ..$ valid_types : [13:14:15.707] ..$ future.call.arguments : [13:14:15.707] ..$ ...future.elements_ii : [13:14:15.707] ..$ ...future.seeds_ii : [13:14:15.707] ..$ ...future.globals.maxSize: [13:14:15.707] - attr(*, "resolved")= logi FALSE [13:14:15.707] - attr(*, "total_size")= num 95400 [13:14:15.707] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:14:15.707] - attr(*, "already-done")= logi TRUE [13:14:15.718] - copied '...future.FUN' to environment [13:14:15.718] - reassign environment for 'x_FUN' [13:14:15.718] - copied 'x_FUN' to environment [13:14:15.719] - copied 'times' to environment [13:14:15.719] - copied 'stopf' to environment [13:14:15.719] - copied 'stop_if_not' to environment [13:14:15.719] - copied 'dim' to environment [13:14:15.719] - copied 'valid_types' to environment [13:14:15.719] - copied 'future.call.arguments' to environment [13:14:15.720] - copied '...future.elements_ii' to environment [13:14:15.720] - copied '...future.seeds_ii' to environment [13:14:15.720] - copied '...future.globals.maxSize' to environment [13:14:15.720] assign_globals() ... done [13:14:15.721] plan(): Setting new future strategy stack: [13:14:15.721] List of future strategies: [13:14:15.721] 1. sequential: [13:14:15.721] - args: function (..., envir = parent.frame(), workers = "") [13:14:15.721] - tweaked: FALSE [13:14:15.721] - call: NULL [13:14:15.721] plan(): nbrOfWorkers() = 1 [13:14:15.723] plan(): Setting new future strategy stack: [13:14:15.723] List of future strategies: [13:14:15.723] 1. sequential: [13:14:15.723] - args: function (..., envir = parent.frame(), workers = "") [13:14:15.723] - tweaked: FALSE [13:14:15.723] - call: plan(strategy) [13:14:15.723] plan(): nbrOfWorkers() = 1 [13:14:15.724] SequentialFuture started (and completed) [13:14:15.724] - Launch lazy future ... done [13:14:15.724] run() for 'SequentialFuture' ... done [13:14:15.724] Created future: [13:14:15.724] SequentialFuture: [13:14:15.724] Label: 'future_vapply-1' [13:14:15.724] Expression: [13:14:15.724] { [13:14:15.724] do.call(function(...) { [13:14:15.724] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:15.724] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:15.724] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:15.724] on.exit(options(oopts), add = TRUE) [13:14:15.724] } [13:14:15.724] { [13:14:15.724] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:15.724] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:15.724] ...future.FUN(...future.X_jj, ...) [13:14:15.724] }) [13:14:15.724] } [13:14:15.724] }, args = future.call.arguments) [13:14:15.724] } [13:14:15.724] Lazy evaluation: FALSE [13:14:15.724] Asynchronous evaluation: FALSE [13:14:15.724] Local evaluation: TRUE [13:14:15.724] Environment: R_GlobalEnv [13:14:15.724] Capture standard output: TRUE [13:14:15.724] Capture condition classes: 'condition' (excluding 'nothing') [13:14:15.724] Globals: 11 objects totaling 93.71 KiB (function '...future.FUN' of 21.22 KiB, function 'x_FUN' of 1.16 KiB, integer 'times' of 56 bytes, function 'stopf' of 26.43 KiB, function 'stop_if_not' of 44.12 KiB, ...) [13:14:15.724] Packages: 1 packages ('future.apply') [13:14:15.724] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:14:15.724] Resolved: TRUE [13:14:15.724] Value: 480 bytes of class 'list' [13:14:15.724] Early signaling: FALSE [13:14:15.724] Owner process: 1bb7d580-628d-c90d-e38a-66de485868c4 [13:14:15.724] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:14:15.726] Chunk #1 of 1 ... DONE [13:14:15.727] Launching 1 futures (chunks) ... DONE [13:14:15.727] Resolving 1 futures (chunks) ... [13:14:15.727] resolve() on list ... [13:14:15.727] recursive: 0 [13:14:15.727] length: 1 [13:14:15.727] [13:14:15.728] resolved() for 'SequentialFuture' ... [13:14:15.728] - state: 'finished' [13:14:15.728] - run: TRUE [13:14:15.728] - result: 'FutureResult' [13:14:15.728] resolved() for 'SequentialFuture' ... done [13:14:15.729] Future #1 [13:14:15.729] signalConditionsASAP(SequentialFuture, pos=1) ... [13:14:15.729] - nx: 1 [13:14:15.729] - relay: TRUE [13:14:15.729] - stdout: TRUE [13:14:15.729] - signal: TRUE [13:14:15.729] - resignal: FALSE [13:14:15.730] - force: TRUE [13:14:15.730] - relayed: [n=1] FALSE [13:14:15.730] - queued futures: [n=1] FALSE [13:14:15.730] - until=1 [13:14:15.730] - relaying element #1 [13:14:15.731] - relayed: [n=1] TRUE [13:14:15.731] - queued futures: [n=1] TRUE [13:14:15.731] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:14:15.731] length: 0 (resolved future 1) [13:14:15.731] Relaying remaining futures [13:14:15.731] signalConditionsASAP(NULL, pos=0) ... [13:14:15.731] - nx: 1 [13:14:15.732] - relay: TRUE [13:14:15.732] - stdout: TRUE [13:14:15.732] - signal: TRUE [13:14:15.732] - resignal: FALSE [13:14:15.732] - force: TRUE [13:14:15.732] - relayed: [n=1] TRUE [13:14:15.732] - queued futures: [n=1] TRUE - flush all [13:14:15.733] - relayed: [n=1] TRUE [13:14:15.733] - queued futures: [n=1] TRUE [13:14:15.733] signalConditionsASAP(NULL, pos=0) ... done [13:14:15.733] resolve() on list ... DONE [13:14:15.733] - Number of value chunks collected: 1 [13:14:15.734] Resolving 1 futures (chunks) ... DONE [13:14:15.734] Reducing values from 1 chunks ... [13:14:15.734] - Number of values collected after concatenation: 10 [13:14:15.734] - Number of values expected: 10 [13:14:15.734] Reducing values from 1 chunks ... DONE [13:14:15.734] future_lapply() ... DONE int[0 , 1:10] num [1:10] 1 1.41 1.73 2 2.24 ... [13:14:15.735] future_lapply() ... [13:14:15.738] Number of chunks: 1 [13:14:15.738] getGlobalsAndPackagesXApply() ... [13:14:15.738] - future.globals: TRUE [13:14:15.738] getGlobalsAndPackages() ... [13:14:15.738] Searching for globals... [13:14:15.742] - globals found: [16] 'FUN', '{', '<-', 'x_FUN', 'if', '!=', 'length', 'times', 'stopf', 'stop_if_not', 'all', '==', 'dim', '%in%', 'typeof', 'valid_types' [13:14:15.742] Searching for globals ... DONE [13:14:15.742] Resolving globals: FALSE [13:14:15.743] The total size of the 7 globals is 92.12 KiB (94336 bytes) [13:14:15.744] The total size of the 7 globals exported for future expression ('FUN()') is 92.12 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). The three largest globals are 'stop_if_not' (44.12 KiB of class 'function'), 'stopf' (26.43 KiB of class 'function') and 'FUN' (21.22 KiB of class 'function') [13:14:15.744] - globals: [7] 'FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types' [13:14:15.744] - packages: [1] 'future.apply' [13:14:15.744] getGlobalsAndPackages() ... DONE [13:14:15.745] - globals found/used: [n=7] 'FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types' [13:14:15.745] - needed namespaces: [n=1] 'future.apply' [13:14:15.745] Finding globals ... DONE [13:14:15.745] - use_args: TRUE [13:14:15.745] - Getting '...' globals ... [13:14:15.746] resolve() on list ... [13:14:15.746] recursive: 0 [13:14:15.746] length: 1 [13:14:15.746] elements: '...' [13:14:15.746] length: 0 (resolved future 1) [13:14:15.746] resolve() on list ... DONE [13:14:15.747] - '...' content: [n=0] [13:14:15.747] List of 1 [13:14:15.747] $ ...: list() [13:14:15.747] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:14:15.747] - attr(*, "where")=List of 1 [13:14:15.747] ..$ ...: [13:14:15.747] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:14:15.747] - attr(*, "resolved")= logi TRUE [13:14:15.747] - attr(*, "total_size")= num NA [13:14:15.750] - Getting '...' globals ... DONE [13:14:15.751] Globals to be used in all futures (chunks): [n=8] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...' [13:14:15.751] List of 8 [13:14:15.751] $ ...future.FUN:function (x, ...) [13:14:15.751] $ x_FUN :function (x) [13:14:15.751] $ times : int 1 [13:14:15.751] $ stopf :function (fmt, ..., call. = TRUE, domain = NULL) [13:14:15.751] $ stop_if_not :function (...) [13:14:15.751] $ dim : NULL [13:14:15.751] $ valid_types : chr [1:3] "logical" "integer" "double" [13:14:15.751] $ ... : list() [13:14:15.751] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:14:15.751] - attr(*, "where")=List of 8 [13:14:15.751] ..$ ...future.FUN: [13:14:15.751] ..$ x_FUN : [13:14:15.751] ..$ times : [13:14:15.751] ..$ stopf : [13:14:15.751] ..$ stop_if_not : [13:14:15.751] ..$ dim : [13:14:15.751] ..$ valid_types : [13:14:15.751] ..$ ... : [13:14:15.751] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:14:15.751] - attr(*, "resolved")= logi FALSE [13:14:15.751] - attr(*, "total_size")= num 94336 [13:14:15.757] Packages to be attached in all futures: [n=1] 'future.apply' [13:14:15.757] getGlobalsAndPackagesXApply() ... DONE [13:14:15.758] Number of futures (= number of chunks): 1 [13:14:15.758] Launching 1 futures (chunks) ... [13:14:15.758] Chunk #1 of 1 ... [13:14:15.758] - Finding globals in 'X' for chunk #1 ... [13:14:15.758] getGlobalsAndPackages() ... [13:14:15.759] Searching for globals... [13:14:15.759] [13:14:15.759] Searching for globals ... DONE [13:14:15.759] - globals: [0] [13:14:15.759] getGlobalsAndPackages() ... DONE [13:14:15.759] + additional globals found: [n=0] [13:14:15.760] + additional namespaces needed: [n=0] [13:14:15.760] - Finding globals in 'X' for chunk #1 ... DONE [13:14:15.760] - seeds: [13:14:15.760] - All globals exported: [n=11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:15.760] getGlobalsAndPackages() ... [13:14:15.760] - globals passed as-is: [11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:15.761] Resolving globals: FALSE [13:14:15.761] Tweak future expression to call with '...' arguments ... [13:14:15.761] { [13:14:15.761] do.call(function(...) { [13:14:15.761] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:15.761] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:15.761] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:15.761] on.exit(options(oopts), add = TRUE) [13:14:15.761] } [13:14:15.761] { [13:14:15.761] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:15.761] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:15.761] ...future.FUN(...future.X_jj, ...) [13:14:15.761] }) [13:14:15.761] } [13:14:15.761] }, args = future.call.arguments) [13:14:15.761] } [13:14:15.761] Tweak future expression to call with '...' arguments ... DONE [13:14:15.762] - globals: [11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:15.762] - packages: [1] 'future.apply' [13:14:15.762] getGlobalsAndPackages() ... DONE [13:14:15.763] run() for 'Future' ... [13:14:15.763] - state: 'created' [13:14:15.763] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:14:15.764] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:14:15.764] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:14:15.764] - Field: 'label' [13:14:15.764] - Field: 'local' [13:14:15.764] - Field: 'owner' [13:14:15.765] - Field: 'envir' [13:14:15.765] - Field: 'packages' [13:14:15.765] - Field: 'gc' [13:14:15.765] - Field: 'conditions' [13:14:15.765] - Field: 'expr' [13:14:15.765] - Field: 'uuid' [13:14:15.766] - Field: 'seed' [13:14:15.766] - Field: 'version' [13:14:15.766] - Field: 'result' [13:14:15.766] - Field: 'asynchronous' [13:14:15.766] - Field: 'calls' [13:14:15.766] - Field: 'globals' [13:14:15.767] - Field: 'stdout' [13:14:15.767] - Field: 'earlySignal' [13:14:15.767] - Field: 'lazy' [13:14:15.767] - Field: 'state' [13:14:15.767] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:14:15.767] - Launch lazy future ... [13:14:15.768] Packages needed by the future expression (n = 1): 'future.apply' [13:14:15.768] Packages needed by future strategies (n = 0): [13:14:15.769] { [13:14:15.769] { [13:14:15.769] { [13:14:15.769] ...future.startTime <- base::Sys.time() [13:14:15.769] { [13:14:15.769] { [13:14:15.769] { [13:14:15.769] { [13:14:15.769] base::local({ [13:14:15.769] has_future <- base::requireNamespace("future", [13:14:15.769] quietly = TRUE) [13:14:15.769] if (has_future) { [13:14:15.769] ns <- base::getNamespace("future") [13:14:15.769] version <- ns[[".package"]][["version"]] [13:14:15.769] if (is.null(version)) [13:14:15.769] version <- utils::packageVersion("future") [13:14:15.769] } [13:14:15.769] else { [13:14:15.769] version <- NULL [13:14:15.769] } [13:14:15.769] if (!has_future || version < "1.8.0") { [13:14:15.769] info <- base::c(r_version = base::gsub("R version ", [13:14:15.769] "", base::R.version$version.string), [13:14:15.769] platform = base::sprintf("%s (%s-bit)", [13:14:15.769] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:14:15.769] os = base::paste(base::Sys.info()[base::c("sysname", [13:14:15.769] "release", "version")], collapse = " "), [13:14:15.769] hostname = base::Sys.info()[["nodename"]]) [13:14:15.769] info <- base::sprintf("%s: %s", base::names(info), [13:14:15.769] info) [13:14:15.769] info <- base::paste(info, collapse = "; ") [13:14:15.769] if (!has_future) { [13:14:15.769] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:14:15.769] info) [13:14:15.769] } [13:14:15.769] else { [13:14:15.769] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:14:15.769] info, version) [13:14:15.769] } [13:14:15.769] base::stop(msg) [13:14:15.769] } [13:14:15.769] }) [13:14:15.769] } [13:14:15.769] base::local({ [13:14:15.769] for (pkg in "future.apply") { [13:14:15.769] base::loadNamespace(pkg) [13:14:15.769] base::library(pkg, character.only = TRUE) [13:14:15.769] } [13:14:15.769] }) [13:14:15.769] } [13:14:15.769] options(future.plan = NULL) [13:14:15.769] Sys.unsetenv("R_FUTURE_PLAN") [13:14:15.769] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:14:15.769] } [13:14:15.769] ...future.workdir <- getwd() [13:14:15.769] } [13:14:15.769] ...future.oldOptions <- base::as.list(base::.Options) [13:14:15.769] ...future.oldEnvVars <- base::Sys.getenv() [13:14:15.769] } [13:14:15.769] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:14:15.769] future.globals.maxSize = NULL, future.globals.method = NULL, [13:14:15.769] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:14:15.769] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:14:15.769] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:14:15.769] future.stdout.windows.reencode = NULL, width = 80L) [13:14:15.769] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:14:15.769] base::names(...future.oldOptions)) [13:14:15.769] } [13:14:15.769] if (FALSE) { [13:14:15.769] } [13:14:15.769] else { [13:14:15.769] if (TRUE) { [13:14:15.769] ...future.stdout <- base::rawConnection(base::raw(0L), [13:14:15.769] open = "w") [13:14:15.769] } [13:14:15.769] else { [13:14:15.769] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:14:15.769] windows = "NUL", "/dev/null"), open = "w") [13:14:15.769] } [13:14:15.769] base::sink(...future.stdout, type = "output", split = FALSE) [13:14:15.769] base::on.exit(if (!base::is.null(...future.stdout)) { [13:14:15.769] base::sink(type = "output", split = FALSE) [13:14:15.769] base::close(...future.stdout) [13:14:15.769] }, add = TRUE) [13:14:15.769] } [13:14:15.769] ...future.frame <- base::sys.nframe() [13:14:15.769] ...future.conditions <- base::list() [13:14:15.769] ...future.rng <- base::globalenv()$.Random.seed [13:14:15.769] if (FALSE) { [13:14:15.769] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:14:15.769] "...future.value", "...future.globalenv.names", ".Random.seed") [13:14:15.769] } [13:14:15.769] ...future.result <- base::tryCatch({ [13:14:15.769] base::withCallingHandlers({ [13:14:15.769] ...future.value <- base::withVisible(base::local({ [13:14:15.769] do.call(function(...) { [13:14:15.769] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:15.769] if (!identical(...future.globals.maxSize.org, [13:14:15.769] ...future.globals.maxSize)) { [13:14:15.769] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:15.769] on.exit(options(oopts), add = TRUE) [13:14:15.769] } [13:14:15.769] { [13:14:15.769] lapply(seq_along(...future.elements_ii), [13:14:15.769] FUN = function(jj) { [13:14:15.769] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:15.769] ...future.FUN(...future.X_jj, ...) [13:14:15.769] }) [13:14:15.769] } [13:14:15.769] }, args = future.call.arguments) [13:14:15.769] })) [13:14:15.769] future::FutureResult(value = ...future.value$value, [13:14:15.769] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:14:15.769] ...future.rng), globalenv = if (FALSE) [13:14:15.769] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:14:15.769] ...future.globalenv.names)) [13:14:15.769] else NULL, started = ...future.startTime, version = "1.8") [13:14:15.769] }, condition = base::local({ [13:14:15.769] c <- base::c [13:14:15.769] inherits <- base::inherits [13:14:15.769] invokeRestart <- base::invokeRestart [13:14:15.769] length <- base::length [13:14:15.769] list <- base::list [13:14:15.769] seq.int <- base::seq.int [13:14:15.769] signalCondition <- base::signalCondition [13:14:15.769] sys.calls <- base::sys.calls [13:14:15.769] `[[` <- base::`[[` [13:14:15.769] `+` <- base::`+` [13:14:15.769] `<<-` <- base::`<<-` [13:14:15.769] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:14:15.769] calls[seq.int(from = from + 12L, to = length(calls) - [13:14:15.769] 3L)] [13:14:15.769] } [13:14:15.769] function(cond) { [13:14:15.769] is_error <- inherits(cond, "error") [13:14:15.769] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:14:15.769] NULL) [13:14:15.769] if (is_error) { [13:14:15.769] sessionInformation <- function() { [13:14:15.769] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:14:15.769] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:14:15.769] search = base::search(), system = base::Sys.info()) [13:14:15.769] } [13:14:15.769] ...future.conditions[[length(...future.conditions) + [13:14:15.769] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:14:15.769] cond$call), session = sessionInformation(), [13:14:15.769] timestamp = base::Sys.time(), signaled = 0L) [13:14:15.769] signalCondition(cond) [13:14:15.769] } [13:14:15.769] else if (!ignore && TRUE && inherits(cond, c("condition", [13:14:15.769] "immediateCondition"))) { [13:14:15.769] signal <- TRUE && inherits(cond, "immediateCondition") [13:14:15.769] ...future.conditions[[length(...future.conditions) + [13:14:15.769] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:14:15.769] if (TRUE && !signal) { [13:14:15.769] muffleCondition <- function (cond, pattern = "^muffle") [13:14:15.769] { [13:14:15.769] inherits <- base::inherits [13:14:15.769] invokeRestart <- base::invokeRestart [13:14:15.769] is.null <- base::is.null [13:14:15.769] muffled <- FALSE [13:14:15.769] if (inherits(cond, "message")) { [13:14:15.769] muffled <- grepl(pattern, "muffleMessage") [13:14:15.769] if (muffled) [13:14:15.769] invokeRestart("muffleMessage") [13:14:15.769] } [13:14:15.769] else if (inherits(cond, "warning")) { [13:14:15.769] muffled <- grepl(pattern, "muffleWarning") [13:14:15.769] if (muffled) [13:14:15.769] invokeRestart("muffleWarning") [13:14:15.769] } [13:14:15.769] else if (inherits(cond, "condition")) { [13:14:15.769] if (!is.null(pattern)) { [13:14:15.769] computeRestarts <- base::computeRestarts [13:14:15.769] grepl <- base::grepl [13:14:15.769] restarts <- computeRestarts(cond) [13:14:15.769] for (restart in restarts) { [13:14:15.769] name <- restart$name [13:14:15.769] if (is.null(name)) [13:14:15.769] next [13:14:15.769] if (!grepl(pattern, name)) [13:14:15.769] next [13:14:15.769] invokeRestart(restart) [13:14:15.769] muffled <- TRUE [13:14:15.769] break [13:14:15.769] } [13:14:15.769] } [13:14:15.769] } [13:14:15.769] invisible(muffled) [13:14:15.769] } [13:14:15.769] muffleCondition(cond, pattern = "^muffle") [13:14:15.769] } [13:14:15.769] } [13:14:15.769] else { [13:14:15.769] if (TRUE) { [13:14:15.769] muffleCondition <- function (cond, pattern = "^muffle") [13:14:15.769] { [13:14:15.769] inherits <- base::inherits [13:14:15.769] invokeRestart <- base::invokeRestart [13:14:15.769] is.null <- base::is.null [13:14:15.769] muffled <- FALSE [13:14:15.769] if (inherits(cond, "message")) { [13:14:15.769] muffled <- grepl(pattern, "muffleMessage") [13:14:15.769] if (muffled) [13:14:15.769] invokeRestart("muffleMessage") [13:14:15.769] } [13:14:15.769] else if (inherits(cond, "warning")) { [13:14:15.769] muffled <- grepl(pattern, "muffleWarning") [13:14:15.769] if (muffled) [13:14:15.769] invokeRestart("muffleWarning") [13:14:15.769] } [13:14:15.769] else if (inherits(cond, "condition")) { [13:14:15.769] if (!is.null(pattern)) { [13:14:15.769] computeRestarts <- base::computeRestarts [13:14:15.769] grepl <- base::grepl [13:14:15.769] restarts <- computeRestarts(cond) [13:14:15.769] for (restart in restarts) { [13:14:15.769] name <- restart$name [13:14:15.769] if (is.null(name)) [13:14:15.769] next [13:14:15.769] if (!grepl(pattern, name)) [13:14:15.769] next [13:14:15.769] invokeRestart(restart) [13:14:15.769] muffled <- TRUE [13:14:15.769] break [13:14:15.769] } [13:14:15.769] } [13:14:15.769] } [13:14:15.769] invisible(muffled) [13:14:15.769] } [13:14:15.769] muffleCondition(cond, pattern = "^muffle") [13:14:15.769] } [13:14:15.769] } [13:14:15.769] } [13:14:15.769] })) [13:14:15.769] }, error = function(ex) { [13:14:15.769] base::structure(base::list(value = NULL, visible = NULL, [13:14:15.769] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:14:15.769] ...future.rng), started = ...future.startTime, [13:14:15.769] finished = Sys.time(), session_uuid = NA_character_, [13:14:15.769] version = "1.8"), class = "FutureResult") [13:14:15.769] }, finally = { [13:14:15.769] if (!identical(...future.workdir, getwd())) [13:14:15.769] setwd(...future.workdir) [13:14:15.769] { [13:14:15.769] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:14:15.769] ...future.oldOptions$nwarnings <- NULL [13:14:15.769] } [13:14:15.769] base::options(...future.oldOptions) [13:14:15.769] if (.Platform$OS.type == "windows") { [13:14:15.769] old_names <- names(...future.oldEnvVars) [13:14:15.769] envs <- base::Sys.getenv() [13:14:15.769] names <- names(envs) [13:14:15.769] common <- intersect(names, old_names) [13:14:15.769] added <- setdiff(names, old_names) [13:14:15.769] removed <- setdiff(old_names, names) [13:14:15.769] changed <- common[...future.oldEnvVars[common] != [13:14:15.769] envs[common]] [13:14:15.769] NAMES <- toupper(changed) [13:14:15.769] args <- list() [13:14:15.769] for (kk in seq_along(NAMES)) { [13:14:15.769] name <- changed[[kk]] [13:14:15.769] NAME <- NAMES[[kk]] [13:14:15.769] if (name != NAME && is.element(NAME, old_names)) [13:14:15.769] next [13:14:15.769] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:15.769] } [13:14:15.769] NAMES <- toupper(added) [13:14:15.769] for (kk in seq_along(NAMES)) { [13:14:15.769] name <- added[[kk]] [13:14:15.769] NAME <- NAMES[[kk]] [13:14:15.769] if (name != NAME && is.element(NAME, old_names)) [13:14:15.769] next [13:14:15.769] args[[name]] <- "" [13:14:15.769] } [13:14:15.769] NAMES <- toupper(removed) [13:14:15.769] for (kk in seq_along(NAMES)) { [13:14:15.769] name <- removed[[kk]] [13:14:15.769] NAME <- NAMES[[kk]] [13:14:15.769] if (name != NAME && is.element(NAME, old_names)) [13:14:15.769] next [13:14:15.769] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:15.769] } [13:14:15.769] if (length(args) > 0) [13:14:15.769] base::do.call(base::Sys.setenv, args = args) [13:14:15.769] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:14:15.769] } [13:14:15.769] else { [13:14:15.769] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:14:15.769] } [13:14:15.769] { [13:14:15.769] if (base::length(...future.futureOptionsAdded) > [13:14:15.769] 0L) { [13:14:15.769] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:14:15.769] base::names(opts) <- ...future.futureOptionsAdded [13:14:15.769] base::options(opts) [13:14:15.769] } [13:14:15.769] { [13:14:15.769] { [13:14:15.769] NULL [13:14:15.769] RNGkind("Mersenne-Twister") [13:14:15.769] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:14:15.769] inherits = FALSE) [13:14:15.769] } [13:14:15.769] options(future.plan = NULL) [13:14:15.769] if (is.na(NA_character_)) [13:14:15.769] Sys.unsetenv("R_FUTURE_PLAN") [13:14:15.769] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:14:15.769] future::plan(list(function (..., envir = parent.frame()) [13:14:15.769] { [13:14:15.769] future <- SequentialFuture(..., envir = envir) [13:14:15.769] if (!future$lazy) [13:14:15.769] future <- run(future) [13:14:15.769] invisible(future) [13:14:15.769] }), .cleanup = FALSE, .init = FALSE) [13:14:15.769] } [13:14:15.769] } [13:14:15.769] } [13:14:15.769] }) [13:14:15.769] if (TRUE) { [13:14:15.769] base::sink(type = "output", split = FALSE) [13:14:15.769] if (TRUE) { [13:14:15.769] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:14:15.769] } [13:14:15.769] else { [13:14:15.769] ...future.result["stdout"] <- base::list(NULL) [13:14:15.769] } [13:14:15.769] base::close(...future.stdout) [13:14:15.769] ...future.stdout <- NULL [13:14:15.769] } [13:14:15.769] ...future.result$conditions <- ...future.conditions [13:14:15.769] ...future.result$finished <- base::Sys.time() [13:14:15.769] ...future.result [13:14:15.769] } [13:14:15.773] assign_globals() ... [13:14:15.773] List of 11 [13:14:15.773] $ ...future.FUN :function (x, ...) [13:14:15.773] $ x_FUN :function (x) [13:14:15.773] $ times : int 1 [13:14:15.773] $ stopf :function (fmt, ..., call. = TRUE, domain = NULL) [13:14:15.773] $ stop_if_not :function (...) [13:14:15.773] $ dim : NULL [13:14:15.773] $ valid_types : chr [1:3] "logical" "integer" "double" [13:14:15.773] $ future.call.arguments : list() [13:14:15.773] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:14:15.773] $ ...future.elements_ii :List of 10 [13:14:15.773] ..$ : int 1 [13:14:15.773] ..$ : int 2 [13:14:15.773] ..$ : int 3 [13:14:15.773] ..$ : int 4 [13:14:15.773] ..$ : int 5 [13:14:15.773] ..$ : int 6 [13:14:15.773] ..$ : int 7 [13:14:15.773] ..$ : int 8 [13:14:15.773] ..$ : int 9 [13:14:15.773] ..$ : int 10 [13:14:15.773] $ ...future.seeds_ii : NULL [13:14:15.773] $ ...future.globals.maxSize: NULL [13:14:15.773] - attr(*, "where")=List of 11 [13:14:15.773] ..$ ...future.FUN : [13:14:15.773] ..$ x_FUN : [13:14:15.773] ..$ times : [13:14:15.773] ..$ stopf : [13:14:15.773] ..$ stop_if_not : [13:14:15.773] ..$ dim : [13:14:15.773] ..$ valid_types : [13:14:15.773] ..$ future.call.arguments : [13:14:15.773] ..$ ...future.elements_ii : [13:14:15.773] ..$ ...future.seeds_ii : [13:14:15.773] ..$ ...future.globals.maxSize: [13:14:15.773] - attr(*, "resolved")= logi FALSE [13:14:15.773] - attr(*, "total_size")= num 94336 [13:14:15.773] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:14:15.773] - attr(*, "already-done")= logi TRUE [13:14:15.786] - copied '...future.FUN' to environment [13:14:15.786] - copied 'x_FUN' to environment [13:14:15.787] - copied 'times' to environment [13:14:15.787] - copied 'stopf' to environment [13:14:15.787] - copied 'stop_if_not' to environment [13:14:15.787] - copied 'dim' to environment [13:14:15.787] - copied 'valid_types' to environment [13:14:15.787] - copied 'future.call.arguments' to environment [13:14:15.788] - copied '...future.elements_ii' to environment [13:14:15.788] - copied '...future.seeds_ii' to environment [13:14:15.788] - copied '...future.globals.maxSize' to environment [13:14:15.788] assign_globals() ... done [13:14:15.789] plan(): Setting new future strategy stack: [13:14:15.789] List of future strategies: [13:14:15.789] 1. sequential: [13:14:15.789] - args: function (..., envir = parent.frame(), workers = "") [13:14:15.789] - tweaked: FALSE [13:14:15.789] - call: NULL [13:14:15.790] plan(): nbrOfWorkers() = 1 [13:14:15.791] plan(): Setting new future strategy stack: [13:14:15.791] List of future strategies: [13:14:15.791] 1. sequential: [13:14:15.791] - args: function (..., envir = parent.frame(), workers = "") [13:14:15.791] - tweaked: FALSE [13:14:15.791] - call: plan(strategy) [13:14:15.792] plan(): nbrOfWorkers() = 1 [13:14:15.792] SequentialFuture started (and completed) [13:14:15.792] - Launch lazy future ... done [13:14:15.793] run() for 'SequentialFuture' ... done [13:14:15.793] Created future: [13:14:15.793] SequentialFuture: [13:14:15.793] Label: 'future_vapply-1' [13:14:15.793] Expression: [13:14:15.793] { [13:14:15.793] do.call(function(...) { [13:14:15.793] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:15.793] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:15.793] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:15.793] on.exit(options(oopts), add = TRUE) [13:14:15.793] } [13:14:15.793] { [13:14:15.793] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:15.793] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:15.793] ...future.FUN(...future.X_jj, ...) [13:14:15.793] }) [13:14:15.793] } [13:14:15.793] }, args = future.call.arguments) [13:14:15.793] } [13:14:15.793] Lazy evaluation: FALSE [13:14:15.793] Asynchronous evaluation: FALSE [13:14:15.793] Local evaluation: TRUE [13:14:15.793] Environment: R_GlobalEnv [13:14:15.793] Capture standard output: TRUE [13:14:15.793] Capture condition classes: 'condition' (excluding 'nothing') [13:14:15.793] Globals: 11 objects totaling 92.67 KiB (function '...future.FUN' of 21.22 KiB, function 'x_FUN' of 56 bytes, integer 'times' of 56 bytes, function 'stopf' of 26.43 KiB, function 'stop_if_not' of 44.12 KiB, ...) [13:14:15.793] Packages: 1 packages ('future.apply') [13:14:15.793] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:14:15.793] Resolved: TRUE [13:14:15.793] Value: 560 bytes of class 'list' [13:14:15.793] Early signaling: FALSE [13:14:15.793] Owner process: 1bb7d580-628d-c90d-e38a-66de485868c4 [13:14:15.793] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:14:15.794] Chunk #1 of 1 ... DONE [13:14:15.795] Launching 1 futures (chunks) ... DONE [13:14:15.795] Resolving 1 futures (chunks) ... [13:14:15.795] resolve() on list ... [13:14:15.795] recursive: 0 [13:14:15.795] length: 1 [13:14:15.795] [13:14:15.796] resolved() for 'SequentialFuture' ... [13:14:15.796] - state: 'finished' [13:14:15.796] - run: TRUE [13:14:15.796] - result: 'FutureResult' [13:14:15.796] resolved() for 'SequentialFuture' ... done [13:14:15.796] Future #1 [13:14:15.797] signalConditionsASAP(SequentialFuture, pos=1) ... [13:14:15.797] - nx: 1 [13:14:15.797] - relay: TRUE [13:14:15.797] - stdout: TRUE [13:14:15.797] - signal: TRUE [13:14:15.797] - resignal: FALSE [13:14:15.798] - force: TRUE [13:14:15.798] - relayed: [n=1] FALSE [13:14:15.798] - queued futures: [n=1] FALSE [13:14:15.798] - until=1 [13:14:15.798] - relaying element #1 [13:14:15.798] - relayed: [n=1] TRUE [13:14:15.799] - queued futures: [n=1] TRUE [13:14:15.800] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:14:15.800] length: 0 (resolved future 1) [13:14:15.800] Relaying remaining futures [13:14:15.800] signalConditionsASAP(NULL, pos=0) ... [13:14:15.800] - nx: 1 [13:14:15.800] - relay: TRUE [13:14:15.801] - stdout: TRUE [13:14:15.801] - signal: TRUE [13:14:15.801] - resignal: FALSE [13:14:15.801] - force: TRUE [13:14:15.801] - relayed: [n=1] TRUE [13:14:15.801] - queued futures: [n=1] TRUE - flush all [13:14:15.802] - relayed: [n=1] TRUE [13:14:15.802] - queued futures: [n=1] TRUE [13:14:15.802] signalConditionsASAP(NULL, pos=0) ... done [13:14:15.802] resolve() on list ... DONE [13:14:15.802] - Number of value chunks collected: 1 [13:14:15.802] Resolving 1 futures (chunks) ... DONE [13:14:15.803] Reducing values from 1 chunks ... [13:14:15.803] - Number of values collected after concatenation: 10 [13:14:15.803] - Number of values expected: 10 [13:14:15.803] Reducing values from 1 chunks ... DONE [13:14:15.803] future_lapply() ... DONE num [1:10] 1 1.41 1.73 2 2.24 ... num [1:2, 1:10] 1 1 2 4 3 9 4 16 5 25 ... [13:14:15.804] future_lapply() ... [13:14:15.806] Number of chunks: 1 [13:14:15.807] getGlobalsAndPackagesXApply() ... [13:14:15.807] - future.globals: TRUE [13:14:15.807] getGlobalsAndPackages() ... [13:14:15.807] Searching for globals... [13:14:15.812] - globals found: [18] 'FUN', '{', '<-', 'x_FUN', 'if', '!=', 'length', 'times', 'stopf', 'stop_if_not', 'all', '==', 'dim', '%in%', 'typeof', 'valid_types', 'c', '^' [13:14:15.812] Searching for globals ... DONE [13:14:15.812] Resolving globals: FALSE [13:14:15.813] The total size of the 7 globals is 94.20 KiB (96456 bytes) [13:14:15.813] The total size of the 7 globals exported for future expression ('FUN()') is 94.20 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). The three largest globals are 'stop_if_not' (44.12 KiB of class 'function'), 'stopf' (26.43 KiB of class 'function') and 'FUN' (21.22 KiB of class 'function') [13:14:15.814] - globals: [7] 'FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types' [13:14:15.814] - packages: [1] 'future.apply' [13:14:15.814] getGlobalsAndPackages() ... DONE [13:14:15.814] - globals found/used: [n=7] 'FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types' [13:14:15.814] - needed namespaces: [n=1] 'future.apply' [13:14:15.815] Finding globals ... DONE [13:14:15.815] - use_args: TRUE [13:14:15.815] - Getting '...' globals ... [13:14:15.815] resolve() on list ... [13:14:15.815] recursive: 0 [13:14:15.816] length: 1 [13:14:15.816] elements: '...' [13:14:15.816] length: 0 (resolved future 1) [13:14:15.816] resolve() on list ... DONE [13:14:15.816] - '...' content: [n=0] [13:14:15.816] List of 1 [13:14:15.816] $ ...: list() [13:14:15.816] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:14:15.816] - attr(*, "where")=List of 1 [13:14:15.816] ..$ ...: [13:14:15.816] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:14:15.816] - attr(*, "resolved")= logi TRUE [13:14:15.816] - attr(*, "total_size")= num NA [13:14:15.819] - Getting '...' globals ... DONE [13:14:15.820] Globals to be used in all futures (chunks): [n=8] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...' [13:14:15.820] List of 8 [13:14:15.820] $ ...future.FUN:function (x, ...) [13:14:15.820] $ x_FUN :function (x) [13:14:15.820] $ times : int 2 [13:14:15.820] $ stopf :function (fmt, ..., call. = TRUE, domain = NULL) [13:14:15.820] $ stop_if_not :function (...) [13:14:15.820] $ dim : NULL [13:14:15.820] $ valid_types : chr [1:3] "logical" "integer" "double" [13:14:15.820] $ ... : list() [13:14:15.820] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:14:15.820] - attr(*, "where")=List of 8 [13:14:15.820] ..$ ...future.FUN: [13:14:15.820] ..$ x_FUN : [13:14:15.820] ..$ times : [13:14:15.820] ..$ stopf : [13:14:15.820] ..$ stop_if_not : [13:14:15.820] ..$ dim : [13:14:15.820] ..$ valid_types : [13:14:15.820] ..$ ... : [13:14:15.820] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:14:15.820] - attr(*, "resolved")= logi FALSE [13:14:15.820] - attr(*, "total_size")= num 96456 [13:14:15.827] Packages to be attached in all futures: [n=1] 'future.apply' [13:14:15.827] getGlobalsAndPackagesXApply() ... DONE [13:14:15.827] Number of futures (= number of chunks): 1 [13:14:15.827] Launching 1 futures (chunks) ... [13:14:15.827] Chunk #1 of 1 ... [13:14:15.828] - Finding globals in 'X' for chunk #1 ... [13:14:15.828] getGlobalsAndPackages() ... [13:14:15.828] Searching for globals... [13:14:15.828] [13:14:15.828] Searching for globals ... DONE [13:14:15.829] - globals: [0] [13:14:15.829] getGlobalsAndPackages() ... DONE [13:14:15.829] + additional globals found: [n=0] [13:14:15.829] + additional namespaces needed: [n=0] [13:14:15.829] - Finding globals in 'X' for chunk #1 ... DONE [13:14:15.829] - seeds: [13:14:15.830] - All globals exported: [n=11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:15.830] getGlobalsAndPackages() ... [13:14:15.830] - globals passed as-is: [11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:15.830] Resolving globals: FALSE [13:14:15.830] Tweak future expression to call with '...' arguments ... [13:14:15.830] { [13:14:15.830] do.call(function(...) { [13:14:15.830] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:15.830] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:15.830] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:15.830] on.exit(options(oopts), add = TRUE) [13:14:15.830] } [13:14:15.830] { [13:14:15.830] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:15.830] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:15.830] ...future.FUN(...future.X_jj, ...) [13:14:15.830] }) [13:14:15.830] } [13:14:15.830] }, args = future.call.arguments) [13:14:15.830] } [13:14:15.831] Tweak future expression to call with '...' arguments ... DONE [13:14:15.832] - globals: [11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:15.832] - packages: [1] 'future.apply' [13:14:15.832] getGlobalsAndPackages() ... DONE [13:14:15.832] run() for 'Future' ... [13:14:15.832] - state: 'created' [13:14:15.833] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:14:15.833] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:14:15.833] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:14:15.833] - Field: 'label' [13:14:15.834] - Field: 'local' [13:14:15.834] - Field: 'owner' [13:14:15.834] - Field: 'envir' [13:14:15.834] - Field: 'packages' [13:14:15.834] - Field: 'gc' [13:14:15.834] - Field: 'conditions' [13:14:15.835] - Field: 'expr' [13:14:15.835] - Field: 'uuid' [13:14:15.835] - Field: 'seed' [13:14:15.835] - Field: 'version' [13:14:15.835] - Field: 'result' [13:14:15.835] - Field: 'asynchronous' [13:14:15.836] - Field: 'calls' [13:14:15.836] - Field: 'globals' [13:14:15.836] - Field: 'stdout' [13:14:15.836] - Field: 'earlySignal' [13:14:15.836] - Field: 'lazy' [13:14:15.836] - Field: 'state' [13:14:15.837] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:14:15.837] - Launch lazy future ... [13:14:15.837] Packages needed by the future expression (n = 1): 'future.apply' [13:14:15.837] Packages needed by future strategies (n = 0): [13:14:15.838] { [13:14:15.838] { [13:14:15.838] { [13:14:15.838] ...future.startTime <- base::Sys.time() [13:14:15.838] { [13:14:15.838] { [13:14:15.838] { [13:14:15.838] { [13:14:15.838] base::local({ [13:14:15.838] has_future <- base::requireNamespace("future", [13:14:15.838] quietly = TRUE) [13:14:15.838] if (has_future) { [13:14:15.838] ns <- base::getNamespace("future") [13:14:15.838] version <- ns[[".package"]][["version"]] [13:14:15.838] if (is.null(version)) [13:14:15.838] version <- utils::packageVersion("future") [13:14:15.838] } [13:14:15.838] else { [13:14:15.838] version <- NULL [13:14:15.838] } [13:14:15.838] if (!has_future || version < "1.8.0") { [13:14:15.838] info <- base::c(r_version = base::gsub("R version ", [13:14:15.838] "", base::R.version$version.string), [13:14:15.838] platform = base::sprintf("%s (%s-bit)", [13:14:15.838] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:14:15.838] os = base::paste(base::Sys.info()[base::c("sysname", [13:14:15.838] "release", "version")], collapse = " "), [13:14:15.838] hostname = base::Sys.info()[["nodename"]]) [13:14:15.838] info <- base::sprintf("%s: %s", base::names(info), [13:14:15.838] info) [13:14:15.838] info <- base::paste(info, collapse = "; ") [13:14:15.838] if (!has_future) { [13:14:15.838] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:14:15.838] info) [13:14:15.838] } [13:14:15.838] else { [13:14:15.838] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:14:15.838] info, version) [13:14:15.838] } [13:14:15.838] base::stop(msg) [13:14:15.838] } [13:14:15.838] }) [13:14:15.838] } [13:14:15.838] base::local({ [13:14:15.838] for (pkg in "future.apply") { [13:14:15.838] base::loadNamespace(pkg) [13:14:15.838] base::library(pkg, character.only = TRUE) [13:14:15.838] } [13:14:15.838] }) [13:14:15.838] } [13:14:15.838] options(future.plan = NULL) [13:14:15.838] Sys.unsetenv("R_FUTURE_PLAN") [13:14:15.838] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:14:15.838] } [13:14:15.838] ...future.workdir <- getwd() [13:14:15.838] } [13:14:15.838] ...future.oldOptions <- base::as.list(base::.Options) [13:14:15.838] ...future.oldEnvVars <- base::Sys.getenv() [13:14:15.838] } [13:14:15.838] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:14:15.838] future.globals.maxSize = NULL, future.globals.method = NULL, [13:14:15.838] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:14:15.838] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:14:15.838] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:14:15.838] future.stdout.windows.reencode = NULL, width = 80L) [13:14:15.838] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:14:15.838] base::names(...future.oldOptions)) [13:14:15.838] } [13:14:15.838] if (FALSE) { [13:14:15.838] } [13:14:15.838] else { [13:14:15.838] if (TRUE) { [13:14:15.838] ...future.stdout <- base::rawConnection(base::raw(0L), [13:14:15.838] open = "w") [13:14:15.838] } [13:14:15.838] else { [13:14:15.838] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:14:15.838] windows = "NUL", "/dev/null"), open = "w") [13:14:15.838] } [13:14:15.838] base::sink(...future.stdout, type = "output", split = FALSE) [13:14:15.838] base::on.exit(if (!base::is.null(...future.stdout)) { [13:14:15.838] base::sink(type = "output", split = FALSE) [13:14:15.838] base::close(...future.stdout) [13:14:15.838] }, add = TRUE) [13:14:15.838] } [13:14:15.838] ...future.frame <- base::sys.nframe() [13:14:15.838] ...future.conditions <- base::list() [13:14:15.838] ...future.rng <- base::globalenv()$.Random.seed [13:14:15.838] if (FALSE) { [13:14:15.838] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:14:15.838] "...future.value", "...future.globalenv.names", ".Random.seed") [13:14:15.838] } [13:14:15.838] ...future.result <- base::tryCatch({ [13:14:15.838] base::withCallingHandlers({ [13:14:15.838] ...future.value <- base::withVisible(base::local({ [13:14:15.838] do.call(function(...) { [13:14:15.838] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:15.838] if (!identical(...future.globals.maxSize.org, [13:14:15.838] ...future.globals.maxSize)) { [13:14:15.838] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:15.838] on.exit(options(oopts), add = TRUE) [13:14:15.838] } [13:14:15.838] { [13:14:15.838] lapply(seq_along(...future.elements_ii), [13:14:15.838] FUN = function(jj) { [13:14:15.838] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:15.838] ...future.FUN(...future.X_jj, ...) [13:14:15.838] }) [13:14:15.838] } [13:14:15.838] }, args = future.call.arguments) [13:14:15.838] })) [13:14:15.838] future::FutureResult(value = ...future.value$value, [13:14:15.838] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:14:15.838] ...future.rng), globalenv = if (FALSE) [13:14:15.838] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:14:15.838] ...future.globalenv.names)) [13:14:15.838] else NULL, started = ...future.startTime, version = "1.8") [13:14:15.838] }, condition = base::local({ [13:14:15.838] c <- base::c [13:14:15.838] inherits <- base::inherits [13:14:15.838] invokeRestart <- base::invokeRestart [13:14:15.838] length <- base::length [13:14:15.838] list <- base::list [13:14:15.838] seq.int <- base::seq.int [13:14:15.838] signalCondition <- base::signalCondition [13:14:15.838] sys.calls <- base::sys.calls [13:14:15.838] `[[` <- base::`[[` [13:14:15.838] `+` <- base::`+` [13:14:15.838] `<<-` <- base::`<<-` [13:14:15.838] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:14:15.838] calls[seq.int(from = from + 12L, to = length(calls) - [13:14:15.838] 3L)] [13:14:15.838] } [13:14:15.838] function(cond) { [13:14:15.838] is_error <- inherits(cond, "error") [13:14:15.838] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:14:15.838] NULL) [13:14:15.838] if (is_error) { [13:14:15.838] sessionInformation <- function() { [13:14:15.838] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:14:15.838] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:14:15.838] search = base::search(), system = base::Sys.info()) [13:14:15.838] } [13:14:15.838] ...future.conditions[[length(...future.conditions) + [13:14:15.838] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:14:15.838] cond$call), session = sessionInformation(), [13:14:15.838] timestamp = base::Sys.time(), signaled = 0L) [13:14:15.838] signalCondition(cond) [13:14:15.838] } [13:14:15.838] else if (!ignore && TRUE && inherits(cond, c("condition", [13:14:15.838] "immediateCondition"))) { [13:14:15.838] signal <- TRUE && inherits(cond, "immediateCondition") [13:14:15.838] ...future.conditions[[length(...future.conditions) + [13:14:15.838] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:14:15.838] if (TRUE && !signal) { [13:14:15.838] muffleCondition <- function (cond, pattern = "^muffle") [13:14:15.838] { [13:14:15.838] inherits <- base::inherits [13:14:15.838] invokeRestart <- base::invokeRestart [13:14:15.838] is.null <- base::is.null [13:14:15.838] muffled <- FALSE [13:14:15.838] if (inherits(cond, "message")) { [13:14:15.838] muffled <- grepl(pattern, "muffleMessage") [13:14:15.838] if (muffled) [13:14:15.838] invokeRestart("muffleMessage") [13:14:15.838] } [13:14:15.838] else if (inherits(cond, "warning")) { [13:14:15.838] muffled <- grepl(pattern, "muffleWarning") [13:14:15.838] if (muffled) [13:14:15.838] invokeRestart("muffleWarning") [13:14:15.838] } [13:14:15.838] else if (inherits(cond, "condition")) { [13:14:15.838] if (!is.null(pattern)) { [13:14:15.838] computeRestarts <- base::computeRestarts [13:14:15.838] grepl <- base::grepl [13:14:15.838] restarts <- computeRestarts(cond) [13:14:15.838] for (restart in restarts) { [13:14:15.838] name <- restart$name [13:14:15.838] if (is.null(name)) [13:14:15.838] next [13:14:15.838] if (!grepl(pattern, name)) [13:14:15.838] next [13:14:15.838] invokeRestart(restart) [13:14:15.838] muffled <- TRUE [13:14:15.838] break [13:14:15.838] } [13:14:15.838] } [13:14:15.838] } [13:14:15.838] invisible(muffled) [13:14:15.838] } [13:14:15.838] muffleCondition(cond, pattern = "^muffle") [13:14:15.838] } [13:14:15.838] } [13:14:15.838] else { [13:14:15.838] if (TRUE) { [13:14:15.838] muffleCondition <- function (cond, pattern = "^muffle") [13:14:15.838] { [13:14:15.838] inherits <- base::inherits [13:14:15.838] invokeRestart <- base::invokeRestart [13:14:15.838] is.null <- base::is.null [13:14:15.838] muffled <- FALSE [13:14:15.838] if (inherits(cond, "message")) { [13:14:15.838] muffled <- grepl(pattern, "muffleMessage") [13:14:15.838] if (muffled) [13:14:15.838] invokeRestart("muffleMessage") [13:14:15.838] } [13:14:15.838] else if (inherits(cond, "warning")) { [13:14:15.838] muffled <- grepl(pattern, "muffleWarning") [13:14:15.838] if (muffled) [13:14:15.838] invokeRestart("muffleWarning") [13:14:15.838] } [13:14:15.838] else if (inherits(cond, "condition")) { [13:14:15.838] if (!is.null(pattern)) { [13:14:15.838] computeRestarts <- base::computeRestarts [13:14:15.838] grepl <- base::grepl [13:14:15.838] restarts <- computeRestarts(cond) [13:14:15.838] for (restart in restarts) { [13:14:15.838] name <- restart$name [13:14:15.838] if (is.null(name)) [13:14:15.838] next [13:14:15.838] if (!grepl(pattern, name)) [13:14:15.838] next [13:14:15.838] invokeRestart(restart) [13:14:15.838] muffled <- TRUE [13:14:15.838] break [13:14:15.838] } [13:14:15.838] } [13:14:15.838] } [13:14:15.838] invisible(muffled) [13:14:15.838] } [13:14:15.838] muffleCondition(cond, pattern = "^muffle") [13:14:15.838] } [13:14:15.838] } [13:14:15.838] } [13:14:15.838] })) [13:14:15.838] }, error = function(ex) { [13:14:15.838] base::structure(base::list(value = NULL, visible = NULL, [13:14:15.838] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:14:15.838] ...future.rng), started = ...future.startTime, [13:14:15.838] finished = Sys.time(), session_uuid = NA_character_, [13:14:15.838] version = "1.8"), class = "FutureResult") [13:14:15.838] }, finally = { [13:14:15.838] if (!identical(...future.workdir, getwd())) [13:14:15.838] setwd(...future.workdir) [13:14:15.838] { [13:14:15.838] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:14:15.838] ...future.oldOptions$nwarnings <- NULL [13:14:15.838] } [13:14:15.838] base::options(...future.oldOptions) [13:14:15.838] if (.Platform$OS.type == "windows") { [13:14:15.838] old_names <- names(...future.oldEnvVars) [13:14:15.838] envs <- base::Sys.getenv() [13:14:15.838] names <- names(envs) [13:14:15.838] common <- intersect(names, old_names) [13:14:15.838] added <- setdiff(names, old_names) [13:14:15.838] removed <- setdiff(old_names, names) [13:14:15.838] changed <- common[...future.oldEnvVars[common] != [13:14:15.838] envs[common]] [13:14:15.838] NAMES <- toupper(changed) [13:14:15.838] args <- list() [13:14:15.838] for (kk in seq_along(NAMES)) { [13:14:15.838] name <- changed[[kk]] [13:14:15.838] NAME <- NAMES[[kk]] [13:14:15.838] if (name != NAME && is.element(NAME, old_names)) [13:14:15.838] next [13:14:15.838] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:15.838] } [13:14:15.838] NAMES <- toupper(added) [13:14:15.838] for (kk in seq_along(NAMES)) { [13:14:15.838] name <- added[[kk]] [13:14:15.838] NAME <- NAMES[[kk]] [13:14:15.838] if (name != NAME && is.element(NAME, old_names)) [13:14:15.838] next [13:14:15.838] args[[name]] <- "" [13:14:15.838] } [13:14:15.838] NAMES <- toupper(removed) [13:14:15.838] for (kk in seq_along(NAMES)) { [13:14:15.838] name <- removed[[kk]] [13:14:15.838] NAME <- NAMES[[kk]] [13:14:15.838] if (name != NAME && is.element(NAME, old_names)) [13:14:15.838] next [13:14:15.838] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:15.838] } [13:14:15.838] if (length(args) > 0) [13:14:15.838] base::do.call(base::Sys.setenv, args = args) [13:14:15.838] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:14:15.838] } [13:14:15.838] else { [13:14:15.838] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:14:15.838] } [13:14:15.838] { [13:14:15.838] if (base::length(...future.futureOptionsAdded) > [13:14:15.838] 0L) { [13:14:15.838] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:14:15.838] base::names(opts) <- ...future.futureOptionsAdded [13:14:15.838] base::options(opts) [13:14:15.838] } [13:14:15.838] { [13:14:15.838] { [13:14:15.838] NULL [13:14:15.838] RNGkind("Mersenne-Twister") [13:14:15.838] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:14:15.838] inherits = FALSE) [13:14:15.838] } [13:14:15.838] options(future.plan = NULL) [13:14:15.838] if (is.na(NA_character_)) [13:14:15.838] Sys.unsetenv("R_FUTURE_PLAN") [13:14:15.838] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:14:15.838] future::plan(list(function (..., envir = parent.frame()) [13:14:15.838] { [13:14:15.838] future <- SequentialFuture(..., envir = envir) [13:14:15.838] if (!future$lazy) [13:14:15.838] future <- run(future) [13:14:15.838] invisible(future) [13:14:15.838] }), .cleanup = FALSE, .init = FALSE) [13:14:15.838] } [13:14:15.838] } [13:14:15.838] } [13:14:15.838] }) [13:14:15.838] if (TRUE) { [13:14:15.838] base::sink(type = "output", split = FALSE) [13:14:15.838] if (TRUE) { [13:14:15.838] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:14:15.838] } [13:14:15.838] else { [13:14:15.838] ...future.result["stdout"] <- base::list(NULL) [13:14:15.838] } [13:14:15.838] base::close(...future.stdout) [13:14:15.838] ...future.stdout <- NULL [13:14:15.838] } [13:14:15.838] ...future.result$conditions <- ...future.conditions [13:14:15.838] ...future.result$finished <- base::Sys.time() [13:14:15.838] ...future.result [13:14:15.838] } [13:14:15.842] assign_globals() ... [13:14:15.842] List of 11 [13:14:15.842] $ ...future.FUN :function (x, ...) [13:14:15.842] $ x_FUN :function (x) [13:14:15.842] $ times : int 2 [13:14:15.842] $ stopf :function (fmt, ..., call. = TRUE, domain = NULL) [13:14:15.842] $ stop_if_not :function (...) [13:14:15.842] $ dim : NULL [13:14:15.842] $ valid_types : chr [1:3] "logical" "integer" "double" [13:14:15.842] $ future.call.arguments : list() [13:14:15.842] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:14:15.842] $ ...future.elements_ii :List of 10 [13:14:15.842] ..$ : int 1 [13:14:15.842] ..$ : int 2 [13:14:15.842] ..$ : int 3 [13:14:15.842] ..$ : int 4 [13:14:15.842] ..$ : int 5 [13:14:15.842] ..$ : int 6 [13:14:15.842] ..$ : int 7 [13:14:15.842] ..$ : int 8 [13:14:15.842] ..$ : int 9 [13:14:15.842] ..$ : int 10 [13:14:15.842] $ ...future.seeds_ii : NULL [13:14:15.842] $ ...future.globals.maxSize: NULL [13:14:15.842] - attr(*, "where")=List of 11 [13:14:15.842] ..$ ...future.FUN : [13:14:15.842] ..$ x_FUN : [13:14:15.842] ..$ times : [13:14:15.842] ..$ stopf : [13:14:15.842] ..$ stop_if_not : [13:14:15.842] ..$ dim : [13:14:15.842] ..$ valid_types : [13:14:15.842] ..$ future.call.arguments : [13:14:15.842] ..$ ...future.elements_ii : [13:14:15.842] ..$ ...future.seeds_ii : [13:14:15.842] ..$ ...future.globals.maxSize: [13:14:15.842] - attr(*, "resolved")= logi FALSE [13:14:15.842] - attr(*, "total_size")= num 96456 [13:14:15.842] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:14:15.842] - attr(*, "already-done")= logi TRUE [13:14:15.854] - copied '...future.FUN' to environment [13:14:15.854] - reassign environment for 'x_FUN' [13:14:15.855] - copied 'x_FUN' to environment [13:14:15.855] - copied 'times' to environment [13:14:15.855] - copied 'stopf' to environment [13:14:15.855] - copied 'stop_if_not' to environment [13:14:15.855] - copied 'dim' to environment [13:14:15.855] - copied 'valid_types' to environment [13:14:15.856] - copied 'future.call.arguments' to environment [13:14:15.856] - copied '...future.elements_ii' to environment [13:14:15.856] - copied '...future.seeds_ii' to environment [13:14:15.856] - copied '...future.globals.maxSize' to environment [13:14:15.856] assign_globals() ... done [13:14:15.857] plan(): Setting new future strategy stack: [13:14:15.857] List of future strategies: [13:14:15.857] 1. sequential: [13:14:15.857] - args: function (..., envir = parent.frame(), workers = "") [13:14:15.857] - tweaked: FALSE [13:14:15.857] - call: NULL [13:14:15.857] plan(): nbrOfWorkers() = 1 [13:14:15.859] plan(): Setting new future strategy stack: [13:14:15.859] List of future strategies: [13:14:15.859] 1. sequential: [13:14:15.859] - args: function (..., envir = parent.frame(), workers = "") [13:14:15.859] - tweaked: FALSE [13:14:15.859] - call: plan(strategy) [13:14:15.859] plan(): nbrOfWorkers() = 1 [13:14:15.860] SequentialFuture started (and completed) [13:14:15.860] - Launch lazy future ... done [13:14:15.860] run() for 'SequentialFuture' ... done [13:14:15.860] Created future: [13:14:15.860] SequentialFuture: [13:14:15.860] Label: 'future_vapply-1' [13:14:15.860] Expression: [13:14:15.860] { [13:14:15.860] do.call(function(...) { [13:14:15.860] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:15.860] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:15.860] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:15.860] on.exit(options(oopts), add = TRUE) [13:14:15.860] } [13:14:15.860] { [13:14:15.860] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:15.860] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:15.860] ...future.FUN(...future.X_jj, ...) [13:14:15.860] }) [13:14:15.860] } [13:14:15.860] }, args = future.call.arguments) [13:14:15.860] } [13:14:15.860] Lazy evaluation: FALSE [13:14:15.860] Asynchronous evaluation: FALSE [13:14:15.860] Local evaluation: TRUE [13:14:15.860] Environment: R_GlobalEnv [13:14:15.860] Capture standard output: TRUE [13:14:15.860] Capture condition classes: 'condition' (excluding 'nothing') [13:14:15.860] Globals: 11 objects totaling 94.74 KiB (function '...future.FUN' of 21.22 KiB, function 'x_FUN' of 2.12 KiB, integer 'times' of 56 bytes, function 'stopf' of 26.43 KiB, function 'stop_if_not' of 44.12 KiB, ...) [13:14:15.860] Packages: 1 packages ('future.apply') [13:14:15.860] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:14:15.860] Resolved: TRUE [13:14:15.860] Value: 640 bytes of class 'list' [13:14:15.860] Early signaling: FALSE [13:14:15.860] Owner process: 1bb7d580-628d-c90d-e38a-66de485868c4 [13:14:15.860] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:14:15.862] Chunk #1 of 1 ... DONE [13:14:15.862] Launching 1 futures (chunks) ... DONE [13:14:15.862] Resolving 1 futures (chunks) ... [13:14:15.862] resolve() on list ... [13:14:15.863] recursive: 0 [13:14:15.863] length: 1 [13:14:15.863] [13:14:15.863] resolved() for 'SequentialFuture' ... [13:14:15.863] - state: 'finished' [13:14:15.863] - run: TRUE [13:14:15.864] - result: 'FutureResult' [13:14:15.864] resolved() for 'SequentialFuture' ... done [13:14:15.864] Future #1 [13:14:15.864] signalConditionsASAP(SequentialFuture, pos=1) ... [13:14:15.864] - nx: 1 [13:14:15.864] - relay: TRUE [13:14:15.865] - stdout: TRUE [13:14:15.865] - signal: TRUE [13:14:15.865] - resignal: FALSE [13:14:15.865] - force: TRUE [13:14:15.865] - relayed: [n=1] FALSE [13:14:15.865] - queued futures: [n=1] FALSE [13:14:15.865] - until=1 [13:14:15.866] - relaying element #1 [13:14:15.866] - relayed: [n=1] TRUE [13:14:15.866] - queued futures: [n=1] TRUE [13:14:15.866] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:14:15.866] length: 0 (resolved future 1) [13:14:15.867] Relaying remaining futures [13:14:15.867] signalConditionsASAP(NULL, pos=0) ... [13:14:15.867] - nx: 1 [13:14:15.867] - relay: TRUE [13:14:15.867] - stdout: TRUE [13:14:15.867] - signal: TRUE [13:14:15.889] - resignal: FALSE [13:14:15.889] - force: TRUE [13:14:15.890] - relayed: [n=1] TRUE [13:14:15.890] - queued futures: [n=1] TRUE - flush all [13:14:15.890] - relayed: [n=1] TRUE [13:14:15.890] - queued futures: [n=1] TRUE [13:14:15.890] signalConditionsASAP(NULL, pos=0) ... done [13:14:15.891] resolve() on list ... DONE [13:14:15.891] - Number of value chunks collected: 1 [13:14:15.891] Resolving 1 futures (chunks) ... DONE [13:14:15.891] Reducing values from 1 chunks ... [13:14:15.891] - Number of values collected after concatenation: 10 [13:14:15.892] - Number of values expected: 10 [13:14:15.892] Reducing values from 1 chunks ... DONE [13:14:15.892] future_lapply() ... DONE num [1:2, 1:10] 1 1 2 4 3 9 4 16 5 25 ... int [1:2, 1:2, 1:10] 1 1 1 1 2 2 2 2 3 3 ... [13:14:15.893] future_lapply() ... [13:14:15.896] Number of chunks: 1 [13:14:15.896] getGlobalsAndPackagesXApply() ... [13:14:15.896] - future.globals: TRUE [13:14:15.896] getGlobalsAndPackages() ... [13:14:15.896] Searching for globals... [13:14:15.901] - globals found: [17] 'FUN', '{', '<-', 'x_FUN', 'if', '!=', 'length', 'times', 'stopf', 'stop_if_not', 'all', '==', 'dim', '%in%', 'typeof', 'valid_types', 'matrix' [13:14:15.901] Searching for globals ... DONE [13:14:15.901] Resolving globals: FALSE [13:14:15.902] The total size of the 7 globals is 94.95 KiB (97232 bytes) [13:14:15.903] The total size of the 7 globals exported for future expression ('FUN()') is 94.95 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). The three largest globals are 'stop_if_not' (44.12 KiB of class 'function'), 'stopf' (26.43 KiB of class 'function') and 'FUN' (21.22 KiB of class 'function') [13:14:15.903] - globals: [7] 'FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types' [13:14:15.903] - packages: [1] 'future.apply' [13:14:15.904] getGlobalsAndPackages() ... DONE [13:14:15.904] - globals found/used: [n=7] 'FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types' [13:14:15.904] - needed namespaces: [n=1] 'future.apply' [13:14:15.904] Finding globals ... DONE [13:14:15.904] - use_args: TRUE [13:14:15.904] - Getting '...' globals ... [13:14:15.905] resolve() on list ... [13:14:15.905] recursive: 0 [13:14:15.905] length: 1 [13:14:15.905] elements: '...' [13:14:15.906] length: 0 (resolved future 1) [13:14:15.906] resolve() on list ... DONE [13:14:15.906] - '...' content: [n=0] [13:14:15.906] List of 1 [13:14:15.906] $ ...: list() [13:14:15.906] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:14:15.906] - attr(*, "where")=List of 1 [13:14:15.906] ..$ ...: [13:14:15.906] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:14:15.906] - attr(*, "resolved")= logi TRUE [13:14:15.906] - attr(*, "total_size")= num NA [13:14:15.909] - Getting '...' globals ... DONE [13:14:15.909] Globals to be used in all futures (chunks): [n=8] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...' [13:14:15.909] List of 8 [13:14:15.909] $ ...future.FUN:function (x, ...) [13:14:15.909] $ x_FUN :function (x) [13:14:15.909] $ times : int 4 [13:14:15.909] $ stopf :function (fmt, ..., call. = TRUE, domain = NULL) [13:14:15.909] $ stop_if_not :function (...) [13:14:15.909] $ dim : int [1:2] 2 2 [13:14:15.909] $ valid_types : chr [1:2] "logical" "integer" [13:14:15.909] $ ... : list() [13:14:15.909] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:14:15.909] - attr(*, "where")=List of 8 [13:14:15.909] ..$ ...future.FUN: [13:14:15.909] ..$ x_FUN : [13:14:15.909] ..$ times : [13:14:15.909] ..$ stopf : [13:14:15.909] ..$ stop_if_not : [13:14:15.909] ..$ dim : [13:14:15.909] ..$ valid_types : [13:14:15.909] ..$ ... : [13:14:15.909] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:14:15.909] - attr(*, "resolved")= logi FALSE [13:14:15.909] - attr(*, "total_size")= num 97232 [13:14:15.917] Packages to be attached in all futures: [n=1] 'future.apply' [13:14:15.917] getGlobalsAndPackagesXApply() ... DONE [13:14:15.917] Number of futures (= number of chunks): 1 [13:14:15.918] Launching 1 futures (chunks) ... [13:14:15.918] Chunk #1 of 1 ... [13:14:15.918] - Finding globals in 'X' for chunk #1 ... [13:14:15.918] getGlobalsAndPackages() ... [13:14:15.918] Searching for globals... [13:14:15.919] [13:14:15.919] Searching for globals ... DONE [13:14:15.919] - globals: [0] [13:14:15.919] getGlobalsAndPackages() ... DONE [13:14:15.919] + additional globals found: [n=0] [13:14:15.919] + additional namespaces needed: [n=0] [13:14:15.919] - Finding globals in 'X' for chunk #1 ... DONE [13:14:15.920] - seeds: [13:14:15.920] - All globals exported: [n=11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:15.920] getGlobalsAndPackages() ... [13:14:15.920] - globals passed as-is: [11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:15.920] Resolving globals: FALSE [13:14:15.920] Tweak future expression to call with '...' arguments ... [13:14:15.921] { [13:14:15.921] do.call(function(...) { [13:14:15.921] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:15.921] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:15.921] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:15.921] on.exit(options(oopts), add = TRUE) [13:14:15.921] } [13:14:15.921] { [13:14:15.921] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:15.921] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:15.921] ...future.FUN(...future.X_jj, ...) [13:14:15.921] }) [13:14:15.921] } [13:14:15.921] }, args = future.call.arguments) [13:14:15.921] } [13:14:15.921] Tweak future expression to call with '...' arguments ... DONE [13:14:15.922] - globals: [11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:15.922] - packages: [1] 'future.apply' [13:14:15.922] getGlobalsAndPackages() ... DONE [13:14:15.922] run() for 'Future' ... [13:14:15.923] - state: 'created' [13:14:15.923] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:14:15.923] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:14:15.923] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:14:15.924] - Field: 'label' [13:14:15.924] - Field: 'local' [13:14:15.924] - Field: 'owner' [13:14:15.924] - Field: 'envir' [13:14:15.924] - Field: 'packages' [13:14:15.925] - Field: 'gc' [13:14:15.925] - Field: 'conditions' [13:14:15.925] - Field: 'expr' [13:14:15.925] - Field: 'uuid' [13:14:15.925] - Field: 'seed' [13:14:15.925] - Field: 'version' [13:14:15.926] - Field: 'result' [13:14:15.926] - Field: 'asynchronous' [13:14:15.926] - Field: 'calls' [13:14:15.926] - Field: 'globals' [13:14:15.926] - Field: 'stdout' [13:14:15.926] - Field: 'earlySignal' [13:14:15.927] - Field: 'lazy' [13:14:15.927] - Field: 'state' [13:14:15.927] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:14:15.927] - Launch lazy future ... [13:14:15.927] Packages needed by the future expression (n = 1): 'future.apply' [13:14:15.928] Packages needed by future strategies (n = 0): [13:14:15.928] { [13:14:15.928] { [13:14:15.928] { [13:14:15.928] ...future.startTime <- base::Sys.time() [13:14:15.928] { [13:14:15.928] { [13:14:15.928] { [13:14:15.928] { [13:14:15.928] base::local({ [13:14:15.928] has_future <- base::requireNamespace("future", [13:14:15.928] quietly = TRUE) [13:14:15.928] if (has_future) { [13:14:15.928] ns <- base::getNamespace("future") [13:14:15.928] version <- ns[[".package"]][["version"]] [13:14:15.928] if (is.null(version)) [13:14:15.928] version <- utils::packageVersion("future") [13:14:15.928] } [13:14:15.928] else { [13:14:15.928] version <- NULL [13:14:15.928] } [13:14:15.928] if (!has_future || version < "1.8.0") { [13:14:15.928] info <- base::c(r_version = base::gsub("R version ", [13:14:15.928] "", base::R.version$version.string), [13:14:15.928] platform = base::sprintf("%s (%s-bit)", [13:14:15.928] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:14:15.928] os = base::paste(base::Sys.info()[base::c("sysname", [13:14:15.928] "release", "version")], collapse = " "), [13:14:15.928] hostname = base::Sys.info()[["nodename"]]) [13:14:15.928] info <- base::sprintf("%s: %s", base::names(info), [13:14:15.928] info) [13:14:15.928] info <- base::paste(info, collapse = "; ") [13:14:15.928] if (!has_future) { [13:14:15.928] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:14:15.928] info) [13:14:15.928] } [13:14:15.928] else { [13:14:15.928] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:14:15.928] info, version) [13:14:15.928] } [13:14:15.928] base::stop(msg) [13:14:15.928] } [13:14:15.928] }) [13:14:15.928] } [13:14:15.928] base::local({ [13:14:15.928] for (pkg in "future.apply") { [13:14:15.928] base::loadNamespace(pkg) [13:14:15.928] base::library(pkg, character.only = TRUE) [13:14:15.928] } [13:14:15.928] }) [13:14:15.928] } [13:14:15.928] options(future.plan = NULL) [13:14:15.928] Sys.unsetenv("R_FUTURE_PLAN") [13:14:15.928] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:14:15.928] } [13:14:15.928] ...future.workdir <- getwd() [13:14:15.928] } [13:14:15.928] ...future.oldOptions <- base::as.list(base::.Options) [13:14:15.928] ...future.oldEnvVars <- base::Sys.getenv() [13:14:15.928] } [13:14:15.928] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:14:15.928] future.globals.maxSize = NULL, future.globals.method = NULL, [13:14:15.928] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:14:15.928] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:14:15.928] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:14:15.928] future.stdout.windows.reencode = NULL, width = 80L) [13:14:15.928] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:14:15.928] base::names(...future.oldOptions)) [13:14:15.928] } [13:14:15.928] if (FALSE) { [13:14:15.928] } [13:14:15.928] else { [13:14:15.928] if (TRUE) { [13:14:15.928] ...future.stdout <- base::rawConnection(base::raw(0L), [13:14:15.928] open = "w") [13:14:15.928] } [13:14:15.928] else { [13:14:15.928] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:14:15.928] windows = "NUL", "/dev/null"), open = "w") [13:14:15.928] } [13:14:15.928] base::sink(...future.stdout, type = "output", split = FALSE) [13:14:15.928] base::on.exit(if (!base::is.null(...future.stdout)) { [13:14:15.928] base::sink(type = "output", split = FALSE) [13:14:15.928] base::close(...future.stdout) [13:14:15.928] }, add = TRUE) [13:14:15.928] } [13:14:15.928] ...future.frame <- base::sys.nframe() [13:14:15.928] ...future.conditions <- base::list() [13:14:15.928] ...future.rng <- base::globalenv()$.Random.seed [13:14:15.928] if (FALSE) { [13:14:15.928] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:14:15.928] "...future.value", "...future.globalenv.names", ".Random.seed") [13:14:15.928] } [13:14:15.928] ...future.result <- base::tryCatch({ [13:14:15.928] base::withCallingHandlers({ [13:14:15.928] ...future.value <- base::withVisible(base::local({ [13:14:15.928] do.call(function(...) { [13:14:15.928] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:15.928] if (!identical(...future.globals.maxSize.org, [13:14:15.928] ...future.globals.maxSize)) { [13:14:15.928] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:15.928] on.exit(options(oopts), add = TRUE) [13:14:15.928] } [13:14:15.928] { [13:14:15.928] lapply(seq_along(...future.elements_ii), [13:14:15.928] FUN = function(jj) { [13:14:15.928] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:15.928] ...future.FUN(...future.X_jj, ...) [13:14:15.928] }) [13:14:15.928] } [13:14:15.928] }, args = future.call.arguments) [13:14:15.928] })) [13:14:15.928] future::FutureResult(value = ...future.value$value, [13:14:15.928] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:14:15.928] ...future.rng), globalenv = if (FALSE) [13:14:15.928] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:14:15.928] ...future.globalenv.names)) [13:14:15.928] else NULL, started = ...future.startTime, version = "1.8") [13:14:15.928] }, condition = base::local({ [13:14:15.928] c <- base::c [13:14:15.928] inherits <- base::inherits [13:14:15.928] invokeRestart <- base::invokeRestart [13:14:15.928] length <- base::length [13:14:15.928] list <- base::list [13:14:15.928] seq.int <- base::seq.int [13:14:15.928] signalCondition <- base::signalCondition [13:14:15.928] sys.calls <- base::sys.calls [13:14:15.928] `[[` <- base::`[[` [13:14:15.928] `+` <- base::`+` [13:14:15.928] `<<-` <- base::`<<-` [13:14:15.928] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:14:15.928] calls[seq.int(from = from + 12L, to = length(calls) - [13:14:15.928] 3L)] [13:14:15.928] } [13:14:15.928] function(cond) { [13:14:15.928] is_error <- inherits(cond, "error") [13:14:15.928] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:14:15.928] NULL) [13:14:15.928] if (is_error) { [13:14:15.928] sessionInformation <- function() { [13:14:15.928] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:14:15.928] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:14:15.928] search = base::search(), system = base::Sys.info()) [13:14:15.928] } [13:14:15.928] ...future.conditions[[length(...future.conditions) + [13:14:15.928] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:14:15.928] cond$call), session = sessionInformation(), [13:14:15.928] timestamp = base::Sys.time(), signaled = 0L) [13:14:15.928] signalCondition(cond) [13:14:15.928] } [13:14:15.928] else if (!ignore && TRUE && inherits(cond, c("condition", [13:14:15.928] "immediateCondition"))) { [13:14:15.928] signal <- TRUE && inherits(cond, "immediateCondition") [13:14:15.928] ...future.conditions[[length(...future.conditions) + [13:14:15.928] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:14:15.928] if (TRUE && !signal) { [13:14:15.928] muffleCondition <- function (cond, pattern = "^muffle") [13:14:15.928] { [13:14:15.928] inherits <- base::inherits [13:14:15.928] invokeRestart <- base::invokeRestart [13:14:15.928] is.null <- base::is.null [13:14:15.928] muffled <- FALSE [13:14:15.928] if (inherits(cond, "message")) { [13:14:15.928] muffled <- grepl(pattern, "muffleMessage") [13:14:15.928] if (muffled) [13:14:15.928] invokeRestart("muffleMessage") [13:14:15.928] } [13:14:15.928] else if (inherits(cond, "warning")) { [13:14:15.928] muffled <- grepl(pattern, "muffleWarning") [13:14:15.928] if (muffled) [13:14:15.928] invokeRestart("muffleWarning") [13:14:15.928] } [13:14:15.928] else if (inherits(cond, "condition")) { [13:14:15.928] if (!is.null(pattern)) { [13:14:15.928] computeRestarts <- base::computeRestarts [13:14:15.928] grepl <- base::grepl [13:14:15.928] restarts <- computeRestarts(cond) [13:14:15.928] for (restart in restarts) { [13:14:15.928] name <- restart$name [13:14:15.928] if (is.null(name)) [13:14:15.928] next [13:14:15.928] if (!grepl(pattern, name)) [13:14:15.928] next [13:14:15.928] invokeRestart(restart) [13:14:15.928] muffled <- TRUE [13:14:15.928] break [13:14:15.928] } [13:14:15.928] } [13:14:15.928] } [13:14:15.928] invisible(muffled) [13:14:15.928] } [13:14:15.928] muffleCondition(cond, pattern = "^muffle") [13:14:15.928] } [13:14:15.928] } [13:14:15.928] else { [13:14:15.928] if (TRUE) { [13:14:15.928] muffleCondition <- function (cond, pattern = "^muffle") [13:14:15.928] { [13:14:15.928] inherits <- base::inherits [13:14:15.928] invokeRestart <- base::invokeRestart [13:14:15.928] is.null <- base::is.null [13:14:15.928] muffled <- FALSE [13:14:15.928] if (inherits(cond, "message")) { [13:14:15.928] muffled <- grepl(pattern, "muffleMessage") [13:14:15.928] if (muffled) [13:14:15.928] invokeRestart("muffleMessage") [13:14:15.928] } [13:14:15.928] else if (inherits(cond, "warning")) { [13:14:15.928] muffled <- grepl(pattern, "muffleWarning") [13:14:15.928] if (muffled) [13:14:15.928] invokeRestart("muffleWarning") [13:14:15.928] } [13:14:15.928] else if (inherits(cond, "condition")) { [13:14:15.928] if (!is.null(pattern)) { [13:14:15.928] computeRestarts <- base::computeRestarts [13:14:15.928] grepl <- base::grepl [13:14:15.928] restarts <- computeRestarts(cond) [13:14:15.928] for (restart in restarts) { [13:14:15.928] name <- restart$name [13:14:15.928] if (is.null(name)) [13:14:15.928] next [13:14:15.928] if (!grepl(pattern, name)) [13:14:15.928] next [13:14:15.928] invokeRestart(restart) [13:14:15.928] muffled <- TRUE [13:14:15.928] break [13:14:15.928] } [13:14:15.928] } [13:14:15.928] } [13:14:15.928] invisible(muffled) [13:14:15.928] } [13:14:15.928] muffleCondition(cond, pattern = "^muffle") [13:14:15.928] } [13:14:15.928] } [13:14:15.928] } [13:14:15.928] })) [13:14:15.928] }, error = function(ex) { [13:14:15.928] base::structure(base::list(value = NULL, visible = NULL, [13:14:15.928] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:14:15.928] ...future.rng), started = ...future.startTime, [13:14:15.928] finished = Sys.time(), session_uuid = NA_character_, [13:14:15.928] version = "1.8"), class = "FutureResult") [13:14:15.928] }, finally = { [13:14:15.928] if (!identical(...future.workdir, getwd())) [13:14:15.928] setwd(...future.workdir) [13:14:15.928] { [13:14:15.928] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:14:15.928] ...future.oldOptions$nwarnings <- NULL [13:14:15.928] } [13:14:15.928] base::options(...future.oldOptions) [13:14:15.928] if (.Platform$OS.type == "windows") { [13:14:15.928] old_names <- names(...future.oldEnvVars) [13:14:15.928] envs <- base::Sys.getenv() [13:14:15.928] names <- names(envs) [13:14:15.928] common <- intersect(names, old_names) [13:14:15.928] added <- setdiff(names, old_names) [13:14:15.928] removed <- setdiff(old_names, names) [13:14:15.928] changed <- common[...future.oldEnvVars[common] != [13:14:15.928] envs[common]] [13:14:15.928] NAMES <- toupper(changed) [13:14:15.928] args <- list() [13:14:15.928] for (kk in seq_along(NAMES)) { [13:14:15.928] name <- changed[[kk]] [13:14:15.928] NAME <- NAMES[[kk]] [13:14:15.928] if (name != NAME && is.element(NAME, old_names)) [13:14:15.928] next [13:14:15.928] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:15.928] } [13:14:15.928] NAMES <- toupper(added) [13:14:15.928] for (kk in seq_along(NAMES)) { [13:14:15.928] name <- added[[kk]] [13:14:15.928] NAME <- NAMES[[kk]] [13:14:15.928] if (name != NAME && is.element(NAME, old_names)) [13:14:15.928] next [13:14:15.928] args[[name]] <- "" [13:14:15.928] } [13:14:15.928] NAMES <- toupper(removed) [13:14:15.928] for (kk in seq_along(NAMES)) { [13:14:15.928] name <- removed[[kk]] [13:14:15.928] NAME <- NAMES[[kk]] [13:14:15.928] if (name != NAME && is.element(NAME, old_names)) [13:14:15.928] next [13:14:15.928] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:15.928] } [13:14:15.928] if (length(args) > 0) [13:14:15.928] base::do.call(base::Sys.setenv, args = args) [13:14:15.928] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:14:15.928] } [13:14:15.928] else { [13:14:15.928] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:14:15.928] } [13:14:15.928] { [13:14:15.928] if (base::length(...future.futureOptionsAdded) > [13:14:15.928] 0L) { [13:14:15.928] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:14:15.928] base::names(opts) <- ...future.futureOptionsAdded [13:14:15.928] base::options(opts) [13:14:15.928] } [13:14:15.928] { [13:14:15.928] { [13:14:15.928] NULL [13:14:15.928] RNGkind("Mersenne-Twister") [13:14:15.928] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:14:15.928] inherits = FALSE) [13:14:15.928] } [13:14:15.928] options(future.plan = NULL) [13:14:15.928] if (is.na(NA_character_)) [13:14:15.928] Sys.unsetenv("R_FUTURE_PLAN") [13:14:15.928] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:14:15.928] future::plan(list(function (..., envir = parent.frame()) [13:14:15.928] { [13:14:15.928] future <- SequentialFuture(..., envir = envir) [13:14:15.928] if (!future$lazy) [13:14:15.928] future <- run(future) [13:14:15.928] invisible(future) [13:14:15.928] }), .cleanup = FALSE, .init = FALSE) [13:14:15.928] } [13:14:15.928] } [13:14:15.928] } [13:14:15.928] }) [13:14:15.928] if (TRUE) { [13:14:15.928] base::sink(type = "output", split = FALSE) [13:14:15.928] if (TRUE) { [13:14:15.928] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:14:15.928] } [13:14:15.928] else { [13:14:15.928] ...future.result["stdout"] <- base::list(NULL) [13:14:15.928] } [13:14:15.928] base::close(...future.stdout) [13:14:15.928] ...future.stdout <- NULL [13:14:15.928] } [13:14:15.928] ...future.result$conditions <- ...future.conditions [13:14:15.928] ...future.result$finished <- base::Sys.time() [13:14:15.928] ...future.result [13:14:15.928] } [13:14:15.932] assign_globals() ... [13:14:15.932] List of 11 [13:14:15.932] $ ...future.FUN :function (x, ...) [13:14:15.932] $ x_FUN :function (x) [13:14:15.932] $ times : int 4 [13:14:15.932] $ stopf :function (fmt, ..., call. = TRUE, domain = NULL) [13:14:15.932] $ stop_if_not :function (...) [13:14:15.932] $ dim : int [1:2] 2 2 [13:14:15.932] $ valid_types : chr [1:2] "logical" "integer" [13:14:15.932] $ future.call.arguments : list() [13:14:15.932] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:14:15.932] $ ...future.elements_ii :List of 10 [13:14:15.932] ..$ : int 1 [13:14:15.932] ..$ : int 2 [13:14:15.932] ..$ : int 3 [13:14:15.932] ..$ : int 4 [13:14:15.932] ..$ : int 5 [13:14:15.932] ..$ : int 6 [13:14:15.932] ..$ : int 7 [13:14:15.932] ..$ : int 8 [13:14:15.932] ..$ : int 9 [13:14:15.932] ..$ : int 10 [13:14:15.932] $ ...future.seeds_ii : NULL [13:14:15.932] $ ...future.globals.maxSize: NULL [13:14:15.932] - attr(*, "where")=List of 11 [13:14:15.932] ..$ ...future.FUN : [13:14:15.932] ..$ x_FUN : [13:14:15.932] ..$ times : [13:14:15.932] ..$ stopf : [13:14:15.932] ..$ stop_if_not : [13:14:15.932] ..$ dim : [13:14:15.932] ..$ valid_types : [13:14:15.932] ..$ future.call.arguments : [13:14:15.932] ..$ ...future.elements_ii : [13:14:15.932] ..$ ...future.seeds_ii : [13:14:15.932] ..$ ...future.globals.maxSize: [13:14:15.932] - attr(*, "resolved")= logi FALSE [13:14:15.932] - attr(*, "total_size")= num 97232 [13:14:15.932] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:14:15.932] - attr(*, "already-done")= logi TRUE [13:14:15.945] - copied '...future.FUN' to environment [13:14:15.945] - reassign environment for 'x_FUN' [13:14:15.945] - copied 'x_FUN' to environment [13:14:15.945] - copied 'times' to environment [13:14:15.946] - copied 'stopf' to environment [13:14:15.946] - copied 'stop_if_not' to environment [13:14:15.946] - copied 'dim' to environment [13:14:15.946] - copied 'valid_types' to environment [13:14:15.946] - copied 'future.call.arguments' to environment [13:14:15.946] - copied '...future.elements_ii' to environment [13:14:15.946] - copied '...future.seeds_ii' to environment [13:14:15.947] - copied '...future.globals.maxSize' to environment [13:14:15.947] assign_globals() ... done [13:14:15.947] plan(): Setting new future strategy stack: [13:14:15.948] List of future strategies: [13:14:15.948] 1. sequential: [13:14:15.948] - args: function (..., envir = parent.frame(), workers = "") [13:14:15.948] - tweaked: FALSE [13:14:15.948] - call: NULL [13:14:15.948] plan(): nbrOfWorkers() = 1 [13:14:15.949] plan(): Setting new future strategy stack: [13:14:15.950] List of future strategies: [13:14:15.950] 1. sequential: [13:14:15.950] - args: function (..., envir = parent.frame(), workers = "") [13:14:15.950] - tweaked: FALSE [13:14:15.950] - call: plan(strategy) [13:14:15.950] plan(): nbrOfWorkers() = 1 [13:14:15.950] SequentialFuture started (and completed) [13:14:15.951] - Launch lazy future ... done [13:14:15.951] run() for 'SequentialFuture' ... done [13:14:15.951] Created future: [13:14:15.951] SequentialFuture: [13:14:15.951] Label: 'future_vapply-1' [13:14:15.951] Expression: [13:14:15.951] { [13:14:15.951] do.call(function(...) { [13:14:15.951] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:15.951] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:15.951] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:15.951] on.exit(options(oopts), add = TRUE) [13:14:15.951] } [13:14:15.951] { [13:14:15.951] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:15.951] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:15.951] ...future.FUN(...future.X_jj, ...) [13:14:15.951] }) [13:14:15.951] } [13:14:15.951] }, args = future.call.arguments) [13:14:15.951] } [13:14:15.951] Lazy evaluation: FALSE [13:14:15.951] Asynchronous evaluation: FALSE [13:14:15.951] Local evaluation: TRUE [13:14:15.951] Environment: R_GlobalEnv [13:14:15.951] Capture standard output: TRUE [13:14:15.951] Capture condition classes: 'condition' (excluding 'nothing') [13:14:15.951] Globals: 11 objects totaling 95.50 KiB (function '...future.FUN' of 21.22 KiB, function 'x_FUN' of 2.90 KiB, integer 'times' of 56 bytes, function 'stopf' of 26.43 KiB, function 'stop_if_not' of 44.12 KiB, ...) [13:14:15.951] Packages: 1 packages ('future.apply') [13:14:15.951] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:14:15.951] Resolved: TRUE [13:14:15.951] Value: 2.27 KiB of class 'list' [13:14:15.951] Early signaling: FALSE [13:14:15.951] Owner process: 1bb7d580-628d-c90d-e38a-66de485868c4 [13:14:15.951] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:14:15.953] Chunk #1 of 1 ... DONE [13:14:15.953] Launching 1 futures (chunks) ... DONE [13:14:15.953] Resolving 1 futures (chunks) ... [13:14:15.953] resolve() on list ... [13:14:15.953] recursive: 0 [13:14:15.954] length: 1 [13:14:15.954] [13:14:15.954] resolved() for 'SequentialFuture' ... [13:14:15.954] - state: 'finished' [13:14:15.954] - run: TRUE [13:14:15.954] - result: 'FutureResult' [13:14:15.955] resolved() for 'SequentialFuture' ... done [13:14:15.955] Future #1 [13:14:15.955] signalConditionsASAP(SequentialFuture, pos=1) ... [13:14:15.955] - nx: 1 [13:14:15.955] - relay: TRUE [13:14:15.955] - stdout: TRUE [13:14:15.956] - signal: TRUE [13:14:15.956] - resignal: FALSE [13:14:15.956] - force: TRUE [13:14:15.956] - relayed: [n=1] FALSE [13:14:15.956] - queued futures: [n=1] FALSE [13:14:15.956] - until=1 [13:14:15.956] - relaying element #1 [13:14:15.957] - relayed: [n=1] TRUE [13:14:15.957] - queued futures: [n=1] TRUE [13:14:15.957] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:14:15.957] length: 0 (resolved future 1) [13:14:15.957] Relaying remaining futures [13:14:15.958] signalConditionsASAP(NULL, pos=0) ... [13:14:15.958] - nx: 1 [13:14:15.958] - relay: TRUE [13:14:15.958] - stdout: TRUE [13:14:15.958] - signal: TRUE [13:14:15.958] - resignal: FALSE [13:14:15.958] - force: TRUE [13:14:15.959] - relayed: [n=1] TRUE [13:14:15.959] - queued futures: [n=1] TRUE - flush all [13:14:15.959] - relayed: [n=1] TRUE [13:14:15.959] - queued futures: [n=1] TRUE [13:14:15.959] signalConditionsASAP(NULL, pos=0) ... done [13:14:15.959] resolve() on list ... DONE [13:14:15.960] - Number of value chunks collected: 1 [13:14:15.960] Resolving 1 futures (chunks) ... DONE [13:14:15.960] Reducing values from 1 chunks ... [13:14:15.960] - Number of values collected after concatenation: 10 [13:14:15.960] - Number of values expected: 10 [13:14:15.960] Reducing values from 1 chunks ... DONE [13:14:15.961] future_lapply() ... DONE int [1:2, 1:2, 1:10] 1 1 1 1 2 2 2 2 3 3 ... num [1:2, 1:2, 1:10] 1 1 1 1 2 2 2 2 3 3 ... [13:14:15.962] future_lapply() ... [13:14:15.964] Number of chunks: 1 [13:14:15.964] getGlobalsAndPackagesXApply() ... [13:14:15.964] - future.globals: TRUE [13:14:15.964] getGlobalsAndPackages() ... [13:14:15.965] Searching for globals... [13:14:15.970] - globals found: [17] 'FUN', '{', '<-', 'x_FUN', 'if', '!=', 'length', 'times', 'stopf', 'stop_if_not', 'all', '==', 'dim', '%in%', 'typeof', 'valid_types', 'matrix' [13:14:15.970] Searching for globals ... DONE [13:14:15.970] Resolving globals: FALSE [13:14:15.971] The total size of the 7 globals is 95.02 KiB (97304 bytes) [13:14:15.972] The total size of the 7 globals exported for future expression ('FUN()') is 95.02 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). The three largest globals are 'stop_if_not' (44.12 KiB of class 'function'), 'stopf' (26.43 KiB of class 'function') and 'FUN' (21.22 KiB of class 'function') [13:14:15.972] - globals: [7] 'FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types' [13:14:15.972] - packages: [1] 'future.apply' [13:14:15.972] getGlobalsAndPackages() ... DONE [13:14:15.972] - globals found/used: [n=7] 'FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types' [13:14:15.972] - needed namespaces: [n=1] 'future.apply' [13:14:15.973] Finding globals ... DONE [13:14:15.973] - use_args: TRUE [13:14:15.973] - Getting '...' globals ... [13:14:15.973] resolve() on list ... [13:14:15.973] recursive: 0 [13:14:15.974] length: 1 [13:14:15.974] elements: '...' [13:14:15.974] length: 0 (resolved future 1) [13:14:15.974] resolve() on list ... DONE [13:14:15.974] - '...' content: [n=0] [13:14:15.974] List of 1 [13:14:15.974] $ ...: list() [13:14:15.974] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:14:15.974] - attr(*, "where")=List of 1 [13:14:15.974] ..$ ...: [13:14:15.974] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:14:15.974] - attr(*, "resolved")= logi TRUE [13:14:15.974] - attr(*, "total_size")= num NA [13:14:15.977] - Getting '...' globals ... DONE [13:14:15.978] Globals to be used in all futures (chunks): [n=8] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...' [13:14:15.978] List of 8 [13:14:15.978] $ ...future.FUN:function (x, ...) [13:14:15.978] $ x_FUN :function (x) [13:14:15.978] $ times : int 4 [13:14:15.978] $ stopf :function (fmt, ..., call. = TRUE, domain = NULL) [13:14:15.978] $ stop_if_not :function (...) [13:14:15.978] $ dim : int [1:2] 2 2 [13:14:15.978] $ valid_types : chr [1:3] "logical" "integer" "double" [13:14:15.978] $ ... : list() [13:14:15.978] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:14:15.978] - attr(*, "where")=List of 8 [13:14:15.978] ..$ ...future.FUN: [13:14:15.978] ..$ x_FUN : [13:14:15.978] ..$ times : [13:14:15.978] ..$ stopf : [13:14:15.978] ..$ stop_if_not : [13:14:15.978] ..$ dim : [13:14:15.978] ..$ valid_types : [13:14:15.978] ..$ ... : [13:14:15.978] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:14:15.978] - attr(*, "resolved")= logi FALSE [13:14:15.978] - attr(*, "total_size")= num 97304 [13:14:15.984] Packages to be attached in all futures: [n=1] 'future.apply' [13:14:15.984] getGlobalsAndPackagesXApply() ... DONE [13:14:15.985] Number of futures (= number of chunks): 1 [13:14:15.985] Launching 1 futures (chunks) ... [13:14:15.985] Chunk #1 of 1 ... [13:14:15.985] - Finding globals in 'X' for chunk #1 ... [13:14:15.985] getGlobalsAndPackages() ... [13:14:15.986] Searching for globals... [13:14:15.986] [13:14:15.986] Searching for globals ... DONE [13:14:15.986] - globals: [0] [13:14:15.986] getGlobalsAndPackages() ... DONE [13:14:15.986] + additional globals found: [n=0] [13:14:15.987] + additional namespaces needed: [n=0] [13:14:15.987] - Finding globals in 'X' for chunk #1 ... DONE [13:14:15.987] - seeds: [13:14:15.987] - All globals exported: [n=11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:15.987] getGlobalsAndPackages() ... [13:14:15.987] - globals passed as-is: [11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:15.988] Resolving globals: FALSE [13:14:15.988] Tweak future expression to call with '...' arguments ... [13:14:15.988] { [13:14:15.988] do.call(function(...) { [13:14:15.988] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:15.988] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:15.988] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:15.988] on.exit(options(oopts), add = TRUE) [13:14:15.988] } [13:14:15.988] { [13:14:15.988] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:15.988] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:15.988] ...future.FUN(...future.X_jj, ...) [13:14:15.988] }) [13:14:15.988] } [13:14:15.988] }, args = future.call.arguments) [13:14:15.988] } [13:14:15.988] Tweak future expression to call with '...' arguments ... DONE [13:14:15.989] - globals: [11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:15.989] - packages: [1] 'future.apply' [13:14:15.989] getGlobalsAndPackages() ... DONE [13:14:15.990] run() for 'Future' ... [13:14:15.991] - state: 'created' [13:14:15.991] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:14:15.991] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:14:15.991] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:14:15.992] - Field: 'label' [13:14:15.992] - Field: 'local' [13:14:15.992] - Field: 'owner' [13:14:15.992] - Field: 'envir' [13:14:15.992] - Field: 'packages' [13:14:15.993] - Field: 'gc' [13:14:15.993] - Field: 'conditions' [13:14:15.993] - Field: 'expr' [13:14:15.993] - Field: 'uuid' [13:14:15.993] - Field: 'seed' [13:14:15.993] - Field: 'version' [13:14:15.994] - Field: 'result' [13:14:15.994] - Field: 'asynchronous' [13:14:15.994] - Field: 'calls' [13:14:15.994] - Field: 'globals' [13:14:15.994] - Field: 'stdout' [13:14:15.994] - Field: 'earlySignal' [13:14:15.995] - Field: 'lazy' [13:14:15.995] - Field: 'state' [13:14:15.995] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:14:15.995] - Launch lazy future ... [13:14:15.995] Packages needed by the future expression (n = 1): 'future.apply' [13:14:15.996] Packages needed by future strategies (n = 0): [13:14:15.996] { [13:14:15.996] { [13:14:15.996] { [13:14:15.996] ...future.startTime <- base::Sys.time() [13:14:15.996] { [13:14:15.996] { [13:14:15.996] { [13:14:15.996] { [13:14:15.996] base::local({ [13:14:15.996] has_future <- base::requireNamespace("future", [13:14:15.996] quietly = TRUE) [13:14:15.996] if (has_future) { [13:14:15.996] ns <- base::getNamespace("future") [13:14:15.996] version <- ns[[".package"]][["version"]] [13:14:15.996] if (is.null(version)) [13:14:15.996] version <- utils::packageVersion("future") [13:14:15.996] } [13:14:15.996] else { [13:14:15.996] version <- NULL [13:14:15.996] } [13:14:15.996] if (!has_future || version < "1.8.0") { [13:14:15.996] info <- base::c(r_version = base::gsub("R version ", [13:14:15.996] "", base::R.version$version.string), [13:14:15.996] platform = base::sprintf("%s (%s-bit)", [13:14:15.996] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:14:15.996] os = base::paste(base::Sys.info()[base::c("sysname", [13:14:15.996] "release", "version")], collapse = " "), [13:14:15.996] hostname = base::Sys.info()[["nodename"]]) [13:14:15.996] info <- base::sprintf("%s: %s", base::names(info), [13:14:15.996] info) [13:14:15.996] info <- base::paste(info, collapse = "; ") [13:14:15.996] if (!has_future) { [13:14:15.996] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:14:15.996] info) [13:14:15.996] } [13:14:15.996] else { [13:14:15.996] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:14:15.996] info, version) [13:14:15.996] } [13:14:15.996] base::stop(msg) [13:14:15.996] } [13:14:15.996] }) [13:14:15.996] } [13:14:15.996] base::local({ [13:14:15.996] for (pkg in "future.apply") { [13:14:15.996] base::loadNamespace(pkg) [13:14:15.996] base::library(pkg, character.only = TRUE) [13:14:15.996] } [13:14:15.996] }) [13:14:15.996] } [13:14:15.996] options(future.plan = NULL) [13:14:15.996] Sys.unsetenv("R_FUTURE_PLAN") [13:14:15.996] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:14:15.996] } [13:14:15.996] ...future.workdir <- getwd() [13:14:15.996] } [13:14:15.996] ...future.oldOptions <- base::as.list(base::.Options) [13:14:15.996] ...future.oldEnvVars <- base::Sys.getenv() [13:14:15.996] } [13:14:15.996] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:14:15.996] future.globals.maxSize = NULL, future.globals.method = NULL, [13:14:15.996] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:14:15.996] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:14:15.996] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:14:15.996] future.stdout.windows.reencode = NULL, width = 80L) [13:14:15.996] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:14:15.996] base::names(...future.oldOptions)) [13:14:15.996] } [13:14:15.996] if (FALSE) { [13:14:15.996] } [13:14:15.996] else { [13:14:15.996] if (TRUE) { [13:14:15.996] ...future.stdout <- base::rawConnection(base::raw(0L), [13:14:15.996] open = "w") [13:14:15.996] } [13:14:15.996] else { [13:14:15.996] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:14:15.996] windows = "NUL", "/dev/null"), open = "w") [13:14:15.996] } [13:14:15.996] base::sink(...future.stdout, type = "output", split = FALSE) [13:14:15.996] base::on.exit(if (!base::is.null(...future.stdout)) { [13:14:15.996] base::sink(type = "output", split = FALSE) [13:14:15.996] base::close(...future.stdout) [13:14:15.996] }, add = TRUE) [13:14:15.996] } [13:14:15.996] ...future.frame <- base::sys.nframe() [13:14:15.996] ...future.conditions <- base::list() [13:14:15.996] ...future.rng <- base::globalenv()$.Random.seed [13:14:15.996] if (FALSE) { [13:14:15.996] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:14:15.996] "...future.value", "...future.globalenv.names", ".Random.seed") [13:14:15.996] } [13:14:15.996] ...future.result <- base::tryCatch({ [13:14:15.996] base::withCallingHandlers({ [13:14:15.996] ...future.value <- base::withVisible(base::local({ [13:14:15.996] do.call(function(...) { [13:14:15.996] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:15.996] if (!identical(...future.globals.maxSize.org, [13:14:15.996] ...future.globals.maxSize)) { [13:14:15.996] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:15.996] on.exit(options(oopts), add = TRUE) [13:14:15.996] } [13:14:15.996] { [13:14:15.996] lapply(seq_along(...future.elements_ii), [13:14:15.996] FUN = function(jj) { [13:14:15.996] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:15.996] ...future.FUN(...future.X_jj, ...) [13:14:15.996] }) [13:14:15.996] } [13:14:15.996] }, args = future.call.arguments) [13:14:15.996] })) [13:14:15.996] future::FutureResult(value = ...future.value$value, [13:14:15.996] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:14:15.996] ...future.rng), globalenv = if (FALSE) [13:14:15.996] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:14:15.996] ...future.globalenv.names)) [13:14:15.996] else NULL, started = ...future.startTime, version = "1.8") [13:14:15.996] }, condition = base::local({ [13:14:15.996] c <- base::c [13:14:15.996] inherits <- base::inherits [13:14:15.996] invokeRestart <- base::invokeRestart [13:14:15.996] length <- base::length [13:14:15.996] list <- base::list [13:14:15.996] seq.int <- base::seq.int [13:14:15.996] signalCondition <- base::signalCondition [13:14:15.996] sys.calls <- base::sys.calls [13:14:15.996] `[[` <- base::`[[` [13:14:15.996] `+` <- base::`+` [13:14:15.996] `<<-` <- base::`<<-` [13:14:15.996] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:14:15.996] calls[seq.int(from = from + 12L, to = length(calls) - [13:14:15.996] 3L)] [13:14:15.996] } [13:14:15.996] function(cond) { [13:14:15.996] is_error <- inherits(cond, "error") [13:14:15.996] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:14:15.996] NULL) [13:14:15.996] if (is_error) { [13:14:15.996] sessionInformation <- function() { [13:14:15.996] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:14:15.996] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:14:15.996] search = base::search(), system = base::Sys.info()) [13:14:15.996] } [13:14:15.996] ...future.conditions[[length(...future.conditions) + [13:14:15.996] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:14:15.996] cond$call), session = sessionInformation(), [13:14:15.996] timestamp = base::Sys.time(), signaled = 0L) [13:14:15.996] signalCondition(cond) [13:14:15.996] } [13:14:15.996] else if (!ignore && TRUE && inherits(cond, c("condition", [13:14:15.996] "immediateCondition"))) { [13:14:15.996] signal <- TRUE && inherits(cond, "immediateCondition") [13:14:15.996] ...future.conditions[[length(...future.conditions) + [13:14:15.996] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:14:15.996] if (TRUE && !signal) { [13:14:15.996] muffleCondition <- function (cond, pattern = "^muffle") [13:14:15.996] { [13:14:15.996] inherits <- base::inherits [13:14:15.996] invokeRestart <- base::invokeRestart [13:14:15.996] is.null <- base::is.null [13:14:15.996] muffled <- FALSE [13:14:15.996] if (inherits(cond, "message")) { [13:14:15.996] muffled <- grepl(pattern, "muffleMessage") [13:14:15.996] if (muffled) [13:14:15.996] invokeRestart("muffleMessage") [13:14:15.996] } [13:14:15.996] else if (inherits(cond, "warning")) { [13:14:15.996] muffled <- grepl(pattern, "muffleWarning") [13:14:15.996] if (muffled) [13:14:15.996] invokeRestart("muffleWarning") [13:14:15.996] } [13:14:15.996] else if (inherits(cond, "condition")) { [13:14:15.996] if (!is.null(pattern)) { [13:14:15.996] computeRestarts <- base::computeRestarts [13:14:15.996] grepl <- base::grepl [13:14:15.996] restarts <- computeRestarts(cond) [13:14:15.996] for (restart in restarts) { [13:14:15.996] name <- restart$name [13:14:15.996] if (is.null(name)) [13:14:15.996] next [13:14:15.996] if (!grepl(pattern, name)) [13:14:15.996] next [13:14:15.996] invokeRestart(restart) [13:14:15.996] muffled <- TRUE [13:14:15.996] break [13:14:15.996] } [13:14:15.996] } [13:14:15.996] } [13:14:15.996] invisible(muffled) [13:14:15.996] } [13:14:15.996] muffleCondition(cond, pattern = "^muffle") [13:14:15.996] } [13:14:15.996] } [13:14:15.996] else { [13:14:15.996] if (TRUE) { [13:14:15.996] muffleCondition <- function (cond, pattern = "^muffle") [13:14:15.996] { [13:14:15.996] inherits <- base::inherits [13:14:15.996] invokeRestart <- base::invokeRestart [13:14:15.996] is.null <- base::is.null [13:14:15.996] muffled <- FALSE [13:14:15.996] if (inherits(cond, "message")) { [13:14:15.996] muffled <- grepl(pattern, "muffleMessage") [13:14:15.996] if (muffled) [13:14:15.996] invokeRestart("muffleMessage") [13:14:15.996] } [13:14:15.996] else if (inherits(cond, "warning")) { [13:14:15.996] muffled <- grepl(pattern, "muffleWarning") [13:14:15.996] if (muffled) [13:14:15.996] invokeRestart("muffleWarning") [13:14:15.996] } [13:14:15.996] else if (inherits(cond, "condition")) { [13:14:15.996] if (!is.null(pattern)) { [13:14:15.996] computeRestarts <- base::computeRestarts [13:14:15.996] grepl <- base::grepl [13:14:15.996] restarts <- computeRestarts(cond) [13:14:15.996] for (restart in restarts) { [13:14:15.996] name <- restart$name [13:14:15.996] if (is.null(name)) [13:14:15.996] next [13:14:15.996] if (!grepl(pattern, name)) [13:14:15.996] next [13:14:15.996] invokeRestart(restart) [13:14:15.996] muffled <- TRUE [13:14:15.996] break [13:14:15.996] } [13:14:15.996] } [13:14:15.996] } [13:14:15.996] invisible(muffled) [13:14:15.996] } [13:14:15.996] muffleCondition(cond, pattern = "^muffle") [13:14:15.996] } [13:14:15.996] } [13:14:15.996] } [13:14:15.996] })) [13:14:15.996] }, error = function(ex) { [13:14:15.996] base::structure(base::list(value = NULL, visible = NULL, [13:14:15.996] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:14:15.996] ...future.rng), started = ...future.startTime, [13:14:15.996] finished = Sys.time(), session_uuid = NA_character_, [13:14:15.996] version = "1.8"), class = "FutureResult") [13:14:15.996] }, finally = { [13:14:15.996] if (!identical(...future.workdir, getwd())) [13:14:15.996] setwd(...future.workdir) [13:14:15.996] { [13:14:15.996] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:14:15.996] ...future.oldOptions$nwarnings <- NULL [13:14:15.996] } [13:14:15.996] base::options(...future.oldOptions) [13:14:15.996] if (.Platform$OS.type == "windows") { [13:14:15.996] old_names <- names(...future.oldEnvVars) [13:14:15.996] envs <- base::Sys.getenv() [13:14:15.996] names <- names(envs) [13:14:15.996] common <- intersect(names, old_names) [13:14:15.996] added <- setdiff(names, old_names) [13:14:15.996] removed <- setdiff(old_names, names) [13:14:15.996] changed <- common[...future.oldEnvVars[common] != [13:14:15.996] envs[common]] [13:14:15.996] NAMES <- toupper(changed) [13:14:15.996] args <- list() [13:14:15.996] for (kk in seq_along(NAMES)) { [13:14:15.996] name <- changed[[kk]] [13:14:15.996] NAME <- NAMES[[kk]] [13:14:15.996] if (name != NAME && is.element(NAME, old_names)) [13:14:15.996] next [13:14:15.996] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:15.996] } [13:14:15.996] NAMES <- toupper(added) [13:14:15.996] for (kk in seq_along(NAMES)) { [13:14:15.996] name <- added[[kk]] [13:14:15.996] NAME <- NAMES[[kk]] [13:14:15.996] if (name != NAME && is.element(NAME, old_names)) [13:14:15.996] next [13:14:15.996] args[[name]] <- "" [13:14:15.996] } [13:14:15.996] NAMES <- toupper(removed) [13:14:15.996] for (kk in seq_along(NAMES)) { [13:14:15.996] name <- removed[[kk]] [13:14:15.996] NAME <- NAMES[[kk]] [13:14:15.996] if (name != NAME && is.element(NAME, old_names)) [13:14:15.996] next [13:14:15.996] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:15.996] } [13:14:15.996] if (length(args) > 0) [13:14:15.996] base::do.call(base::Sys.setenv, args = args) [13:14:15.996] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:14:15.996] } [13:14:15.996] else { [13:14:15.996] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:14:15.996] } [13:14:15.996] { [13:14:15.996] if (base::length(...future.futureOptionsAdded) > [13:14:15.996] 0L) { [13:14:15.996] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:14:15.996] base::names(opts) <- ...future.futureOptionsAdded [13:14:15.996] base::options(opts) [13:14:15.996] } [13:14:15.996] { [13:14:15.996] { [13:14:15.996] NULL [13:14:15.996] RNGkind("Mersenne-Twister") [13:14:15.996] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:14:15.996] inherits = FALSE) [13:14:15.996] } [13:14:15.996] options(future.plan = NULL) [13:14:15.996] if (is.na(NA_character_)) [13:14:15.996] Sys.unsetenv("R_FUTURE_PLAN") [13:14:15.996] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:14:15.996] future::plan(list(function (..., envir = parent.frame()) [13:14:15.996] { [13:14:15.996] future <- SequentialFuture(..., envir = envir) [13:14:15.996] if (!future$lazy) [13:14:15.996] future <- run(future) [13:14:15.996] invisible(future) [13:14:15.996] }), .cleanup = FALSE, .init = FALSE) [13:14:15.996] } [13:14:15.996] } [13:14:15.996] } [13:14:15.996] }) [13:14:15.996] if (TRUE) { [13:14:15.996] base::sink(type = "output", split = FALSE) [13:14:15.996] if (TRUE) { [13:14:15.996] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:14:15.996] } [13:14:15.996] else { [13:14:15.996] ...future.result["stdout"] <- base::list(NULL) [13:14:15.996] } [13:14:15.996] base::close(...future.stdout) [13:14:15.996] ...future.stdout <- NULL [13:14:15.996] } [13:14:15.996] ...future.result$conditions <- ...future.conditions [13:14:15.996] ...future.result$finished <- base::Sys.time() [13:14:15.996] ...future.result [13:14:15.996] } [13:14:16.000] assign_globals() ... [13:14:16.000] List of 11 [13:14:16.000] $ ...future.FUN :function (x, ...) [13:14:16.000] $ x_FUN :function (x) [13:14:16.000] $ times : int 4 [13:14:16.000] $ stopf :function (fmt, ..., call. = TRUE, domain = NULL) [13:14:16.000] $ stop_if_not :function (...) [13:14:16.000] $ dim : int [1:2] 2 2 [13:14:16.000] $ valid_types : chr [1:3] "logical" "integer" "double" [13:14:16.000] $ future.call.arguments : list() [13:14:16.000] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:14:16.000] $ ...future.elements_ii :List of 10 [13:14:16.000] ..$ : int 1 [13:14:16.000] ..$ : int 2 [13:14:16.000] ..$ : int 3 [13:14:16.000] ..$ : int 4 [13:14:16.000] ..$ : int 5 [13:14:16.000] ..$ : int 6 [13:14:16.000] ..$ : int 7 [13:14:16.000] ..$ : int 8 [13:14:16.000] ..$ : int 9 [13:14:16.000] ..$ : int 10 [13:14:16.000] $ ...future.seeds_ii : NULL [13:14:16.000] $ ...future.globals.maxSize: NULL [13:14:16.000] - attr(*, "where")=List of 11 [13:14:16.000] ..$ ...future.FUN : [13:14:16.000] ..$ x_FUN : [13:14:16.000] ..$ times : [13:14:16.000] ..$ stopf : [13:14:16.000] ..$ stop_if_not : [13:14:16.000] ..$ dim : [13:14:16.000] ..$ valid_types : [13:14:16.000] ..$ future.call.arguments : [13:14:16.000] ..$ ...future.elements_ii : [13:14:16.000] ..$ ...future.seeds_ii : [13:14:16.000] ..$ ...future.globals.maxSize: [13:14:16.000] - attr(*, "resolved")= logi FALSE [13:14:16.000] - attr(*, "total_size")= num 97304 [13:14:16.000] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:14:16.000] - attr(*, "already-done")= logi TRUE [13:14:16.012] - copied '...future.FUN' to environment [13:14:16.012] - reassign environment for 'x_FUN' [13:14:16.012] - copied 'x_FUN' to environment [13:14:16.012] - copied 'times' to environment [13:14:16.013] - copied 'stopf' to environment [13:14:16.013] - copied 'stop_if_not' to environment [13:14:16.013] - copied 'dim' to environment [13:14:16.013] - copied 'valid_types' to environment [13:14:16.013] - copied 'future.call.arguments' to environment [13:14:16.013] - copied '...future.elements_ii' to environment [13:14:16.014] - copied '...future.seeds_ii' to environment [13:14:16.014] - copied '...future.globals.maxSize' to environment [13:14:16.014] assign_globals() ... done [13:14:16.014] plan(): Setting new future strategy stack: [13:14:16.015] List of future strategies: [13:14:16.015] 1. sequential: [13:14:16.015] - args: function (..., envir = parent.frame(), workers = "") [13:14:16.015] - tweaked: FALSE [13:14:16.015] - call: NULL [13:14:16.015] plan(): nbrOfWorkers() = 1 [13:14:16.017] plan(): Setting new future strategy stack: [13:14:16.017] List of future strategies: [13:14:16.017] 1. sequential: [13:14:16.017] - args: function (..., envir = parent.frame(), workers = "") [13:14:16.017] - tweaked: FALSE [13:14:16.017] - call: plan(strategy) [13:14:16.018] plan(): nbrOfWorkers() = 1 [13:14:16.018] SequentialFuture started (and completed) [13:14:16.018] - Launch lazy future ... done [13:14:16.019] run() for 'SequentialFuture' ... done [13:14:16.019] Created future: [13:14:16.019] SequentialFuture: [13:14:16.019] Label: 'future_vapply-1' [13:14:16.019] Expression: [13:14:16.019] { [13:14:16.019] do.call(function(...) { [13:14:16.019] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:16.019] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:16.019] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:16.019] on.exit(options(oopts), add = TRUE) [13:14:16.019] } [13:14:16.019] { [13:14:16.019] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:16.019] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:16.019] ...future.FUN(...future.X_jj, ...) [13:14:16.019] }) [13:14:16.019] } [13:14:16.019] }, args = future.call.arguments) [13:14:16.019] } [13:14:16.019] Lazy evaluation: FALSE [13:14:16.019] Asynchronous evaluation: FALSE [13:14:16.019] Local evaluation: TRUE [13:14:16.019] Environment: R_GlobalEnv [13:14:16.019] Capture standard output: TRUE [13:14:16.019] Capture condition classes: 'condition' (excluding 'nothing') [13:14:16.019] Globals: 11 objects totaling 95.57 KiB (function '...future.FUN' of 21.22 KiB, function 'x_FUN' of 2.90 KiB, integer 'times' of 56 bytes, function 'stopf' of 26.43 KiB, function 'stop_if_not' of 44.12 KiB, ...) [13:14:16.019] Packages: 1 packages ('future.apply') [13:14:16.019] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:14:16.019] Resolved: TRUE [13:14:16.019] Value: 2.27 KiB of class 'list' [13:14:16.019] Early signaling: FALSE [13:14:16.019] Owner process: 1bb7d580-628d-c90d-e38a-66de485868c4 [13:14:16.019] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:14:16.020] Chunk #1 of 1 ... DONE [13:14:16.021] Launching 1 futures (chunks) ... DONE [13:14:16.021] Resolving 1 futures (chunks) ... [13:14:16.021] resolve() on list ... [13:14:16.021] recursive: 0 [13:14:16.021] length: 1 [13:14:16.021] [13:14:16.022] resolved() for 'SequentialFuture' ... [13:14:16.022] - state: 'finished' [13:14:16.022] - run: TRUE [13:14:16.022] - result: 'FutureResult' [13:14:16.022] resolved() for 'SequentialFuture' ... done [13:14:16.022] Future #1 [13:14:16.023] signalConditionsASAP(SequentialFuture, pos=1) ... [13:14:16.023] - nx: 1 [13:14:16.023] - relay: TRUE [13:14:16.023] - stdout: TRUE [13:14:16.023] - signal: TRUE [13:14:16.023] - resignal: FALSE [13:14:16.024] - force: TRUE [13:14:16.024] - relayed: [n=1] FALSE [13:14:16.024] - queued futures: [n=1] FALSE [13:14:16.024] - until=1 [13:14:16.024] - relaying element #1 [13:14:16.024] - relayed: [n=1] TRUE [13:14:16.025] - queued futures: [n=1] TRUE [13:14:16.025] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:14:16.025] length: 0 (resolved future 1) [13:14:16.025] Relaying remaining futures [13:14:16.025] signalConditionsASAP(NULL, pos=0) ... [13:14:16.025] - nx: 1 [13:14:16.026] - relay: TRUE [13:14:16.026] - stdout: TRUE [13:14:16.026] - signal: TRUE [13:14:16.026] - resignal: FALSE [13:14:16.026] - force: TRUE [13:14:16.026] - relayed: [n=1] TRUE [13:14:16.026] - queued futures: [n=1] TRUE - flush all [13:14:16.027] - relayed: [n=1] TRUE [13:14:16.027] - queued futures: [n=1] TRUE [13:14:16.027] signalConditionsASAP(NULL, pos=0) ... done [13:14:16.027] resolve() on list ... DONE [13:14:16.027] - Number of value chunks collected: 1 [13:14:16.027] Resolving 1 futures (chunks) ... DONE [13:14:16.028] Reducing values from 1 chunks ... [13:14:16.028] - Number of values collected after concatenation: 10 [13:14:16.028] - Number of values expected: 10 [13:14:16.028] Reducing values from 1 chunks ... DONE [13:14:16.028] future_lapply() ... DONE int [1:2, 1:2, 1:10] 1 1 1 1 2 2 2 2 3 3 ... num [1:2, 1:2, 1:10] 1 1 1 1 2 2 2 2 3 3 ... - attr(*, "dimnames")=List of 3 ..$ : chr [1:2] "a" "b" ..$ : chr [1:2] "A" "B" ..$ : NULL [13:14:16.030] future_lapply() ... [13:14:16.033] Number of chunks: 1 [13:14:16.033] getGlobalsAndPackagesXApply() ... [13:14:16.033] - future.globals: TRUE [13:14:16.033] getGlobalsAndPackages() ... [13:14:16.033] Searching for globals... [13:14:16.038] - globals found: [19] 'FUN', '{', '<-', 'x_FUN', 'if', '!=', 'length', 'times', 'stopf', 'stop_if_not', 'all', '==', 'dim', '%in%', 'typeof', 'valid_types', 'matrix', 'list', 'c' [13:14:16.038] Searching for globals ... DONE [13:14:16.039] Resolving globals: FALSE [13:14:16.040] The total size of the 7 globals is 103.08 KiB (105552 bytes) [13:14:16.040] The total size of the 7 globals exported for future expression ('FUN()') is 103.08 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). The three largest globals are 'stop_if_not' (44.12 KiB of class 'function'), 'stopf' (26.43 KiB of class 'function') and 'FUN' (21.22 KiB of class 'function') [13:14:16.041] - globals: [7] 'FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types' [13:14:16.041] - packages: [1] 'future.apply' [13:14:16.041] getGlobalsAndPackages() ... DONE [13:14:16.042] - globals found/used: [n=7] 'FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types' [13:14:16.042] - needed namespaces: [n=1] 'future.apply' [13:14:16.042] Finding globals ... DONE [13:14:16.042] - use_args: TRUE [13:14:16.042] - Getting '...' globals ... [13:14:16.043] resolve() on list ... [13:14:16.043] recursive: 0 [13:14:16.043] length: 1 [13:14:16.043] elements: '...' [13:14:16.043] length: 0 (resolved future 1) [13:14:16.043] resolve() on list ... DONE [13:14:16.044] - '...' content: [n=0] [13:14:16.044] List of 1 [13:14:16.044] $ ...: list() [13:14:16.044] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:14:16.044] - attr(*, "where")=List of 1 [13:14:16.044] ..$ ...: [13:14:16.044] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:14:16.044] - attr(*, "resolved")= logi TRUE [13:14:16.044] - attr(*, "total_size")= num NA [13:14:16.047] - Getting '...' globals ... DONE [13:14:16.047] Globals to be used in all futures (chunks): [n=8] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...' [13:14:16.047] List of 8 [13:14:16.047] $ ...future.FUN:function (x, ...) [13:14:16.047] $ x_FUN :function (x) [13:14:16.047] $ times : int 4 [13:14:16.047] $ stopf :function (fmt, ..., call. = TRUE, domain = NULL) [13:14:16.047] $ stop_if_not :function (...) [13:14:16.047] $ dim : int [1:2] 2 2 [13:14:16.047] $ valid_types : chr [1:3] "logical" "integer" "double" [13:14:16.047] $ ... : list() [13:14:16.047] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:14:16.047] - attr(*, "where")=List of 8 [13:14:16.047] ..$ ...future.FUN: [13:14:16.047] ..$ x_FUN : [13:14:16.047] ..$ times : [13:14:16.047] ..$ stopf : [13:14:16.047] ..$ stop_if_not : [13:14:16.047] ..$ dim : [13:14:16.047] ..$ valid_types : [13:14:16.047] ..$ ... : [13:14:16.047] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:14:16.047] - attr(*, "resolved")= logi FALSE [13:14:16.047] - attr(*, "total_size")= num 105552 [13:14:16.058] Packages to be attached in all futures: [n=1] 'future.apply' [13:14:16.059] getGlobalsAndPackagesXApply() ... DONE [13:14:16.059] Number of futures (= number of chunks): 1 [13:14:16.059] Launching 1 futures (chunks) ... [13:14:16.060] Chunk #1 of 1 ... [13:14:16.060] - Finding globals in 'X' for chunk #1 ... [13:14:16.060] getGlobalsAndPackages() ... [13:14:16.060] Searching for globals... [13:14:16.061] [13:14:16.061] Searching for globals ... DONE [13:14:16.061] - globals: [0] [13:14:16.062] getGlobalsAndPackages() ... DONE [13:14:16.062] + additional globals found: [n=0] [13:14:16.062] + additional namespaces needed: [n=0] [13:14:16.062] - Finding globals in 'X' for chunk #1 ... DONE [13:14:16.062] - seeds: [13:14:16.063] - All globals exported: [n=11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:16.063] getGlobalsAndPackages() ... [13:14:16.063] - globals passed as-is: [11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:16.063] Resolving globals: FALSE [13:14:16.064] Tweak future expression to call with '...' arguments ... [13:14:16.064] { [13:14:16.064] do.call(function(...) { [13:14:16.064] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:16.064] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:16.064] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:16.064] on.exit(options(oopts), add = TRUE) [13:14:16.064] } [13:14:16.064] { [13:14:16.064] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:16.064] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:16.064] ...future.FUN(...future.X_jj, ...) [13:14:16.064] }) [13:14:16.064] } [13:14:16.064] }, args = future.call.arguments) [13:14:16.064] } [13:14:16.064] Tweak future expression to call with '...' arguments ... DONE [13:14:16.066] - globals: [11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:16.066] - packages: [1] 'future.apply' [13:14:16.066] getGlobalsAndPackages() ... DONE [13:14:16.067] run() for 'Future' ... [13:14:16.067] - state: 'created' [13:14:16.067] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:14:16.068] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:14:16.068] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:14:16.068] - Field: 'label' [13:14:16.068] - Field: 'local' [13:14:16.069] - Field: 'owner' [13:14:16.069] - Field: 'envir' [13:14:16.069] - Field: 'packages' [13:14:16.069] - Field: 'gc' [13:14:16.069] - Field: 'conditions' [13:14:16.069] - Field: 'expr' [13:14:16.070] - Field: 'uuid' [13:14:16.070] - Field: 'seed' [13:14:16.070] - Field: 'version' [13:14:16.070] - Field: 'result' [13:14:16.070] - Field: 'asynchronous' [13:14:16.070] - Field: 'calls' [13:14:16.071] - Field: 'globals' [13:14:16.071] - Field: 'stdout' [13:14:16.071] - Field: 'earlySignal' [13:14:16.071] - Field: 'lazy' [13:14:16.071] - Field: 'state' [13:14:16.071] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:14:16.072] - Launch lazy future ... [13:14:16.072] Packages needed by the future expression (n = 1): 'future.apply' [13:14:16.072] Packages needed by future strategies (n = 0): [13:14:16.074] { [13:14:16.074] { [13:14:16.074] { [13:14:16.074] ...future.startTime <- base::Sys.time() [13:14:16.074] { [13:14:16.074] { [13:14:16.074] { [13:14:16.074] { [13:14:16.074] base::local({ [13:14:16.074] has_future <- base::requireNamespace("future", [13:14:16.074] quietly = TRUE) [13:14:16.074] if (has_future) { [13:14:16.074] ns <- base::getNamespace("future") [13:14:16.074] version <- ns[[".package"]][["version"]] [13:14:16.074] if (is.null(version)) [13:14:16.074] version <- utils::packageVersion("future") [13:14:16.074] } [13:14:16.074] else { [13:14:16.074] version <- NULL [13:14:16.074] } [13:14:16.074] if (!has_future || version < "1.8.0") { [13:14:16.074] info <- base::c(r_version = base::gsub("R version ", [13:14:16.074] "", base::R.version$version.string), [13:14:16.074] platform = base::sprintf("%s (%s-bit)", [13:14:16.074] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:14:16.074] os = base::paste(base::Sys.info()[base::c("sysname", [13:14:16.074] "release", "version")], collapse = " "), [13:14:16.074] hostname = base::Sys.info()[["nodename"]]) [13:14:16.074] info <- base::sprintf("%s: %s", base::names(info), [13:14:16.074] info) [13:14:16.074] info <- base::paste(info, collapse = "; ") [13:14:16.074] if (!has_future) { [13:14:16.074] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:14:16.074] info) [13:14:16.074] } [13:14:16.074] else { [13:14:16.074] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:14:16.074] info, version) [13:14:16.074] } [13:14:16.074] base::stop(msg) [13:14:16.074] } [13:14:16.074] }) [13:14:16.074] } [13:14:16.074] base::local({ [13:14:16.074] for (pkg in "future.apply") { [13:14:16.074] base::loadNamespace(pkg) [13:14:16.074] base::library(pkg, character.only = TRUE) [13:14:16.074] } [13:14:16.074] }) [13:14:16.074] } [13:14:16.074] options(future.plan = NULL) [13:14:16.074] Sys.unsetenv("R_FUTURE_PLAN") [13:14:16.074] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:14:16.074] } [13:14:16.074] ...future.workdir <- getwd() [13:14:16.074] } [13:14:16.074] ...future.oldOptions <- base::as.list(base::.Options) [13:14:16.074] ...future.oldEnvVars <- base::Sys.getenv() [13:14:16.074] } [13:14:16.074] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:14:16.074] future.globals.maxSize = NULL, future.globals.method = NULL, [13:14:16.074] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:14:16.074] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:14:16.074] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:14:16.074] future.stdout.windows.reencode = NULL, width = 80L) [13:14:16.074] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:14:16.074] base::names(...future.oldOptions)) [13:14:16.074] } [13:14:16.074] if (FALSE) { [13:14:16.074] } [13:14:16.074] else { [13:14:16.074] if (TRUE) { [13:14:16.074] ...future.stdout <- base::rawConnection(base::raw(0L), [13:14:16.074] open = "w") [13:14:16.074] } [13:14:16.074] else { [13:14:16.074] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:14:16.074] windows = "NUL", "/dev/null"), open = "w") [13:14:16.074] } [13:14:16.074] base::sink(...future.stdout, type = "output", split = FALSE) [13:14:16.074] base::on.exit(if (!base::is.null(...future.stdout)) { [13:14:16.074] base::sink(type = "output", split = FALSE) [13:14:16.074] base::close(...future.stdout) [13:14:16.074] }, add = TRUE) [13:14:16.074] } [13:14:16.074] ...future.frame <- base::sys.nframe() [13:14:16.074] ...future.conditions <- base::list() [13:14:16.074] ...future.rng <- base::globalenv()$.Random.seed [13:14:16.074] if (FALSE) { [13:14:16.074] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:14:16.074] "...future.value", "...future.globalenv.names", ".Random.seed") [13:14:16.074] } [13:14:16.074] ...future.result <- base::tryCatch({ [13:14:16.074] base::withCallingHandlers({ [13:14:16.074] ...future.value <- base::withVisible(base::local({ [13:14:16.074] do.call(function(...) { [13:14:16.074] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:16.074] if (!identical(...future.globals.maxSize.org, [13:14:16.074] ...future.globals.maxSize)) { [13:14:16.074] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:16.074] on.exit(options(oopts), add = TRUE) [13:14:16.074] } [13:14:16.074] { [13:14:16.074] lapply(seq_along(...future.elements_ii), [13:14:16.074] FUN = function(jj) { [13:14:16.074] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:16.074] ...future.FUN(...future.X_jj, ...) [13:14:16.074] }) [13:14:16.074] } [13:14:16.074] }, args = future.call.arguments) [13:14:16.074] })) [13:14:16.074] future::FutureResult(value = ...future.value$value, [13:14:16.074] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:14:16.074] ...future.rng), globalenv = if (FALSE) [13:14:16.074] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:14:16.074] ...future.globalenv.names)) [13:14:16.074] else NULL, started = ...future.startTime, version = "1.8") [13:14:16.074] }, condition = base::local({ [13:14:16.074] c <- base::c [13:14:16.074] inherits <- base::inherits [13:14:16.074] invokeRestart <- base::invokeRestart [13:14:16.074] length <- base::length [13:14:16.074] list <- base::list [13:14:16.074] seq.int <- base::seq.int [13:14:16.074] signalCondition <- base::signalCondition [13:14:16.074] sys.calls <- base::sys.calls [13:14:16.074] `[[` <- base::`[[` [13:14:16.074] `+` <- base::`+` [13:14:16.074] `<<-` <- base::`<<-` [13:14:16.074] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:14:16.074] calls[seq.int(from = from + 12L, to = length(calls) - [13:14:16.074] 3L)] [13:14:16.074] } [13:14:16.074] function(cond) { [13:14:16.074] is_error <- inherits(cond, "error") [13:14:16.074] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:14:16.074] NULL) [13:14:16.074] if (is_error) { [13:14:16.074] sessionInformation <- function() { [13:14:16.074] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:14:16.074] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:14:16.074] search = base::search(), system = base::Sys.info()) [13:14:16.074] } [13:14:16.074] ...future.conditions[[length(...future.conditions) + [13:14:16.074] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:14:16.074] cond$call), session = sessionInformation(), [13:14:16.074] timestamp = base::Sys.time(), signaled = 0L) [13:14:16.074] signalCondition(cond) [13:14:16.074] } [13:14:16.074] else if (!ignore && TRUE && inherits(cond, c("condition", [13:14:16.074] "immediateCondition"))) { [13:14:16.074] signal <- TRUE && inherits(cond, "immediateCondition") [13:14:16.074] ...future.conditions[[length(...future.conditions) + [13:14:16.074] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:14:16.074] if (TRUE && !signal) { [13:14:16.074] muffleCondition <- function (cond, pattern = "^muffle") [13:14:16.074] { [13:14:16.074] inherits <- base::inherits [13:14:16.074] invokeRestart <- base::invokeRestart [13:14:16.074] is.null <- base::is.null [13:14:16.074] muffled <- FALSE [13:14:16.074] if (inherits(cond, "message")) { [13:14:16.074] muffled <- grepl(pattern, "muffleMessage") [13:14:16.074] if (muffled) [13:14:16.074] invokeRestart("muffleMessage") [13:14:16.074] } [13:14:16.074] else if (inherits(cond, "warning")) { [13:14:16.074] muffled <- grepl(pattern, "muffleWarning") [13:14:16.074] if (muffled) [13:14:16.074] invokeRestart("muffleWarning") [13:14:16.074] } [13:14:16.074] else if (inherits(cond, "condition")) { [13:14:16.074] if (!is.null(pattern)) { [13:14:16.074] computeRestarts <- base::computeRestarts [13:14:16.074] grepl <- base::grepl [13:14:16.074] restarts <- computeRestarts(cond) [13:14:16.074] for (restart in restarts) { [13:14:16.074] name <- restart$name [13:14:16.074] if (is.null(name)) [13:14:16.074] next [13:14:16.074] if (!grepl(pattern, name)) [13:14:16.074] next [13:14:16.074] invokeRestart(restart) [13:14:16.074] muffled <- TRUE [13:14:16.074] break [13:14:16.074] } [13:14:16.074] } [13:14:16.074] } [13:14:16.074] invisible(muffled) [13:14:16.074] } [13:14:16.074] muffleCondition(cond, pattern = "^muffle") [13:14:16.074] } [13:14:16.074] } [13:14:16.074] else { [13:14:16.074] if (TRUE) { [13:14:16.074] muffleCondition <- function (cond, pattern = "^muffle") [13:14:16.074] { [13:14:16.074] inherits <- base::inherits [13:14:16.074] invokeRestart <- base::invokeRestart [13:14:16.074] is.null <- base::is.null [13:14:16.074] muffled <- FALSE [13:14:16.074] if (inherits(cond, "message")) { [13:14:16.074] muffled <- grepl(pattern, "muffleMessage") [13:14:16.074] if (muffled) [13:14:16.074] invokeRestart("muffleMessage") [13:14:16.074] } [13:14:16.074] else if (inherits(cond, "warning")) { [13:14:16.074] muffled <- grepl(pattern, "muffleWarning") [13:14:16.074] if (muffled) [13:14:16.074] invokeRestart("muffleWarning") [13:14:16.074] } [13:14:16.074] else if (inherits(cond, "condition")) { [13:14:16.074] if (!is.null(pattern)) { [13:14:16.074] computeRestarts <- base::computeRestarts [13:14:16.074] grepl <- base::grepl [13:14:16.074] restarts <- computeRestarts(cond) [13:14:16.074] for (restart in restarts) { [13:14:16.074] name <- restart$name [13:14:16.074] if (is.null(name)) [13:14:16.074] next [13:14:16.074] if (!grepl(pattern, name)) [13:14:16.074] next [13:14:16.074] invokeRestart(restart) [13:14:16.074] muffled <- TRUE [13:14:16.074] break [13:14:16.074] } [13:14:16.074] } [13:14:16.074] } [13:14:16.074] invisible(muffled) [13:14:16.074] } [13:14:16.074] muffleCondition(cond, pattern = "^muffle") [13:14:16.074] } [13:14:16.074] } [13:14:16.074] } [13:14:16.074] })) [13:14:16.074] }, error = function(ex) { [13:14:16.074] base::structure(base::list(value = NULL, visible = NULL, [13:14:16.074] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:14:16.074] ...future.rng), started = ...future.startTime, [13:14:16.074] finished = Sys.time(), session_uuid = NA_character_, [13:14:16.074] version = "1.8"), class = "FutureResult") [13:14:16.074] }, finally = { [13:14:16.074] if (!identical(...future.workdir, getwd())) [13:14:16.074] setwd(...future.workdir) [13:14:16.074] { [13:14:16.074] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:14:16.074] ...future.oldOptions$nwarnings <- NULL [13:14:16.074] } [13:14:16.074] base::options(...future.oldOptions) [13:14:16.074] if (.Platform$OS.type == "windows") { [13:14:16.074] old_names <- names(...future.oldEnvVars) [13:14:16.074] envs <- base::Sys.getenv() [13:14:16.074] names <- names(envs) [13:14:16.074] common <- intersect(names, old_names) [13:14:16.074] added <- setdiff(names, old_names) [13:14:16.074] removed <- setdiff(old_names, names) [13:14:16.074] changed <- common[...future.oldEnvVars[common] != [13:14:16.074] envs[common]] [13:14:16.074] NAMES <- toupper(changed) [13:14:16.074] args <- list() [13:14:16.074] for (kk in seq_along(NAMES)) { [13:14:16.074] name <- changed[[kk]] [13:14:16.074] NAME <- NAMES[[kk]] [13:14:16.074] if (name != NAME && is.element(NAME, old_names)) [13:14:16.074] next [13:14:16.074] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:16.074] } [13:14:16.074] NAMES <- toupper(added) [13:14:16.074] for (kk in seq_along(NAMES)) { [13:14:16.074] name <- added[[kk]] [13:14:16.074] NAME <- NAMES[[kk]] [13:14:16.074] if (name != NAME && is.element(NAME, old_names)) [13:14:16.074] next [13:14:16.074] args[[name]] <- "" [13:14:16.074] } [13:14:16.074] NAMES <- toupper(removed) [13:14:16.074] for (kk in seq_along(NAMES)) { [13:14:16.074] name <- removed[[kk]] [13:14:16.074] NAME <- NAMES[[kk]] [13:14:16.074] if (name != NAME && is.element(NAME, old_names)) [13:14:16.074] next [13:14:16.074] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:16.074] } [13:14:16.074] if (length(args) > 0) [13:14:16.074] base::do.call(base::Sys.setenv, args = args) [13:14:16.074] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:14:16.074] } [13:14:16.074] else { [13:14:16.074] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:14:16.074] } [13:14:16.074] { [13:14:16.074] if (base::length(...future.futureOptionsAdded) > [13:14:16.074] 0L) { [13:14:16.074] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:14:16.074] base::names(opts) <- ...future.futureOptionsAdded [13:14:16.074] base::options(opts) [13:14:16.074] } [13:14:16.074] { [13:14:16.074] { [13:14:16.074] NULL [13:14:16.074] RNGkind("Mersenne-Twister") [13:14:16.074] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:14:16.074] inherits = FALSE) [13:14:16.074] } [13:14:16.074] options(future.plan = NULL) [13:14:16.074] if (is.na(NA_character_)) [13:14:16.074] Sys.unsetenv("R_FUTURE_PLAN") [13:14:16.074] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:14:16.074] future::plan(list(function (..., envir = parent.frame()) [13:14:16.074] { [13:14:16.074] future <- SequentialFuture(..., envir = envir) [13:14:16.074] if (!future$lazy) [13:14:16.074] future <- run(future) [13:14:16.074] invisible(future) [13:14:16.074] }), .cleanup = FALSE, .init = FALSE) [13:14:16.074] } [13:14:16.074] } [13:14:16.074] } [13:14:16.074] }) [13:14:16.074] if (TRUE) { [13:14:16.074] base::sink(type = "output", split = FALSE) [13:14:16.074] if (TRUE) { [13:14:16.074] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:14:16.074] } [13:14:16.074] else { [13:14:16.074] ...future.result["stdout"] <- base::list(NULL) [13:14:16.074] } [13:14:16.074] base::close(...future.stdout) [13:14:16.074] ...future.stdout <- NULL [13:14:16.074] } [13:14:16.074] ...future.result$conditions <- ...future.conditions [13:14:16.074] ...future.result$finished <- base::Sys.time() [13:14:16.074] ...future.result [13:14:16.074] } [13:14:16.078] assign_globals() ... [13:14:16.078] List of 11 [13:14:16.078] $ ...future.FUN :function (x, ...) [13:14:16.078] $ x_FUN :function (x) [13:14:16.078] $ times : int 4 [13:14:16.078] $ stopf :function (fmt, ..., call. = TRUE, domain = NULL) [13:14:16.078] $ stop_if_not :function (...) [13:14:16.078] $ dim : int [1:2] 2 2 [13:14:16.078] $ valid_types : chr [1:3] "logical" "integer" "double" [13:14:16.078] $ future.call.arguments : list() [13:14:16.078] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:14:16.078] $ ...future.elements_ii :List of 10 [13:14:16.078] ..$ : int 1 [13:14:16.078] ..$ : int 2 [13:14:16.078] ..$ : int 3 [13:14:16.078] ..$ : int 4 [13:14:16.078] ..$ : int 5 [13:14:16.078] ..$ : int 6 [13:14:16.078] ..$ : int 7 [13:14:16.078] ..$ : int 8 [13:14:16.078] ..$ : int 9 [13:14:16.078] ..$ : int 10 [13:14:16.078] $ ...future.seeds_ii : NULL [13:14:16.078] $ ...future.globals.maxSize: NULL [13:14:16.078] - attr(*, "where")=List of 11 [13:14:16.078] ..$ ...future.FUN : [13:14:16.078] ..$ x_FUN : [13:14:16.078] ..$ times : [13:14:16.078] ..$ stopf : [13:14:16.078] ..$ stop_if_not : [13:14:16.078] ..$ dim : [13:14:16.078] ..$ valid_types : [13:14:16.078] ..$ future.call.arguments : [13:14:16.078] ..$ ...future.elements_ii : [13:14:16.078] ..$ ...future.seeds_ii : [13:14:16.078] ..$ ...future.globals.maxSize: [13:14:16.078] - attr(*, "resolved")= logi FALSE [13:14:16.078] - attr(*, "total_size")= num 105552 [13:14:16.078] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:14:16.078] - attr(*, "already-done")= logi TRUE [13:14:16.095] - copied '...future.FUN' to environment [13:14:16.096] - reassign environment for 'x_FUN' [13:14:16.096] - copied 'x_FUN' to environment [13:14:16.096] - copied 'times' to environment [13:14:16.096] - copied 'stopf' to environment [13:14:16.097] - copied 'stop_if_not' to environment [13:14:16.097] - copied 'dim' to environment [13:14:16.097] - copied 'valid_types' to environment [13:14:16.097] - copied 'future.call.arguments' to environment [13:14:16.097] - copied '...future.elements_ii' to environment [13:14:16.097] - copied '...future.seeds_ii' to environment [13:14:16.098] - copied '...future.globals.maxSize' to environment [13:14:16.098] assign_globals() ... done [13:14:16.099] plan(): Setting new future strategy stack: [13:14:16.099] List of future strategies: [13:14:16.099] 1. sequential: [13:14:16.099] - args: function (..., envir = parent.frame(), workers = "") [13:14:16.099] - tweaked: FALSE [13:14:16.099] - call: NULL [13:14:16.099] plan(): nbrOfWorkers() = 1 [13:14:16.101] plan(): Setting new future strategy stack: [13:14:16.101] List of future strategies: [13:14:16.101] 1. sequential: [13:14:16.101] - args: function (..., envir = parent.frame(), workers = "") [13:14:16.101] - tweaked: FALSE [13:14:16.101] - call: plan(strategy) [13:14:16.102] plan(): nbrOfWorkers() = 1 [13:14:16.102] SequentialFuture started (and completed) [13:14:16.102] - Launch lazy future ... done [13:14:16.102] run() for 'SequentialFuture' ... done [13:14:16.102] Created future: [13:14:16.103] SequentialFuture: [13:14:16.103] Label: 'future_vapply-1' [13:14:16.103] Expression: [13:14:16.103] { [13:14:16.103] do.call(function(...) { [13:14:16.103] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:16.103] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:16.103] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:16.103] on.exit(options(oopts), add = TRUE) [13:14:16.103] } [13:14:16.103] { [13:14:16.103] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:16.103] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:16.103] ...future.FUN(...future.X_jj, ...) [13:14:16.103] }) [13:14:16.103] } [13:14:16.103] }, args = future.call.arguments) [13:14:16.103] } [13:14:16.103] Lazy evaluation: FALSE [13:14:16.103] Asynchronous evaluation: FALSE [13:14:16.103] Local evaluation: TRUE [13:14:16.103] Environment: R_GlobalEnv [13:14:16.103] Capture standard output: TRUE [13:14:16.103] Capture condition classes: 'condition' (excluding 'nothing') [13:14:16.103] Globals: 11 objects totaling 103.62 KiB (function '...future.FUN' of 21.22 KiB, function 'x_FUN' of 10.95 KiB, integer 'times' of 56 bytes, function 'stopf' of 26.43 KiB, function 'stop_if_not' of 44.12 KiB, ...) [13:14:16.103] Packages: 1 packages ('future.apply') [13:14:16.103] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:14:16.103] Resolved: TRUE [13:14:16.103] Value: 7.42 KiB of class 'list' [13:14:16.103] Early signaling: FALSE [13:14:16.103] Owner process: 1bb7d580-628d-c90d-e38a-66de485868c4 [13:14:16.103] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:14:16.104] Chunk #1 of 1 ... DONE [13:14:16.104] Launching 1 futures (chunks) ... DONE [13:14:16.104] Resolving 1 futures (chunks) ... [13:14:16.105] resolve() on list ... [13:14:16.105] recursive: 0 [13:14:16.105] length: 1 [13:14:16.106] [13:14:16.106] resolved() for 'SequentialFuture' ... [13:14:16.106] - state: 'finished' [13:14:16.106] - run: TRUE [13:14:16.106] - result: 'FutureResult' [13:14:16.107] resolved() for 'SequentialFuture' ... done [13:14:16.107] Future #1 [13:14:16.107] signalConditionsASAP(SequentialFuture, pos=1) ... [13:14:16.107] - nx: 1 [13:14:16.107] - relay: TRUE [13:14:16.108] - stdout: TRUE [13:14:16.108] - signal: TRUE [13:14:16.108] - resignal: FALSE [13:14:16.108] - force: TRUE [13:14:16.108] - relayed: [n=1] FALSE [13:14:16.108] - queued futures: [n=1] FALSE [13:14:16.108] - until=1 [13:14:16.109] - relaying element #1 [13:14:16.109] - relayed: [n=1] TRUE [13:14:16.109] - queued futures: [n=1] TRUE [13:14:16.109] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:14:16.109] length: 0 (resolved future 1) [13:14:16.110] Relaying remaining futures [13:14:16.110] signalConditionsASAP(NULL, pos=0) ... [13:14:16.110] - nx: 1 [13:14:16.110] - relay: TRUE [13:14:16.110] - stdout: TRUE [13:14:16.110] - signal: TRUE [13:14:16.110] - resignal: FALSE [13:14:16.111] - force: TRUE [13:14:16.111] - relayed: [n=1] TRUE [13:14:16.111] - queued futures: [n=1] TRUE - flush all [13:14:16.111] - relayed: [n=1] TRUE [13:14:16.111] - queued futures: [n=1] TRUE [13:14:16.111] signalConditionsASAP(NULL, pos=0) ... done [13:14:16.112] resolve() on list ... DONE [13:14:16.112] - Number of value chunks collected: 1 [13:14:16.112] Resolving 1 futures (chunks) ... DONE [13:14:16.112] Reducing values from 1 chunks ... [13:14:16.112] - Number of values collected after concatenation: 10 [13:14:16.112] - Number of values expected: 10 [13:14:16.113] Reducing values from 1 chunks ... DONE [13:14:16.113] future_lapply() ... DONE int [1:2, 1:2, 1:10] 1 1 1 1 2 2 2 2 3 3 ... - attr(*, "dimnames")=List of 3 ..$ : chr [1:2] "a" "b" ..$ : chr [1:2] "A" "B" ..$ : NULL - From example(vapply) ... [13:14:16.117] future_lapply() ... [13:14:16.120] Number of chunks: 1 [13:14:16.120] getGlobalsAndPackagesXApply() ... [13:14:16.120] - future.globals: TRUE [13:14:16.120] getGlobalsAndPackages() ... [13:14:16.120] Searching for globals... [13:14:16.125] - globals found: [17] 'FUN', '{', '<-', 'x_FUN', 'if', '!=', 'length', 'times', 'stopf', 'stop_if_not', 'all', '==', 'dim', '%in%', 'typeof', 'valid_types', 'UseMethod' [13:14:16.125] Searching for globals ... DONE [13:14:16.125] Resolving globals: FALSE [13:14:16.126] The total size of the 7 globals is 93.29 KiB (95528 bytes) [13:14:16.127] The total size of the 7 globals exported for future expression ('FUN()') is 93.29 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). The three largest globals are 'stop_if_not' (44.12 KiB of class 'function'), 'stopf' (26.43 KiB of class 'function') and 'FUN' (21.22 KiB of class 'function') [13:14:16.127] - globals: [7] 'FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types' [13:14:16.127] - packages: [2] 'stats', 'future.apply' [13:14:16.127] getGlobalsAndPackages() ... DONE [13:14:16.127] - globals found/used: [n=7] 'FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types' [13:14:16.128] - needed namespaces: [n=2] 'stats', 'future.apply' [13:14:16.128] Finding globals ... DONE [13:14:16.128] - use_args: TRUE [13:14:16.128] - Getting '...' globals ... [13:14:16.129] resolve() on list ... [13:14:16.129] recursive: 0 [13:14:16.129] length: 1 [13:14:16.129] elements: '...' [13:14:16.129] length: 0 (resolved future 1) [13:14:16.129] resolve() on list ... DONE [13:14:16.129] - '...' content: [n=0] [13:14:16.130] List of 1 [13:14:16.130] $ ...: list() [13:14:16.130] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:14:16.130] - attr(*, "where")=List of 1 [13:14:16.130] ..$ ...: [13:14:16.130] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:14:16.130] - attr(*, "resolved")= logi TRUE [13:14:16.130] - attr(*, "total_size")= num NA [13:14:16.133] - Getting '...' globals ... DONE [13:14:16.134] Globals to be used in all futures (chunks): [n=8] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...' [13:14:16.134] List of 8 [13:14:16.134] $ ...future.FUN:function (x, ...) [13:14:16.134] $ x_FUN :function (x, ...) [13:14:16.134] $ times : int 5 [13:14:16.134] $ stopf :function (fmt, ..., call. = TRUE, domain = NULL) [13:14:16.134] $ stop_if_not :function (...) [13:14:16.134] $ dim : NULL [13:14:16.134] $ valid_types : chr [1:3] "logical" "integer" "double" [13:14:16.134] $ ... : list() [13:14:16.134] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:14:16.134] - attr(*, "where")=List of 8 [13:14:16.134] ..$ ...future.FUN: [13:14:16.134] ..$ x_FUN : [13:14:16.134] ..$ times : [13:14:16.134] ..$ stopf : [13:14:16.134] ..$ stop_if_not : [13:14:16.134] ..$ dim : [13:14:16.134] ..$ valid_types : [13:14:16.134] ..$ ... : [13:14:16.134] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:14:16.134] - attr(*, "resolved")= logi FALSE [13:14:16.134] - attr(*, "total_size")= num 95528 [13:14:16.140] Packages to be attached in all futures: [n=2] 'stats', 'future.apply' [13:14:16.140] getGlobalsAndPackagesXApply() ... DONE [13:14:16.141] Number of futures (= number of chunks): 1 [13:14:16.141] Launching 1 futures (chunks) ... [13:14:16.141] Chunk #1 of 1 ... [13:14:16.141] - Finding globals in 'X' for chunk #1 ... [13:14:16.141] getGlobalsAndPackages() ... [13:14:16.142] Searching for globals... [13:14:16.142] [13:14:16.142] Searching for globals ... DONE [13:14:16.142] - globals: [0] [13:14:16.142] getGlobalsAndPackages() ... DONE [13:14:16.143] + additional globals found: [n=0] [13:14:16.143] + additional namespaces needed: [n=0] [13:14:16.143] - Finding globals in 'X' for chunk #1 ... DONE [13:14:16.143] - seeds: [13:14:16.143] - All globals exported: [n=11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:16.143] getGlobalsAndPackages() ... [13:14:16.144] - globals passed as-is: [11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:16.144] Resolving globals: FALSE [13:14:16.144] Tweak future expression to call with '...' arguments ... [13:14:16.144] { [13:14:16.144] do.call(function(...) { [13:14:16.144] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:16.144] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:16.144] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:16.144] on.exit(options(oopts), add = TRUE) [13:14:16.144] } [13:14:16.144] { [13:14:16.144] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:16.144] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:16.144] ...future.FUN(...future.X_jj, ...) [13:14:16.144] }) [13:14:16.144] } [13:14:16.144] }, args = future.call.arguments) [13:14:16.144] } [13:14:16.145] Tweak future expression to call with '...' arguments ... DONE [13:14:16.145] - globals: [11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:16.145] - packages: [2] 'stats', 'future.apply' [13:14:16.146] getGlobalsAndPackages() ... DONE [13:14:16.146] run() for 'Future' ... [13:14:16.146] - state: 'created' [13:14:16.146] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:14:16.147] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:14:16.147] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:14:16.147] - Field: 'label' [13:14:16.147] - Field: 'local' [13:14:16.147] - Field: 'owner' [13:14:16.148] - Field: 'envir' [13:14:16.148] - Field: 'packages' [13:14:16.148] - Field: 'gc' [13:14:16.148] - Field: 'conditions' [13:14:16.148] - Field: 'expr' [13:14:16.149] - Field: 'uuid' [13:14:16.149] - Field: 'seed' [13:14:16.149] - Field: 'version' [13:14:16.149] - Field: 'result' [13:14:16.149] - Field: 'asynchronous' [13:14:16.149] - Field: 'calls' [13:14:16.150] - Field: 'globals' [13:14:16.150] - Field: 'stdout' [13:14:16.150] - Field: 'earlySignal' [13:14:16.150] - Field: 'lazy' [13:14:16.150] - Field: 'state' [13:14:16.150] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:14:16.151] - Launch lazy future ... [13:14:16.151] Packages needed by the future expression (n = 2): 'stats', 'future.apply' [13:14:16.151] Packages needed by future strategies (n = 0): [13:14:16.152] { [13:14:16.152] { [13:14:16.152] { [13:14:16.152] ...future.startTime <- base::Sys.time() [13:14:16.152] { [13:14:16.152] { [13:14:16.152] { [13:14:16.152] { [13:14:16.152] base::local({ [13:14:16.152] has_future <- base::requireNamespace("future", [13:14:16.152] quietly = TRUE) [13:14:16.152] if (has_future) { [13:14:16.152] ns <- base::getNamespace("future") [13:14:16.152] version <- ns[[".package"]][["version"]] [13:14:16.152] if (is.null(version)) [13:14:16.152] version <- utils::packageVersion("future") [13:14:16.152] } [13:14:16.152] else { [13:14:16.152] version <- NULL [13:14:16.152] } [13:14:16.152] if (!has_future || version < "1.8.0") { [13:14:16.152] info <- base::c(r_version = base::gsub("R version ", [13:14:16.152] "", base::R.version$version.string), [13:14:16.152] platform = base::sprintf("%s (%s-bit)", [13:14:16.152] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:14:16.152] os = base::paste(base::Sys.info()[base::c("sysname", [13:14:16.152] "release", "version")], collapse = " "), [13:14:16.152] hostname = base::Sys.info()[["nodename"]]) [13:14:16.152] info <- base::sprintf("%s: %s", base::names(info), [13:14:16.152] info) [13:14:16.152] info <- base::paste(info, collapse = "; ") [13:14:16.152] if (!has_future) { [13:14:16.152] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:14:16.152] info) [13:14:16.152] } [13:14:16.152] else { [13:14:16.152] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:14:16.152] info, version) [13:14:16.152] } [13:14:16.152] base::stop(msg) [13:14:16.152] } [13:14:16.152] }) [13:14:16.152] } [13:14:16.152] base::local({ [13:14:16.152] for (pkg in c("stats", "future.apply")) { [13:14:16.152] base::loadNamespace(pkg) [13:14:16.152] base::library(pkg, character.only = TRUE) [13:14:16.152] } [13:14:16.152] }) [13:14:16.152] } [13:14:16.152] options(future.plan = NULL) [13:14:16.152] Sys.unsetenv("R_FUTURE_PLAN") [13:14:16.152] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:14:16.152] } [13:14:16.152] ...future.workdir <- getwd() [13:14:16.152] } [13:14:16.152] ...future.oldOptions <- base::as.list(base::.Options) [13:14:16.152] ...future.oldEnvVars <- base::Sys.getenv() [13:14:16.152] } [13:14:16.152] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:14:16.152] future.globals.maxSize = NULL, future.globals.method = NULL, [13:14:16.152] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:14:16.152] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:14:16.152] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:14:16.152] future.stdout.windows.reencode = NULL, width = 80L) [13:14:16.152] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:14:16.152] base::names(...future.oldOptions)) [13:14:16.152] } [13:14:16.152] if (FALSE) { [13:14:16.152] } [13:14:16.152] else { [13:14:16.152] if (TRUE) { [13:14:16.152] ...future.stdout <- base::rawConnection(base::raw(0L), [13:14:16.152] open = "w") [13:14:16.152] } [13:14:16.152] else { [13:14:16.152] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:14:16.152] windows = "NUL", "/dev/null"), open = "w") [13:14:16.152] } [13:14:16.152] base::sink(...future.stdout, type = "output", split = FALSE) [13:14:16.152] base::on.exit(if (!base::is.null(...future.stdout)) { [13:14:16.152] base::sink(type = "output", split = FALSE) [13:14:16.152] base::close(...future.stdout) [13:14:16.152] }, add = TRUE) [13:14:16.152] } [13:14:16.152] ...future.frame <- base::sys.nframe() [13:14:16.152] ...future.conditions <- base::list() [13:14:16.152] ...future.rng <- base::globalenv()$.Random.seed [13:14:16.152] if (FALSE) { [13:14:16.152] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:14:16.152] "...future.value", "...future.globalenv.names", ".Random.seed") [13:14:16.152] } [13:14:16.152] ...future.result <- base::tryCatch({ [13:14:16.152] base::withCallingHandlers({ [13:14:16.152] ...future.value <- base::withVisible(base::local({ [13:14:16.152] do.call(function(...) { [13:14:16.152] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:16.152] if (!identical(...future.globals.maxSize.org, [13:14:16.152] ...future.globals.maxSize)) { [13:14:16.152] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:16.152] on.exit(options(oopts), add = TRUE) [13:14:16.152] } [13:14:16.152] { [13:14:16.152] lapply(seq_along(...future.elements_ii), [13:14:16.152] FUN = function(jj) { [13:14:16.152] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:16.152] ...future.FUN(...future.X_jj, ...) [13:14:16.152] }) [13:14:16.152] } [13:14:16.152] }, args = future.call.arguments) [13:14:16.152] })) [13:14:16.152] future::FutureResult(value = ...future.value$value, [13:14:16.152] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:14:16.152] ...future.rng), globalenv = if (FALSE) [13:14:16.152] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:14:16.152] ...future.globalenv.names)) [13:14:16.152] else NULL, started = ...future.startTime, version = "1.8") [13:14:16.152] }, condition = base::local({ [13:14:16.152] c <- base::c [13:14:16.152] inherits <- base::inherits [13:14:16.152] invokeRestart <- base::invokeRestart [13:14:16.152] length <- base::length [13:14:16.152] list <- base::list [13:14:16.152] seq.int <- base::seq.int [13:14:16.152] signalCondition <- base::signalCondition [13:14:16.152] sys.calls <- base::sys.calls [13:14:16.152] `[[` <- base::`[[` [13:14:16.152] `+` <- base::`+` [13:14:16.152] `<<-` <- base::`<<-` [13:14:16.152] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:14:16.152] calls[seq.int(from = from + 12L, to = length(calls) - [13:14:16.152] 3L)] [13:14:16.152] } [13:14:16.152] function(cond) { [13:14:16.152] is_error <- inherits(cond, "error") [13:14:16.152] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:14:16.152] NULL) [13:14:16.152] if (is_error) { [13:14:16.152] sessionInformation <- function() { [13:14:16.152] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:14:16.152] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:14:16.152] search = base::search(), system = base::Sys.info()) [13:14:16.152] } [13:14:16.152] ...future.conditions[[length(...future.conditions) + [13:14:16.152] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:14:16.152] cond$call), session = sessionInformation(), [13:14:16.152] timestamp = base::Sys.time(), signaled = 0L) [13:14:16.152] signalCondition(cond) [13:14:16.152] } [13:14:16.152] else if (!ignore && TRUE && inherits(cond, c("condition", [13:14:16.152] "immediateCondition"))) { [13:14:16.152] signal <- TRUE && inherits(cond, "immediateCondition") [13:14:16.152] ...future.conditions[[length(...future.conditions) + [13:14:16.152] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:14:16.152] if (TRUE && !signal) { [13:14:16.152] muffleCondition <- function (cond, pattern = "^muffle") [13:14:16.152] { [13:14:16.152] inherits <- base::inherits [13:14:16.152] invokeRestart <- base::invokeRestart [13:14:16.152] is.null <- base::is.null [13:14:16.152] muffled <- FALSE [13:14:16.152] if (inherits(cond, "message")) { [13:14:16.152] muffled <- grepl(pattern, "muffleMessage") [13:14:16.152] if (muffled) [13:14:16.152] invokeRestart("muffleMessage") [13:14:16.152] } [13:14:16.152] else if (inherits(cond, "warning")) { [13:14:16.152] muffled <- grepl(pattern, "muffleWarning") [13:14:16.152] if (muffled) [13:14:16.152] invokeRestart("muffleWarning") [13:14:16.152] } [13:14:16.152] else if (inherits(cond, "condition")) { [13:14:16.152] if (!is.null(pattern)) { [13:14:16.152] computeRestarts <- base::computeRestarts [13:14:16.152] grepl <- base::grepl [13:14:16.152] restarts <- computeRestarts(cond) [13:14:16.152] for (restart in restarts) { [13:14:16.152] name <- restart$name [13:14:16.152] if (is.null(name)) [13:14:16.152] next [13:14:16.152] if (!grepl(pattern, name)) [13:14:16.152] next [13:14:16.152] invokeRestart(restart) [13:14:16.152] muffled <- TRUE [13:14:16.152] break [13:14:16.152] } [13:14:16.152] } [13:14:16.152] } [13:14:16.152] invisible(muffled) [13:14:16.152] } [13:14:16.152] muffleCondition(cond, pattern = "^muffle") [13:14:16.152] } [13:14:16.152] } [13:14:16.152] else { [13:14:16.152] if (TRUE) { [13:14:16.152] muffleCondition <- function (cond, pattern = "^muffle") [13:14:16.152] { [13:14:16.152] inherits <- base::inherits [13:14:16.152] invokeRestart <- base::invokeRestart [13:14:16.152] is.null <- base::is.null [13:14:16.152] muffled <- FALSE [13:14:16.152] if (inherits(cond, "message")) { [13:14:16.152] muffled <- grepl(pattern, "muffleMessage") [13:14:16.152] if (muffled) [13:14:16.152] invokeRestart("muffleMessage") [13:14:16.152] } [13:14:16.152] else if (inherits(cond, "warning")) { [13:14:16.152] muffled <- grepl(pattern, "muffleWarning") [13:14:16.152] if (muffled) [13:14:16.152] invokeRestart("muffleWarning") [13:14:16.152] } [13:14:16.152] else if (inherits(cond, "condition")) { [13:14:16.152] if (!is.null(pattern)) { [13:14:16.152] computeRestarts <- base::computeRestarts [13:14:16.152] grepl <- base::grepl [13:14:16.152] restarts <- computeRestarts(cond) [13:14:16.152] for (restart in restarts) { [13:14:16.152] name <- restart$name [13:14:16.152] if (is.null(name)) [13:14:16.152] next [13:14:16.152] if (!grepl(pattern, name)) [13:14:16.152] next [13:14:16.152] invokeRestart(restart) [13:14:16.152] muffled <- TRUE [13:14:16.152] break [13:14:16.152] } [13:14:16.152] } [13:14:16.152] } [13:14:16.152] invisible(muffled) [13:14:16.152] } [13:14:16.152] muffleCondition(cond, pattern = "^muffle") [13:14:16.152] } [13:14:16.152] } [13:14:16.152] } [13:14:16.152] })) [13:14:16.152] }, error = function(ex) { [13:14:16.152] base::structure(base::list(value = NULL, visible = NULL, [13:14:16.152] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:14:16.152] ...future.rng), started = ...future.startTime, [13:14:16.152] finished = Sys.time(), session_uuid = NA_character_, [13:14:16.152] version = "1.8"), class = "FutureResult") [13:14:16.152] }, finally = { [13:14:16.152] if (!identical(...future.workdir, getwd())) [13:14:16.152] setwd(...future.workdir) [13:14:16.152] { [13:14:16.152] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:14:16.152] ...future.oldOptions$nwarnings <- NULL [13:14:16.152] } [13:14:16.152] base::options(...future.oldOptions) [13:14:16.152] if (.Platform$OS.type == "windows") { [13:14:16.152] old_names <- names(...future.oldEnvVars) [13:14:16.152] envs <- base::Sys.getenv() [13:14:16.152] names <- names(envs) [13:14:16.152] common <- intersect(names, old_names) [13:14:16.152] added <- setdiff(names, old_names) [13:14:16.152] removed <- setdiff(old_names, names) [13:14:16.152] changed <- common[...future.oldEnvVars[common] != [13:14:16.152] envs[common]] [13:14:16.152] NAMES <- toupper(changed) [13:14:16.152] args <- list() [13:14:16.152] for (kk in seq_along(NAMES)) { [13:14:16.152] name <- changed[[kk]] [13:14:16.152] NAME <- NAMES[[kk]] [13:14:16.152] if (name != NAME && is.element(NAME, old_names)) [13:14:16.152] next [13:14:16.152] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:16.152] } [13:14:16.152] NAMES <- toupper(added) [13:14:16.152] for (kk in seq_along(NAMES)) { [13:14:16.152] name <- added[[kk]] [13:14:16.152] NAME <- NAMES[[kk]] [13:14:16.152] if (name != NAME && is.element(NAME, old_names)) [13:14:16.152] next [13:14:16.152] args[[name]] <- "" [13:14:16.152] } [13:14:16.152] NAMES <- toupper(removed) [13:14:16.152] for (kk in seq_along(NAMES)) { [13:14:16.152] name <- removed[[kk]] [13:14:16.152] NAME <- NAMES[[kk]] [13:14:16.152] if (name != NAME && is.element(NAME, old_names)) [13:14:16.152] next [13:14:16.152] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:16.152] } [13:14:16.152] if (length(args) > 0) [13:14:16.152] base::do.call(base::Sys.setenv, args = args) [13:14:16.152] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:14:16.152] } [13:14:16.152] else { [13:14:16.152] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:14:16.152] } [13:14:16.152] { [13:14:16.152] if (base::length(...future.futureOptionsAdded) > [13:14:16.152] 0L) { [13:14:16.152] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:14:16.152] base::names(opts) <- ...future.futureOptionsAdded [13:14:16.152] base::options(opts) [13:14:16.152] } [13:14:16.152] { [13:14:16.152] { [13:14:16.152] NULL [13:14:16.152] RNGkind("Mersenne-Twister") [13:14:16.152] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:14:16.152] inherits = FALSE) [13:14:16.152] } [13:14:16.152] options(future.plan = NULL) [13:14:16.152] if (is.na(NA_character_)) [13:14:16.152] Sys.unsetenv("R_FUTURE_PLAN") [13:14:16.152] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:14:16.152] future::plan(list(function (..., envir = parent.frame()) [13:14:16.152] { [13:14:16.152] future <- SequentialFuture(..., envir = envir) [13:14:16.152] if (!future$lazy) [13:14:16.152] future <- run(future) [13:14:16.152] invisible(future) [13:14:16.152] }), .cleanup = FALSE, .init = FALSE) [13:14:16.152] } [13:14:16.152] } [13:14:16.152] } [13:14:16.152] }) [13:14:16.152] if (TRUE) { [13:14:16.152] base::sink(type = "output", split = FALSE) [13:14:16.152] if (TRUE) { [13:14:16.152] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:14:16.152] } [13:14:16.152] else { [13:14:16.152] ...future.result["stdout"] <- base::list(NULL) [13:14:16.152] } [13:14:16.152] base::close(...future.stdout) [13:14:16.152] ...future.stdout <- NULL [13:14:16.152] } [13:14:16.152] ...future.result$conditions <- ...future.conditions [13:14:16.152] ...future.result$finished <- base::Sys.time() [13:14:16.152] ...future.result [13:14:16.152] } [13:14:16.156] assign_globals() ... [13:14:16.156] List of 11 [13:14:16.156] $ ...future.FUN :function (x, ...) [13:14:16.156] $ x_FUN :function (x, ...) [13:14:16.156] $ times : int 5 [13:14:16.156] $ stopf :function (fmt, ..., call. = TRUE, domain = NULL) [13:14:16.156] $ stop_if_not :function (...) [13:14:16.156] $ dim : NULL [13:14:16.156] $ valid_types : chr [1:3] "logical" "integer" "double" [13:14:16.156] $ future.call.arguments : list() [13:14:16.156] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:14:16.156] $ ...future.elements_ii :List of 3 [13:14:16.156] ..$ a : int [1:10] 1 2 3 4 5 6 7 8 9 10 [13:14:16.156] ..$ beta : num [1:7] 0.0498 0.1353 0.3679 1 2.7183 ... [13:14:16.156] ..$ logic: logi [1:4] TRUE FALSE FALSE TRUE [13:14:16.156] $ ...future.seeds_ii : NULL [13:14:16.156] $ ...future.globals.maxSize: NULL [13:14:16.156] - attr(*, "where")=List of 11 [13:14:16.156] ..$ ...future.FUN : [13:14:16.156] ..$ x_FUN : [13:14:16.156] ..$ times : [13:14:16.156] ..$ stopf : [13:14:16.156] ..$ stop_if_not : [13:14:16.156] ..$ dim : [13:14:16.156] ..$ valid_types : [13:14:16.156] ..$ future.call.arguments : [13:14:16.156] ..$ ...future.elements_ii : [13:14:16.156] ..$ ...future.seeds_ii : [13:14:16.156] ..$ ...future.globals.maxSize: [13:14:16.156] - attr(*, "resolved")= logi FALSE [13:14:16.156] - attr(*, "total_size")= num 95528 [13:14:16.156] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:14:16.156] - attr(*, "already-done")= logi TRUE [13:14:16.166] - copied '...future.FUN' to environment [13:14:16.166] - copied 'x_FUN' to environment [13:14:16.167] - copied 'times' to environment [13:14:16.167] - copied 'stopf' to environment [13:14:16.167] - copied 'stop_if_not' to environment [13:14:16.167] - copied 'dim' to environment [13:14:16.167] - copied 'valid_types' to environment [13:14:16.167] - copied 'future.call.arguments' to environment [13:14:16.168] - copied '...future.elements_ii' to environment [13:14:16.168] - copied '...future.seeds_ii' to environment [13:14:16.168] - copied '...future.globals.maxSize' to environment [13:14:16.168] assign_globals() ... done [13:14:16.169] plan(): Setting new future strategy stack: [13:14:16.169] List of future strategies: [13:14:16.169] 1. sequential: [13:14:16.169] - args: function (..., envir = parent.frame(), workers = "") [13:14:16.169] - tweaked: FALSE [13:14:16.169] - call: NULL [13:14:16.170] plan(): nbrOfWorkers() = 1 [13:14:16.171] plan(): Setting new future strategy stack: [13:14:16.172] List of future strategies: [13:14:16.172] 1. sequential: [13:14:16.172] - args: function (..., envir = parent.frame(), workers = "") [13:14:16.172] - tweaked: FALSE [13:14:16.172] - call: plan(strategy) [13:14:16.172] plan(): nbrOfWorkers() = 1 [13:14:16.172] SequentialFuture started (and completed) [13:14:16.173] - Launch lazy future ... done [13:14:16.173] run() for 'SequentialFuture' ... done [13:14:16.173] Created future: [13:14:16.173] SequentialFuture: [13:14:16.173] Label: 'future_vapply-1' [13:14:16.173] Expression: [13:14:16.173] { [13:14:16.173] do.call(function(...) { [13:14:16.173] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:16.173] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:16.173] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:16.173] on.exit(options(oopts), add = TRUE) [13:14:16.173] } [13:14:16.173] { [13:14:16.173] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:16.173] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:16.173] ...future.FUN(...future.X_jj, ...) [13:14:16.173] }) [13:14:16.173] } [13:14:16.173] }, args = future.call.arguments) [13:14:16.173] } [13:14:16.173] Lazy evaluation: FALSE [13:14:16.173] Asynchronous evaluation: FALSE [13:14:16.173] Local evaluation: TRUE [13:14:16.173] Environment: R_GlobalEnv [13:14:16.173] Capture standard output: TRUE [13:14:16.173] Capture condition classes: 'condition' (excluding 'nothing') [13:14:16.173] Globals: 11 objects totaling 93.55 KiB (function '...future.FUN' of 21.22 KiB, function 'x_FUN' of 1.22 KiB, integer 'times' of 56 bytes, function 'stopf' of 26.43 KiB, function 'stop_if_not' of 44.12 KiB, ...) [13:14:16.173] Packages: 2 packages ('stats', 'future.apply') [13:14:16.173] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:14:16.173] Resolved: TRUE [13:14:16.173] Value: 1.71 KiB of class 'list' [13:14:16.173] Early signaling: FALSE [13:14:16.173] Owner process: 1bb7d580-628d-c90d-e38a-66de485868c4 [13:14:16.173] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:14:16.175] Chunk #1 of 1 ... DONE [13:14:16.175] Launching 1 futures (chunks) ... DONE [13:14:16.175] Resolving 1 futures (chunks) ... [13:14:16.175] resolve() on list ... [13:14:16.175] recursive: 0 [13:14:16.176] length: 1 [13:14:16.176] [13:14:16.176] resolved() for 'SequentialFuture' ... [13:14:16.176] - state: 'finished' [13:14:16.176] - run: TRUE [13:14:16.176] - result: 'FutureResult' [13:14:16.177] resolved() for 'SequentialFuture' ... done [13:14:16.177] Future #1 [13:14:16.177] signalConditionsASAP(SequentialFuture, pos=1) ... [13:14:16.177] - nx: 1 [13:14:16.177] - relay: TRUE [13:14:16.177] - stdout: TRUE [13:14:16.178] - signal: TRUE [13:14:16.178] - resignal: FALSE [13:14:16.178] - force: TRUE [13:14:16.178] - relayed: [n=1] FALSE [13:14:16.178] - queued futures: [n=1] FALSE [13:14:16.178] - until=1 [13:14:16.178] - relaying element #1 [13:14:16.179] - relayed: [n=1] TRUE [13:14:16.180] - queued futures: [n=1] TRUE [13:14:16.180] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:14:16.180] length: 0 (resolved future 1) [13:14:16.180] Relaying remaining futures [13:14:16.180] signalConditionsASAP(NULL, pos=0) ... [13:14:16.180] - nx: 1 [13:14:16.181] - relay: TRUE [13:14:16.181] - stdout: TRUE [13:14:16.181] - signal: TRUE [13:14:16.181] - resignal: FALSE [13:14:16.181] - force: TRUE [13:14:16.181] - relayed: [n=1] TRUE [13:14:16.181] - queued futures: [n=1] TRUE - flush all [13:14:16.182] - relayed: [n=1] TRUE [13:14:16.182] - queued futures: [n=1] TRUE [13:14:16.182] signalConditionsASAP(NULL, pos=0) ... done [13:14:16.182] resolve() on list ... DONE [13:14:16.182] - Number of value chunks collected: 1 [13:14:16.183] Resolving 1 futures (chunks) ... DONE [13:14:16.183] Reducing values from 1 chunks ... [13:14:16.183] - Number of values collected after concatenation: 3 [13:14:16.183] - Number of values expected: 3 [13:14:16.183] Reducing values from 1 chunks ... DONE [13:14:16.183] future_lapply() ... DONE num [1:5, 1:3] 1 3.25 5.5 7.75 10 ... - attr(*, "dimnames")=List of 2 ..$ : chr [1:5] "0%" "25%" "50%" "75%" ... ..$ : chr [1:3] "a" "beta" "logic" [13:14:16.186] future_lapply() ... [13:14:16.191] Number of chunks: 1 [13:14:16.191] getGlobalsAndPackagesXApply() ... [13:14:16.191] - future.globals: TRUE [13:14:16.191] getGlobalsAndPackages() ... [13:14:16.192] Searching for globals... [13:14:16.198] - globals found: [21] 'FUN', '{', '<-', 'is.na', 'if', 'any', '[', '!', 'return', 'rep.int', 'sort', 'length', '==', '/', 'floor', '(', '+', 'c', '-', '*', 'ceiling' [13:14:16.198] Searching for globals ... DONE [13:14:16.198] Resolving globals: FALSE [13:14:16.200] The total size of the 1 globals is 45.86 KiB (46960 bytes) [13:14:16.201] The total size of the 1 globals exported for future expression ('FUN()') is 45.86 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (45.86 KiB of class 'function') [13:14:16.201] - globals: [1] 'FUN' [13:14:16.201] - packages: [1] 'stats' [13:14:16.201] getGlobalsAndPackages() ... DONE [13:14:16.201] - globals found/used: [n=1] 'FUN' [13:14:16.202] - needed namespaces: [n=1] 'stats' [13:14:16.202] Finding globals ... DONE [13:14:16.202] - use_args: TRUE [13:14:16.202] - Getting '...' globals ... [13:14:16.202] resolve() on list ... [13:14:16.203] recursive: 0 [13:14:16.203] length: 1 [13:14:16.203] elements: '...' [13:14:16.203] length: 0 (resolved future 1) [13:14:16.203] resolve() on list ... DONE [13:14:16.203] - '...' content: [n=0] [13:14:16.204] List of 1 [13:14:16.204] $ ...: list() [13:14:16.204] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:14:16.204] - attr(*, "where")=List of 1 [13:14:16.204] ..$ ...: [13:14:16.204] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:14:16.204] - attr(*, "resolved")= logi TRUE [13:14:16.204] - attr(*, "total_size")= num NA [13:14:16.207] - Getting '...' globals ... DONE [13:14:16.207] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:14:16.207] List of 2 [13:14:16.207] $ ...future.FUN:function (x, na.rm = TRUE) [13:14:16.207] $ ... : list() [13:14:16.207] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:14:16.207] - attr(*, "where")=List of 2 [13:14:16.207] ..$ ...future.FUN: [13:14:16.207] ..$ ... : [13:14:16.207] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:14:16.207] - attr(*, "resolved")= logi FALSE [13:14:16.207] - attr(*, "total_size")= num 46960 [13:14:16.210] Packages to be attached in all futures: [n=1] 'stats' [13:14:16.210] getGlobalsAndPackagesXApply() ... DONE [13:14:16.211] Number of futures (= number of chunks): 1 [13:14:16.211] Launching 1 futures (chunks) ... [13:14:16.211] Chunk #1 of 1 ... [13:14:16.211] - Finding globals in 'X' for chunk #1 ... [13:14:16.211] getGlobalsAndPackages() ... [13:14:16.211] Searching for globals... [13:14:16.212] [13:14:16.212] Searching for globals ... DONE [13:14:16.212] - globals: [0] [13:14:16.212] getGlobalsAndPackages() ... DONE [13:14:16.212] + additional globals found: [n=0] [13:14:16.213] + additional namespaces needed: [n=0] [13:14:16.213] - Finding globals in 'X' for chunk #1 ... DONE [13:14:16.213] - seeds: [13:14:16.213] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:16.213] getGlobalsAndPackages() ... [13:14:16.213] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:16.214] Resolving globals: FALSE [13:14:16.214] Tweak future expression to call with '...' arguments ... [13:14:16.214] { [13:14:16.214] do.call(function(...) { [13:14:16.214] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:16.214] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:16.214] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:16.214] on.exit(options(oopts), add = TRUE) [13:14:16.214] } [13:14:16.214] { [13:14:16.214] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:16.214] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:16.214] ...future.FUN(...future.X_jj, ...) [13:14:16.214] }) [13:14:16.214] } [13:14:16.214] }, args = future.call.arguments) [13:14:16.214] } [13:14:16.214] Tweak future expression to call with '...' arguments ... DONE [13:14:16.215] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:16.215] - packages: [1] 'stats' [13:14:16.215] getGlobalsAndPackages() ... DONE [13:14:16.216] run() for 'Future' ... [13:14:16.216] - state: 'created' [13:14:16.216] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:14:16.216] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:14:16.217] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:14:16.217] - Field: 'label' [13:14:16.217] - Field: 'local' [13:14:16.217] - Field: 'owner' [13:14:16.217] - Field: 'envir' [13:14:16.217] - Field: 'packages' [13:14:16.218] - Field: 'gc' [13:14:16.218] - Field: 'conditions' [13:14:16.218] - Field: 'expr' [13:14:16.218] - Field: 'uuid' [13:14:16.218] - Field: 'seed' [13:14:16.219] - Field: 'version' [13:14:16.219] - Field: 'result' [13:14:16.219] - Field: 'asynchronous' [13:14:16.219] - Field: 'calls' [13:14:16.219] - Field: 'globals' [13:14:16.219] - Field: 'stdout' [13:14:16.220] - Field: 'earlySignal' [13:14:16.220] - Field: 'lazy' [13:14:16.220] - Field: 'state' [13:14:16.220] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:14:16.220] - Launch lazy future ... [13:14:16.220] Packages needed by the future expression (n = 1): 'stats' [13:14:16.221] Packages needed by future strategies (n = 0): [13:14:16.221] { [13:14:16.221] { [13:14:16.221] { [13:14:16.221] ...future.startTime <- base::Sys.time() [13:14:16.221] { [13:14:16.221] { [13:14:16.221] { [13:14:16.221] { [13:14:16.221] base::local({ [13:14:16.221] has_future <- base::requireNamespace("future", [13:14:16.221] quietly = TRUE) [13:14:16.221] if (has_future) { [13:14:16.221] ns <- base::getNamespace("future") [13:14:16.221] version <- ns[[".package"]][["version"]] [13:14:16.221] if (is.null(version)) [13:14:16.221] version <- utils::packageVersion("future") [13:14:16.221] } [13:14:16.221] else { [13:14:16.221] version <- NULL [13:14:16.221] } [13:14:16.221] if (!has_future || version < "1.8.0") { [13:14:16.221] info <- base::c(r_version = base::gsub("R version ", [13:14:16.221] "", base::R.version$version.string), [13:14:16.221] platform = base::sprintf("%s (%s-bit)", [13:14:16.221] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:14:16.221] os = base::paste(base::Sys.info()[base::c("sysname", [13:14:16.221] "release", "version")], collapse = " "), [13:14:16.221] hostname = base::Sys.info()[["nodename"]]) [13:14:16.221] info <- base::sprintf("%s: %s", base::names(info), [13:14:16.221] info) [13:14:16.221] info <- base::paste(info, collapse = "; ") [13:14:16.221] if (!has_future) { [13:14:16.221] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:14:16.221] info) [13:14:16.221] } [13:14:16.221] else { [13:14:16.221] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:14:16.221] info, version) [13:14:16.221] } [13:14:16.221] base::stop(msg) [13:14:16.221] } [13:14:16.221] }) [13:14:16.221] } [13:14:16.221] base::local({ [13:14:16.221] for (pkg in "stats") { [13:14:16.221] base::loadNamespace(pkg) [13:14:16.221] base::library(pkg, character.only = TRUE) [13:14:16.221] } [13:14:16.221] }) [13:14:16.221] } [13:14:16.221] options(future.plan = NULL) [13:14:16.221] Sys.unsetenv("R_FUTURE_PLAN") [13:14:16.221] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:14:16.221] } [13:14:16.221] ...future.workdir <- getwd() [13:14:16.221] } [13:14:16.221] ...future.oldOptions <- base::as.list(base::.Options) [13:14:16.221] ...future.oldEnvVars <- base::Sys.getenv() [13:14:16.221] } [13:14:16.221] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:14:16.221] future.globals.maxSize = NULL, future.globals.method = NULL, [13:14:16.221] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:14:16.221] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:14:16.221] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:14:16.221] future.stdout.windows.reencode = NULL, width = 80L) [13:14:16.221] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:14:16.221] base::names(...future.oldOptions)) [13:14:16.221] } [13:14:16.221] if (FALSE) { [13:14:16.221] } [13:14:16.221] else { [13:14:16.221] if (TRUE) { [13:14:16.221] ...future.stdout <- base::rawConnection(base::raw(0L), [13:14:16.221] open = "w") [13:14:16.221] } [13:14:16.221] else { [13:14:16.221] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:14:16.221] windows = "NUL", "/dev/null"), open = "w") [13:14:16.221] } [13:14:16.221] base::sink(...future.stdout, type = "output", split = FALSE) [13:14:16.221] base::on.exit(if (!base::is.null(...future.stdout)) { [13:14:16.221] base::sink(type = "output", split = FALSE) [13:14:16.221] base::close(...future.stdout) [13:14:16.221] }, add = TRUE) [13:14:16.221] } [13:14:16.221] ...future.frame <- base::sys.nframe() [13:14:16.221] ...future.conditions <- base::list() [13:14:16.221] ...future.rng <- base::globalenv()$.Random.seed [13:14:16.221] if (FALSE) { [13:14:16.221] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:14:16.221] "...future.value", "...future.globalenv.names", ".Random.seed") [13:14:16.221] } [13:14:16.221] ...future.result <- base::tryCatch({ [13:14:16.221] base::withCallingHandlers({ [13:14:16.221] ...future.value <- base::withVisible(base::local({ [13:14:16.221] do.call(function(...) { [13:14:16.221] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:16.221] if (!identical(...future.globals.maxSize.org, [13:14:16.221] ...future.globals.maxSize)) { [13:14:16.221] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:16.221] on.exit(options(oopts), add = TRUE) [13:14:16.221] } [13:14:16.221] { [13:14:16.221] lapply(seq_along(...future.elements_ii), [13:14:16.221] FUN = function(jj) { [13:14:16.221] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:16.221] ...future.FUN(...future.X_jj, ...) [13:14:16.221] }) [13:14:16.221] } [13:14:16.221] }, args = future.call.arguments) [13:14:16.221] })) [13:14:16.221] future::FutureResult(value = ...future.value$value, [13:14:16.221] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:14:16.221] ...future.rng), globalenv = if (FALSE) [13:14:16.221] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:14:16.221] ...future.globalenv.names)) [13:14:16.221] else NULL, started = ...future.startTime, version = "1.8") [13:14:16.221] }, condition = base::local({ [13:14:16.221] c <- base::c [13:14:16.221] inherits <- base::inherits [13:14:16.221] invokeRestart <- base::invokeRestart [13:14:16.221] length <- base::length [13:14:16.221] list <- base::list [13:14:16.221] seq.int <- base::seq.int [13:14:16.221] signalCondition <- base::signalCondition [13:14:16.221] sys.calls <- base::sys.calls [13:14:16.221] `[[` <- base::`[[` [13:14:16.221] `+` <- base::`+` [13:14:16.221] `<<-` <- base::`<<-` [13:14:16.221] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:14:16.221] calls[seq.int(from = from + 12L, to = length(calls) - [13:14:16.221] 3L)] [13:14:16.221] } [13:14:16.221] function(cond) { [13:14:16.221] is_error <- inherits(cond, "error") [13:14:16.221] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:14:16.221] NULL) [13:14:16.221] if (is_error) { [13:14:16.221] sessionInformation <- function() { [13:14:16.221] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:14:16.221] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:14:16.221] search = base::search(), system = base::Sys.info()) [13:14:16.221] } [13:14:16.221] ...future.conditions[[length(...future.conditions) + [13:14:16.221] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:14:16.221] cond$call), session = sessionInformation(), [13:14:16.221] timestamp = base::Sys.time(), signaled = 0L) [13:14:16.221] signalCondition(cond) [13:14:16.221] } [13:14:16.221] else if (!ignore && TRUE && inherits(cond, c("condition", [13:14:16.221] "immediateCondition"))) { [13:14:16.221] signal <- TRUE && inherits(cond, "immediateCondition") [13:14:16.221] ...future.conditions[[length(...future.conditions) + [13:14:16.221] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:14:16.221] if (TRUE && !signal) { [13:14:16.221] muffleCondition <- function (cond, pattern = "^muffle") [13:14:16.221] { [13:14:16.221] inherits <- base::inherits [13:14:16.221] invokeRestart <- base::invokeRestart [13:14:16.221] is.null <- base::is.null [13:14:16.221] muffled <- FALSE [13:14:16.221] if (inherits(cond, "message")) { [13:14:16.221] muffled <- grepl(pattern, "muffleMessage") [13:14:16.221] if (muffled) [13:14:16.221] invokeRestart("muffleMessage") [13:14:16.221] } [13:14:16.221] else if (inherits(cond, "warning")) { [13:14:16.221] muffled <- grepl(pattern, "muffleWarning") [13:14:16.221] if (muffled) [13:14:16.221] invokeRestart("muffleWarning") [13:14:16.221] } [13:14:16.221] else if (inherits(cond, "condition")) { [13:14:16.221] if (!is.null(pattern)) { [13:14:16.221] computeRestarts <- base::computeRestarts [13:14:16.221] grepl <- base::grepl [13:14:16.221] restarts <- computeRestarts(cond) [13:14:16.221] for (restart in restarts) { [13:14:16.221] name <- restart$name [13:14:16.221] if (is.null(name)) [13:14:16.221] next [13:14:16.221] if (!grepl(pattern, name)) [13:14:16.221] next [13:14:16.221] invokeRestart(restart) [13:14:16.221] muffled <- TRUE [13:14:16.221] break [13:14:16.221] } [13:14:16.221] } [13:14:16.221] } [13:14:16.221] invisible(muffled) [13:14:16.221] } [13:14:16.221] muffleCondition(cond, pattern = "^muffle") [13:14:16.221] } [13:14:16.221] } [13:14:16.221] else { [13:14:16.221] if (TRUE) { [13:14:16.221] muffleCondition <- function (cond, pattern = "^muffle") [13:14:16.221] { [13:14:16.221] inherits <- base::inherits [13:14:16.221] invokeRestart <- base::invokeRestart [13:14:16.221] is.null <- base::is.null [13:14:16.221] muffled <- FALSE [13:14:16.221] if (inherits(cond, "message")) { [13:14:16.221] muffled <- grepl(pattern, "muffleMessage") [13:14:16.221] if (muffled) [13:14:16.221] invokeRestart("muffleMessage") [13:14:16.221] } [13:14:16.221] else if (inherits(cond, "warning")) { [13:14:16.221] muffled <- grepl(pattern, "muffleWarning") [13:14:16.221] if (muffled) [13:14:16.221] invokeRestart("muffleWarning") [13:14:16.221] } [13:14:16.221] else if (inherits(cond, "condition")) { [13:14:16.221] if (!is.null(pattern)) { [13:14:16.221] computeRestarts <- base::computeRestarts [13:14:16.221] grepl <- base::grepl [13:14:16.221] restarts <- computeRestarts(cond) [13:14:16.221] for (restart in restarts) { [13:14:16.221] name <- restart$name [13:14:16.221] if (is.null(name)) [13:14:16.221] next [13:14:16.221] if (!grepl(pattern, name)) [13:14:16.221] next [13:14:16.221] invokeRestart(restart) [13:14:16.221] muffled <- TRUE [13:14:16.221] break [13:14:16.221] } [13:14:16.221] } [13:14:16.221] } [13:14:16.221] invisible(muffled) [13:14:16.221] } [13:14:16.221] muffleCondition(cond, pattern = "^muffle") [13:14:16.221] } [13:14:16.221] } [13:14:16.221] } [13:14:16.221] })) [13:14:16.221] }, error = function(ex) { [13:14:16.221] base::structure(base::list(value = NULL, visible = NULL, [13:14:16.221] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:14:16.221] ...future.rng), started = ...future.startTime, [13:14:16.221] finished = Sys.time(), session_uuid = NA_character_, [13:14:16.221] version = "1.8"), class = "FutureResult") [13:14:16.221] }, finally = { [13:14:16.221] if (!identical(...future.workdir, getwd())) [13:14:16.221] setwd(...future.workdir) [13:14:16.221] { [13:14:16.221] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:14:16.221] ...future.oldOptions$nwarnings <- NULL [13:14:16.221] } [13:14:16.221] base::options(...future.oldOptions) [13:14:16.221] if (.Platform$OS.type == "windows") { [13:14:16.221] old_names <- names(...future.oldEnvVars) [13:14:16.221] envs <- base::Sys.getenv() [13:14:16.221] names <- names(envs) [13:14:16.221] common <- intersect(names, old_names) [13:14:16.221] added <- setdiff(names, old_names) [13:14:16.221] removed <- setdiff(old_names, names) [13:14:16.221] changed <- common[...future.oldEnvVars[common] != [13:14:16.221] envs[common]] [13:14:16.221] NAMES <- toupper(changed) [13:14:16.221] args <- list() [13:14:16.221] for (kk in seq_along(NAMES)) { [13:14:16.221] name <- changed[[kk]] [13:14:16.221] NAME <- NAMES[[kk]] [13:14:16.221] if (name != NAME && is.element(NAME, old_names)) [13:14:16.221] next [13:14:16.221] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:16.221] } [13:14:16.221] NAMES <- toupper(added) [13:14:16.221] for (kk in seq_along(NAMES)) { [13:14:16.221] name <- added[[kk]] [13:14:16.221] NAME <- NAMES[[kk]] [13:14:16.221] if (name != NAME && is.element(NAME, old_names)) [13:14:16.221] next [13:14:16.221] args[[name]] <- "" [13:14:16.221] } [13:14:16.221] NAMES <- toupper(removed) [13:14:16.221] for (kk in seq_along(NAMES)) { [13:14:16.221] name <- removed[[kk]] [13:14:16.221] NAME <- NAMES[[kk]] [13:14:16.221] if (name != NAME && is.element(NAME, old_names)) [13:14:16.221] next [13:14:16.221] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:16.221] } [13:14:16.221] if (length(args) > 0) [13:14:16.221] base::do.call(base::Sys.setenv, args = args) [13:14:16.221] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:14:16.221] } [13:14:16.221] else { [13:14:16.221] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:14:16.221] } [13:14:16.221] { [13:14:16.221] if (base::length(...future.futureOptionsAdded) > [13:14:16.221] 0L) { [13:14:16.221] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:14:16.221] base::names(opts) <- ...future.futureOptionsAdded [13:14:16.221] base::options(opts) [13:14:16.221] } [13:14:16.221] { [13:14:16.221] { [13:14:16.221] NULL [13:14:16.221] RNGkind("Mersenne-Twister") [13:14:16.221] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:14:16.221] inherits = FALSE) [13:14:16.221] } [13:14:16.221] options(future.plan = NULL) [13:14:16.221] if (is.na(NA_character_)) [13:14:16.221] Sys.unsetenv("R_FUTURE_PLAN") [13:14:16.221] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:14:16.221] future::plan(list(function (..., envir = parent.frame()) [13:14:16.221] { [13:14:16.221] future <- SequentialFuture(..., envir = envir) [13:14:16.221] if (!future$lazy) [13:14:16.221] future <- run(future) [13:14:16.221] invisible(future) [13:14:16.221] }), .cleanup = FALSE, .init = FALSE) [13:14:16.221] } [13:14:16.221] } [13:14:16.221] } [13:14:16.221] }) [13:14:16.221] if (TRUE) { [13:14:16.221] base::sink(type = "output", split = FALSE) [13:14:16.221] if (TRUE) { [13:14:16.221] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:14:16.221] } [13:14:16.221] else { [13:14:16.221] ...future.result["stdout"] <- base::list(NULL) [13:14:16.221] } [13:14:16.221] base::close(...future.stdout) [13:14:16.221] ...future.stdout <- NULL [13:14:16.221] } [13:14:16.221] ...future.result$conditions <- ...future.conditions [13:14:16.221] ...future.result$finished <- base::Sys.time() [13:14:16.221] ...future.result [13:14:16.221] } [13:14:16.225] assign_globals() ... [13:14:16.225] List of 5 [13:14:16.225] $ ...future.FUN :function (x, na.rm = TRUE) [13:14:16.225] $ future.call.arguments : list() [13:14:16.225] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:14:16.225] $ ...future.elements_ii :List of 7 [13:14:16.225] ..$ : int [1:3] 1 2 3 [13:14:16.225] ..$ : int [1:4] 1 2 3 4 [13:14:16.225] ..$ : int [1:5] 1 2 3 4 5 [13:14:16.225] ..$ : int [1:6] 1 2 3 4 5 6 [13:14:16.225] ..$ : int [1:7] 1 2 3 4 5 6 7 [13:14:16.225] ..$ : int [1:8] 1 2 3 4 5 6 7 8 [13:14:16.225] ..$ : int [1:9] 1 2 3 4 5 6 7 8 9 [13:14:16.225] $ ...future.seeds_ii : NULL [13:14:16.225] $ ...future.globals.maxSize: NULL [13:14:16.225] - attr(*, "where")=List of 5 [13:14:16.225] ..$ ...future.FUN : [13:14:16.225] ..$ future.call.arguments : [13:14:16.225] ..$ ...future.elements_ii : [13:14:16.225] ..$ ...future.seeds_ii : [13:14:16.225] ..$ ...future.globals.maxSize: [13:14:16.225] - attr(*, "resolved")= logi FALSE [13:14:16.225] - attr(*, "total_size")= num 46960 [13:14:16.225] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:14:16.225] - attr(*, "already-done")= logi TRUE [13:14:16.234] - copied '...future.FUN' to environment [13:14:16.234] - copied 'future.call.arguments' to environment [13:14:16.234] - copied '...future.elements_ii' to environment [13:14:16.235] - copied '...future.seeds_ii' to environment [13:14:16.235] - copied '...future.globals.maxSize' to environment [13:14:16.235] assign_globals() ... done [13:14:16.235] plan(): Setting new future strategy stack: [13:14:16.236] List of future strategies: [13:14:16.236] 1. sequential: [13:14:16.236] - args: function (..., envir = parent.frame(), workers = "") [13:14:16.236] - tweaked: FALSE [13:14:16.236] - call: NULL [13:14:16.236] plan(): nbrOfWorkers() = 1 [13:14:16.237] plan(): Setting new future strategy stack: [13:14:16.238] List of future strategies: [13:14:16.238] 1. sequential: [13:14:16.238] - args: function (..., envir = parent.frame(), workers = "") [13:14:16.238] - tweaked: FALSE [13:14:16.238] - call: plan(strategy) [13:14:16.238] plan(): nbrOfWorkers() = 1 [13:14:16.238] SequentialFuture started (and completed) [13:14:16.239] - Launch lazy future ... done [13:14:16.239] run() for 'SequentialFuture' ... done [13:14:16.239] Created future: [13:14:16.239] SequentialFuture: [13:14:16.239] Label: 'future_sapply-1' [13:14:16.239] Expression: [13:14:16.239] { [13:14:16.239] do.call(function(...) { [13:14:16.239] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:16.239] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:16.239] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:16.239] on.exit(options(oopts), add = TRUE) [13:14:16.239] } [13:14:16.239] { [13:14:16.239] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:16.239] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:16.239] ...future.FUN(...future.X_jj, ...) [13:14:16.239] }) [13:14:16.239] } [13:14:16.239] }, args = future.call.arguments) [13:14:16.239] } [13:14:16.239] Lazy evaluation: FALSE [13:14:16.239] Asynchronous evaluation: FALSE [13:14:16.239] Local evaluation: TRUE [13:14:16.239] Environment: R_GlobalEnv [13:14:16.239] Capture standard output: TRUE [13:14:16.239] Capture condition classes: 'condition' (excluding 'nothing') [13:14:16.239] Globals: 5 objects totaling 46.39 KiB (function '...future.FUN' of 45.86 KiB, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 544 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:14:16.239] Packages: 1 packages ('stats') [13:14:16.239] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:14:16.239] Resolved: TRUE [13:14:16.239] Value: 672 bytes of class 'list' [13:14:16.239] Early signaling: FALSE [13:14:16.239] Owner process: 1bb7d580-628d-c90d-e38a-66de485868c4 [13:14:16.239] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:14:16.240] Chunk #1 of 1 ... DONE [13:14:16.241] Launching 1 futures (chunks) ... DONE [13:14:16.241] Resolving 1 futures (chunks) ... [13:14:16.241] resolve() on list ... [13:14:16.241] recursive: 0 [13:14:16.241] length: 1 [13:14:16.241] [13:14:16.242] resolved() for 'SequentialFuture' ... [13:14:16.242] - state: 'finished' [13:14:16.242] - run: TRUE [13:14:16.242] - result: 'FutureResult' [13:14:16.242] resolved() for 'SequentialFuture' ... done [13:14:16.243] Future #1 [13:14:16.243] signalConditionsASAP(SequentialFuture, pos=1) ... [13:14:16.243] - nx: 1 [13:14:16.243] - relay: TRUE [13:14:16.243] - stdout: TRUE [13:14:16.243] - signal: TRUE [13:14:16.244] - resignal: FALSE [13:14:16.244] - force: TRUE [13:14:16.244] - relayed: [n=1] FALSE [13:14:16.244] - queued futures: [n=1] FALSE [13:14:16.244] - until=1 [13:14:16.244] - relaying element #1 [13:14:16.245] - relayed: [n=1] TRUE [13:14:16.245] - queued futures: [n=1] TRUE [13:14:16.245] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:14:16.245] length: 0 (resolved future 1) [13:14:16.245] Relaying remaining futures [13:14:16.245] signalConditionsASAP(NULL, pos=0) ... [13:14:16.246] - nx: 1 [13:14:16.246] - relay: TRUE [13:14:16.246] - stdout: TRUE [13:14:16.246] - signal: TRUE [13:14:16.246] - resignal: FALSE [13:14:16.246] - force: TRUE [13:14:16.246] - relayed: [n=1] TRUE [13:14:16.247] - queued futures: [n=1] TRUE - flush all [13:14:16.247] - relayed: [n=1] TRUE [13:14:16.247] - queued futures: [n=1] TRUE [13:14:16.247] signalConditionsASAP(NULL, pos=0) ... done [13:14:16.247] resolve() on list ... DONE [13:14:16.248] - Number of value chunks collected: 1 [13:14:16.248] Resolving 1 futures (chunks) ... DONE [13:14:16.248] Reducing values from 1 chunks ... [13:14:16.248] - Number of values collected after concatenation: 7 [13:14:16.248] - Number of values expected: 7 [13:14:16.248] Reducing values from 1 chunks ... DONE [13:14:16.248] future_lapply() ... DONE [13:14:16.249] future_lapply() ... [13:14:16.252] Number of chunks: 1 [13:14:16.252] getGlobalsAndPackagesXApply() ... [13:14:16.252] - future.globals: TRUE [13:14:16.253] getGlobalsAndPackages() ... [13:14:16.253] Searching for globals... [13:14:16.262] - globals found: [31] 'FUN', '{', '<-', 'x_FUN', 'if', '!=', 'length', 'times', 'stopf', 'stop_if_not', 'all', '==', 'dim', '%in%', 'typeof', 'valid_types', 'is.na', 'any', '[', '!', 'return', 'rep.int', 'sort', '/', 'floor', '(', '+', 'c', '-', '*', 'ceiling' [13:14:16.262] Searching for globals ... DONE [13:14:16.263] Resolving globals: FALSE [13:14:16.264] The total size of the 7 globals is 137.93 KiB (141240 bytes) [13:14:16.264] The total size of the 7 globals exported for future expression ('FUN()') is 137.93 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). The three largest globals are 'x_FUN' (45.86 KiB of class 'function'), 'stop_if_not' (44.12 KiB of class 'function') and 'stopf' (26.43 KiB of class 'function') [13:14:16.265] - globals: [7] 'FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types' [13:14:16.265] - packages: [2] 'stats', 'future.apply' [13:14:16.265] getGlobalsAndPackages() ... DONE [13:14:16.265] - globals found/used: [n=7] 'FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types' [13:14:16.265] - needed namespaces: [n=2] 'stats', 'future.apply' [13:14:16.266] Finding globals ... DONE [13:14:16.266] - use_args: TRUE [13:14:16.266] - Getting '...' globals ... [13:14:16.266] resolve() on list ... [13:14:16.266] recursive: 0 [13:14:16.267] length: 1 [13:14:16.267] elements: '...' [13:14:16.267] length: 0 (resolved future 1) [13:14:16.267] resolve() on list ... DONE [13:14:16.267] - '...' content: [n=0] [13:14:16.267] List of 1 [13:14:16.267] $ ...: list() [13:14:16.267] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:14:16.267] - attr(*, "where")=List of 1 [13:14:16.267] ..$ ...: [13:14:16.267] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:14:16.267] - attr(*, "resolved")= logi TRUE [13:14:16.267] - attr(*, "total_size")= num NA [13:14:16.272] - Getting '...' globals ... DONE [13:14:16.272] Globals to be used in all futures (chunks): [n=8] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...' [13:14:16.272] List of 8 [13:14:16.272] $ ...future.FUN:function (x, ...) [13:14:16.272] $ x_FUN :function (x, na.rm = TRUE) [13:14:16.272] $ times : int 5 [13:14:16.272] $ stopf :function (fmt, ..., call. = TRUE, domain = NULL) [13:14:16.272] $ stop_if_not :function (...) [13:14:16.272] $ dim : NULL [13:14:16.272] $ valid_types : chr [1:3] "logical" "integer" "double" [13:14:16.272] $ ... : list() [13:14:16.272] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:14:16.272] - attr(*, "where")=List of 8 [13:14:16.272] ..$ ...future.FUN: [13:14:16.272] ..$ x_FUN : [13:14:16.272] ..$ times : [13:14:16.272] ..$ stopf : [13:14:16.272] ..$ stop_if_not : [13:14:16.272] ..$ dim : [13:14:16.272] ..$ valid_types : [13:14:16.272] ..$ ... : [13:14:16.272] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:14:16.272] - attr(*, "resolved")= logi FALSE [13:14:16.272] - attr(*, "total_size")= num 141240 [13:14:16.279] Packages to be attached in all futures: [n=2] 'stats', 'future.apply' [13:14:16.279] getGlobalsAndPackagesXApply() ... DONE [13:14:16.279] Number of futures (= number of chunks): 1 [13:14:16.280] Launching 1 futures (chunks) ... [13:14:16.280] Chunk #1 of 1 ... [13:14:16.280] - Finding globals in 'X' for chunk #1 ... [13:14:16.280] getGlobalsAndPackages() ... [13:14:16.280] Searching for globals... [13:14:16.281] [13:14:16.281] Searching for globals ... DONE [13:14:16.281] - globals: [0] [13:14:16.281] getGlobalsAndPackages() ... DONE [13:14:16.281] + additional globals found: [n=0] [13:14:16.281] + additional namespaces needed: [n=0] [13:14:16.281] - Finding globals in 'X' for chunk #1 ... DONE [13:14:16.282] - seeds: [13:14:16.282] - All globals exported: [n=11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:16.282] getGlobalsAndPackages() ... [13:14:16.282] - globals passed as-is: [11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:16.282] Resolving globals: FALSE [13:14:16.282] Tweak future expression to call with '...' arguments ... [13:14:16.283] { [13:14:16.283] do.call(function(...) { [13:14:16.283] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:16.283] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:16.283] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:16.283] on.exit(options(oopts), add = TRUE) [13:14:16.283] } [13:14:16.283] { [13:14:16.283] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:16.283] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:16.283] ...future.FUN(...future.X_jj, ...) [13:14:16.283] }) [13:14:16.283] } [13:14:16.283] }, args = future.call.arguments) [13:14:16.283] } [13:14:16.283] Tweak future expression to call with '...' arguments ... DONE [13:14:16.284] - globals: [11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:16.284] - packages: [2] 'stats', 'future.apply' [13:14:16.284] getGlobalsAndPackages() ... DONE [13:14:16.285] run() for 'Future' ... [13:14:16.285] - state: 'created' [13:14:16.285] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:14:16.285] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:14:16.285] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:14:16.286] - Field: 'label' [13:14:16.286] - Field: 'local' [13:14:16.286] - Field: 'owner' [13:14:16.286] - Field: 'envir' [13:14:16.286] - Field: 'packages' [13:14:16.287] - Field: 'gc' [13:14:16.287] - Field: 'conditions' [13:14:16.287] - Field: 'expr' [13:14:16.287] - Field: 'uuid' [13:14:16.287] - Field: 'seed' [13:14:16.287] - Field: 'version' [13:14:16.288] - Field: 'result' [13:14:16.288] - Field: 'asynchronous' [13:14:16.288] - Field: 'calls' [13:14:16.288] - Field: 'globals' [13:14:16.288] - Field: 'stdout' [13:14:16.288] - Field: 'earlySignal' [13:14:16.289] - Field: 'lazy' [13:14:16.289] - Field: 'state' [13:14:16.289] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:14:16.289] - Launch lazy future ... [13:14:16.289] Packages needed by the future expression (n = 2): 'stats', 'future.apply' [13:14:16.290] Packages needed by future strategies (n = 0): [13:14:16.290] { [13:14:16.290] { [13:14:16.290] { [13:14:16.290] ...future.startTime <- base::Sys.time() [13:14:16.290] { [13:14:16.290] { [13:14:16.290] { [13:14:16.290] { [13:14:16.290] base::local({ [13:14:16.290] has_future <- base::requireNamespace("future", [13:14:16.290] quietly = TRUE) [13:14:16.290] if (has_future) { [13:14:16.290] ns <- base::getNamespace("future") [13:14:16.290] version <- ns[[".package"]][["version"]] [13:14:16.290] if (is.null(version)) [13:14:16.290] version <- utils::packageVersion("future") [13:14:16.290] } [13:14:16.290] else { [13:14:16.290] version <- NULL [13:14:16.290] } [13:14:16.290] if (!has_future || version < "1.8.0") { [13:14:16.290] info <- base::c(r_version = base::gsub("R version ", [13:14:16.290] "", base::R.version$version.string), [13:14:16.290] platform = base::sprintf("%s (%s-bit)", [13:14:16.290] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:14:16.290] os = base::paste(base::Sys.info()[base::c("sysname", [13:14:16.290] "release", "version")], collapse = " "), [13:14:16.290] hostname = base::Sys.info()[["nodename"]]) [13:14:16.290] info <- base::sprintf("%s: %s", base::names(info), [13:14:16.290] info) [13:14:16.290] info <- base::paste(info, collapse = "; ") [13:14:16.290] if (!has_future) { [13:14:16.290] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:14:16.290] info) [13:14:16.290] } [13:14:16.290] else { [13:14:16.290] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:14:16.290] info, version) [13:14:16.290] } [13:14:16.290] base::stop(msg) [13:14:16.290] } [13:14:16.290] }) [13:14:16.290] } [13:14:16.290] base::local({ [13:14:16.290] for (pkg in c("stats", "future.apply")) { [13:14:16.290] base::loadNamespace(pkg) [13:14:16.290] base::library(pkg, character.only = TRUE) [13:14:16.290] } [13:14:16.290] }) [13:14:16.290] } [13:14:16.290] options(future.plan = NULL) [13:14:16.290] Sys.unsetenv("R_FUTURE_PLAN") [13:14:16.290] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:14:16.290] } [13:14:16.290] ...future.workdir <- getwd() [13:14:16.290] } [13:14:16.290] ...future.oldOptions <- base::as.list(base::.Options) [13:14:16.290] ...future.oldEnvVars <- base::Sys.getenv() [13:14:16.290] } [13:14:16.290] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:14:16.290] future.globals.maxSize = NULL, future.globals.method = NULL, [13:14:16.290] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:14:16.290] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:14:16.290] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:14:16.290] future.stdout.windows.reencode = NULL, width = 80L) [13:14:16.290] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:14:16.290] base::names(...future.oldOptions)) [13:14:16.290] } [13:14:16.290] if (FALSE) { [13:14:16.290] } [13:14:16.290] else { [13:14:16.290] if (TRUE) { [13:14:16.290] ...future.stdout <- base::rawConnection(base::raw(0L), [13:14:16.290] open = "w") [13:14:16.290] } [13:14:16.290] else { [13:14:16.290] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:14:16.290] windows = "NUL", "/dev/null"), open = "w") [13:14:16.290] } [13:14:16.290] base::sink(...future.stdout, type = "output", split = FALSE) [13:14:16.290] base::on.exit(if (!base::is.null(...future.stdout)) { [13:14:16.290] base::sink(type = "output", split = FALSE) [13:14:16.290] base::close(...future.stdout) [13:14:16.290] }, add = TRUE) [13:14:16.290] } [13:14:16.290] ...future.frame <- base::sys.nframe() [13:14:16.290] ...future.conditions <- base::list() [13:14:16.290] ...future.rng <- base::globalenv()$.Random.seed [13:14:16.290] if (FALSE) { [13:14:16.290] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:14:16.290] "...future.value", "...future.globalenv.names", ".Random.seed") [13:14:16.290] } [13:14:16.290] ...future.result <- base::tryCatch({ [13:14:16.290] base::withCallingHandlers({ [13:14:16.290] ...future.value <- base::withVisible(base::local({ [13:14:16.290] do.call(function(...) { [13:14:16.290] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:16.290] if (!identical(...future.globals.maxSize.org, [13:14:16.290] ...future.globals.maxSize)) { [13:14:16.290] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:16.290] on.exit(options(oopts), add = TRUE) [13:14:16.290] } [13:14:16.290] { [13:14:16.290] lapply(seq_along(...future.elements_ii), [13:14:16.290] FUN = function(jj) { [13:14:16.290] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:16.290] ...future.FUN(...future.X_jj, ...) [13:14:16.290] }) [13:14:16.290] } [13:14:16.290] }, args = future.call.arguments) [13:14:16.290] })) [13:14:16.290] future::FutureResult(value = ...future.value$value, [13:14:16.290] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:14:16.290] ...future.rng), globalenv = if (FALSE) [13:14:16.290] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:14:16.290] ...future.globalenv.names)) [13:14:16.290] else NULL, started = ...future.startTime, version = "1.8") [13:14:16.290] }, condition = base::local({ [13:14:16.290] c <- base::c [13:14:16.290] inherits <- base::inherits [13:14:16.290] invokeRestart <- base::invokeRestart [13:14:16.290] length <- base::length [13:14:16.290] list <- base::list [13:14:16.290] seq.int <- base::seq.int [13:14:16.290] signalCondition <- base::signalCondition [13:14:16.290] sys.calls <- base::sys.calls [13:14:16.290] `[[` <- base::`[[` [13:14:16.290] `+` <- base::`+` [13:14:16.290] `<<-` <- base::`<<-` [13:14:16.290] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:14:16.290] calls[seq.int(from = from + 12L, to = length(calls) - [13:14:16.290] 3L)] [13:14:16.290] } [13:14:16.290] function(cond) { [13:14:16.290] is_error <- inherits(cond, "error") [13:14:16.290] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:14:16.290] NULL) [13:14:16.290] if (is_error) { [13:14:16.290] sessionInformation <- function() { [13:14:16.290] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:14:16.290] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:14:16.290] search = base::search(), system = base::Sys.info()) [13:14:16.290] } [13:14:16.290] ...future.conditions[[length(...future.conditions) + [13:14:16.290] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:14:16.290] cond$call), session = sessionInformation(), [13:14:16.290] timestamp = base::Sys.time(), signaled = 0L) [13:14:16.290] signalCondition(cond) [13:14:16.290] } [13:14:16.290] else if (!ignore && TRUE && inherits(cond, c("condition", [13:14:16.290] "immediateCondition"))) { [13:14:16.290] signal <- TRUE && inherits(cond, "immediateCondition") [13:14:16.290] ...future.conditions[[length(...future.conditions) + [13:14:16.290] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:14:16.290] if (TRUE && !signal) { [13:14:16.290] muffleCondition <- function (cond, pattern = "^muffle") [13:14:16.290] { [13:14:16.290] inherits <- base::inherits [13:14:16.290] invokeRestart <- base::invokeRestart [13:14:16.290] is.null <- base::is.null [13:14:16.290] muffled <- FALSE [13:14:16.290] if (inherits(cond, "message")) { [13:14:16.290] muffled <- grepl(pattern, "muffleMessage") [13:14:16.290] if (muffled) [13:14:16.290] invokeRestart("muffleMessage") [13:14:16.290] } [13:14:16.290] else if (inherits(cond, "warning")) { [13:14:16.290] muffled <- grepl(pattern, "muffleWarning") [13:14:16.290] if (muffled) [13:14:16.290] invokeRestart("muffleWarning") [13:14:16.290] } [13:14:16.290] else if (inherits(cond, "condition")) { [13:14:16.290] if (!is.null(pattern)) { [13:14:16.290] computeRestarts <- base::computeRestarts [13:14:16.290] grepl <- base::grepl [13:14:16.290] restarts <- computeRestarts(cond) [13:14:16.290] for (restart in restarts) { [13:14:16.290] name <- restart$name [13:14:16.290] if (is.null(name)) [13:14:16.290] next [13:14:16.290] if (!grepl(pattern, name)) [13:14:16.290] next [13:14:16.290] invokeRestart(restart) [13:14:16.290] muffled <- TRUE [13:14:16.290] break [13:14:16.290] } [13:14:16.290] } [13:14:16.290] } [13:14:16.290] invisible(muffled) [13:14:16.290] } [13:14:16.290] muffleCondition(cond, pattern = "^muffle") [13:14:16.290] } [13:14:16.290] } [13:14:16.290] else { [13:14:16.290] if (TRUE) { [13:14:16.290] muffleCondition <- function (cond, pattern = "^muffle") [13:14:16.290] { [13:14:16.290] inherits <- base::inherits [13:14:16.290] invokeRestart <- base::invokeRestart [13:14:16.290] is.null <- base::is.null [13:14:16.290] muffled <- FALSE [13:14:16.290] if (inherits(cond, "message")) { [13:14:16.290] muffled <- grepl(pattern, "muffleMessage") [13:14:16.290] if (muffled) [13:14:16.290] invokeRestart("muffleMessage") [13:14:16.290] } [13:14:16.290] else if (inherits(cond, "warning")) { [13:14:16.290] muffled <- grepl(pattern, "muffleWarning") [13:14:16.290] if (muffled) [13:14:16.290] invokeRestart("muffleWarning") [13:14:16.290] } [13:14:16.290] else if (inherits(cond, "condition")) { [13:14:16.290] if (!is.null(pattern)) { [13:14:16.290] computeRestarts <- base::computeRestarts [13:14:16.290] grepl <- base::grepl [13:14:16.290] restarts <- computeRestarts(cond) [13:14:16.290] for (restart in restarts) { [13:14:16.290] name <- restart$name [13:14:16.290] if (is.null(name)) [13:14:16.290] next [13:14:16.290] if (!grepl(pattern, name)) [13:14:16.290] next [13:14:16.290] invokeRestart(restart) [13:14:16.290] muffled <- TRUE [13:14:16.290] break [13:14:16.290] } [13:14:16.290] } [13:14:16.290] } [13:14:16.290] invisible(muffled) [13:14:16.290] } [13:14:16.290] muffleCondition(cond, pattern = "^muffle") [13:14:16.290] } [13:14:16.290] } [13:14:16.290] } [13:14:16.290] })) [13:14:16.290] }, error = function(ex) { [13:14:16.290] base::structure(base::list(value = NULL, visible = NULL, [13:14:16.290] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:14:16.290] ...future.rng), started = ...future.startTime, [13:14:16.290] finished = Sys.time(), session_uuid = NA_character_, [13:14:16.290] version = "1.8"), class = "FutureResult") [13:14:16.290] }, finally = { [13:14:16.290] if (!identical(...future.workdir, getwd())) [13:14:16.290] setwd(...future.workdir) [13:14:16.290] { [13:14:16.290] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:14:16.290] ...future.oldOptions$nwarnings <- NULL [13:14:16.290] } [13:14:16.290] base::options(...future.oldOptions) [13:14:16.290] if (.Platform$OS.type == "windows") { [13:14:16.290] old_names <- names(...future.oldEnvVars) [13:14:16.290] envs <- base::Sys.getenv() [13:14:16.290] names <- names(envs) [13:14:16.290] common <- intersect(names, old_names) [13:14:16.290] added <- setdiff(names, old_names) [13:14:16.290] removed <- setdiff(old_names, names) [13:14:16.290] changed <- common[...future.oldEnvVars[common] != [13:14:16.290] envs[common]] [13:14:16.290] NAMES <- toupper(changed) [13:14:16.290] args <- list() [13:14:16.290] for (kk in seq_along(NAMES)) { [13:14:16.290] name <- changed[[kk]] [13:14:16.290] NAME <- NAMES[[kk]] [13:14:16.290] if (name != NAME && is.element(NAME, old_names)) [13:14:16.290] next [13:14:16.290] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:16.290] } [13:14:16.290] NAMES <- toupper(added) [13:14:16.290] for (kk in seq_along(NAMES)) { [13:14:16.290] name <- added[[kk]] [13:14:16.290] NAME <- NAMES[[kk]] [13:14:16.290] if (name != NAME && is.element(NAME, old_names)) [13:14:16.290] next [13:14:16.290] args[[name]] <- "" [13:14:16.290] } [13:14:16.290] NAMES <- toupper(removed) [13:14:16.290] for (kk in seq_along(NAMES)) { [13:14:16.290] name <- removed[[kk]] [13:14:16.290] NAME <- NAMES[[kk]] [13:14:16.290] if (name != NAME && is.element(NAME, old_names)) [13:14:16.290] next [13:14:16.290] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:16.290] } [13:14:16.290] if (length(args) > 0) [13:14:16.290] base::do.call(base::Sys.setenv, args = args) [13:14:16.290] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:14:16.290] } [13:14:16.290] else { [13:14:16.290] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:14:16.290] } [13:14:16.290] { [13:14:16.290] if (base::length(...future.futureOptionsAdded) > [13:14:16.290] 0L) { [13:14:16.290] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:14:16.290] base::names(opts) <- ...future.futureOptionsAdded [13:14:16.290] base::options(opts) [13:14:16.290] } [13:14:16.290] { [13:14:16.290] { [13:14:16.290] NULL [13:14:16.290] RNGkind("Mersenne-Twister") [13:14:16.290] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:14:16.290] inherits = FALSE) [13:14:16.290] } [13:14:16.290] options(future.plan = NULL) [13:14:16.290] if (is.na(NA_character_)) [13:14:16.290] Sys.unsetenv("R_FUTURE_PLAN") [13:14:16.290] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:14:16.290] future::plan(list(function (..., envir = parent.frame()) [13:14:16.290] { [13:14:16.290] future <- SequentialFuture(..., envir = envir) [13:14:16.290] if (!future$lazy) [13:14:16.290] future <- run(future) [13:14:16.290] invisible(future) [13:14:16.290] }), .cleanup = FALSE, .init = FALSE) [13:14:16.290] } [13:14:16.290] } [13:14:16.290] } [13:14:16.290] }) [13:14:16.290] if (TRUE) { [13:14:16.290] base::sink(type = "output", split = FALSE) [13:14:16.290] if (TRUE) { [13:14:16.290] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:14:16.290] } [13:14:16.290] else { [13:14:16.290] ...future.result["stdout"] <- base::list(NULL) [13:14:16.290] } [13:14:16.290] base::close(...future.stdout) [13:14:16.290] ...future.stdout <- NULL [13:14:16.290] } [13:14:16.290] ...future.result$conditions <- ...future.conditions [13:14:16.290] ...future.result$finished <- base::Sys.time() [13:14:16.290] ...future.result [13:14:16.290] } [13:14:16.294] assign_globals() ... [13:14:16.294] List of 11 [13:14:16.294] $ ...future.FUN :function (x, ...) [13:14:16.294] $ x_FUN :function (x, na.rm = TRUE) [13:14:16.294] $ times : int 5 [13:14:16.294] $ stopf :function (fmt, ..., call. = TRUE, domain = NULL) [13:14:16.294] $ stop_if_not :function (...) [13:14:16.294] $ dim : NULL [13:14:16.294] $ valid_types : chr [1:3] "logical" "integer" "double" [13:14:16.294] $ future.call.arguments : list() [13:14:16.294] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:14:16.294] $ ...future.elements_ii :List of 7 [13:14:16.294] ..$ : int [1:3] 1 2 3 [13:14:16.294] ..$ : int [1:4] 1 2 3 4 [13:14:16.294] ..$ : int [1:5] 1 2 3 4 5 [13:14:16.294] ..$ : int [1:6] 1 2 3 4 5 6 [13:14:16.294] ..$ : int [1:7] 1 2 3 4 5 6 7 [13:14:16.294] ..$ : int [1:8] 1 2 3 4 5 6 7 8 [13:14:16.294] ..$ : int [1:9] 1 2 3 4 5 6 7 8 9 [13:14:16.294] $ ...future.seeds_ii : NULL [13:14:16.294] $ ...future.globals.maxSize: NULL [13:14:16.294] - attr(*, "where")=List of 11 [13:14:16.294] ..$ ...future.FUN : [13:14:16.294] ..$ x_FUN : [13:14:16.294] ..$ times : [13:14:16.294] ..$ stopf : [13:14:16.294] ..$ stop_if_not : [13:14:16.294] ..$ dim : [13:14:16.294] ..$ valid_types : [13:14:16.294] ..$ future.call.arguments : [13:14:16.294] ..$ ...future.elements_ii : [13:14:16.294] ..$ ...future.seeds_ii : [13:14:16.294] ..$ ...future.globals.maxSize: [13:14:16.294] - attr(*, "resolved")= logi FALSE [13:14:16.294] - attr(*, "total_size")= num 141240 [13:14:16.294] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:14:16.294] - attr(*, "already-done")= logi TRUE [13:14:16.306] - copied '...future.FUN' to environment [13:14:16.306] - copied 'x_FUN' to environment [13:14:16.306] - copied 'times' to environment [13:14:16.307] - copied 'stopf' to environment [13:14:16.307] - copied 'stop_if_not' to environment [13:14:16.307] - copied 'dim' to environment [13:14:16.307] - copied 'valid_types' to environment [13:14:16.307] - copied 'future.call.arguments' to environment [13:14:16.307] - copied '...future.elements_ii' to environment [13:14:16.308] - copied '...future.seeds_ii' to environment [13:14:16.308] - copied '...future.globals.maxSize' to environment [13:14:16.308] assign_globals() ... done [13:14:16.309] plan(): Setting new future strategy stack: [13:14:16.309] List of future strategies: [13:14:16.309] 1. sequential: [13:14:16.309] - args: function (..., envir = parent.frame(), workers = "") [13:14:16.309] - tweaked: FALSE [13:14:16.309] - call: NULL [13:14:16.309] plan(): nbrOfWorkers() = 1 [13:14:16.311] plan(): Setting new future strategy stack: [13:14:16.311] List of future strategies: [13:14:16.311] 1. sequential: [13:14:16.311] - args: function (..., envir = parent.frame(), workers = "") [13:14:16.311] - tweaked: FALSE [13:14:16.311] - call: plan(strategy) [13:14:16.311] plan(): nbrOfWorkers() = 1 [13:14:16.312] SequentialFuture started (and completed) [13:14:16.312] - Launch lazy future ... done [13:14:16.312] run() for 'SequentialFuture' ... done [13:14:16.312] Created future: [13:14:16.312] SequentialFuture: [13:14:16.312] Label: 'future_vapply-1' [13:14:16.312] Expression: [13:14:16.312] { [13:14:16.312] do.call(function(...) { [13:14:16.312] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:16.312] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:16.312] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:16.312] on.exit(options(oopts), add = TRUE) [13:14:16.312] } [13:14:16.312] { [13:14:16.312] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:16.312] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:16.312] ...future.FUN(...future.X_jj, ...) [13:14:16.312] }) [13:14:16.312] } [13:14:16.312] }, args = future.call.arguments) [13:14:16.312] } [13:14:16.312] Lazy evaluation: FALSE [13:14:16.312] Asynchronous evaluation: FALSE [13:14:16.312] Local evaluation: TRUE [13:14:16.312] Environment: R_GlobalEnv [13:14:16.312] Capture standard output: TRUE [13:14:16.312] Capture condition classes: 'condition' (excluding 'nothing') [13:14:16.312] Globals: 11 objects totaling 138.46 KiB (function '...future.FUN' of 21.22 KiB, function 'x_FUN' of 45.86 KiB, integer 'times' of 56 bytes, function 'stopf' of 26.43 KiB, function 'stop_if_not' of 44.12 KiB, ...) [13:14:16.312] Packages: 2 packages ('stats', 'future.apply') [13:14:16.312] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:14:16.312] Resolved: TRUE [13:14:16.312] Value: 672 bytes of class 'list' [13:14:16.312] Early signaling: FALSE [13:14:16.312] Owner process: 1bb7d580-628d-c90d-e38a-66de485868c4 [13:14:16.312] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:14:16.314] Chunk #1 of 1 ... DONE [13:14:16.314] Launching 1 futures (chunks) ... DONE [13:14:16.314] Resolving 1 futures (chunks) ... [13:14:16.314] resolve() on list ... [13:14:16.315] recursive: 0 [13:14:16.315] length: 1 [13:14:16.315] [13:14:16.315] resolved() for 'SequentialFuture' ... [13:14:16.315] - state: 'finished' [13:14:16.315] - run: TRUE [13:14:16.316] - result: 'FutureResult' [13:14:16.316] resolved() for 'SequentialFuture' ... done [13:14:16.316] Future #1 [13:14:16.316] signalConditionsASAP(SequentialFuture, pos=1) ... [13:14:16.316] - nx: 1 [13:14:16.316] - relay: TRUE [13:14:16.317] - stdout: TRUE [13:14:16.317] - signal: TRUE [13:14:16.317] - resignal: FALSE [13:14:16.317] - force: TRUE [13:14:16.317] - relayed: [n=1] FALSE [13:14:16.317] - queued futures: [n=1] FALSE [13:14:16.318] - until=1 [13:14:16.318] - relaying element #1 [13:14:16.318] - relayed: [n=1] TRUE [13:14:16.318] - queued futures: [n=1] TRUE [13:14:16.318] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:14:16.318] length: 0 (resolved future 1) [13:14:16.319] Relaying remaining futures [13:14:16.319] signalConditionsASAP(NULL, pos=0) ... [13:14:16.319] - nx: 1 [13:14:16.320] - relay: TRUE [13:14:16.320] - stdout: TRUE [13:14:16.320] - signal: TRUE [13:14:16.320] - resignal: FALSE [13:14:16.320] - force: TRUE [13:14:16.321] - relayed: [n=1] TRUE [13:14:16.321] - queued futures: [n=1] TRUE - flush all [13:14:16.321] - relayed: [n=1] TRUE [13:14:16.321] - queued futures: [n=1] TRUE [13:14:16.321] signalConditionsASAP(NULL, pos=0) ... done [13:14:16.321] resolve() on list ... DONE [13:14:16.322] - Number of value chunks collected: 1 [13:14:16.322] Resolving 1 futures (chunks) ... DONE [13:14:16.322] Reducing values from 1 chunks ... [13:14:16.322] - Number of values collected after concatenation: 7 [13:14:16.322] - Number of values expected: 7 [13:14:16.322] Reducing values from 1 chunks ... DONE [13:14:16.323] future_lapply() ... DONE num [1:5, 1:7] 1 1.5 2 2.5 3 1 1.5 2.5 3.5 4 ... - attr(*, "dimnames")=List of 2 ..$ : chr [1:5] "Min." "1st Qu." "Median" "3rd Qu." ... ..$ : NULL [13:14:16.324] future_lapply() ... [13:14:16.325] Number of chunks: 1 [13:14:16.325] getGlobalsAndPackagesXApply() ... [13:14:16.326] - future.globals: TRUE [13:14:16.326] getGlobalsAndPackages() ... [13:14:16.326] Searching for globals... [13:14:16.327] - globals found: [3] 'FUN', 'outer', 'rep' [13:14:16.328] Searching for globals ... DONE [13:14:16.328] Resolving globals: FALSE [13:14:16.328] The total size of the 1 globals is 4.07 KiB (4168 bytes) [13:14:16.329] The total size of the 1 globals exported for future expression ('FUN(y = c(2, 4, 6, 8, 10))') is 4.07 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (4.07 KiB of class 'function') [13:14:16.329] - globals: [1] 'FUN' [13:14:16.329] [13:14:16.329] getGlobalsAndPackages() ... DONE [13:14:16.329] - globals found/used: [n=1] 'FUN' [13:14:16.329] - needed namespaces: [n=0] [13:14:16.330] Finding globals ... DONE [13:14:16.330] - use_args: TRUE [13:14:16.330] - Getting '...' globals ... [13:14:16.330] resolve() on list ... [13:14:16.331] recursive: 0 [13:14:16.331] length: 1 [13:14:16.331] elements: '...' [13:14:16.331] length: 0 (resolved future 1) [13:14:16.331] resolve() on list ... DONE [13:14:16.331] - '...' content: [n=1] 'y' [13:14:16.332] List of 1 [13:14:16.332] $ ...:List of 1 [13:14:16.332] ..$ y: num [1:5] 2 4 6 8 10 [13:14:16.332] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:14:16.332] - attr(*, "where")=List of 1 [13:14:16.332] ..$ ...: [13:14:16.332] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:14:16.332] - attr(*, "resolved")= logi TRUE [13:14:16.332] - attr(*, "total_size")= num NA [13:14:16.335] - Getting '...' globals ... DONE [13:14:16.335] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:14:16.335] List of 2 [13:14:16.335] $ ...future.FUN:function (x, y) [13:14:16.335] $ ... :List of 1 [13:14:16.335] ..$ y: num [1:5] 2 4 6 8 10 [13:14:16.335] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:14:16.335] - attr(*, "where")=List of 2 [13:14:16.335] ..$ ...future.FUN: [13:14:16.335] ..$ ... : [13:14:16.335] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:14:16.335] - attr(*, "resolved")= logi FALSE [13:14:16.335] - attr(*, "total_size")= num 4264 [13:14:16.339] Packages to be attached in all futures: [n=0] [13:14:16.339] getGlobalsAndPackagesXApply() ... DONE [13:14:16.340] Number of futures (= number of chunks): 1 [13:14:16.340] Launching 1 futures (chunks) ... [13:14:16.340] Chunk #1 of 1 ... [13:14:16.340] - Finding globals in 'X' for chunk #1 ... [13:14:16.340] getGlobalsAndPackages() ... [13:14:16.340] Searching for globals... [13:14:16.341] [13:14:16.341] Searching for globals ... DONE [13:14:16.341] - globals: [0] [13:14:16.341] getGlobalsAndPackages() ... DONE [13:14:16.341] + additional globals found: [n=0] [13:14:16.342] + additional namespaces needed: [n=0] [13:14:16.342] - Finding globals in 'X' for chunk #1 ... DONE [13:14:16.342] - seeds: [13:14:16.342] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:16.342] getGlobalsAndPackages() ... [13:14:16.343] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:16.343] Resolving globals: FALSE [13:14:16.343] Tweak future expression to call with '...' arguments ... [13:14:16.344] { [13:14:16.344] do.call(function(...) { [13:14:16.344] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:16.344] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:16.344] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:16.344] on.exit(options(oopts), add = TRUE) [13:14:16.344] } [13:14:16.344] { [13:14:16.344] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:16.344] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:16.344] ...future.FUN(...future.X_jj, ...) [13:14:16.344] }) [13:14:16.344] } [13:14:16.344] }, args = future.call.arguments) [13:14:16.344] } [13:14:16.344] Tweak future expression to call with '...' arguments ... DONE [13:14:16.345] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:16.345] [13:14:16.345] getGlobalsAndPackages() ... DONE [13:14:16.345] run() for 'Future' ... [13:14:16.345] - state: 'created' [13:14:16.346] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:14:16.346] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:14:16.346] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:14:16.346] - Field: 'label' [13:14:16.347] - Field: 'local' [13:14:16.347] - Field: 'owner' [13:14:16.347] - Field: 'envir' [13:14:16.347] - Field: 'packages' [13:14:16.347] - Field: 'gc' [13:14:16.348] - Field: 'conditions' [13:14:16.348] - Field: 'expr' [13:14:16.348] - Field: 'uuid' [13:14:16.348] - Field: 'seed' [13:14:16.348] - Field: 'version' [13:14:16.348] - Field: 'result' [13:14:16.349] - Field: 'asynchronous' [13:14:16.349] - Field: 'calls' [13:14:16.349] - Field: 'globals' [13:14:16.349] - Field: 'stdout' [13:14:16.349] - Field: 'earlySignal' [13:14:16.349] - Field: 'lazy' [13:14:16.350] - Field: 'state' [13:14:16.350] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:14:16.350] - Launch lazy future ... [13:14:16.350] Packages needed by the future expression (n = 0): [13:14:16.350] Packages needed by future strategies (n = 0): [13:14:16.351] { [13:14:16.351] { [13:14:16.351] { [13:14:16.351] ...future.startTime <- base::Sys.time() [13:14:16.351] { [13:14:16.351] { [13:14:16.351] { [13:14:16.351] base::local({ [13:14:16.351] has_future <- base::requireNamespace("future", [13:14:16.351] quietly = TRUE) [13:14:16.351] if (has_future) { [13:14:16.351] ns <- base::getNamespace("future") [13:14:16.351] version <- ns[[".package"]][["version"]] [13:14:16.351] if (is.null(version)) [13:14:16.351] version <- utils::packageVersion("future") [13:14:16.351] } [13:14:16.351] else { [13:14:16.351] version <- NULL [13:14:16.351] } [13:14:16.351] if (!has_future || version < "1.8.0") { [13:14:16.351] info <- base::c(r_version = base::gsub("R version ", [13:14:16.351] "", base::R.version$version.string), [13:14:16.351] platform = base::sprintf("%s (%s-bit)", [13:14:16.351] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:14:16.351] os = base::paste(base::Sys.info()[base::c("sysname", [13:14:16.351] "release", "version")], collapse = " "), [13:14:16.351] hostname = base::Sys.info()[["nodename"]]) [13:14:16.351] info <- base::sprintf("%s: %s", base::names(info), [13:14:16.351] info) [13:14:16.351] info <- base::paste(info, collapse = "; ") [13:14:16.351] if (!has_future) { [13:14:16.351] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:14:16.351] info) [13:14:16.351] } [13:14:16.351] else { [13:14:16.351] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:14:16.351] info, version) [13:14:16.351] } [13:14:16.351] base::stop(msg) [13:14:16.351] } [13:14:16.351] }) [13:14:16.351] } [13:14:16.351] options(future.plan = NULL) [13:14:16.351] Sys.unsetenv("R_FUTURE_PLAN") [13:14:16.351] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:14:16.351] } [13:14:16.351] ...future.workdir <- getwd() [13:14:16.351] } [13:14:16.351] ...future.oldOptions <- base::as.list(base::.Options) [13:14:16.351] ...future.oldEnvVars <- base::Sys.getenv() [13:14:16.351] } [13:14:16.351] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:14:16.351] future.globals.maxSize = NULL, future.globals.method = NULL, [13:14:16.351] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:14:16.351] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:14:16.351] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:14:16.351] future.stdout.windows.reencode = NULL, width = 80L) [13:14:16.351] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:14:16.351] base::names(...future.oldOptions)) [13:14:16.351] } [13:14:16.351] if (FALSE) { [13:14:16.351] } [13:14:16.351] else { [13:14:16.351] if (TRUE) { [13:14:16.351] ...future.stdout <- base::rawConnection(base::raw(0L), [13:14:16.351] open = "w") [13:14:16.351] } [13:14:16.351] else { [13:14:16.351] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:14:16.351] windows = "NUL", "/dev/null"), open = "w") [13:14:16.351] } [13:14:16.351] base::sink(...future.stdout, type = "output", split = FALSE) [13:14:16.351] base::on.exit(if (!base::is.null(...future.stdout)) { [13:14:16.351] base::sink(type = "output", split = FALSE) [13:14:16.351] base::close(...future.stdout) [13:14:16.351] }, add = TRUE) [13:14:16.351] } [13:14:16.351] ...future.frame <- base::sys.nframe() [13:14:16.351] ...future.conditions <- base::list() [13:14:16.351] ...future.rng <- base::globalenv()$.Random.seed [13:14:16.351] if (FALSE) { [13:14:16.351] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:14:16.351] "...future.value", "...future.globalenv.names", ".Random.seed") [13:14:16.351] } [13:14:16.351] ...future.result <- base::tryCatch({ [13:14:16.351] base::withCallingHandlers({ [13:14:16.351] ...future.value <- base::withVisible(base::local({ [13:14:16.351] do.call(function(...) { [13:14:16.351] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:16.351] if (!identical(...future.globals.maxSize.org, [13:14:16.351] ...future.globals.maxSize)) { [13:14:16.351] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:16.351] on.exit(options(oopts), add = TRUE) [13:14:16.351] } [13:14:16.351] { [13:14:16.351] lapply(seq_along(...future.elements_ii), [13:14:16.351] FUN = function(jj) { [13:14:16.351] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:16.351] ...future.FUN(...future.X_jj, ...) [13:14:16.351] }) [13:14:16.351] } [13:14:16.351] }, args = future.call.arguments) [13:14:16.351] })) [13:14:16.351] future::FutureResult(value = ...future.value$value, [13:14:16.351] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:14:16.351] ...future.rng), globalenv = if (FALSE) [13:14:16.351] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:14:16.351] ...future.globalenv.names)) [13:14:16.351] else NULL, started = ...future.startTime, version = "1.8") [13:14:16.351] }, condition = base::local({ [13:14:16.351] c <- base::c [13:14:16.351] inherits <- base::inherits [13:14:16.351] invokeRestart <- base::invokeRestart [13:14:16.351] length <- base::length [13:14:16.351] list <- base::list [13:14:16.351] seq.int <- base::seq.int [13:14:16.351] signalCondition <- base::signalCondition [13:14:16.351] sys.calls <- base::sys.calls [13:14:16.351] `[[` <- base::`[[` [13:14:16.351] `+` <- base::`+` [13:14:16.351] `<<-` <- base::`<<-` [13:14:16.351] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:14:16.351] calls[seq.int(from = from + 12L, to = length(calls) - [13:14:16.351] 3L)] [13:14:16.351] } [13:14:16.351] function(cond) { [13:14:16.351] is_error <- inherits(cond, "error") [13:14:16.351] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:14:16.351] NULL) [13:14:16.351] if (is_error) { [13:14:16.351] sessionInformation <- function() { [13:14:16.351] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:14:16.351] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:14:16.351] search = base::search(), system = base::Sys.info()) [13:14:16.351] } [13:14:16.351] ...future.conditions[[length(...future.conditions) + [13:14:16.351] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:14:16.351] cond$call), session = sessionInformation(), [13:14:16.351] timestamp = base::Sys.time(), signaled = 0L) [13:14:16.351] signalCondition(cond) [13:14:16.351] } [13:14:16.351] else if (!ignore && TRUE && inherits(cond, c("condition", [13:14:16.351] "immediateCondition"))) { [13:14:16.351] signal <- TRUE && inherits(cond, "immediateCondition") [13:14:16.351] ...future.conditions[[length(...future.conditions) + [13:14:16.351] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:14:16.351] if (TRUE && !signal) { [13:14:16.351] muffleCondition <- function (cond, pattern = "^muffle") [13:14:16.351] { [13:14:16.351] inherits <- base::inherits [13:14:16.351] invokeRestart <- base::invokeRestart [13:14:16.351] is.null <- base::is.null [13:14:16.351] muffled <- FALSE [13:14:16.351] if (inherits(cond, "message")) { [13:14:16.351] muffled <- grepl(pattern, "muffleMessage") [13:14:16.351] if (muffled) [13:14:16.351] invokeRestart("muffleMessage") [13:14:16.351] } [13:14:16.351] else if (inherits(cond, "warning")) { [13:14:16.351] muffled <- grepl(pattern, "muffleWarning") [13:14:16.351] if (muffled) [13:14:16.351] invokeRestart("muffleWarning") [13:14:16.351] } [13:14:16.351] else if (inherits(cond, "condition")) { [13:14:16.351] if (!is.null(pattern)) { [13:14:16.351] computeRestarts <- base::computeRestarts [13:14:16.351] grepl <- base::grepl [13:14:16.351] restarts <- computeRestarts(cond) [13:14:16.351] for (restart in restarts) { [13:14:16.351] name <- restart$name [13:14:16.351] if (is.null(name)) [13:14:16.351] next [13:14:16.351] if (!grepl(pattern, name)) [13:14:16.351] next [13:14:16.351] invokeRestart(restart) [13:14:16.351] muffled <- TRUE [13:14:16.351] break [13:14:16.351] } [13:14:16.351] } [13:14:16.351] } [13:14:16.351] invisible(muffled) [13:14:16.351] } [13:14:16.351] muffleCondition(cond, pattern = "^muffle") [13:14:16.351] } [13:14:16.351] } [13:14:16.351] else { [13:14:16.351] if (TRUE) { [13:14:16.351] muffleCondition <- function (cond, pattern = "^muffle") [13:14:16.351] { [13:14:16.351] inherits <- base::inherits [13:14:16.351] invokeRestart <- base::invokeRestart [13:14:16.351] is.null <- base::is.null [13:14:16.351] muffled <- FALSE [13:14:16.351] if (inherits(cond, "message")) { [13:14:16.351] muffled <- grepl(pattern, "muffleMessage") [13:14:16.351] if (muffled) [13:14:16.351] invokeRestart("muffleMessage") [13:14:16.351] } [13:14:16.351] else if (inherits(cond, "warning")) { [13:14:16.351] muffled <- grepl(pattern, "muffleWarning") [13:14:16.351] if (muffled) [13:14:16.351] invokeRestart("muffleWarning") [13:14:16.351] } [13:14:16.351] else if (inherits(cond, "condition")) { [13:14:16.351] if (!is.null(pattern)) { [13:14:16.351] computeRestarts <- base::computeRestarts [13:14:16.351] grepl <- base::grepl [13:14:16.351] restarts <- computeRestarts(cond) [13:14:16.351] for (restart in restarts) { [13:14:16.351] name <- restart$name [13:14:16.351] if (is.null(name)) [13:14:16.351] next [13:14:16.351] if (!grepl(pattern, name)) [13:14:16.351] next [13:14:16.351] invokeRestart(restart) [13:14:16.351] muffled <- TRUE [13:14:16.351] break [13:14:16.351] } [13:14:16.351] } [13:14:16.351] } [13:14:16.351] invisible(muffled) [13:14:16.351] } [13:14:16.351] muffleCondition(cond, pattern = "^muffle") [13:14:16.351] } [13:14:16.351] } [13:14:16.351] } [13:14:16.351] })) [13:14:16.351] }, error = function(ex) { [13:14:16.351] base::structure(base::list(value = NULL, visible = NULL, [13:14:16.351] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:14:16.351] ...future.rng), started = ...future.startTime, [13:14:16.351] finished = Sys.time(), session_uuid = NA_character_, [13:14:16.351] version = "1.8"), class = "FutureResult") [13:14:16.351] }, finally = { [13:14:16.351] if (!identical(...future.workdir, getwd())) [13:14:16.351] setwd(...future.workdir) [13:14:16.351] { [13:14:16.351] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:14:16.351] ...future.oldOptions$nwarnings <- NULL [13:14:16.351] } [13:14:16.351] base::options(...future.oldOptions) [13:14:16.351] if (.Platform$OS.type == "windows") { [13:14:16.351] old_names <- names(...future.oldEnvVars) [13:14:16.351] envs <- base::Sys.getenv() [13:14:16.351] names <- names(envs) [13:14:16.351] common <- intersect(names, old_names) [13:14:16.351] added <- setdiff(names, old_names) [13:14:16.351] removed <- setdiff(old_names, names) [13:14:16.351] changed <- common[...future.oldEnvVars[common] != [13:14:16.351] envs[common]] [13:14:16.351] NAMES <- toupper(changed) [13:14:16.351] args <- list() [13:14:16.351] for (kk in seq_along(NAMES)) { [13:14:16.351] name <- changed[[kk]] [13:14:16.351] NAME <- NAMES[[kk]] [13:14:16.351] if (name != NAME && is.element(NAME, old_names)) [13:14:16.351] next [13:14:16.351] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:16.351] } [13:14:16.351] NAMES <- toupper(added) [13:14:16.351] for (kk in seq_along(NAMES)) { [13:14:16.351] name <- added[[kk]] [13:14:16.351] NAME <- NAMES[[kk]] [13:14:16.351] if (name != NAME && is.element(NAME, old_names)) [13:14:16.351] next [13:14:16.351] args[[name]] <- "" [13:14:16.351] } [13:14:16.351] NAMES <- toupper(removed) [13:14:16.351] for (kk in seq_along(NAMES)) { [13:14:16.351] name <- removed[[kk]] [13:14:16.351] NAME <- NAMES[[kk]] [13:14:16.351] if (name != NAME && is.element(NAME, old_names)) [13:14:16.351] next [13:14:16.351] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:16.351] } [13:14:16.351] if (length(args) > 0) [13:14:16.351] base::do.call(base::Sys.setenv, args = args) [13:14:16.351] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:14:16.351] } [13:14:16.351] else { [13:14:16.351] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:14:16.351] } [13:14:16.351] { [13:14:16.351] if (base::length(...future.futureOptionsAdded) > [13:14:16.351] 0L) { [13:14:16.351] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:14:16.351] base::names(opts) <- ...future.futureOptionsAdded [13:14:16.351] base::options(opts) [13:14:16.351] } [13:14:16.351] { [13:14:16.351] { [13:14:16.351] NULL [13:14:16.351] RNGkind("Mersenne-Twister") [13:14:16.351] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:14:16.351] inherits = FALSE) [13:14:16.351] } [13:14:16.351] options(future.plan = NULL) [13:14:16.351] if (is.na(NA_character_)) [13:14:16.351] Sys.unsetenv("R_FUTURE_PLAN") [13:14:16.351] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:14:16.351] future::plan(list(function (..., envir = parent.frame()) [13:14:16.351] { [13:14:16.351] future <- SequentialFuture(..., envir = envir) [13:14:16.351] if (!future$lazy) [13:14:16.351] future <- run(future) [13:14:16.351] invisible(future) [13:14:16.351] }), .cleanup = FALSE, .init = FALSE) [13:14:16.351] } [13:14:16.351] } [13:14:16.351] } [13:14:16.351] }) [13:14:16.351] if (TRUE) { [13:14:16.351] base::sink(type = "output", split = FALSE) [13:14:16.351] if (TRUE) { [13:14:16.351] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:14:16.351] } [13:14:16.351] else { [13:14:16.351] ...future.result["stdout"] <- base::list(NULL) [13:14:16.351] } [13:14:16.351] base::close(...future.stdout) [13:14:16.351] ...future.stdout <- NULL [13:14:16.351] } [13:14:16.351] ...future.result$conditions <- ...future.conditions [13:14:16.351] ...future.result$finished <- base::Sys.time() [13:14:16.351] ...future.result [13:14:16.351] } [13:14:16.355] assign_globals() ... [13:14:16.355] List of 5 [13:14:16.355] $ ...future.FUN :function (x, y) [13:14:16.355] $ future.call.arguments :List of 1 [13:14:16.355] ..$ y: num [1:5] 2 4 6 8 10 [13:14:16.355] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:14:16.355] $ ...future.elements_ii :List of 4 [13:14:16.355] ..$ A: num 50 [13:14:16.355] ..$ B: num 60 [13:14:16.355] ..$ C: num 70 [13:14:16.355] ..$ D: num 80 [13:14:16.355] $ ...future.seeds_ii : NULL [13:14:16.355] $ ...future.globals.maxSize: NULL [13:14:16.355] - attr(*, "where")=List of 5 [13:14:16.355] ..$ ...future.FUN : [13:14:16.355] ..$ future.call.arguments : [13:14:16.355] ..$ ...future.elements_ii : [13:14:16.355] ..$ ...future.seeds_ii : [13:14:16.355] ..$ ...future.globals.maxSize: [13:14:16.355] - attr(*, "resolved")= logi FALSE [13:14:16.355] - attr(*, "total_size")= num 4264 [13:14:16.355] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:14:16.355] - attr(*, "already-done")= logi TRUE [13:14:16.362] - reassign environment for '...future.FUN' [13:14:16.362] - copied '...future.FUN' to environment [13:14:16.363] - copied 'future.call.arguments' to environment [13:14:16.363] - copied '...future.elements_ii' to environment [13:14:16.363] - copied '...future.seeds_ii' to environment [13:14:16.363] - copied '...future.globals.maxSize' to environment [13:14:16.363] assign_globals() ... done [13:14:16.364] plan(): Setting new future strategy stack: [13:14:16.364] List of future strategies: [13:14:16.364] 1. sequential: [13:14:16.364] - args: function (..., envir = parent.frame(), workers = "") [13:14:16.364] - tweaked: FALSE [13:14:16.364] - call: NULL [13:14:16.364] plan(): nbrOfWorkers() = 1 [13:14:16.365] plan(): Setting new future strategy stack: [13:14:16.366] List of future strategies: [13:14:16.366] 1. sequential: [13:14:16.366] - args: function (..., envir = parent.frame(), workers = "") [13:14:16.366] - tweaked: FALSE [13:14:16.366] - call: plan(strategy) [13:14:16.366] plan(): nbrOfWorkers() = 1 [13:14:16.367] SequentialFuture started (and completed) [13:14:16.367] - Launch lazy future ... done [13:14:16.367] run() for 'SequentialFuture' ... done [13:14:16.367] Created future: [13:14:16.367] SequentialFuture: [13:14:16.367] Label: 'future_sapply-1' [13:14:16.367] Expression: [13:14:16.367] { [13:14:16.367] do.call(function(...) { [13:14:16.367] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:16.367] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:16.367] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:16.367] on.exit(options(oopts), add = TRUE) [13:14:16.367] } [13:14:16.367] { [13:14:16.367] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:16.367] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:16.367] ...future.FUN(...future.X_jj, ...) [13:14:16.367] }) [13:14:16.367] } [13:14:16.367] }, args = future.call.arguments) [13:14:16.367] } [13:14:16.367] Lazy evaluation: FALSE [13:14:16.367] Asynchronous evaluation: FALSE [13:14:16.367] Local evaluation: TRUE [13:14:16.367] Environment: R_GlobalEnv [13:14:16.367] Capture standard output: TRUE [13:14:16.367] Capture condition classes: 'condition' (excluding 'nothing') [13:14:16.367] Globals: 5 objects totaling 4.38 KiB (function '...future.FUN' of 4.07 KiB, DotDotDotList 'future.call.arguments' of 96 bytes, list '...future.elements_ii' of 224 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:14:16.367] Packages: [13:14:16.367] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:14:16.367] Resolved: TRUE [13:14:16.367] Value: 1.34 KiB of class 'list' [13:14:16.367] Early signaling: FALSE [13:14:16.367] Owner process: 1bb7d580-628d-c90d-e38a-66de485868c4 [13:14:16.367] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:14:16.369] Chunk #1 of 1 ... DONE [13:14:16.369] Launching 1 futures (chunks) ... DONE [13:14:16.369] Resolving 1 futures (chunks) ... [13:14:16.369] resolve() on list ... [13:14:16.369] recursive: 0 [13:14:16.369] length: 1 [13:14:16.370] [13:14:16.370] resolved() for 'SequentialFuture' ... [13:14:16.370] - state: 'finished' [13:14:16.370] - run: TRUE [13:14:16.370] - result: 'FutureResult' [13:14:16.370] resolved() for 'SequentialFuture' ... done [13:14:16.371] Future #1 [13:14:16.372] signalConditionsASAP(SequentialFuture, pos=1) ... [13:14:16.372] - nx: 1 [13:14:16.372] - relay: TRUE [13:14:16.372] - stdout: TRUE [13:14:16.372] - signal: TRUE [13:14:16.372] - resignal: FALSE [13:14:16.373] - force: TRUE [13:14:16.373] - relayed: [n=1] FALSE [13:14:16.373] - queued futures: [n=1] FALSE [13:14:16.373] - until=1 [13:14:16.373] - relaying element #1 [13:14:16.373] - relayed: [n=1] TRUE [13:14:16.374] - queued futures: [n=1] TRUE [13:14:16.374] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:14:16.374] length: 0 (resolved future 1) [13:14:16.374] Relaying remaining futures [13:14:16.374] signalConditionsASAP(NULL, pos=0) ... [13:14:16.374] - nx: 1 [13:14:16.375] - relay: TRUE [13:14:16.375] - stdout: TRUE [13:14:16.375] - signal: TRUE [13:14:16.375] - resignal: FALSE [13:14:16.375] - force: TRUE [13:14:16.375] - relayed: [n=1] TRUE [13:14:16.375] - queued futures: [n=1] TRUE - flush all [13:14:16.376] - relayed: [n=1] TRUE [13:14:16.376] - queued futures: [n=1] TRUE [13:14:16.376] signalConditionsASAP(NULL, pos=0) ... done [13:14:16.376] resolve() on list ... DONE [13:14:16.376] - Number of value chunks collected: 1 [13:14:16.377] Resolving 1 futures (chunks) ... DONE [13:14:16.377] Reducing values from 1 chunks ... [13:14:16.377] - Number of values collected after concatenation: 4 [13:14:16.377] - Number of values expected: 4 [13:14:16.377] Reducing values from 1 chunks ... DONE [13:14:16.377] future_lapply() ... DONE [13:14:16.378] future_lapply() ... [13:14:16.380] Number of chunks: 1 [13:14:16.380] getGlobalsAndPackagesXApply() ... [13:14:16.381] - future.globals: TRUE [13:14:16.381] getGlobalsAndPackages() ... [13:14:16.381] Searching for globals... [13:14:16.385] - globals found: [18] 'FUN', '{', '<-', 'x_FUN', 'if', '!=', 'length', 'times', 'stopf', 'stop_if_not', 'all', '==', 'dim', '%in%', 'typeof', 'valid_types', 'outer', 'rep' [13:14:16.386] Searching for globals ... DONE [13:14:16.386] Resolving globals: FALSE [13:14:16.387] The total size of the 7 globals is 96.20 KiB (98504 bytes) [13:14:16.387] The total size of the 7 globals exported for future expression ('FUN(y = c(2, 4, 6, 8, 10))') is 96.20 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). The three largest globals are 'stop_if_not' (44.12 KiB of class 'function'), 'stopf' (26.43 KiB of class 'function') and 'FUN' (21.22 KiB of class 'function') [13:14:16.388] - globals: [7] 'FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types' [13:14:16.388] - packages: [1] 'future.apply' [13:14:16.388] getGlobalsAndPackages() ... DONE [13:14:16.388] - globals found/used: [n=7] 'FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types' [13:14:16.388] - needed namespaces: [n=1] 'future.apply' [13:14:16.388] Finding globals ... DONE [13:14:16.389] - use_args: TRUE [13:14:16.389] - Getting '...' globals ... [13:14:16.389] resolve() on list ... [13:14:16.389] recursive: 0 [13:14:16.389] length: 1 [13:14:16.390] elements: '...' [13:14:16.390] length: 0 (resolved future 1) [13:14:16.390] resolve() on list ... DONE [13:14:16.390] - '...' content: [n=1] 'y' [13:14:16.390] List of 1 [13:14:16.390] $ ...:List of 1 [13:14:16.390] ..$ y: num [1:5] 2 4 6 8 10 [13:14:16.390] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:14:16.390] - attr(*, "where")=List of 1 [13:14:16.390] ..$ ...: [13:14:16.390] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:14:16.390] - attr(*, "resolved")= logi TRUE [13:14:16.390] - attr(*, "total_size")= num NA [13:14:16.395] - Getting '...' globals ... DONE [13:14:16.395] Globals to be used in all futures (chunks): [n=8] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...' [13:14:16.395] List of 8 [13:14:16.395] $ ...future.FUN:function (x, ...) [13:14:16.395] $ x_FUN :function (x, y) [13:14:16.395] $ times : int 15 [13:14:16.395] $ stopf :function (fmt, ..., call. = TRUE, domain = NULL) [13:14:16.395] $ stop_if_not :function (...) [13:14:16.395] $ dim : int [1:2] 3 5 [13:14:16.395] $ valid_types : chr [1:3] "logical" "integer" "double" [13:14:16.395] $ ... :List of 1 [13:14:16.395] ..$ y: num [1:5] 2 4 6 8 10 [13:14:16.395] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:14:16.395] - attr(*, "where")=List of 8 [13:14:16.395] ..$ ...future.FUN: [13:14:16.395] ..$ x_FUN : [13:14:16.395] ..$ times : [13:14:16.395] ..$ stopf : [13:14:16.395] ..$ stop_if_not : [13:14:16.395] ..$ dim : [13:14:16.395] ..$ valid_types : [13:14:16.395] ..$ ... : [13:14:16.395] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:14:16.395] - attr(*, "resolved")= logi FALSE [13:14:16.395] - attr(*, "total_size")= num 98600 [13:14:16.402] Packages to be attached in all futures: [n=1] 'future.apply' [13:14:16.402] getGlobalsAndPackagesXApply() ... DONE [13:14:16.403] Number of futures (= number of chunks): 1 [13:14:16.403] Launching 1 futures (chunks) ... [13:14:16.403] Chunk #1 of 1 ... [13:14:16.403] - Finding globals in 'X' for chunk #1 ... [13:14:16.403] getGlobalsAndPackages() ... [13:14:16.404] Searching for globals... [13:14:16.404] [13:14:16.404] Searching for globals ... DONE [13:14:16.404] - globals: [0] [13:14:16.404] getGlobalsAndPackages() ... DONE [13:14:16.404] + additional globals found: [n=0] [13:14:16.405] + additional namespaces needed: [n=0] [13:14:16.405] - Finding globals in 'X' for chunk #1 ... DONE [13:14:16.405] - seeds: [13:14:16.405] - All globals exported: [n=11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:16.405] getGlobalsAndPackages() ... [13:14:16.405] - globals passed as-is: [11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:16.406] Resolving globals: FALSE [13:14:16.406] Tweak future expression to call with '...' arguments ... [13:14:16.406] { [13:14:16.406] do.call(function(...) { [13:14:16.406] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:16.406] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:16.406] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:16.406] on.exit(options(oopts), add = TRUE) [13:14:16.406] } [13:14:16.406] { [13:14:16.406] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:16.406] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:16.406] ...future.FUN(...future.X_jj, ...) [13:14:16.406] }) [13:14:16.406] } [13:14:16.406] }, args = future.call.arguments) [13:14:16.406] } [13:14:16.406] Tweak future expression to call with '...' arguments ... DONE [13:14:16.407] - globals: [11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:16.407] - packages: [1] 'future.apply' [13:14:16.407] getGlobalsAndPackages() ... DONE [13:14:16.408] run() for 'Future' ... [13:14:16.408] - state: 'created' [13:14:16.408] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:14:16.409] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:14:16.409] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:14:16.409] - Field: 'label' [13:14:16.409] - Field: 'local' [13:14:16.409] - Field: 'owner' [13:14:16.410] - Field: 'envir' [13:14:16.410] - Field: 'packages' [13:14:16.410] - Field: 'gc' [13:14:16.410] - Field: 'conditions' [13:14:16.410] - Field: 'expr' [13:14:16.410] - Field: 'uuid' [13:14:16.411] - Field: 'seed' [13:14:16.411] - Field: 'version' [13:14:16.411] - Field: 'result' [13:14:16.411] - Field: 'asynchronous' [13:14:16.411] - Field: 'calls' [13:14:16.411] - Field: 'globals' [13:14:16.412] - Field: 'stdout' [13:14:16.412] - Field: 'earlySignal' [13:14:16.412] - Field: 'lazy' [13:14:16.412] - Field: 'state' [13:14:16.412] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:14:16.412] - Launch lazy future ... [13:14:16.413] Packages needed by the future expression (n = 1): 'future.apply' [13:14:16.413] Packages needed by future strategies (n = 0): [13:14:16.413] { [13:14:16.413] { [13:14:16.413] { [13:14:16.413] ...future.startTime <- base::Sys.time() [13:14:16.413] { [13:14:16.413] { [13:14:16.413] { [13:14:16.413] { [13:14:16.413] base::local({ [13:14:16.413] has_future <- base::requireNamespace("future", [13:14:16.413] quietly = TRUE) [13:14:16.413] if (has_future) { [13:14:16.413] ns <- base::getNamespace("future") [13:14:16.413] version <- ns[[".package"]][["version"]] [13:14:16.413] if (is.null(version)) [13:14:16.413] version <- utils::packageVersion("future") [13:14:16.413] } [13:14:16.413] else { [13:14:16.413] version <- NULL [13:14:16.413] } [13:14:16.413] if (!has_future || version < "1.8.0") { [13:14:16.413] info <- base::c(r_version = base::gsub("R version ", [13:14:16.413] "", base::R.version$version.string), [13:14:16.413] platform = base::sprintf("%s (%s-bit)", [13:14:16.413] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:14:16.413] os = base::paste(base::Sys.info()[base::c("sysname", [13:14:16.413] "release", "version")], collapse = " "), [13:14:16.413] hostname = base::Sys.info()[["nodename"]]) [13:14:16.413] info <- base::sprintf("%s: %s", base::names(info), [13:14:16.413] info) [13:14:16.413] info <- base::paste(info, collapse = "; ") [13:14:16.413] if (!has_future) { [13:14:16.413] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:14:16.413] info) [13:14:16.413] } [13:14:16.413] else { [13:14:16.413] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:14:16.413] info, version) [13:14:16.413] } [13:14:16.413] base::stop(msg) [13:14:16.413] } [13:14:16.413] }) [13:14:16.413] } [13:14:16.413] base::local({ [13:14:16.413] for (pkg in "future.apply") { [13:14:16.413] base::loadNamespace(pkg) [13:14:16.413] base::library(pkg, character.only = TRUE) [13:14:16.413] } [13:14:16.413] }) [13:14:16.413] } [13:14:16.413] options(future.plan = NULL) [13:14:16.413] Sys.unsetenv("R_FUTURE_PLAN") [13:14:16.413] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:14:16.413] } [13:14:16.413] ...future.workdir <- getwd() [13:14:16.413] } [13:14:16.413] ...future.oldOptions <- base::as.list(base::.Options) [13:14:16.413] ...future.oldEnvVars <- base::Sys.getenv() [13:14:16.413] } [13:14:16.413] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:14:16.413] future.globals.maxSize = NULL, future.globals.method = NULL, [13:14:16.413] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:14:16.413] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:14:16.413] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:14:16.413] future.stdout.windows.reencode = NULL, width = 80L) [13:14:16.413] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:14:16.413] base::names(...future.oldOptions)) [13:14:16.413] } [13:14:16.413] if (FALSE) { [13:14:16.413] } [13:14:16.413] else { [13:14:16.413] if (TRUE) { [13:14:16.413] ...future.stdout <- base::rawConnection(base::raw(0L), [13:14:16.413] open = "w") [13:14:16.413] } [13:14:16.413] else { [13:14:16.413] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:14:16.413] windows = "NUL", "/dev/null"), open = "w") [13:14:16.413] } [13:14:16.413] base::sink(...future.stdout, type = "output", split = FALSE) [13:14:16.413] base::on.exit(if (!base::is.null(...future.stdout)) { [13:14:16.413] base::sink(type = "output", split = FALSE) [13:14:16.413] base::close(...future.stdout) [13:14:16.413] }, add = TRUE) [13:14:16.413] } [13:14:16.413] ...future.frame <- base::sys.nframe() [13:14:16.413] ...future.conditions <- base::list() [13:14:16.413] ...future.rng <- base::globalenv()$.Random.seed [13:14:16.413] if (FALSE) { [13:14:16.413] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:14:16.413] "...future.value", "...future.globalenv.names", ".Random.seed") [13:14:16.413] } [13:14:16.413] ...future.result <- base::tryCatch({ [13:14:16.413] base::withCallingHandlers({ [13:14:16.413] ...future.value <- base::withVisible(base::local({ [13:14:16.413] do.call(function(...) { [13:14:16.413] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:16.413] if (!identical(...future.globals.maxSize.org, [13:14:16.413] ...future.globals.maxSize)) { [13:14:16.413] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:16.413] on.exit(options(oopts), add = TRUE) [13:14:16.413] } [13:14:16.413] { [13:14:16.413] lapply(seq_along(...future.elements_ii), [13:14:16.413] FUN = function(jj) { [13:14:16.413] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:16.413] ...future.FUN(...future.X_jj, ...) [13:14:16.413] }) [13:14:16.413] } [13:14:16.413] }, args = future.call.arguments) [13:14:16.413] })) [13:14:16.413] future::FutureResult(value = ...future.value$value, [13:14:16.413] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:14:16.413] ...future.rng), globalenv = if (FALSE) [13:14:16.413] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:14:16.413] ...future.globalenv.names)) [13:14:16.413] else NULL, started = ...future.startTime, version = "1.8") [13:14:16.413] }, condition = base::local({ [13:14:16.413] c <- base::c [13:14:16.413] inherits <- base::inherits [13:14:16.413] invokeRestart <- base::invokeRestart [13:14:16.413] length <- base::length [13:14:16.413] list <- base::list [13:14:16.413] seq.int <- base::seq.int [13:14:16.413] signalCondition <- base::signalCondition [13:14:16.413] sys.calls <- base::sys.calls [13:14:16.413] `[[` <- base::`[[` [13:14:16.413] `+` <- base::`+` [13:14:16.413] `<<-` <- base::`<<-` [13:14:16.413] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:14:16.413] calls[seq.int(from = from + 12L, to = length(calls) - [13:14:16.413] 3L)] [13:14:16.413] } [13:14:16.413] function(cond) { [13:14:16.413] is_error <- inherits(cond, "error") [13:14:16.413] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:14:16.413] NULL) [13:14:16.413] if (is_error) { [13:14:16.413] sessionInformation <- function() { [13:14:16.413] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:14:16.413] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:14:16.413] search = base::search(), system = base::Sys.info()) [13:14:16.413] } [13:14:16.413] ...future.conditions[[length(...future.conditions) + [13:14:16.413] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:14:16.413] cond$call), session = sessionInformation(), [13:14:16.413] timestamp = base::Sys.time(), signaled = 0L) [13:14:16.413] signalCondition(cond) [13:14:16.413] } [13:14:16.413] else if (!ignore && TRUE && inherits(cond, c("condition", [13:14:16.413] "immediateCondition"))) { [13:14:16.413] signal <- TRUE && inherits(cond, "immediateCondition") [13:14:16.413] ...future.conditions[[length(...future.conditions) + [13:14:16.413] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:14:16.413] if (TRUE && !signal) { [13:14:16.413] muffleCondition <- function (cond, pattern = "^muffle") [13:14:16.413] { [13:14:16.413] inherits <- base::inherits [13:14:16.413] invokeRestart <- base::invokeRestart [13:14:16.413] is.null <- base::is.null [13:14:16.413] muffled <- FALSE [13:14:16.413] if (inherits(cond, "message")) { [13:14:16.413] muffled <- grepl(pattern, "muffleMessage") [13:14:16.413] if (muffled) [13:14:16.413] invokeRestart("muffleMessage") [13:14:16.413] } [13:14:16.413] else if (inherits(cond, "warning")) { [13:14:16.413] muffled <- grepl(pattern, "muffleWarning") [13:14:16.413] if (muffled) [13:14:16.413] invokeRestart("muffleWarning") [13:14:16.413] } [13:14:16.413] else if (inherits(cond, "condition")) { [13:14:16.413] if (!is.null(pattern)) { [13:14:16.413] computeRestarts <- base::computeRestarts [13:14:16.413] grepl <- base::grepl [13:14:16.413] restarts <- computeRestarts(cond) [13:14:16.413] for (restart in restarts) { [13:14:16.413] name <- restart$name [13:14:16.413] if (is.null(name)) [13:14:16.413] next [13:14:16.413] if (!grepl(pattern, name)) [13:14:16.413] next [13:14:16.413] invokeRestart(restart) [13:14:16.413] muffled <- TRUE [13:14:16.413] break [13:14:16.413] } [13:14:16.413] } [13:14:16.413] } [13:14:16.413] invisible(muffled) [13:14:16.413] } [13:14:16.413] muffleCondition(cond, pattern = "^muffle") [13:14:16.413] } [13:14:16.413] } [13:14:16.413] else { [13:14:16.413] if (TRUE) { [13:14:16.413] muffleCondition <- function (cond, pattern = "^muffle") [13:14:16.413] { [13:14:16.413] inherits <- base::inherits [13:14:16.413] invokeRestart <- base::invokeRestart [13:14:16.413] is.null <- base::is.null [13:14:16.413] muffled <- FALSE [13:14:16.413] if (inherits(cond, "message")) { [13:14:16.413] muffled <- grepl(pattern, "muffleMessage") [13:14:16.413] if (muffled) [13:14:16.413] invokeRestart("muffleMessage") [13:14:16.413] } [13:14:16.413] else if (inherits(cond, "warning")) { [13:14:16.413] muffled <- grepl(pattern, "muffleWarning") [13:14:16.413] if (muffled) [13:14:16.413] invokeRestart("muffleWarning") [13:14:16.413] } [13:14:16.413] else if (inherits(cond, "condition")) { [13:14:16.413] if (!is.null(pattern)) { [13:14:16.413] computeRestarts <- base::computeRestarts [13:14:16.413] grepl <- base::grepl [13:14:16.413] restarts <- computeRestarts(cond) [13:14:16.413] for (restart in restarts) { [13:14:16.413] name <- restart$name [13:14:16.413] if (is.null(name)) [13:14:16.413] next [13:14:16.413] if (!grepl(pattern, name)) [13:14:16.413] next [13:14:16.413] invokeRestart(restart) [13:14:16.413] muffled <- TRUE [13:14:16.413] break [13:14:16.413] } [13:14:16.413] } [13:14:16.413] } [13:14:16.413] invisible(muffled) [13:14:16.413] } [13:14:16.413] muffleCondition(cond, pattern = "^muffle") [13:14:16.413] } [13:14:16.413] } [13:14:16.413] } [13:14:16.413] })) [13:14:16.413] }, error = function(ex) { [13:14:16.413] base::structure(base::list(value = NULL, visible = NULL, [13:14:16.413] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:14:16.413] ...future.rng), started = ...future.startTime, [13:14:16.413] finished = Sys.time(), session_uuid = NA_character_, [13:14:16.413] version = "1.8"), class = "FutureResult") [13:14:16.413] }, finally = { [13:14:16.413] if (!identical(...future.workdir, getwd())) [13:14:16.413] setwd(...future.workdir) [13:14:16.413] { [13:14:16.413] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:14:16.413] ...future.oldOptions$nwarnings <- NULL [13:14:16.413] } [13:14:16.413] base::options(...future.oldOptions) [13:14:16.413] if (.Platform$OS.type == "windows") { [13:14:16.413] old_names <- names(...future.oldEnvVars) [13:14:16.413] envs <- base::Sys.getenv() [13:14:16.413] names <- names(envs) [13:14:16.413] common <- intersect(names, old_names) [13:14:16.413] added <- setdiff(names, old_names) [13:14:16.413] removed <- setdiff(old_names, names) [13:14:16.413] changed <- common[...future.oldEnvVars[common] != [13:14:16.413] envs[common]] [13:14:16.413] NAMES <- toupper(changed) [13:14:16.413] args <- list() [13:14:16.413] for (kk in seq_along(NAMES)) { [13:14:16.413] name <- changed[[kk]] [13:14:16.413] NAME <- NAMES[[kk]] [13:14:16.413] if (name != NAME && is.element(NAME, old_names)) [13:14:16.413] next [13:14:16.413] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:16.413] } [13:14:16.413] NAMES <- toupper(added) [13:14:16.413] for (kk in seq_along(NAMES)) { [13:14:16.413] name <- added[[kk]] [13:14:16.413] NAME <- NAMES[[kk]] [13:14:16.413] if (name != NAME && is.element(NAME, old_names)) [13:14:16.413] next [13:14:16.413] args[[name]] <- "" [13:14:16.413] } [13:14:16.413] NAMES <- toupper(removed) [13:14:16.413] for (kk in seq_along(NAMES)) { [13:14:16.413] name <- removed[[kk]] [13:14:16.413] NAME <- NAMES[[kk]] [13:14:16.413] if (name != NAME && is.element(NAME, old_names)) [13:14:16.413] next [13:14:16.413] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:16.413] } [13:14:16.413] if (length(args) > 0) [13:14:16.413] base::do.call(base::Sys.setenv, args = args) [13:14:16.413] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:14:16.413] } [13:14:16.413] else { [13:14:16.413] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:14:16.413] } [13:14:16.413] { [13:14:16.413] if (base::length(...future.futureOptionsAdded) > [13:14:16.413] 0L) { [13:14:16.413] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:14:16.413] base::names(opts) <- ...future.futureOptionsAdded [13:14:16.413] base::options(opts) [13:14:16.413] } [13:14:16.413] { [13:14:16.413] { [13:14:16.413] NULL [13:14:16.413] RNGkind("Mersenne-Twister") [13:14:16.413] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:14:16.413] inherits = FALSE) [13:14:16.413] } [13:14:16.413] options(future.plan = NULL) [13:14:16.413] if (is.na(NA_character_)) [13:14:16.413] Sys.unsetenv("R_FUTURE_PLAN") [13:14:16.413] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:14:16.413] future::plan(list(function (..., envir = parent.frame()) [13:14:16.413] { [13:14:16.413] future <- SequentialFuture(..., envir = envir) [13:14:16.413] if (!future$lazy) [13:14:16.413] future <- run(future) [13:14:16.413] invisible(future) [13:14:16.413] }), .cleanup = FALSE, .init = FALSE) [13:14:16.413] } [13:14:16.413] } [13:14:16.413] } [13:14:16.413] }) [13:14:16.413] if (TRUE) { [13:14:16.413] base::sink(type = "output", split = FALSE) [13:14:16.413] if (TRUE) { [13:14:16.413] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:14:16.413] } [13:14:16.413] else { [13:14:16.413] ...future.result["stdout"] <- base::list(NULL) [13:14:16.413] } [13:14:16.413] base::close(...future.stdout) [13:14:16.413] ...future.stdout <- NULL [13:14:16.413] } [13:14:16.413] ...future.result$conditions <- ...future.conditions [13:14:16.413] ...future.result$finished <- base::Sys.time() [13:14:16.413] ...future.result [13:14:16.413] } [13:14:16.417] assign_globals() ... [13:14:16.418] List of 11 [13:14:16.418] $ ...future.FUN :function (x, ...) [13:14:16.418] $ x_FUN :function (x, y) [13:14:16.418] $ times : int 15 [13:14:16.418] $ stopf :function (fmt, ..., call. = TRUE, domain = NULL) [13:14:16.418] $ stop_if_not :function (...) [13:14:16.418] $ dim : int [1:2] 3 5 [13:14:16.418] $ valid_types : chr [1:3] "logical" "integer" "double" [13:14:16.418] $ future.call.arguments :List of 1 [13:14:16.418] ..$ y: num [1:5] 2 4 6 8 10 [13:14:16.418] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:14:16.418] $ ...future.elements_ii :List of 4 [13:14:16.418] ..$ A: num 50 [13:14:16.418] ..$ B: num 60 [13:14:16.418] ..$ C: num 70 [13:14:16.418] ..$ D: num 80 [13:14:16.418] $ ...future.seeds_ii : NULL [13:14:16.418] $ ...future.globals.maxSize: NULL [13:14:16.418] - attr(*, "where")=List of 11 [13:14:16.418] ..$ ...future.FUN : [13:14:16.418] ..$ x_FUN : [13:14:16.418] ..$ times : [13:14:16.418] ..$ stopf : [13:14:16.418] ..$ stop_if_not : [13:14:16.418] ..$ dim : [13:14:16.418] ..$ valid_types : [13:14:16.418] ..$ future.call.arguments : [13:14:16.418] ..$ ...future.elements_ii : [13:14:16.418] ..$ ...future.seeds_ii : [13:14:16.418] ..$ ...future.globals.maxSize: [13:14:16.418] - attr(*, "resolved")= logi FALSE [13:14:16.418] - attr(*, "total_size")= num 98600 [13:14:16.418] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:14:16.418] - attr(*, "already-done")= logi TRUE [13:14:16.429] - copied '...future.FUN' to environment [13:14:16.429] - reassign environment for 'x_FUN' [13:14:16.429] - copied 'x_FUN' to environment [13:14:16.430] - copied 'times' to environment [13:14:16.430] - copied 'stopf' to environment [13:14:16.430] - copied 'stop_if_not' to environment [13:14:16.430] - copied 'dim' to environment [13:14:16.430] - copied 'valid_types' to environment [13:14:16.430] - copied 'future.call.arguments' to environment [13:14:16.431] - copied '...future.elements_ii' to environment [13:14:16.431] - copied '...future.seeds_ii' to environment [13:14:16.431] - copied '...future.globals.maxSize' to environment [13:14:16.431] assign_globals() ... done [13:14:16.432] plan(): Setting new future strategy stack: [13:14:16.432] List of future strategies: [13:14:16.432] 1. sequential: [13:14:16.432] - args: function (..., envir = parent.frame(), workers = "") [13:14:16.432] - tweaked: FALSE [13:14:16.432] - call: NULL [13:14:16.432] plan(): nbrOfWorkers() = 1 [13:14:16.434] plan(): Setting new future strategy stack: [13:14:16.434] List of future strategies: [13:14:16.434] 1. sequential: [13:14:16.434] - args: function (..., envir = parent.frame(), workers = "") [13:14:16.434] - tweaked: FALSE [13:14:16.434] - call: plan(strategy) [13:14:16.434] plan(): nbrOfWorkers() = 1 [13:14:16.435] SequentialFuture started (and completed) [13:14:16.435] - Launch lazy future ... done [13:14:16.435] run() for 'SequentialFuture' ... done [13:14:16.435] Created future: [13:14:16.435] SequentialFuture: [13:14:16.435] Label: 'future_vapply-1' [13:14:16.435] Expression: [13:14:16.435] { [13:14:16.435] do.call(function(...) { [13:14:16.435] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:16.435] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:16.435] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:16.435] on.exit(options(oopts), add = TRUE) [13:14:16.435] } [13:14:16.435] { [13:14:16.435] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:16.435] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:16.435] ...future.FUN(...future.X_jj, ...) [13:14:16.435] }) [13:14:16.435] } [13:14:16.435] }, args = future.call.arguments) [13:14:16.435] } [13:14:16.435] Lazy evaluation: FALSE [13:14:16.435] Asynchronous evaluation: FALSE [13:14:16.435] Local evaluation: TRUE [13:14:16.435] Environment: R_GlobalEnv [13:14:16.435] Capture standard output: TRUE [13:14:16.435] Capture condition classes: 'condition' (excluding 'nothing') [13:14:16.435] Globals: 11 objects totaling 96.51 KiB (function '...future.FUN' of 21.22 KiB, function 'x_FUN' of 4.07 KiB, integer 'times' of 56 bytes, function 'stopf' of 26.43 KiB, function 'stop_if_not' of 44.12 KiB, ...) [13:14:16.435] Packages: 1 packages ('future.apply') [13:14:16.435] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:14:16.435] Resolved: TRUE [13:14:16.435] Value: 1.34 KiB of class 'list' [13:14:16.435] Early signaling: FALSE [13:14:16.435] Owner process: 1bb7d580-628d-c90d-e38a-66de485868c4 [13:14:16.435] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:14:16.437] Chunk #1 of 1 ... DONE [13:14:16.437] Launching 1 futures (chunks) ... DONE [13:14:16.437] Resolving 1 futures (chunks) ... [13:14:16.437] resolve() on list ... [13:14:16.437] recursive: 0 [13:14:16.438] length: 1 [13:14:16.438] [13:14:16.438] resolved() for 'SequentialFuture' ... [13:14:16.438] - state: 'finished' [13:14:16.438] - run: TRUE [13:14:16.438] - result: 'FutureResult' [13:14:16.439] resolved() for 'SequentialFuture' ... done [13:14:16.439] Future #1 [13:14:16.439] signalConditionsASAP(SequentialFuture, pos=1) ... [13:14:16.439] - nx: 1 [13:14:16.439] - relay: TRUE [13:14:16.439] - stdout: TRUE [13:14:16.440] - signal: TRUE [13:14:16.440] - resignal: FALSE [13:14:16.440] - force: TRUE [13:14:16.440] - relayed: [n=1] FALSE [13:14:16.440] - queued futures: [n=1] FALSE [13:14:16.440] - until=1 [13:14:16.441] - relaying element #1 [13:14:16.441] - relayed: [n=1] TRUE [13:14:16.441] - queued futures: [n=1] TRUE [13:14:16.441] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:14:16.441] length: 0 (resolved future 1) [13:14:16.442] Relaying remaining futures [13:14:16.442] signalConditionsASAP(NULL, pos=0) ... [13:14:16.443] - nx: 1 [13:14:16.443] - relay: TRUE [13:14:16.443] - stdout: TRUE [13:14:16.443] - signal: TRUE [13:14:16.443] - resignal: FALSE [13:14:16.443] - force: TRUE [13:14:16.444] - relayed: [n=1] TRUE [13:14:16.444] - queued futures: [n=1] TRUE - flush all [13:14:16.444] - relayed: [n=1] TRUE [13:14:16.444] - queued futures: [n=1] TRUE [13:14:16.444] signalConditionsASAP(NULL, pos=0) ... done [13:14:16.445] resolve() on list ... DONE [13:14:16.445] - Number of value chunks collected: 1 [13:14:16.445] Resolving 1 futures (chunks) ... DONE [13:14:16.445] Reducing values from 1 chunks ... [13:14:16.445] - Number of values collected after concatenation: 4 [13:14:16.445] - Number of values expected: 4 [13:14:16.446] Reducing values from 1 chunks ... DONE [13:14:16.446] future_lapply() ... DONE num [1:3, 1:5, 1:4] 100 100 100 200 200 200 300 300 300 400 ... - attr(*, "dimnames")=List of 3 ..$ : NULL ..$ : NULL ..$ : chr [1:4] "A" "B" "C" "D" [13:14:16.448] future_lapply() ... [13:14:16.451] Number of chunks: 1 [13:14:16.451] getGlobalsAndPackagesXApply() ... [13:14:16.451] - future.globals: TRUE [13:14:16.451] getGlobalsAndPackages() ... [13:14:16.451] Searching for globals... [13:14:16.455] - globals found: [16] 'FUN', '{', '<-', 'x_FUN', 'if', '!=', 'length', 'times', 'stopf', 'stop_if_not', 'all', '==', 'dim', '%in%', 'typeof', 'valid_types' [13:14:16.455] Searching for globals ... DONE [13:14:16.455] Resolving globals: FALSE [13:14:16.456] The total size of the 7 globals is 91.99 KiB (94200 bytes) [13:14:16.457] The total size of the 7 globals exported for future expression ('FUN()') is 91.99 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). The three largest globals are 'stop_if_not' (44.12 KiB of class 'function'), 'stopf' (26.43 KiB of class 'function') and 'FUN' (21.22 KiB of class 'function') [13:14:16.457] - globals: [7] 'FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types' [13:14:16.457] - packages: [1] 'future.apply' [13:14:16.458] getGlobalsAndPackages() ... DONE [13:14:16.458] - globals found/used: [n=7] 'FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types' [13:14:16.458] - needed namespaces: [n=1] 'future.apply' [13:14:16.458] Finding globals ... DONE [13:14:16.458] - use_args: TRUE [13:14:16.458] - Getting '...' globals ... [13:14:16.459] resolve() on list ... [13:14:16.459] recursive: 0 [13:14:16.459] length: 1 [13:14:16.459] elements: '...' [13:14:16.459] length: 0 (resolved future 1) [13:14:16.460] resolve() on list ... DONE [13:14:16.460] - '...' content: [n=0] [13:14:16.460] List of 1 [13:14:16.460] $ ...: list() [13:14:16.460] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:14:16.460] - attr(*, "where")=List of 1 [13:14:16.460] ..$ ...: [13:14:16.460] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:14:16.460] - attr(*, "resolved")= logi TRUE [13:14:16.460] - attr(*, "total_size")= num NA [13:14:16.463] - Getting '...' globals ... DONE [13:14:16.463] Globals to be used in all futures (chunks): [n=8] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...' [13:14:16.463] List of 8 [13:14:16.463] $ ...future.FUN:function (x, ...) [13:14:16.463] $ x_FUN :function (x) [13:14:16.463] $ times : int 1 [13:14:16.463] $ stopf :function (fmt, ..., call. = TRUE, domain = NULL) [13:14:16.463] $ stop_if_not :function (...) [13:14:16.463] $ dim : NULL [13:14:16.463] $ valid_types : chr "logical" [13:14:16.463] $ ... : list() [13:14:16.463] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:14:16.463] - attr(*, "where")=List of 8 [13:14:16.463] ..$ ...future.FUN: [13:14:16.463] ..$ x_FUN : [13:14:16.463] ..$ times : [13:14:16.463] ..$ stopf : [13:14:16.463] ..$ stop_if_not : [13:14:16.463] ..$ dim : [13:14:16.463] ..$ valid_types : [13:14:16.463] ..$ ... : [13:14:16.463] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:14:16.463] - attr(*, "resolved")= logi FALSE [13:14:16.463] - attr(*, "total_size")= num 94200 [13:14:16.471] Packages to be attached in all futures: [n=1] 'future.apply' [13:14:16.471] getGlobalsAndPackagesXApply() ... DONE [13:14:16.471] Number of futures (= number of chunks): 1 [13:14:16.471] Launching 1 futures (chunks) ... [13:14:16.471] Chunk #1 of 1 ... [13:14:16.472] - Finding globals in 'X' for chunk #1 ... [13:14:16.472] getGlobalsAndPackages() ... [13:14:16.472] Searching for globals... [13:14:16.472] [13:14:16.472] Searching for globals ... DONE [13:14:16.473] - globals: [0] [13:14:16.473] getGlobalsAndPackages() ... DONE [13:14:16.473] + additional globals found: [n=0] [13:14:16.473] + additional namespaces needed: [n=0] [13:14:16.473] - Finding globals in 'X' for chunk #1 ... DONE [13:14:16.473] - seeds: [13:14:16.474] - All globals exported: [n=11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:16.474] getGlobalsAndPackages() ... [13:14:16.474] - globals passed as-is: [11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:16.474] Resolving globals: FALSE [13:14:16.474] Tweak future expression to call with '...' arguments ... [13:14:16.474] { [13:14:16.474] do.call(function(...) { [13:14:16.474] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:16.474] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:16.474] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:16.474] on.exit(options(oopts), add = TRUE) [13:14:16.474] } [13:14:16.474] { [13:14:16.474] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:16.474] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:16.474] ...future.FUN(...future.X_jj, ...) [13:14:16.474] }) [13:14:16.474] } [13:14:16.474] }, args = future.call.arguments) [13:14:16.474] } [13:14:16.475] Tweak future expression to call with '...' arguments ... DONE [13:14:16.475] - globals: [11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:16.476] - packages: [1] 'future.apply' [13:14:16.476] getGlobalsAndPackages() ... DONE [13:14:16.476] run() for 'Future' ... [13:14:16.476] - state: 'created' [13:14:16.477] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:14:16.477] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:14:16.477] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:14:16.477] - Field: 'label' [13:14:16.478] - Field: 'local' [13:14:16.478] - Field: 'owner' [13:14:16.478] - Field: 'envir' [13:14:16.478] - Field: 'packages' [13:14:16.478] - Field: 'gc' [13:14:16.478] - Field: 'conditions' [13:14:16.479] - Field: 'expr' [13:14:16.479] - Field: 'uuid' [13:14:16.479] - Field: 'seed' [13:14:16.479] - Field: 'version' [13:14:16.479] - Field: 'result' [13:14:16.479] - Field: 'asynchronous' [13:14:16.480] - Field: 'calls' [13:14:16.480] - Field: 'globals' [13:14:16.480] - Field: 'stdout' [13:14:16.480] - Field: 'earlySignal' [13:14:16.480] - Field: 'lazy' [13:14:16.480] - Field: 'state' [13:14:16.481] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:14:16.481] - Launch lazy future ... [13:14:16.481] Packages needed by the future expression (n = 1): 'future.apply' [13:14:16.481] Packages needed by future strategies (n = 0): [13:14:16.482] { [13:14:16.482] { [13:14:16.482] { [13:14:16.482] ...future.startTime <- base::Sys.time() [13:14:16.482] { [13:14:16.482] { [13:14:16.482] { [13:14:16.482] { [13:14:16.482] base::local({ [13:14:16.482] has_future <- base::requireNamespace("future", [13:14:16.482] quietly = TRUE) [13:14:16.482] if (has_future) { [13:14:16.482] ns <- base::getNamespace("future") [13:14:16.482] version <- ns[[".package"]][["version"]] [13:14:16.482] if (is.null(version)) [13:14:16.482] version <- utils::packageVersion("future") [13:14:16.482] } [13:14:16.482] else { [13:14:16.482] version <- NULL [13:14:16.482] } [13:14:16.482] if (!has_future || version < "1.8.0") { [13:14:16.482] info <- base::c(r_version = base::gsub("R version ", [13:14:16.482] "", base::R.version$version.string), [13:14:16.482] platform = base::sprintf("%s (%s-bit)", [13:14:16.482] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:14:16.482] os = base::paste(base::Sys.info()[base::c("sysname", [13:14:16.482] "release", "version")], collapse = " "), [13:14:16.482] hostname = base::Sys.info()[["nodename"]]) [13:14:16.482] info <- base::sprintf("%s: %s", base::names(info), [13:14:16.482] info) [13:14:16.482] info <- base::paste(info, collapse = "; ") [13:14:16.482] if (!has_future) { [13:14:16.482] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:14:16.482] info) [13:14:16.482] } [13:14:16.482] else { [13:14:16.482] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:14:16.482] info, version) [13:14:16.482] } [13:14:16.482] base::stop(msg) [13:14:16.482] } [13:14:16.482] }) [13:14:16.482] } [13:14:16.482] base::local({ [13:14:16.482] for (pkg in "future.apply") { [13:14:16.482] base::loadNamespace(pkg) [13:14:16.482] base::library(pkg, character.only = TRUE) [13:14:16.482] } [13:14:16.482] }) [13:14:16.482] } [13:14:16.482] options(future.plan = NULL) [13:14:16.482] Sys.unsetenv("R_FUTURE_PLAN") [13:14:16.482] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:14:16.482] } [13:14:16.482] ...future.workdir <- getwd() [13:14:16.482] } [13:14:16.482] ...future.oldOptions <- base::as.list(base::.Options) [13:14:16.482] ...future.oldEnvVars <- base::Sys.getenv() [13:14:16.482] } [13:14:16.482] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:14:16.482] future.globals.maxSize = NULL, future.globals.method = NULL, [13:14:16.482] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:14:16.482] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:14:16.482] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:14:16.482] future.stdout.windows.reencode = NULL, width = 80L) [13:14:16.482] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:14:16.482] base::names(...future.oldOptions)) [13:14:16.482] } [13:14:16.482] if (FALSE) { [13:14:16.482] } [13:14:16.482] else { [13:14:16.482] if (TRUE) { [13:14:16.482] ...future.stdout <- base::rawConnection(base::raw(0L), [13:14:16.482] open = "w") [13:14:16.482] } [13:14:16.482] else { [13:14:16.482] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:14:16.482] windows = "NUL", "/dev/null"), open = "w") [13:14:16.482] } [13:14:16.482] base::sink(...future.stdout, type = "output", split = FALSE) [13:14:16.482] base::on.exit(if (!base::is.null(...future.stdout)) { [13:14:16.482] base::sink(type = "output", split = FALSE) [13:14:16.482] base::close(...future.stdout) [13:14:16.482] }, add = TRUE) [13:14:16.482] } [13:14:16.482] ...future.frame <- base::sys.nframe() [13:14:16.482] ...future.conditions <- base::list() [13:14:16.482] ...future.rng <- base::globalenv()$.Random.seed [13:14:16.482] if (FALSE) { [13:14:16.482] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:14:16.482] "...future.value", "...future.globalenv.names", ".Random.seed") [13:14:16.482] } [13:14:16.482] ...future.result <- base::tryCatch({ [13:14:16.482] base::withCallingHandlers({ [13:14:16.482] ...future.value <- base::withVisible(base::local({ [13:14:16.482] do.call(function(...) { [13:14:16.482] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:16.482] if (!identical(...future.globals.maxSize.org, [13:14:16.482] ...future.globals.maxSize)) { [13:14:16.482] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:16.482] on.exit(options(oopts), add = TRUE) [13:14:16.482] } [13:14:16.482] { [13:14:16.482] lapply(seq_along(...future.elements_ii), [13:14:16.482] FUN = function(jj) { [13:14:16.482] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:16.482] ...future.FUN(...future.X_jj, ...) [13:14:16.482] }) [13:14:16.482] } [13:14:16.482] }, args = future.call.arguments) [13:14:16.482] })) [13:14:16.482] future::FutureResult(value = ...future.value$value, [13:14:16.482] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:14:16.482] ...future.rng), globalenv = if (FALSE) [13:14:16.482] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:14:16.482] ...future.globalenv.names)) [13:14:16.482] else NULL, started = ...future.startTime, version = "1.8") [13:14:16.482] }, condition = base::local({ [13:14:16.482] c <- base::c [13:14:16.482] inherits <- base::inherits [13:14:16.482] invokeRestart <- base::invokeRestart [13:14:16.482] length <- base::length [13:14:16.482] list <- base::list [13:14:16.482] seq.int <- base::seq.int [13:14:16.482] signalCondition <- base::signalCondition [13:14:16.482] sys.calls <- base::sys.calls [13:14:16.482] `[[` <- base::`[[` [13:14:16.482] `+` <- base::`+` [13:14:16.482] `<<-` <- base::`<<-` [13:14:16.482] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:14:16.482] calls[seq.int(from = from + 12L, to = length(calls) - [13:14:16.482] 3L)] [13:14:16.482] } [13:14:16.482] function(cond) { [13:14:16.482] is_error <- inherits(cond, "error") [13:14:16.482] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:14:16.482] NULL) [13:14:16.482] if (is_error) { [13:14:16.482] sessionInformation <- function() { [13:14:16.482] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:14:16.482] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:14:16.482] search = base::search(), system = base::Sys.info()) [13:14:16.482] } [13:14:16.482] ...future.conditions[[length(...future.conditions) + [13:14:16.482] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:14:16.482] cond$call), session = sessionInformation(), [13:14:16.482] timestamp = base::Sys.time(), signaled = 0L) [13:14:16.482] signalCondition(cond) [13:14:16.482] } [13:14:16.482] else if (!ignore && TRUE && inherits(cond, c("condition", [13:14:16.482] "immediateCondition"))) { [13:14:16.482] signal <- TRUE && inherits(cond, "immediateCondition") [13:14:16.482] ...future.conditions[[length(...future.conditions) + [13:14:16.482] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:14:16.482] if (TRUE && !signal) { [13:14:16.482] muffleCondition <- function (cond, pattern = "^muffle") [13:14:16.482] { [13:14:16.482] inherits <- base::inherits [13:14:16.482] invokeRestart <- base::invokeRestart [13:14:16.482] is.null <- base::is.null [13:14:16.482] muffled <- FALSE [13:14:16.482] if (inherits(cond, "message")) { [13:14:16.482] muffled <- grepl(pattern, "muffleMessage") [13:14:16.482] if (muffled) [13:14:16.482] invokeRestart("muffleMessage") [13:14:16.482] } [13:14:16.482] else if (inherits(cond, "warning")) { [13:14:16.482] muffled <- grepl(pattern, "muffleWarning") [13:14:16.482] if (muffled) [13:14:16.482] invokeRestart("muffleWarning") [13:14:16.482] } [13:14:16.482] else if (inherits(cond, "condition")) { [13:14:16.482] if (!is.null(pattern)) { [13:14:16.482] computeRestarts <- base::computeRestarts [13:14:16.482] grepl <- base::grepl [13:14:16.482] restarts <- computeRestarts(cond) [13:14:16.482] for (restart in restarts) { [13:14:16.482] name <- restart$name [13:14:16.482] if (is.null(name)) [13:14:16.482] next [13:14:16.482] if (!grepl(pattern, name)) [13:14:16.482] next [13:14:16.482] invokeRestart(restart) [13:14:16.482] muffled <- TRUE [13:14:16.482] break [13:14:16.482] } [13:14:16.482] } [13:14:16.482] } [13:14:16.482] invisible(muffled) [13:14:16.482] } [13:14:16.482] muffleCondition(cond, pattern = "^muffle") [13:14:16.482] } [13:14:16.482] } [13:14:16.482] else { [13:14:16.482] if (TRUE) { [13:14:16.482] muffleCondition <- function (cond, pattern = "^muffle") [13:14:16.482] { [13:14:16.482] inherits <- base::inherits [13:14:16.482] invokeRestart <- base::invokeRestart [13:14:16.482] is.null <- base::is.null [13:14:16.482] muffled <- FALSE [13:14:16.482] if (inherits(cond, "message")) { [13:14:16.482] muffled <- grepl(pattern, "muffleMessage") [13:14:16.482] if (muffled) [13:14:16.482] invokeRestart("muffleMessage") [13:14:16.482] } [13:14:16.482] else if (inherits(cond, "warning")) { [13:14:16.482] muffled <- grepl(pattern, "muffleWarning") [13:14:16.482] if (muffled) [13:14:16.482] invokeRestart("muffleWarning") [13:14:16.482] } [13:14:16.482] else if (inherits(cond, "condition")) { [13:14:16.482] if (!is.null(pattern)) { [13:14:16.482] computeRestarts <- base::computeRestarts [13:14:16.482] grepl <- base::grepl [13:14:16.482] restarts <- computeRestarts(cond) [13:14:16.482] for (restart in restarts) { [13:14:16.482] name <- restart$name [13:14:16.482] if (is.null(name)) [13:14:16.482] next [13:14:16.482] if (!grepl(pattern, name)) [13:14:16.482] next [13:14:16.482] invokeRestart(restart) [13:14:16.482] muffled <- TRUE [13:14:16.482] break [13:14:16.482] } [13:14:16.482] } [13:14:16.482] } [13:14:16.482] invisible(muffled) [13:14:16.482] } [13:14:16.482] muffleCondition(cond, pattern = "^muffle") [13:14:16.482] } [13:14:16.482] } [13:14:16.482] } [13:14:16.482] })) [13:14:16.482] }, error = function(ex) { [13:14:16.482] base::structure(base::list(value = NULL, visible = NULL, [13:14:16.482] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:14:16.482] ...future.rng), started = ...future.startTime, [13:14:16.482] finished = Sys.time(), session_uuid = NA_character_, [13:14:16.482] version = "1.8"), class = "FutureResult") [13:14:16.482] }, finally = { [13:14:16.482] if (!identical(...future.workdir, getwd())) [13:14:16.482] setwd(...future.workdir) [13:14:16.482] { [13:14:16.482] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:14:16.482] ...future.oldOptions$nwarnings <- NULL [13:14:16.482] } [13:14:16.482] base::options(...future.oldOptions) [13:14:16.482] if (.Platform$OS.type == "windows") { [13:14:16.482] old_names <- names(...future.oldEnvVars) [13:14:16.482] envs <- base::Sys.getenv() [13:14:16.482] names <- names(envs) [13:14:16.482] common <- intersect(names, old_names) [13:14:16.482] added <- setdiff(names, old_names) [13:14:16.482] removed <- setdiff(old_names, names) [13:14:16.482] changed <- common[...future.oldEnvVars[common] != [13:14:16.482] envs[common]] [13:14:16.482] NAMES <- toupper(changed) [13:14:16.482] args <- list() [13:14:16.482] for (kk in seq_along(NAMES)) { [13:14:16.482] name <- changed[[kk]] [13:14:16.482] NAME <- NAMES[[kk]] [13:14:16.482] if (name != NAME && is.element(NAME, old_names)) [13:14:16.482] next [13:14:16.482] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:16.482] } [13:14:16.482] NAMES <- toupper(added) [13:14:16.482] for (kk in seq_along(NAMES)) { [13:14:16.482] name <- added[[kk]] [13:14:16.482] NAME <- NAMES[[kk]] [13:14:16.482] if (name != NAME && is.element(NAME, old_names)) [13:14:16.482] next [13:14:16.482] args[[name]] <- "" [13:14:16.482] } [13:14:16.482] NAMES <- toupper(removed) [13:14:16.482] for (kk in seq_along(NAMES)) { [13:14:16.482] name <- removed[[kk]] [13:14:16.482] NAME <- NAMES[[kk]] [13:14:16.482] if (name != NAME && is.element(NAME, old_names)) [13:14:16.482] next [13:14:16.482] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:16.482] } [13:14:16.482] if (length(args) > 0) [13:14:16.482] base::do.call(base::Sys.setenv, args = args) [13:14:16.482] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:14:16.482] } [13:14:16.482] else { [13:14:16.482] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:14:16.482] } [13:14:16.482] { [13:14:16.482] if (base::length(...future.futureOptionsAdded) > [13:14:16.482] 0L) { [13:14:16.482] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:14:16.482] base::names(opts) <- ...future.futureOptionsAdded [13:14:16.482] base::options(opts) [13:14:16.482] } [13:14:16.482] { [13:14:16.482] { [13:14:16.482] NULL [13:14:16.482] RNGkind("Mersenne-Twister") [13:14:16.482] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:14:16.482] inherits = FALSE) [13:14:16.482] } [13:14:16.482] options(future.plan = NULL) [13:14:16.482] if (is.na(NA_character_)) [13:14:16.482] Sys.unsetenv("R_FUTURE_PLAN") [13:14:16.482] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:14:16.482] future::plan(list(function (..., envir = parent.frame()) [13:14:16.482] { [13:14:16.482] future <- SequentialFuture(..., envir = envir) [13:14:16.482] if (!future$lazy) [13:14:16.482] future <- run(future) [13:14:16.482] invisible(future) [13:14:16.482] }), .cleanup = FALSE, .init = FALSE) [13:14:16.482] } [13:14:16.482] } [13:14:16.482] } [13:14:16.482] }) [13:14:16.482] if (TRUE) { [13:14:16.482] base::sink(type = "output", split = FALSE) [13:14:16.482] if (TRUE) { [13:14:16.482] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:14:16.482] } [13:14:16.482] else { [13:14:16.482] ...future.result["stdout"] <- base::list(NULL) [13:14:16.482] } [13:14:16.482] base::close(...future.stdout) [13:14:16.482] ...future.stdout <- NULL [13:14:16.482] } [13:14:16.482] ...future.result$conditions <- ...future.conditions [13:14:16.482] ...future.result$finished <- base::Sys.time() [13:14:16.482] ...future.result [13:14:16.482] } [13:14:16.486] assign_globals() ... [13:14:16.486] List of 11 [13:14:16.486] $ ...future.FUN :function (x, ...) [13:14:16.486] $ x_FUN :function (x) [13:14:16.486] $ times : int 1 [13:14:16.486] $ stopf :function (fmt, ..., call. = TRUE, domain = NULL) [13:14:16.486] $ stop_if_not :function (...) [13:14:16.486] $ dim : NULL [13:14:16.486] $ valid_types : chr "logical" [13:14:16.486] $ future.call.arguments : list() [13:14:16.486] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:14:16.486] $ ...future.elements_ii :List of 11 [13:14:16.486] ..$ mpg : num [1:32] 21 21 22.8 21.4 18.7 18.1 14.3 24.4 22.8 19.2 ... [13:14:16.486] ..$ cyl : num [1:32] 6 6 4 6 8 6 8 4 4 6 ... [13:14:16.486] ..$ disp: num [1:32] 160 160 108 258 360 ... [13:14:16.486] ..$ hp : num [1:32] 110 110 93 110 175 105 245 62 95 123 ... [13:14:16.486] ..$ drat: num [1:32] 3.9 3.9 3.85 3.08 3.15 2.76 3.21 3.69 3.92 3.92 ... [13:14:16.486] ..$ wt : num [1:32] 2.62 2.88 2.32 3.21 3.44 ... [13:14:16.486] ..$ qsec: num [1:32] 16.5 17 18.6 19.4 17 ... [13:14:16.486] ..$ vs : num [1:32] 0 0 1 1 0 1 0 1 1 1 ... [13:14:16.486] ..$ am : num [1:32] 1 1 1 0 0 0 0 0 0 0 ... [13:14:16.486] ..$ gear: num [1:32] 4 4 4 3 3 3 3 4 4 4 ... [13:14:16.486] ..$ carb: num [1:32] 4 4 1 1 2 1 4 2 2 4 ... [13:14:16.486] $ ...future.seeds_ii : NULL [13:14:16.486] $ ...future.globals.maxSize: NULL [13:14:16.486] - attr(*, "where")=List of 11 [13:14:16.486] ..$ ...future.FUN : [13:14:16.486] ..$ x_FUN : [13:14:16.486] ..$ times : [13:14:16.486] ..$ stopf : [13:14:16.486] ..$ stop_if_not : [13:14:16.486] ..$ dim : [13:14:16.486] ..$ valid_types : [13:14:16.486] ..$ future.call.arguments : [13:14:16.486] ..$ ...future.elements_ii : [13:14:16.486] ..$ ...future.seeds_ii : [13:14:16.486] ..$ ...future.globals.maxSize: [13:14:16.486] - attr(*, "resolved")= logi FALSE [13:14:16.486] - attr(*, "total_size")= num 94200 [13:14:16.486] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:14:16.486] - attr(*, "already-done")= logi TRUE [13:14:16.500] - copied '...future.FUN' to environment [13:14:16.500] - copied 'x_FUN' to environment [13:14:16.500] - copied 'times' to environment [13:14:16.500] - copied 'stopf' to environment [13:14:16.500] - copied 'stop_if_not' to environment [13:14:16.501] - copied 'dim' to environment [13:14:16.501] - copied 'valid_types' to environment [13:14:16.501] - copied 'future.call.arguments' to environment [13:14:16.501] - copied '...future.elements_ii' to environment [13:14:16.501] - copied '...future.seeds_ii' to environment [13:14:16.501] - copied '...future.globals.maxSize' to environment [13:14:16.501] assign_globals() ... done [13:14:16.502] plan(): Setting new future strategy stack: [13:14:16.502] List of future strategies: [13:14:16.502] 1. sequential: [13:14:16.502] - args: function (..., envir = parent.frame(), workers = "") [13:14:16.502] - tweaked: FALSE [13:14:16.502] - call: NULL [13:14:16.503] plan(): nbrOfWorkers() = 1 [13:14:16.504] plan(): Setting new future strategy stack: [13:14:16.504] List of future strategies: [13:14:16.504] 1. sequential: [13:14:16.504] - args: function (..., envir = parent.frame(), workers = "") [13:14:16.504] - tweaked: FALSE [13:14:16.504] - call: plan(strategy) [13:14:16.505] plan(): nbrOfWorkers() = 1 [13:14:16.505] SequentialFuture started (and completed) [13:14:16.505] - Launch lazy future ... done [13:14:16.506] run() for 'SequentialFuture' ... done [13:14:16.506] Created future: [13:14:16.506] SequentialFuture: [13:14:16.506] Label: 'future_vapply-1' [13:14:16.506] Expression: [13:14:16.506] { [13:14:16.506] do.call(function(...) { [13:14:16.506] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:16.506] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:16.506] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:16.506] on.exit(options(oopts), add = TRUE) [13:14:16.506] } [13:14:16.506] { [13:14:16.506] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:16.506] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:16.506] ...future.FUN(...future.X_jj, ...) [13:14:16.506] }) [13:14:16.506] } [13:14:16.506] }, args = future.call.arguments) [13:14:16.506] } [13:14:16.506] Lazy evaluation: FALSE [13:14:16.506] Asynchronous evaluation: FALSE [13:14:16.506] Local evaluation: TRUE [13:14:16.506] Environment: R_GlobalEnv [13:14:16.506] Capture standard output: TRUE [13:14:16.506] Capture condition classes: 'condition' (excluding 'nothing') [13:14:16.506] Globals: 11 objects totaling 95.26 KiB (function '...future.FUN' of 21.22 KiB, function 'x_FUN' of 56 bytes, integer 'times' of 56 bytes, function 'stopf' of 26.43 KiB, function 'stop_if_not' of 44.12 KiB, ...) [13:14:16.506] Packages: 1 packages ('future.apply') [13:14:16.506] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:14:16.506] Resolved: TRUE [13:14:16.506] Value: 616 bytes of class 'list' [13:14:16.506] Early signaling: FALSE [13:14:16.506] Owner process: 1bb7d580-628d-c90d-e38a-66de485868c4 [13:14:16.506] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:14:16.507] Chunk #1 of 1 ... DONE [13:14:16.508] Launching 1 futures (chunks) ... DONE [13:14:16.508] Resolving 1 futures (chunks) ... [13:14:16.508] resolve() on list ... [13:14:16.508] recursive: 0 [13:14:16.508] length: 1 [13:14:16.508] [13:14:16.508] resolved() for 'SequentialFuture' ... [13:14:16.509] - state: 'finished' [13:14:16.509] - run: TRUE [13:14:16.509] - result: 'FutureResult' [13:14:16.509] resolved() for 'SequentialFuture' ... done [13:14:16.509] Future #1 [13:14:16.510] signalConditionsASAP(SequentialFuture, pos=1) ... [13:14:16.510] - nx: 1 [13:14:16.510] - relay: TRUE [13:14:16.510] - stdout: TRUE [13:14:16.510] - signal: TRUE [13:14:16.510] - resignal: FALSE [13:14:16.510] - force: TRUE [13:14:16.511] - relayed: [n=1] FALSE [13:14:16.511] - queued futures: [n=1] FALSE [13:14:16.511] - until=1 [13:14:16.511] - relaying element #1 [13:14:16.511] - relayed: [n=1] TRUE [13:14:16.512] - queued futures: [n=1] TRUE [13:14:16.512] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:14:16.512] length: 0 (resolved future 1) [13:14:16.512] Relaying remaining futures [13:14:16.512] signalConditionsASAP(NULL, pos=0) ... [13:14:16.512] - nx: 1 [13:14:16.513] - relay: TRUE [13:14:16.513] - stdout: TRUE [13:14:16.513] - signal: TRUE [13:14:16.513] - resignal: FALSE [13:14:16.513] - force: TRUE [13:14:16.513] - relayed: [n=1] TRUE [13:14:16.513] - queued futures: [n=1] TRUE - flush all [13:14:16.514] - relayed: [n=1] TRUE [13:14:16.514] - queued futures: [n=1] TRUE [13:14:16.514] signalConditionsASAP(NULL, pos=0) ... done [13:14:16.515] resolve() on list ... DONE [13:14:16.515] - Number of value chunks collected: 1 [13:14:16.515] Resolving 1 futures (chunks) ... DONE [13:14:16.515] Reducing values from 1 chunks ... [13:14:16.516] - Number of values collected after concatenation: 11 [13:14:16.516] - Number of values expected: 11 [13:14:16.516] Reducing values from 1 chunks ... DONE [13:14:16.516] future_lapply() ... DONE Named logi [1:11] TRUE TRUE TRUE TRUE TRUE TRUE ... - attr(*, "names")= chr [1:11] "mpg" "cyl" "disp" "hp" ... - future_vapply(x, ...) where length(x) != length(as.list(x)) ... [13:14:16.517] future_lapply() ... [13:14:16.520] Number of chunks: 1 [13:14:16.520] getGlobalsAndPackagesXApply() ... [13:14:16.520] - future.globals: TRUE [13:14:16.520] getGlobalsAndPackages() ... [13:14:16.520] Searching for globals... [13:14:16.524] - globals found: [16] 'FUN', '{', '<-', 'x_FUN', 'if', '!=', 'length', 'times', 'stopf', 'stop_if_not', 'all', '==', 'dim', '%in%', 'typeof', 'valid_types' [13:14:16.524] Searching for globals ... DONE [13:14:16.524] Resolving globals: FALSE [13:14:16.525] The total size of the 7 globals is 92.05 KiB (94264 bytes) [13:14:16.526] The total size of the 7 globals exported for future expression ('FUN()') is 92.05 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). The three largest globals are 'stop_if_not' (44.12 KiB of class 'function'), 'stopf' (26.43 KiB of class 'function') and 'FUN' (21.22 KiB of class 'function') [13:14:16.526] - globals: [7] 'FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types' [13:14:16.526] - packages: [1] 'future.apply' [13:14:16.526] getGlobalsAndPackages() ... DONE [13:14:16.527] - globals found/used: [n=7] 'FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types' [13:14:16.527] - needed namespaces: [n=1] 'future.apply' [13:14:16.527] Finding globals ... DONE [13:14:16.527] - use_args: TRUE [13:14:16.527] - Getting '...' globals ... [13:14:16.528] resolve() on list ... [13:14:16.528] recursive: 0 [13:14:16.528] length: 1 [13:14:16.528] elements: '...' [13:14:16.528] length: 0 (resolved future 1) [13:14:16.528] resolve() on list ... DONE [13:14:16.529] - '...' content: [n=0] [13:14:16.529] List of 1 [13:14:16.529] $ ...: list() [13:14:16.529] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:14:16.529] - attr(*, "where")=List of 1 [13:14:16.529] ..$ ...: [13:14:16.529] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:14:16.529] - attr(*, "resolved")= logi TRUE [13:14:16.529] - attr(*, "total_size")= num NA [13:14:16.532] - Getting '...' globals ... DONE [13:14:16.532] Globals to be used in all futures (chunks): [n=8] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...' [13:14:16.532] List of 8 [13:14:16.532] $ ...future.FUN:function (x, ...) [13:14:16.532] $ x_FUN :function (x) [13:14:16.532] $ times : int 1 [13:14:16.532] $ stopf :function (fmt, ..., call. = TRUE, domain = NULL) [13:14:16.532] $ stop_if_not :function (...) [13:14:16.532] $ dim : NULL [13:14:16.532] $ valid_types : chr [1:2] "logical" "integer" [13:14:16.532] $ ... : list() [13:14:16.532] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:14:16.532] - attr(*, "where")=List of 8 [13:14:16.532] ..$ ...future.FUN: [13:14:16.532] ..$ x_FUN : [13:14:16.532] ..$ times : [13:14:16.532] ..$ stopf : [13:14:16.532] ..$ stop_if_not : [13:14:16.532] ..$ dim : [13:14:16.532] ..$ valid_types : [13:14:16.532] ..$ ... : [13:14:16.532] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:14:16.532] - attr(*, "resolved")= logi FALSE [13:14:16.532] - attr(*, "total_size")= num 94264 [13:14:16.539] Packages to be attached in all futures: [n=1] 'future.apply' [13:14:16.540] getGlobalsAndPackagesXApply() ... DONE [13:14:16.540] Number of futures (= number of chunks): 1 [13:14:16.540] Launching 1 futures (chunks) ... [13:14:16.540] Chunk #1 of 1 ... [13:14:16.540] - Finding globals in 'X' for chunk #1 ... [13:14:16.541] getGlobalsAndPackages() ... [13:14:16.541] Searching for globals... [13:14:16.541] [13:14:16.541] Searching for globals ... DONE [13:14:16.541] - globals: [0] [13:14:16.542] getGlobalsAndPackages() ... DONE [13:14:16.542] + additional globals found: [n=0] [13:14:16.542] + additional namespaces needed: [n=0] [13:14:16.542] - Finding globals in 'X' for chunk #1 ... DONE [13:14:16.542] - seeds: [13:14:16.542] - All globals exported: [n=11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:16.542] getGlobalsAndPackages() ... [13:14:16.543] - globals passed as-is: [11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:16.543] Resolving globals: FALSE [13:14:16.543] Tweak future expression to call with '...' arguments ... [13:14:16.543] { [13:14:16.543] do.call(function(...) { [13:14:16.543] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:16.543] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:16.543] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:16.543] on.exit(options(oopts), add = TRUE) [13:14:16.543] } [13:14:16.543] { [13:14:16.543] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:16.543] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:16.543] ...future.FUN(...future.X_jj, ...) [13:14:16.543] }) [13:14:16.543] } [13:14:16.543] }, args = future.call.arguments) [13:14:16.543] } [13:14:16.544] Tweak future expression to call with '...' arguments ... DONE [13:14:16.544] - globals: [11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:16.544] - packages: [1] 'future.apply' [13:14:16.545] getGlobalsAndPackages() ... DONE [13:14:16.545] run() for 'Future' ... [13:14:16.545] - state: 'created' [13:14:16.545] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:14:16.546] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:14:16.546] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:14:16.546] - Field: 'label' [13:14:16.546] - Field: 'local' [13:14:16.547] - Field: 'owner' [13:14:16.547] - Field: 'envir' [13:14:16.547] - Field: 'packages' [13:14:16.547] - Field: 'gc' [13:14:16.547] - Field: 'conditions' [13:14:16.547] - Field: 'expr' [13:14:16.548] - Field: 'uuid' [13:14:16.548] - Field: 'seed' [13:14:16.548] - Field: 'version' [13:14:16.548] - Field: 'result' [13:14:16.548] - Field: 'asynchronous' [13:14:16.548] - Field: 'calls' [13:14:16.549] - Field: 'globals' [13:14:16.549] - Field: 'stdout' [13:14:16.549] - Field: 'earlySignal' [13:14:16.549] - Field: 'lazy' [13:14:16.549] - Field: 'state' [13:14:16.549] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:14:16.550] - Launch lazy future ... [13:14:16.550] Packages needed by the future expression (n = 1): 'future.apply' [13:14:16.550] Packages needed by future strategies (n = 0): [13:14:16.551] { [13:14:16.551] { [13:14:16.551] { [13:14:16.551] ...future.startTime <- base::Sys.time() [13:14:16.551] { [13:14:16.551] { [13:14:16.551] { [13:14:16.551] { [13:14:16.551] base::local({ [13:14:16.551] has_future <- base::requireNamespace("future", [13:14:16.551] quietly = TRUE) [13:14:16.551] if (has_future) { [13:14:16.551] ns <- base::getNamespace("future") [13:14:16.551] version <- ns[[".package"]][["version"]] [13:14:16.551] if (is.null(version)) [13:14:16.551] version <- utils::packageVersion("future") [13:14:16.551] } [13:14:16.551] else { [13:14:16.551] version <- NULL [13:14:16.551] } [13:14:16.551] if (!has_future || version < "1.8.0") { [13:14:16.551] info <- base::c(r_version = base::gsub("R version ", [13:14:16.551] "", base::R.version$version.string), [13:14:16.551] platform = base::sprintf("%s (%s-bit)", [13:14:16.551] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:14:16.551] os = base::paste(base::Sys.info()[base::c("sysname", [13:14:16.551] "release", "version")], collapse = " "), [13:14:16.551] hostname = base::Sys.info()[["nodename"]]) [13:14:16.551] info <- base::sprintf("%s: %s", base::names(info), [13:14:16.551] info) [13:14:16.551] info <- base::paste(info, collapse = "; ") [13:14:16.551] if (!has_future) { [13:14:16.551] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:14:16.551] info) [13:14:16.551] } [13:14:16.551] else { [13:14:16.551] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:14:16.551] info, version) [13:14:16.551] } [13:14:16.551] base::stop(msg) [13:14:16.551] } [13:14:16.551] }) [13:14:16.551] } [13:14:16.551] base::local({ [13:14:16.551] for (pkg in "future.apply") { [13:14:16.551] base::loadNamespace(pkg) [13:14:16.551] base::library(pkg, character.only = TRUE) [13:14:16.551] } [13:14:16.551] }) [13:14:16.551] } [13:14:16.551] options(future.plan = NULL) [13:14:16.551] Sys.unsetenv("R_FUTURE_PLAN") [13:14:16.551] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:14:16.551] } [13:14:16.551] ...future.workdir <- getwd() [13:14:16.551] } [13:14:16.551] ...future.oldOptions <- base::as.list(base::.Options) [13:14:16.551] ...future.oldEnvVars <- base::Sys.getenv() [13:14:16.551] } [13:14:16.551] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:14:16.551] future.globals.maxSize = NULL, future.globals.method = NULL, [13:14:16.551] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:14:16.551] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:14:16.551] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:14:16.551] future.stdout.windows.reencode = NULL, width = 80L) [13:14:16.551] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:14:16.551] base::names(...future.oldOptions)) [13:14:16.551] } [13:14:16.551] if (FALSE) { [13:14:16.551] } [13:14:16.551] else { [13:14:16.551] if (TRUE) { [13:14:16.551] ...future.stdout <- base::rawConnection(base::raw(0L), [13:14:16.551] open = "w") [13:14:16.551] } [13:14:16.551] else { [13:14:16.551] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:14:16.551] windows = "NUL", "/dev/null"), open = "w") [13:14:16.551] } [13:14:16.551] base::sink(...future.stdout, type = "output", split = FALSE) [13:14:16.551] base::on.exit(if (!base::is.null(...future.stdout)) { [13:14:16.551] base::sink(type = "output", split = FALSE) [13:14:16.551] base::close(...future.stdout) [13:14:16.551] }, add = TRUE) [13:14:16.551] } [13:14:16.551] ...future.frame <- base::sys.nframe() [13:14:16.551] ...future.conditions <- base::list() [13:14:16.551] ...future.rng <- base::globalenv()$.Random.seed [13:14:16.551] if (FALSE) { [13:14:16.551] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:14:16.551] "...future.value", "...future.globalenv.names", ".Random.seed") [13:14:16.551] } [13:14:16.551] ...future.result <- base::tryCatch({ [13:14:16.551] base::withCallingHandlers({ [13:14:16.551] ...future.value <- base::withVisible(base::local({ [13:14:16.551] do.call(function(...) { [13:14:16.551] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:16.551] if (!identical(...future.globals.maxSize.org, [13:14:16.551] ...future.globals.maxSize)) { [13:14:16.551] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:16.551] on.exit(options(oopts), add = TRUE) [13:14:16.551] } [13:14:16.551] { [13:14:16.551] lapply(seq_along(...future.elements_ii), [13:14:16.551] FUN = function(jj) { [13:14:16.551] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:16.551] ...future.FUN(...future.X_jj, ...) [13:14:16.551] }) [13:14:16.551] } [13:14:16.551] }, args = future.call.arguments) [13:14:16.551] })) [13:14:16.551] future::FutureResult(value = ...future.value$value, [13:14:16.551] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:14:16.551] ...future.rng), globalenv = if (FALSE) [13:14:16.551] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:14:16.551] ...future.globalenv.names)) [13:14:16.551] else NULL, started = ...future.startTime, version = "1.8") [13:14:16.551] }, condition = base::local({ [13:14:16.551] c <- base::c [13:14:16.551] inherits <- base::inherits [13:14:16.551] invokeRestart <- base::invokeRestart [13:14:16.551] length <- base::length [13:14:16.551] list <- base::list [13:14:16.551] seq.int <- base::seq.int [13:14:16.551] signalCondition <- base::signalCondition [13:14:16.551] sys.calls <- base::sys.calls [13:14:16.551] `[[` <- base::`[[` [13:14:16.551] `+` <- base::`+` [13:14:16.551] `<<-` <- base::`<<-` [13:14:16.551] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:14:16.551] calls[seq.int(from = from + 12L, to = length(calls) - [13:14:16.551] 3L)] [13:14:16.551] } [13:14:16.551] function(cond) { [13:14:16.551] is_error <- inherits(cond, "error") [13:14:16.551] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:14:16.551] NULL) [13:14:16.551] if (is_error) { [13:14:16.551] sessionInformation <- function() { [13:14:16.551] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:14:16.551] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:14:16.551] search = base::search(), system = base::Sys.info()) [13:14:16.551] } [13:14:16.551] ...future.conditions[[length(...future.conditions) + [13:14:16.551] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:14:16.551] cond$call), session = sessionInformation(), [13:14:16.551] timestamp = base::Sys.time(), signaled = 0L) [13:14:16.551] signalCondition(cond) [13:14:16.551] } [13:14:16.551] else if (!ignore && TRUE && inherits(cond, c("condition", [13:14:16.551] "immediateCondition"))) { [13:14:16.551] signal <- TRUE && inherits(cond, "immediateCondition") [13:14:16.551] ...future.conditions[[length(...future.conditions) + [13:14:16.551] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:14:16.551] if (TRUE && !signal) { [13:14:16.551] muffleCondition <- function (cond, pattern = "^muffle") [13:14:16.551] { [13:14:16.551] inherits <- base::inherits [13:14:16.551] invokeRestart <- base::invokeRestart [13:14:16.551] is.null <- base::is.null [13:14:16.551] muffled <- FALSE [13:14:16.551] if (inherits(cond, "message")) { [13:14:16.551] muffled <- grepl(pattern, "muffleMessage") [13:14:16.551] if (muffled) [13:14:16.551] invokeRestart("muffleMessage") [13:14:16.551] } [13:14:16.551] else if (inherits(cond, "warning")) { [13:14:16.551] muffled <- grepl(pattern, "muffleWarning") [13:14:16.551] if (muffled) [13:14:16.551] invokeRestart("muffleWarning") [13:14:16.551] } [13:14:16.551] else if (inherits(cond, "condition")) { [13:14:16.551] if (!is.null(pattern)) { [13:14:16.551] computeRestarts <- base::computeRestarts [13:14:16.551] grepl <- base::grepl [13:14:16.551] restarts <- computeRestarts(cond) [13:14:16.551] for (restart in restarts) { [13:14:16.551] name <- restart$name [13:14:16.551] if (is.null(name)) [13:14:16.551] next [13:14:16.551] if (!grepl(pattern, name)) [13:14:16.551] next [13:14:16.551] invokeRestart(restart) [13:14:16.551] muffled <- TRUE [13:14:16.551] break [13:14:16.551] } [13:14:16.551] } [13:14:16.551] } [13:14:16.551] invisible(muffled) [13:14:16.551] } [13:14:16.551] muffleCondition(cond, pattern = "^muffle") [13:14:16.551] } [13:14:16.551] } [13:14:16.551] else { [13:14:16.551] if (TRUE) { [13:14:16.551] muffleCondition <- function (cond, pattern = "^muffle") [13:14:16.551] { [13:14:16.551] inherits <- base::inherits [13:14:16.551] invokeRestart <- base::invokeRestart [13:14:16.551] is.null <- base::is.null [13:14:16.551] muffled <- FALSE [13:14:16.551] if (inherits(cond, "message")) { [13:14:16.551] muffled <- grepl(pattern, "muffleMessage") [13:14:16.551] if (muffled) [13:14:16.551] invokeRestart("muffleMessage") [13:14:16.551] } [13:14:16.551] else if (inherits(cond, "warning")) { [13:14:16.551] muffled <- grepl(pattern, "muffleWarning") [13:14:16.551] if (muffled) [13:14:16.551] invokeRestart("muffleWarning") [13:14:16.551] } [13:14:16.551] else if (inherits(cond, "condition")) { [13:14:16.551] if (!is.null(pattern)) { [13:14:16.551] computeRestarts <- base::computeRestarts [13:14:16.551] grepl <- base::grepl [13:14:16.551] restarts <- computeRestarts(cond) [13:14:16.551] for (restart in restarts) { [13:14:16.551] name <- restart$name [13:14:16.551] if (is.null(name)) [13:14:16.551] next [13:14:16.551] if (!grepl(pattern, name)) [13:14:16.551] next [13:14:16.551] invokeRestart(restart) [13:14:16.551] muffled <- TRUE [13:14:16.551] break [13:14:16.551] } [13:14:16.551] } [13:14:16.551] } [13:14:16.551] invisible(muffled) [13:14:16.551] } [13:14:16.551] muffleCondition(cond, pattern = "^muffle") [13:14:16.551] } [13:14:16.551] } [13:14:16.551] } [13:14:16.551] })) [13:14:16.551] }, error = function(ex) { [13:14:16.551] base::structure(base::list(value = NULL, visible = NULL, [13:14:16.551] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:14:16.551] ...future.rng), started = ...future.startTime, [13:14:16.551] finished = Sys.time(), session_uuid = NA_character_, [13:14:16.551] version = "1.8"), class = "FutureResult") [13:14:16.551] }, finally = { [13:14:16.551] if (!identical(...future.workdir, getwd())) [13:14:16.551] setwd(...future.workdir) [13:14:16.551] { [13:14:16.551] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:14:16.551] ...future.oldOptions$nwarnings <- NULL [13:14:16.551] } [13:14:16.551] base::options(...future.oldOptions) [13:14:16.551] if (.Platform$OS.type == "windows") { [13:14:16.551] old_names <- names(...future.oldEnvVars) [13:14:16.551] envs <- base::Sys.getenv() [13:14:16.551] names <- names(envs) [13:14:16.551] common <- intersect(names, old_names) [13:14:16.551] added <- setdiff(names, old_names) [13:14:16.551] removed <- setdiff(old_names, names) [13:14:16.551] changed <- common[...future.oldEnvVars[common] != [13:14:16.551] envs[common]] [13:14:16.551] NAMES <- toupper(changed) [13:14:16.551] args <- list() [13:14:16.551] for (kk in seq_along(NAMES)) { [13:14:16.551] name <- changed[[kk]] [13:14:16.551] NAME <- NAMES[[kk]] [13:14:16.551] if (name != NAME && is.element(NAME, old_names)) [13:14:16.551] next [13:14:16.551] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:16.551] } [13:14:16.551] NAMES <- toupper(added) [13:14:16.551] for (kk in seq_along(NAMES)) { [13:14:16.551] name <- added[[kk]] [13:14:16.551] NAME <- NAMES[[kk]] [13:14:16.551] if (name != NAME && is.element(NAME, old_names)) [13:14:16.551] next [13:14:16.551] args[[name]] <- "" [13:14:16.551] } [13:14:16.551] NAMES <- toupper(removed) [13:14:16.551] for (kk in seq_along(NAMES)) { [13:14:16.551] name <- removed[[kk]] [13:14:16.551] NAME <- NAMES[[kk]] [13:14:16.551] if (name != NAME && is.element(NAME, old_names)) [13:14:16.551] next [13:14:16.551] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:16.551] } [13:14:16.551] if (length(args) > 0) [13:14:16.551] base::do.call(base::Sys.setenv, args = args) [13:14:16.551] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:14:16.551] } [13:14:16.551] else { [13:14:16.551] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:14:16.551] } [13:14:16.551] { [13:14:16.551] if (base::length(...future.futureOptionsAdded) > [13:14:16.551] 0L) { [13:14:16.551] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:14:16.551] base::names(opts) <- ...future.futureOptionsAdded [13:14:16.551] base::options(opts) [13:14:16.551] } [13:14:16.551] { [13:14:16.551] { [13:14:16.551] NULL [13:14:16.551] RNGkind("Mersenne-Twister") [13:14:16.551] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:14:16.551] inherits = FALSE) [13:14:16.551] } [13:14:16.551] options(future.plan = NULL) [13:14:16.551] if (is.na(NA_character_)) [13:14:16.551] Sys.unsetenv("R_FUTURE_PLAN") [13:14:16.551] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:14:16.551] future::plan(list(function (..., envir = parent.frame()) [13:14:16.551] { [13:14:16.551] future <- SequentialFuture(..., envir = envir) [13:14:16.551] if (!future$lazy) [13:14:16.551] future <- run(future) [13:14:16.551] invisible(future) [13:14:16.551] }), .cleanup = FALSE, .init = FALSE) [13:14:16.551] } [13:14:16.551] } [13:14:16.551] } [13:14:16.551] }) [13:14:16.551] if (TRUE) { [13:14:16.551] base::sink(type = "output", split = FALSE) [13:14:16.551] if (TRUE) { [13:14:16.551] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:14:16.551] } [13:14:16.551] else { [13:14:16.551] ...future.result["stdout"] <- base::list(NULL) [13:14:16.551] } [13:14:16.551] base::close(...future.stdout) [13:14:16.551] ...future.stdout <- NULL [13:14:16.551] } [13:14:16.551] ...future.result$conditions <- ...future.conditions [13:14:16.551] ...future.result$finished <- base::Sys.time() [13:14:16.551] ...future.result [13:14:16.551] } [13:14:16.555] assign_globals() ... [13:14:16.555] List of 11 [13:14:16.555] $ ...future.FUN :function (x, ...) [13:14:16.555] $ x_FUN :function (x) [13:14:16.555] $ times : int 1 [13:14:16.555] $ stopf :function (fmt, ..., call. = TRUE, domain = NULL) [13:14:16.555] $ stop_if_not :function (...) [13:14:16.555] $ dim : NULL [13:14:16.555] $ valid_types : chr [1:2] "logical" "integer" [13:14:16.555] $ future.call.arguments : list() [13:14:16.555] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:14:16.555] $ ...future.elements_ii :List of 3 [13:14:16.555] ..$ a: num 1 [13:14:16.555] ..$ b: num 2 [13:14:16.555] ..$ c: num 3 [13:14:16.555] $ ...future.seeds_ii : NULL [13:14:16.555] $ ...future.globals.maxSize: NULL [13:14:16.555] - attr(*, "where")=List of 11 [13:14:16.555] ..$ ...future.FUN : [13:14:16.555] ..$ x_FUN : [13:14:16.555] ..$ times : [13:14:16.555] ..$ stopf : [13:14:16.555] ..$ stop_if_not : [13:14:16.555] ..$ dim : [13:14:16.555] ..$ valid_types : [13:14:16.555] ..$ future.call.arguments : [13:14:16.555] ..$ ...future.elements_ii : [13:14:16.555] ..$ ...future.seeds_ii : [13:14:16.555] ..$ ...future.globals.maxSize: [13:14:16.555] - attr(*, "resolved")= logi FALSE [13:14:16.555] - attr(*, "total_size")= num 94264 [13:14:16.555] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:14:16.555] - attr(*, "already-done")= logi TRUE [13:14:16.565] - copied '...future.FUN' to environment [13:14:16.565] - copied 'x_FUN' to environment [13:14:16.566] - copied 'times' to environment [13:14:16.566] - copied 'stopf' to environment [13:14:16.566] - copied 'stop_if_not' to environment [13:14:16.566] - copied 'dim' to environment [13:14:16.566] - copied 'valid_types' to environment [13:14:16.566] - copied 'future.call.arguments' to environment [13:14:16.567] - copied '...future.elements_ii' to environment [13:14:16.567] - copied '...future.seeds_ii' to environment [13:14:16.567] - copied '...future.globals.maxSize' to environment [13:14:16.567] assign_globals() ... done [13:14:16.568] plan(): Setting new future strategy stack: [13:14:16.568] List of future strategies: [13:14:16.568] 1. sequential: [13:14:16.568] - args: function (..., envir = parent.frame(), workers = "") [13:14:16.568] - tweaked: FALSE [13:14:16.568] - call: NULL [13:14:16.568] plan(): nbrOfWorkers() = 1 [13:14:16.570] plan(): Setting new future strategy stack: [13:14:16.570] List of future strategies: [13:14:16.570] 1. sequential: [13:14:16.570] - args: function (..., envir = parent.frame(), workers = "") [13:14:16.570] - tweaked: FALSE [13:14:16.570] - call: plan(strategy) [13:14:16.570] plan(): nbrOfWorkers() = 1 [13:14:16.571] SequentialFuture started (and completed) [13:14:16.571] - Launch lazy future ... done [13:14:16.571] run() for 'SequentialFuture' ... done [13:14:16.571] Created future: [13:14:16.571] SequentialFuture: [13:14:16.571] Label: 'future_vapply-1' [13:14:16.571] Expression: [13:14:16.571] { [13:14:16.571] do.call(function(...) { [13:14:16.571] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:16.571] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:16.571] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:16.571] on.exit(options(oopts), add = TRUE) [13:14:16.571] } [13:14:16.571] { [13:14:16.571] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:16.571] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:16.571] ...future.FUN(...future.X_jj, ...) [13:14:16.571] }) [13:14:16.571] } [13:14:16.571] }, args = future.call.arguments) [13:14:16.571] } [13:14:16.571] Lazy evaluation: FALSE [13:14:16.571] Asynchronous evaluation: FALSE [13:14:16.571] Local evaluation: TRUE [13:14:16.571] Environment: R_GlobalEnv [13:14:16.571] Capture standard output: TRUE [13:14:16.571] Capture condition classes: 'condition' (excluding 'nothing') [13:14:16.571] Globals: 11 objects totaling 92.22 KiB (function '...future.FUN' of 21.22 KiB, function 'x_FUN' of 56 bytes, integer 'times' of 56 bytes, function 'stopf' of 26.43 KiB, function 'stop_if_not' of 44.12 KiB, ...) [13:14:16.571] Packages: 1 packages ('future.apply') [13:14:16.571] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:14:16.571] Resolved: TRUE [13:14:16.571] Value: 168 bytes of class 'list' [13:14:16.571] Early signaling: FALSE [13:14:16.571] Owner process: 1bb7d580-628d-c90d-e38a-66de485868c4 [13:14:16.571] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:14:16.573] Chunk #1 of 1 ... DONE [13:14:16.573] Launching 1 futures (chunks) ... DONE [13:14:16.573] Resolving 1 futures (chunks) ... [13:14:16.573] resolve() on list ... [13:14:16.573] recursive: 0 [13:14:16.574] length: 1 [13:14:16.574] [13:14:16.574] resolved() for 'SequentialFuture' ... [13:14:16.574] - state: 'finished' [13:14:16.574] - run: TRUE [13:14:16.574] - result: 'FutureResult' [13:14:16.575] resolved() for 'SequentialFuture' ... done [13:14:16.575] Future #1 [13:14:16.575] signalConditionsASAP(SequentialFuture, pos=1) ... [13:14:16.575] - nx: 1 [13:14:16.575] - relay: TRUE [13:14:16.575] - stdout: TRUE [13:14:16.576] - signal: TRUE [13:14:16.576] - resignal: FALSE [13:14:16.576] - force: TRUE [13:14:16.576] - relayed: [n=1] FALSE [13:14:16.576] - queued futures: [n=1] FALSE [13:14:16.576] - until=1 [13:14:16.576] - relaying element #1 [13:14:16.577] - relayed: [n=1] TRUE [13:14:16.577] - queued futures: [n=1] TRUE [13:14:16.577] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:14:16.577] length: 0 (resolved future 1) [13:14:16.577] Relaying remaining futures [13:14:16.578] signalConditionsASAP(NULL, pos=0) ... [13:14:16.578] - nx: 1 [13:14:16.578] - relay: TRUE [13:14:16.578] - stdout: TRUE [13:14:16.578] - signal: TRUE [13:14:16.578] - resignal: FALSE [13:14:16.578] - force: TRUE [13:14:16.579] - relayed: [n=1] TRUE [13:14:16.579] - queued futures: [n=1] TRUE - flush all [13:14:16.579] - relayed: [n=1] TRUE [13:14:16.579] - queued futures: [n=1] TRUE [13:14:16.579] signalConditionsASAP(NULL, pos=0) ... done [13:14:16.579] resolve() on list ... DONE [13:14:16.580] - Number of value chunks collected: 1 [13:14:16.580] Resolving 1 futures (chunks) ... DONE [13:14:16.580] Reducing values from 1 chunks ... [13:14:16.580] - Number of values collected after concatenation: 3 [13:14:16.580] - Number of values expected: 3 [13:14:16.580] Reducing values from 1 chunks ... DONE [13:14:16.581] future_lapply() ... DONE - exceptions ... [13:14:16.581] future_lapply() ... [13:14:16.583] Number of chunks: 1 [13:14:16.583] getGlobalsAndPackagesXApply() ... [13:14:16.584] - future.globals: TRUE [13:14:16.584] getGlobalsAndPackages() ... [13:14:16.584] Searching for globals... [13:14:16.589] - globals found: [16] 'FUN', '{', '<-', 'x_FUN', 'if', '!=', 'length', 'times', 'stopf', 'stop_if_not', 'all', '==', 'dim', '%in%', 'typeof', 'valid_types' [13:14:16.589] Searching for globals ... DONE [13:14:16.589] Resolving globals: FALSE [13:14:16.590] The total size of the 7 globals is 92.90 KiB (95128 bytes) [13:14:16.591] The total size of the 7 globals exported for future expression ('FUN()') is 92.90 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). The three largest globals are 'stop_if_not' (44.12 KiB of class 'function'), 'stopf' (26.43 KiB of class 'function') and 'FUN' (21.22 KiB of class 'function') [13:14:16.591] - globals: [7] 'FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types' [13:14:16.591] - packages: [1] 'future.apply' [13:14:16.592] getGlobalsAndPackages() ... DONE [13:14:16.592] - globals found/used: [n=7] 'FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types' [13:14:16.592] - needed namespaces: [n=1] 'future.apply' [13:14:16.592] Finding globals ... DONE [13:14:16.592] - use_args: TRUE [13:14:16.592] - Getting '...' globals ... [13:14:16.593] resolve() on list ... [13:14:16.593] recursive: 0 [13:14:16.593] length: 1 [13:14:16.593] elements: '...' [13:14:16.593] length: 0 (resolved future 1) [13:14:16.594] resolve() on list ... DONE [13:14:16.594] - '...' content: [n=0] [13:14:16.594] List of 1 [13:14:16.594] $ ...: list() [13:14:16.594] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:14:16.594] - attr(*, "where")=List of 1 [13:14:16.594] ..$ ...: [13:14:16.594] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:14:16.594] - attr(*, "resolved")= logi TRUE [13:14:16.594] - attr(*, "total_size")= num NA [13:14:16.597] - Getting '...' globals ... DONE [13:14:16.597] Globals to be used in all futures (chunks): [n=8] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...' [13:14:16.597] List of 8 [13:14:16.597] $ ...future.FUN:function (x, ...) [13:14:16.597] $ x_FUN :function (x) [13:14:16.597] $ times : int 2 [13:14:16.597] $ stopf :function (fmt, ..., call. = TRUE, domain = NULL) [13:14:16.597] $ stop_if_not :function (...) [13:14:16.597] $ dim : NULL [13:14:16.597] $ valid_types : chr [1:3] "logical" "integer" "double" [13:14:16.597] $ ... : list() [13:14:16.597] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:14:16.597] - attr(*, "where")=List of 8 [13:14:16.597] ..$ ...future.FUN: [13:14:16.597] ..$ x_FUN : [13:14:16.597] ..$ times : [13:14:16.597] ..$ stopf : [13:14:16.597] ..$ stop_if_not : [13:14:16.597] ..$ dim : [13:14:16.597] ..$ valid_types : [13:14:16.597] ..$ ... : [13:14:16.597] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:14:16.597] - attr(*, "resolved")= logi FALSE [13:14:16.597] - attr(*, "total_size")= num 95128 [13:14:16.604] Packages to be attached in all futures: [n=1] 'future.apply' [13:14:16.604] getGlobalsAndPackagesXApply() ... DONE [13:14:16.605] Number of futures (= number of chunks): 1 [13:14:16.605] Launching 1 futures (chunks) ... [13:14:16.605] Chunk #1 of 1 ... [13:14:16.606] - Finding globals in 'X' for chunk #1 ... [13:14:16.606] getGlobalsAndPackages() ... [13:14:16.606] Searching for globals... [13:14:16.606] [13:14:16.606] Searching for globals ... DONE [13:14:16.607] - globals: [0] [13:14:16.607] getGlobalsAndPackages() ... DONE [13:14:16.607] + additional globals found: [n=0] [13:14:16.607] + additional namespaces needed: [n=0] [13:14:16.607] - Finding globals in 'X' for chunk #1 ... DONE [13:14:16.607] - seeds: [13:14:16.607] - All globals exported: [n=11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:16.608] getGlobalsAndPackages() ... [13:14:16.608] - globals passed as-is: [11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:16.608] Resolving globals: FALSE [13:14:16.608] Tweak future expression to call with '...' arguments ... [13:14:16.608] { [13:14:16.608] do.call(function(...) { [13:14:16.608] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:16.608] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:16.608] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:16.608] on.exit(options(oopts), add = TRUE) [13:14:16.608] } [13:14:16.608] { [13:14:16.608] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:16.608] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:16.608] ...future.FUN(...future.X_jj, ...) [13:14:16.608] }) [13:14:16.608] } [13:14:16.608] }, args = future.call.arguments) [13:14:16.608] } [13:14:16.609] Tweak future expression to call with '...' arguments ... DONE [13:14:16.609] - globals: [11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:16.610] - packages: [1] 'future.apply' [13:14:16.610] getGlobalsAndPackages() ... DONE [13:14:16.610] run() for 'Future' ... [13:14:16.610] - state: 'created' [13:14:16.611] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:14:16.611] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:14:16.611] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:14:16.611] - Field: 'label' [13:14:16.612] - Field: 'local' [13:14:16.612] - Field: 'owner' [13:14:16.612] - Field: 'envir' [13:14:16.612] - Field: 'packages' [13:14:16.612] - Field: 'gc' [13:14:16.612] - Field: 'conditions' [13:14:16.613] - Field: 'expr' [13:14:16.613] - Field: 'uuid' [13:14:16.613] - Field: 'seed' [13:14:16.613] - Field: 'version' [13:14:16.613] - Field: 'result' [13:14:16.613] - Field: 'asynchronous' [13:14:16.614] - Field: 'calls' [13:14:16.614] - Field: 'globals' [13:14:16.614] - Field: 'stdout' [13:14:16.614] - Field: 'earlySignal' [13:14:16.614] - Field: 'lazy' [13:14:16.615] - Field: 'state' [13:14:16.615] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:14:16.615] - Launch lazy future ... [13:14:16.615] Packages needed by the future expression (n = 1): 'future.apply' [13:14:16.615] Packages needed by future strategies (n = 0): [13:14:16.616] { [13:14:16.616] { [13:14:16.616] { [13:14:16.616] ...future.startTime <- base::Sys.time() [13:14:16.616] { [13:14:16.616] { [13:14:16.616] { [13:14:16.616] { [13:14:16.616] base::local({ [13:14:16.616] has_future <- base::requireNamespace("future", [13:14:16.616] quietly = TRUE) [13:14:16.616] if (has_future) { [13:14:16.616] ns <- base::getNamespace("future") [13:14:16.616] version <- ns[[".package"]][["version"]] [13:14:16.616] if (is.null(version)) [13:14:16.616] version <- utils::packageVersion("future") [13:14:16.616] } [13:14:16.616] else { [13:14:16.616] version <- NULL [13:14:16.616] } [13:14:16.616] if (!has_future || version < "1.8.0") { [13:14:16.616] info <- base::c(r_version = base::gsub("R version ", [13:14:16.616] "", base::R.version$version.string), [13:14:16.616] platform = base::sprintf("%s (%s-bit)", [13:14:16.616] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:14:16.616] os = base::paste(base::Sys.info()[base::c("sysname", [13:14:16.616] "release", "version")], collapse = " "), [13:14:16.616] hostname = base::Sys.info()[["nodename"]]) [13:14:16.616] info <- base::sprintf("%s: %s", base::names(info), [13:14:16.616] info) [13:14:16.616] info <- base::paste(info, collapse = "; ") [13:14:16.616] if (!has_future) { [13:14:16.616] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:14:16.616] info) [13:14:16.616] } [13:14:16.616] else { [13:14:16.616] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:14:16.616] info, version) [13:14:16.616] } [13:14:16.616] base::stop(msg) [13:14:16.616] } [13:14:16.616] }) [13:14:16.616] } [13:14:16.616] base::local({ [13:14:16.616] for (pkg in "future.apply") { [13:14:16.616] base::loadNamespace(pkg) [13:14:16.616] base::library(pkg, character.only = TRUE) [13:14:16.616] } [13:14:16.616] }) [13:14:16.616] } [13:14:16.616] options(future.plan = NULL) [13:14:16.616] Sys.unsetenv("R_FUTURE_PLAN") [13:14:16.616] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:14:16.616] } [13:14:16.616] ...future.workdir <- getwd() [13:14:16.616] } [13:14:16.616] ...future.oldOptions <- base::as.list(base::.Options) [13:14:16.616] ...future.oldEnvVars <- base::Sys.getenv() [13:14:16.616] } [13:14:16.616] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:14:16.616] future.globals.maxSize = NULL, future.globals.method = NULL, [13:14:16.616] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:14:16.616] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:14:16.616] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:14:16.616] future.stdout.windows.reencode = NULL, width = 80L) [13:14:16.616] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:14:16.616] base::names(...future.oldOptions)) [13:14:16.616] } [13:14:16.616] if (FALSE) { [13:14:16.616] } [13:14:16.616] else { [13:14:16.616] if (TRUE) { [13:14:16.616] ...future.stdout <- base::rawConnection(base::raw(0L), [13:14:16.616] open = "w") [13:14:16.616] } [13:14:16.616] else { [13:14:16.616] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:14:16.616] windows = "NUL", "/dev/null"), open = "w") [13:14:16.616] } [13:14:16.616] base::sink(...future.stdout, type = "output", split = FALSE) [13:14:16.616] base::on.exit(if (!base::is.null(...future.stdout)) { [13:14:16.616] base::sink(type = "output", split = FALSE) [13:14:16.616] base::close(...future.stdout) [13:14:16.616] }, add = TRUE) [13:14:16.616] } [13:14:16.616] ...future.frame <- base::sys.nframe() [13:14:16.616] ...future.conditions <- base::list() [13:14:16.616] ...future.rng <- base::globalenv()$.Random.seed [13:14:16.616] if (FALSE) { [13:14:16.616] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:14:16.616] "...future.value", "...future.globalenv.names", ".Random.seed") [13:14:16.616] } [13:14:16.616] ...future.result <- base::tryCatch({ [13:14:16.616] base::withCallingHandlers({ [13:14:16.616] ...future.value <- base::withVisible(base::local({ [13:14:16.616] do.call(function(...) { [13:14:16.616] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:16.616] if (!identical(...future.globals.maxSize.org, [13:14:16.616] ...future.globals.maxSize)) { [13:14:16.616] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:16.616] on.exit(options(oopts), add = TRUE) [13:14:16.616] } [13:14:16.616] { [13:14:16.616] lapply(seq_along(...future.elements_ii), [13:14:16.616] FUN = function(jj) { [13:14:16.616] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:16.616] ...future.FUN(...future.X_jj, ...) [13:14:16.616] }) [13:14:16.616] } [13:14:16.616] }, args = future.call.arguments) [13:14:16.616] })) [13:14:16.616] future::FutureResult(value = ...future.value$value, [13:14:16.616] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:14:16.616] ...future.rng), globalenv = if (FALSE) [13:14:16.616] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:14:16.616] ...future.globalenv.names)) [13:14:16.616] else NULL, started = ...future.startTime, version = "1.8") [13:14:16.616] }, condition = base::local({ [13:14:16.616] c <- base::c [13:14:16.616] inherits <- base::inherits [13:14:16.616] invokeRestart <- base::invokeRestart [13:14:16.616] length <- base::length [13:14:16.616] list <- base::list [13:14:16.616] seq.int <- base::seq.int [13:14:16.616] signalCondition <- base::signalCondition [13:14:16.616] sys.calls <- base::sys.calls [13:14:16.616] `[[` <- base::`[[` [13:14:16.616] `+` <- base::`+` [13:14:16.616] `<<-` <- base::`<<-` [13:14:16.616] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:14:16.616] calls[seq.int(from = from + 12L, to = length(calls) - [13:14:16.616] 3L)] [13:14:16.616] } [13:14:16.616] function(cond) { [13:14:16.616] is_error <- inherits(cond, "error") [13:14:16.616] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:14:16.616] NULL) [13:14:16.616] if (is_error) { [13:14:16.616] sessionInformation <- function() { [13:14:16.616] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:14:16.616] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:14:16.616] search = base::search(), system = base::Sys.info()) [13:14:16.616] } [13:14:16.616] ...future.conditions[[length(...future.conditions) + [13:14:16.616] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:14:16.616] cond$call), session = sessionInformation(), [13:14:16.616] timestamp = base::Sys.time(), signaled = 0L) [13:14:16.616] signalCondition(cond) [13:14:16.616] } [13:14:16.616] else if (!ignore && TRUE && inherits(cond, c("condition", [13:14:16.616] "immediateCondition"))) { [13:14:16.616] signal <- TRUE && inherits(cond, "immediateCondition") [13:14:16.616] ...future.conditions[[length(...future.conditions) + [13:14:16.616] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:14:16.616] if (TRUE && !signal) { [13:14:16.616] muffleCondition <- function (cond, pattern = "^muffle") [13:14:16.616] { [13:14:16.616] inherits <- base::inherits [13:14:16.616] invokeRestart <- base::invokeRestart [13:14:16.616] is.null <- base::is.null [13:14:16.616] muffled <- FALSE [13:14:16.616] if (inherits(cond, "message")) { [13:14:16.616] muffled <- grepl(pattern, "muffleMessage") [13:14:16.616] if (muffled) [13:14:16.616] invokeRestart("muffleMessage") [13:14:16.616] } [13:14:16.616] else if (inherits(cond, "warning")) { [13:14:16.616] muffled <- grepl(pattern, "muffleWarning") [13:14:16.616] if (muffled) [13:14:16.616] invokeRestart("muffleWarning") [13:14:16.616] } [13:14:16.616] else if (inherits(cond, "condition")) { [13:14:16.616] if (!is.null(pattern)) { [13:14:16.616] computeRestarts <- base::computeRestarts [13:14:16.616] grepl <- base::grepl [13:14:16.616] restarts <- computeRestarts(cond) [13:14:16.616] for (restart in restarts) { [13:14:16.616] name <- restart$name [13:14:16.616] if (is.null(name)) [13:14:16.616] next [13:14:16.616] if (!grepl(pattern, name)) [13:14:16.616] next [13:14:16.616] invokeRestart(restart) [13:14:16.616] muffled <- TRUE [13:14:16.616] break [13:14:16.616] } [13:14:16.616] } [13:14:16.616] } [13:14:16.616] invisible(muffled) [13:14:16.616] } [13:14:16.616] muffleCondition(cond, pattern = "^muffle") [13:14:16.616] } [13:14:16.616] } [13:14:16.616] else { [13:14:16.616] if (TRUE) { [13:14:16.616] muffleCondition <- function (cond, pattern = "^muffle") [13:14:16.616] { [13:14:16.616] inherits <- base::inherits [13:14:16.616] invokeRestart <- base::invokeRestart [13:14:16.616] is.null <- base::is.null [13:14:16.616] muffled <- FALSE [13:14:16.616] if (inherits(cond, "message")) { [13:14:16.616] muffled <- grepl(pattern, "muffleMessage") [13:14:16.616] if (muffled) [13:14:16.616] invokeRestart("muffleMessage") [13:14:16.616] } [13:14:16.616] else if (inherits(cond, "warning")) { [13:14:16.616] muffled <- grepl(pattern, "muffleWarning") [13:14:16.616] if (muffled) [13:14:16.616] invokeRestart("muffleWarning") [13:14:16.616] } [13:14:16.616] else if (inherits(cond, "condition")) { [13:14:16.616] if (!is.null(pattern)) { [13:14:16.616] computeRestarts <- base::computeRestarts [13:14:16.616] grepl <- base::grepl [13:14:16.616] restarts <- computeRestarts(cond) [13:14:16.616] for (restart in restarts) { [13:14:16.616] name <- restart$name [13:14:16.616] if (is.null(name)) [13:14:16.616] next [13:14:16.616] if (!grepl(pattern, name)) [13:14:16.616] next [13:14:16.616] invokeRestart(restart) [13:14:16.616] muffled <- TRUE [13:14:16.616] break [13:14:16.616] } [13:14:16.616] } [13:14:16.616] } [13:14:16.616] invisible(muffled) [13:14:16.616] } [13:14:16.616] muffleCondition(cond, pattern = "^muffle") [13:14:16.616] } [13:14:16.616] } [13:14:16.616] } [13:14:16.616] })) [13:14:16.616] }, error = function(ex) { [13:14:16.616] base::structure(base::list(value = NULL, visible = NULL, [13:14:16.616] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:14:16.616] ...future.rng), started = ...future.startTime, [13:14:16.616] finished = Sys.time(), session_uuid = NA_character_, [13:14:16.616] version = "1.8"), class = "FutureResult") [13:14:16.616] }, finally = { [13:14:16.616] if (!identical(...future.workdir, getwd())) [13:14:16.616] setwd(...future.workdir) [13:14:16.616] { [13:14:16.616] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:14:16.616] ...future.oldOptions$nwarnings <- NULL [13:14:16.616] } [13:14:16.616] base::options(...future.oldOptions) [13:14:16.616] if (.Platform$OS.type == "windows") { [13:14:16.616] old_names <- names(...future.oldEnvVars) [13:14:16.616] envs <- base::Sys.getenv() [13:14:16.616] names <- names(envs) [13:14:16.616] common <- intersect(names, old_names) [13:14:16.616] added <- setdiff(names, old_names) [13:14:16.616] removed <- setdiff(old_names, names) [13:14:16.616] changed <- common[...future.oldEnvVars[common] != [13:14:16.616] envs[common]] [13:14:16.616] NAMES <- toupper(changed) [13:14:16.616] args <- list() [13:14:16.616] for (kk in seq_along(NAMES)) { [13:14:16.616] name <- changed[[kk]] [13:14:16.616] NAME <- NAMES[[kk]] [13:14:16.616] if (name != NAME && is.element(NAME, old_names)) [13:14:16.616] next [13:14:16.616] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:16.616] } [13:14:16.616] NAMES <- toupper(added) [13:14:16.616] for (kk in seq_along(NAMES)) { [13:14:16.616] name <- added[[kk]] [13:14:16.616] NAME <- NAMES[[kk]] [13:14:16.616] if (name != NAME && is.element(NAME, old_names)) [13:14:16.616] next [13:14:16.616] args[[name]] <- "" [13:14:16.616] } [13:14:16.616] NAMES <- toupper(removed) [13:14:16.616] for (kk in seq_along(NAMES)) { [13:14:16.616] name <- removed[[kk]] [13:14:16.616] NAME <- NAMES[[kk]] [13:14:16.616] if (name != NAME && is.element(NAME, old_names)) [13:14:16.616] next [13:14:16.616] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:16.616] } [13:14:16.616] if (length(args) > 0) [13:14:16.616] base::do.call(base::Sys.setenv, args = args) [13:14:16.616] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:14:16.616] } [13:14:16.616] else { [13:14:16.616] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:14:16.616] } [13:14:16.616] { [13:14:16.616] if (base::length(...future.futureOptionsAdded) > [13:14:16.616] 0L) { [13:14:16.616] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:14:16.616] base::names(opts) <- ...future.futureOptionsAdded [13:14:16.616] base::options(opts) [13:14:16.616] } [13:14:16.616] { [13:14:16.616] { [13:14:16.616] NULL [13:14:16.616] RNGkind("Mersenne-Twister") [13:14:16.616] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:14:16.616] inherits = FALSE) [13:14:16.616] } [13:14:16.616] options(future.plan = NULL) [13:14:16.616] if (is.na(NA_character_)) [13:14:16.616] Sys.unsetenv("R_FUTURE_PLAN") [13:14:16.616] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:14:16.616] future::plan(list(function (..., envir = parent.frame()) [13:14:16.616] { [13:14:16.616] future <- SequentialFuture(..., envir = envir) [13:14:16.616] if (!future$lazy) [13:14:16.616] future <- run(future) [13:14:16.616] invisible(future) [13:14:16.616] }), .cleanup = FALSE, .init = FALSE) [13:14:16.616] } [13:14:16.616] } [13:14:16.616] } [13:14:16.616] }) [13:14:16.616] if (TRUE) { [13:14:16.616] base::sink(type = "output", split = FALSE) [13:14:16.616] if (TRUE) { [13:14:16.616] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:14:16.616] } [13:14:16.616] else { [13:14:16.616] ...future.result["stdout"] <- base::list(NULL) [13:14:16.616] } [13:14:16.616] base::close(...future.stdout) [13:14:16.616] ...future.stdout <- NULL [13:14:16.616] } [13:14:16.616] ...future.result$conditions <- ...future.conditions [13:14:16.616] ...future.result$finished <- base::Sys.time() [13:14:16.616] ...future.result [13:14:16.616] } [13:14:16.620] assign_globals() ... [13:14:16.620] List of 11 [13:14:16.620] $ ...future.FUN :function (x, ...) [13:14:16.620] $ x_FUN :function (x) [13:14:16.620] $ times : int 2 [13:14:16.620] $ stopf :function (fmt, ..., call. = TRUE, domain = NULL) [13:14:16.620] $ stop_if_not :function (...) [13:14:16.620] $ dim : NULL [13:14:16.620] $ valid_types : chr [1:3] "logical" "integer" "double" [13:14:16.620] $ future.call.arguments : list() [13:14:16.620] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:14:16.620] $ ...future.elements_ii :List of 3 [13:14:16.620] ..$ : int 1 [13:14:16.620] ..$ : int 2 [13:14:16.620] ..$ : int 3 [13:14:16.620] $ ...future.seeds_ii : NULL [13:14:16.620] $ ...future.globals.maxSize: NULL [13:14:16.620] - attr(*, "where")=List of 11 [13:14:16.620] ..$ ...future.FUN : [13:14:16.620] ..$ x_FUN : [13:14:16.620] ..$ times : [13:14:16.620] ..$ stopf : [13:14:16.620] ..$ stop_if_not : [13:14:16.620] ..$ dim : [13:14:16.620] ..$ valid_types : [13:14:16.620] ..$ future.call.arguments : [13:14:16.620] ..$ ...future.elements_ii : [13:14:16.620] ..$ ...future.seeds_ii : [13:14:16.620] ..$ ...future.globals.maxSize: [13:14:16.620] - attr(*, "resolved")= logi FALSE [13:14:16.620] - attr(*, "total_size")= num 95128 [13:14:16.620] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:14:16.620] - attr(*, "already-done")= logi TRUE [13:14:16.630] - copied '...future.FUN' to environment [13:14:16.630] - copied 'x_FUN' to environment [13:14:16.630] - copied 'times' to environment [13:14:16.631] - copied 'stopf' to environment [13:14:16.631] - copied 'stop_if_not' to environment [13:14:16.631] - copied 'dim' to environment [13:14:16.631] - copied 'valid_types' to environment [13:14:16.631] - copied 'future.call.arguments' to environment [13:14:16.631] - copied '...future.elements_ii' to environment [13:14:16.632] - copied '...future.seeds_ii' to environment [13:14:16.632] - copied '...future.globals.maxSize' to environment [13:14:16.632] assign_globals() ... done [13:14:16.633] plan(): Setting new future strategy stack: [13:14:16.633] List of future strategies: [13:14:16.633] 1. sequential: [13:14:16.633] - args: function (..., envir = parent.frame(), workers = "") [13:14:16.633] - tweaked: FALSE [13:14:16.633] - call: NULL [13:14:16.633] plan(): nbrOfWorkers() = 1 [13:14:16.635] plan(): Setting new future strategy stack: [13:14:16.635] List of future strategies: [13:14:16.635] 1. sequential: [13:14:16.635] - args: function (..., envir = parent.frame(), workers = "") [13:14:16.635] - tweaked: FALSE [13:14:16.635] - call: plan(strategy) [13:14:16.636] plan(): nbrOfWorkers() = 1 [13:14:16.636] SequentialFuture started (and completed) [13:14:16.636] signalConditions() ... [13:14:16.636] - include = 'immediateCondition' [13:14:16.636] - exclude = [13:14:16.637] - resignal = FALSE [13:14:16.637] - Number of conditions: 1 [13:14:16.637] signalConditions() ... done [13:14:16.637] - Launch lazy future ... done [13:14:16.637] run() for 'SequentialFuture' ... done [13:14:16.637] Created future: [13:14:16.638] SequentialFuture: [13:14:16.638] Label: 'future_vapply-1' [13:14:16.638] Expression: [13:14:16.638] { [13:14:16.638] do.call(function(...) { [13:14:16.638] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:16.638] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:16.638] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:16.638] on.exit(options(oopts), add = TRUE) [13:14:16.638] } [13:14:16.638] { [13:14:16.638] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:16.638] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:16.638] ...future.FUN(...future.X_jj, ...) [13:14:16.638] }) [13:14:16.638] } [13:14:16.638] }, args = future.call.arguments) [13:14:16.638] } [13:14:16.638] Lazy evaluation: FALSE [13:14:16.638] Asynchronous evaluation: FALSE [13:14:16.638] Local evaluation: TRUE [13:14:16.638] Environment: R_GlobalEnv [13:14:16.638] Capture standard output: TRUE [13:14:16.638] Capture condition classes: 'condition' (excluding 'nothing') [13:14:16.638] Globals: 11 objects totaling 93.06 KiB (function '...future.FUN' of 21.22 KiB, function 'x_FUN' of 848 bytes, integer 'times' of 56 bytes, function 'stopf' of 26.43 KiB, function 'stop_if_not' of 44.12 KiB, ...) [13:14:16.638] Packages: 1 packages ('future.apply') [13:14:16.638] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:14:16.638] Resolved: TRUE [13:14:16.638] Value: 0 bytes of class 'NULL' [13:14:16.638] Conditions captured: [n=1] 'simpleError' [13:14:16.638] Early signaling: FALSE [13:14:16.638] Owner process: 1bb7d580-628d-c90d-e38a-66de485868c4 [13:14:16.638] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:14:16.639] Chunk #1 of 1 ... DONE [13:14:16.639] Launching 1 futures (chunks) ... DONE [13:14:16.639] Resolving 1 futures (chunks) ... [13:14:16.640] resolve() on list ... [13:14:16.640] recursive: 0 [13:14:16.640] length: 1 [13:14:16.640] [13:14:16.640] resolved() for 'SequentialFuture' ... [13:14:16.640] - state: 'finished' [13:14:16.640] - run: TRUE [13:14:16.641] - result: 'FutureResult' [13:14:16.641] resolved() for 'SequentialFuture' ... done [13:14:16.641] Future #1 [13:14:16.641] signalConditions() ... [13:14:16.641] - include = 'immediateCondition' [13:14:16.642] - exclude = [13:14:16.642] - resignal = FALSE [13:14:16.642] - Number of conditions: 1 [13:14:16.642] signalConditions() ... done [13:14:16.642] signalConditionsASAP(SequentialFuture, pos=1) ... [13:14:16.642] - nx: 1 [13:14:16.643] - relay: TRUE [13:14:16.643] - stdout: TRUE [13:14:16.643] - signal: TRUE [13:14:16.643] - resignal: FALSE [13:14:16.643] - force: TRUE [13:14:16.643] - relayed: [n=1] FALSE [13:14:16.643] - queued futures: [n=1] FALSE [13:14:16.644] - until=1 [13:14:16.644] - relaying element #1 [13:14:16.644] signalConditions() ... [13:14:16.644] - include = 'immediateCondition' [13:14:16.644] - exclude = [13:14:16.644] - resignal = FALSE [13:14:16.645] - Number of conditions: 1 [13:14:16.645] signalConditions() ... done [13:14:16.645] signalConditions() ... [13:14:16.645] - include = 'immediateCondition' [13:14:16.645] - exclude = [13:14:16.645] - resignal = FALSE [13:14:16.646] - Number of conditions: 1 [13:14:16.646] signalConditions() ... done [13:14:16.646] signalConditions() ... [13:14:16.646] - include = 'condition' [13:14:16.646] - exclude = 'immediateCondition' [13:14:16.646] - resignal = TRUE [13:14:16.647] - Number of conditions: 1 [13:14:16.647] - Condition #1: 'simpleError', 'error', 'condition' [13:14:16.647] signalConditions() ... done [13:14:16.647] - relayed: [n=1] FALSE [13:14:16.647] - queued futures: [n=1] TRUE [13:14:16.647] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:14:16.648] plan(): Setting new future strategy stack: [13:14:16.648] List of future strategies: [13:14:16.648] 1. sequential: [13:14:16.648] - args: function (..., envir = parent.frame(), workers = "") [13:14:16.648] - tweaked: FALSE [13:14:16.648] - call: plan(sequential) [13:14:16.648] plan(): nbrOfWorkers() = 1 *** strategy = 'sequential' ... done *** strategy = 'multisession' ... [13:14:16.649] plan(): Setting new future strategy stack: [13:14:16.649] List of future strategies: [13:14:16.649] 1. multisession: [13:14:16.649] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [13:14:16.649] - tweaked: FALSE [13:14:16.649] - call: plan(strategy) [13:14:16.650] plan(): plan_init() of 'multisession', 'cluster', 'multiprocess', 'future', 'function' ... [13:14:16.650] multisession: [13:14:16.650] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [13:14:16.650] - tweaked: FALSE [13:14:16.650] - call: plan(strategy) [13:14:16.655] getGlobalsAndPackages() ... [13:14:16.655] Not searching for globals [13:14:16.655] - globals: [0] [13:14:16.655] getGlobalsAndPackages() ... DONE [13:14:16.656] [local output] makeClusterPSOCK() ... [13:14:16.699] [local output] Workers: [n = 2] 'localhost', 'localhost' [13:14:16.706] [local output] Base port: 21879 [13:14:16.706] [local output] Getting setup options for 2 cluster nodes ... [13:14:16.706] [local output] - Node 1 of 2 ... [13:14:16.707] [local output] localMachine=TRUE => revtunnel=FALSE [13:14:16.708] Testing if worker's PID can be inferred: '"D:/RCompile/recent/R/bin/x64/Rscript" -e "try(suppressWarnings(cat(Sys.getpid(),file=\"D:/temp/RtmpSAIue4/worker.rank=1.parallelly.parent=3360.d205c11458a.pid\")), silent = TRUE)" -e "file.exists(\"D:/temp/RtmpSAIue4/worker.rank=1.parallelly.parent=3360.d205c11458a.pid\")"' [13:14:17.034] - Possible to infer worker's PID: TRUE [13:14:17.035] [local output] Rscript port: 21879 [13:14:17.036] [local output] - Node 2 of 2 ... [13:14:17.036] [local output] localMachine=TRUE => revtunnel=FALSE [13:14:17.038] [local output] Rscript port: 21879 [13:14:17.038] [local output] Getting setup options for 2 cluster nodes ... done [13:14:17.038] [local output] - Parallel setup requested for some PSOCK nodes [13:14:17.039] [local output] Setting up PSOCK nodes in parallel [13:14:17.040] List of 36 [13:14:17.040] $ worker : chr "localhost" [13:14:17.040] ..- attr(*, "localhost")= logi TRUE [13:14:17.040] $ master : chr "localhost" [13:14:17.040] $ port : int 21879 [13:14:17.040] $ connectTimeout : num 120 [13:14:17.040] $ timeout : num 120 [13:14:17.040] $ rscript : chr "\"D:/RCompile/recent/R/bin/x64/Rscript\"" [13:14:17.040] $ homogeneous : logi TRUE [13:14:17.040] $ rscript_args : chr "--default-packages=datasets,utils,grDevices,graphics,stats,methods -e \"#label=future_vapply.R:3360:CRANWIN3:CR"| __truncated__ [13:14:17.040] $ rscript_envs : NULL [13:14:17.040] $ rscript_libs : chr [1:2] "D:/temp/RtmpKkFYYg/RLIBS_20dc214b714b" "D:/RCompile/recent/R/library" [13:14:17.040] $ rscript_startup : NULL [13:14:17.040] $ rscript_sh : chr "cmd" [13:14:17.040] $ default_packages: chr [1:6] "datasets" "utils" "grDevices" "graphics" ... [13:14:17.040] $ methods : logi TRUE [13:14:17.040] $ socketOptions : chr "no-delay" [13:14:17.040] $ useXDR : logi FALSE [13:14:17.040] $ outfile : chr "/dev/null" [13:14:17.040] $ renice : int NA [13:14:17.040] $ rshcmd : NULL [13:14:17.040] $ user : chr(0) [13:14:17.040] $ revtunnel : logi FALSE [13:14:17.040] $ rshlogfile : NULL [13:14:17.040] $ rshopts : chr(0) [13:14:17.040] $ rank : int 1 [13:14:17.040] $ manual : logi FALSE [13:14:17.040] $ dryrun : logi FALSE [13:14:17.040] $ quiet : logi FALSE [13:14:17.040] $ setup_strategy : chr "parallel" [13:14:17.040] $ local_cmd : chr "\"D:/RCompile/recent/R/bin/x64/Rscript\" --default-packages=datasets,utils,grDevices,graphics,stats,methods -e "| __truncated__ [13:14:17.040] $ pidfile : chr "D:/temp/RtmpSAIue4/worker.rank=1.parallelly.parent=3360.d205c11458a.pid" [13:14:17.040] $ rshcmd_label : NULL [13:14:17.040] $ rsh_call : NULL [13:14:17.040] $ cmd : chr "\"D:/RCompile/recent/R/bin/x64/Rscript\" --default-packages=datasets,utils,grDevices,graphics,stats,methods -e "| __truncated__ [13:14:17.040] $ localMachine : logi TRUE [13:14:17.040] $ make_fcn :function (worker = getOption2("parallelly.localhost.hostname", "localhost"), [13:14:17.040] master = NULL, port, connectTimeout = getOption2("parallelly.makeNodePSOCK.connectTimeout", [13:14:17.040] 2 * 60), timeout = getOption2("parallelly.makeNodePSOCK.timeout", [13:14:17.040] 30 * 24 * 60 * 60), rscript = NULL, homogeneous = NULL, rscript_args = NULL, [13:14:17.040] rscript_envs = NULL, rscript_libs = NULL, rscript_startup = NULL, rscript_sh = c("auto", [13:14:17.040] "cmd", "sh"), default_packages = c("datasets", "utils", "grDevices", [13:14:17.040] "graphics", "stats", if (methods) "methods"), methods = TRUE, socketOptions = getOption2("parallelly.makeNodePSOCK.socketOptions", [13:14:17.040] "no-delay"), useXDR = getOption2("parallelly.makeNodePSOCK.useXDR", [13:14:17.040] FALSE), outfile = "/dev/null", renice = NA_integer_, rshcmd = getOption2("parallelly.makeNodePSOCK.rshcmd", [13:14:17.040] NULL), user = NULL, revtunnel = NA, rshlogfile = NULL, rshopts = getOption2("parallelly.makeNodePSOCK.rshopts", [13:14:17.040] NULL), rank = 1L, manual = FALSE, dryrun = FALSE, quiet = FALSE, [13:14:17.040] setup_strategy = getOption2("parallelly.makeNodePSOCK.setup_strategy", [13:14:17.040] "parallel"), action = c("launch", "options"), verbose = FALSE) [13:14:17.040] $ arguments :List of 28 [13:14:17.040] ..$ worker : chr "localhost" [13:14:17.040] ..$ master : NULL [13:14:17.040] ..$ port : int 21879 [13:14:17.040] ..$ connectTimeout : num 120 [13:14:17.040] ..$ timeout : num 120 [13:14:17.040] ..$ rscript : NULL [13:14:17.040] ..$ homogeneous : NULL [13:14:17.040] ..$ rscript_args : NULL [13:14:17.040] ..$ rscript_envs : NULL [13:14:17.040] ..$ rscript_libs : chr [1:2] "D:/temp/RtmpKkFYYg/RLIBS_20dc214b714b" "D:/RCompile/recent/R/library" [13:14:17.040] ..$ rscript_startup : NULL [13:14:17.040] ..$ rscript_sh : chr [1:3] "auto" "cmd" "sh" [13:14:17.040] ..$ default_packages: chr [1:6] "datasets" "utils" "grDevices" "graphics" ... [13:14:17.040] ..$ methods : logi TRUE [13:14:17.040] ..$ socketOptions : chr "no-delay" [13:14:17.040] ..$ useXDR : logi FALSE [13:14:17.040] ..$ outfile : chr "/dev/null" [13:14:17.040] ..$ renice : int NA [13:14:17.040] ..$ rshcmd : NULL [13:14:17.040] ..$ user : NULL [13:14:17.040] ..$ revtunnel : logi NA [13:14:17.040] ..$ rshlogfile : NULL [13:14:17.040] ..$ rshopts : NULL [13:14:17.040] ..$ rank : int 1 [13:14:17.040] ..$ manual : logi FALSE [13:14:17.040] ..$ dryrun : logi FALSE [13:14:17.040] ..$ quiet : logi FALSE [13:14:17.040] ..$ setup_strategy : chr "parallel" [13:14:17.040] - attr(*, "class")= chr [1:2] "makeNodePSOCKOptions" "makeNodeOptions" [13:14:17.065] [local output] System call to launch all workers: [13:14:17.065] [local output] "D:/RCompile/recent/R/bin/x64/Rscript" --default-packages=datasets,utils,grDevices,graphics,stats,methods -e "#label=future_vapply.R:3360:CRANWIN3:CRAN" -e "try(suppressWarnings(cat(Sys.getpid(),file=\"D:/temp/RtmpSAIue4/worker.rank=1.parallelly.parent=3360.d205c11458a.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=21879 OUT=/dev/null TIMEOUT=120 XDR=FALSE SETUPTIMEOUT=120 SETUPSTRATEGY=parallel [13:14:17.065] [local output] Starting PSOCK main server [13:14:17.071] [local output] Workers launched [13:14:17.071] [local output] Waiting for workers to connect back [13:14:17.071] - [local output] 0 workers out of 2 ready [13:14:17.239] - [local output] 0 workers out of 2 ready [13:14:17.239] - [local output] 1 workers out of 2 ready [13:14:17.240] - [local output] 2 workers out of 2 ready [13:14:17.240] [local output] Launching of workers completed [13:14:17.240] [local output] Collecting session information from workers [13:14:17.241] [local output] - Worker #1 of 2 [13:14:17.242] [local output] - Worker #2 of 2 [13:14:17.242] [local output] makeClusterPSOCK() ... done [13:14:17.255] Packages needed by the future expression (n = 0): [13:14:17.256] Packages needed by future strategies (n = 0): [13:14:17.256] { [13:14:17.256] { [13:14:17.256] { [13:14:17.256] ...future.startTime <- base::Sys.time() [13:14:17.256] { [13:14:17.256] { [13:14:17.256] { [13:14:17.256] { [13:14:17.256] base::local({ [13:14:17.256] has_future <- base::requireNamespace("future", [13:14:17.256] quietly = TRUE) [13:14:17.256] if (has_future) { [13:14:17.256] ns <- base::getNamespace("future") [13:14:17.256] version <- ns[[".package"]][["version"]] [13:14:17.256] if (is.null(version)) [13:14:17.256] version <- utils::packageVersion("future") [13:14:17.256] } [13:14:17.256] else { [13:14:17.256] version <- NULL [13:14:17.256] } [13:14:17.256] if (!has_future || version < "1.8.0") { [13:14:17.256] info <- base::c(r_version = base::gsub("R version ", [13:14:17.256] "", base::R.version$version.string), [13:14:17.256] platform = base::sprintf("%s (%s-bit)", [13:14:17.256] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:14:17.256] os = base::paste(base::Sys.info()[base::c("sysname", [13:14:17.256] "release", "version")], collapse = " "), [13:14:17.256] hostname = base::Sys.info()[["nodename"]]) [13:14:17.256] info <- base::sprintf("%s: %s", base::names(info), [13:14:17.256] info) [13:14:17.256] info <- base::paste(info, collapse = "; ") [13:14:17.256] if (!has_future) { [13:14:17.256] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:14:17.256] info) [13:14:17.256] } [13:14:17.256] else { [13:14:17.256] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:14:17.256] info, version) [13:14:17.256] } [13:14:17.256] base::stop(msg) [13:14:17.256] } [13:14:17.256] }) [13:14:17.256] } [13:14:17.256] ...future.mc.cores.old <- base::getOption("mc.cores") [13:14:17.256] base::options(mc.cores = 1L) [13:14:17.256] } [13:14:17.256] options(future.plan = NULL) [13:14:17.256] Sys.unsetenv("R_FUTURE_PLAN") [13:14:17.256] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:14:17.256] } [13:14:17.256] ...future.workdir <- getwd() [13:14:17.256] } [13:14:17.256] ...future.oldOptions <- base::as.list(base::.Options) [13:14:17.256] ...future.oldEnvVars <- base::Sys.getenv() [13:14:17.256] } [13:14:17.256] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:14:17.256] future.globals.maxSize = NULL, future.globals.method = NULL, [13:14:17.256] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:14:17.256] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:14:17.256] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:14:17.256] future.stdout.windows.reencode = NULL, width = 80L) [13:14:17.256] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:14:17.256] base::names(...future.oldOptions)) [13:14:17.256] } [13:14:17.256] if (FALSE) { [13:14:17.256] } [13:14:17.256] else { [13:14:17.256] if (TRUE) { [13:14:17.256] ...future.stdout <- base::rawConnection(base::raw(0L), [13:14:17.256] open = "w") [13:14:17.256] } [13:14:17.256] else { [13:14:17.256] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:14:17.256] windows = "NUL", "/dev/null"), open = "w") [13:14:17.256] } [13:14:17.256] base::sink(...future.stdout, type = "output", split = FALSE) [13:14:17.256] base::on.exit(if (!base::is.null(...future.stdout)) { [13:14:17.256] base::sink(type = "output", split = FALSE) [13:14:17.256] base::close(...future.stdout) [13:14:17.256] }, add = TRUE) [13:14:17.256] } [13:14:17.256] ...future.frame <- base::sys.nframe() [13:14:17.256] ...future.conditions <- base::list() [13:14:17.256] ...future.rng <- base::globalenv()$.Random.seed [13:14:17.256] if (FALSE) { [13:14:17.256] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:14:17.256] "...future.value", "...future.globalenv.names", ".Random.seed") [13:14:17.256] } [13:14:17.256] ...future.result <- base::tryCatch({ [13:14:17.256] base::withCallingHandlers({ [13:14:17.256] ...future.value <- base::withVisible(base::local({ [13:14:17.256] ...future.makeSendCondition <- local({ [13:14:17.256] sendCondition <- NULL [13:14:17.256] function(frame = 1L) { [13:14:17.256] if (is.function(sendCondition)) [13:14:17.256] return(sendCondition) [13:14:17.256] ns <- getNamespace("parallel") [13:14:17.256] if (exists("sendData", mode = "function", [13:14:17.256] envir = ns)) { [13:14:17.256] parallel_sendData <- get("sendData", mode = "function", [13:14:17.256] envir = ns) [13:14:17.256] envir <- sys.frame(frame) [13:14:17.256] master <- NULL [13:14:17.256] while (!identical(envir, .GlobalEnv) && [13:14:17.256] !identical(envir, emptyenv())) { [13:14:17.256] if (exists("master", mode = "list", envir = envir, [13:14:17.256] inherits = FALSE)) { [13:14:17.256] master <- get("master", mode = "list", [13:14:17.256] envir = envir, inherits = FALSE) [13:14:17.256] if (inherits(master, c("SOCKnode", [13:14:17.256] "SOCK0node"))) { [13:14:17.256] sendCondition <<- function(cond) { [13:14:17.256] data <- list(type = "VALUE", value = cond, [13:14:17.256] success = TRUE) [13:14:17.256] parallel_sendData(master, data) [13:14:17.256] } [13:14:17.256] return(sendCondition) [13:14:17.256] } [13:14:17.256] } [13:14:17.256] frame <- frame + 1L [13:14:17.256] envir <- sys.frame(frame) [13:14:17.256] } [13:14:17.256] } [13:14:17.256] sendCondition <<- function(cond) NULL [13:14:17.256] } [13:14:17.256] }) [13:14:17.256] withCallingHandlers({ [13:14:17.256] NA [13:14:17.256] }, immediateCondition = function(cond) { [13:14:17.256] sendCondition <- ...future.makeSendCondition() [13:14:17.256] sendCondition(cond) [13:14:17.256] muffleCondition <- function (cond, pattern = "^muffle") [13:14:17.256] { [13:14:17.256] inherits <- base::inherits [13:14:17.256] invokeRestart <- base::invokeRestart [13:14:17.256] is.null <- base::is.null [13:14:17.256] muffled <- FALSE [13:14:17.256] if (inherits(cond, "message")) { [13:14:17.256] muffled <- grepl(pattern, "muffleMessage") [13:14:17.256] if (muffled) [13:14:17.256] invokeRestart("muffleMessage") [13:14:17.256] } [13:14:17.256] else if (inherits(cond, "warning")) { [13:14:17.256] muffled <- grepl(pattern, "muffleWarning") [13:14:17.256] if (muffled) [13:14:17.256] invokeRestart("muffleWarning") [13:14:17.256] } [13:14:17.256] else if (inherits(cond, "condition")) { [13:14:17.256] if (!is.null(pattern)) { [13:14:17.256] computeRestarts <- base::computeRestarts [13:14:17.256] grepl <- base::grepl [13:14:17.256] restarts <- computeRestarts(cond) [13:14:17.256] for (restart in restarts) { [13:14:17.256] name <- restart$name [13:14:17.256] if (is.null(name)) [13:14:17.256] next [13:14:17.256] if (!grepl(pattern, name)) [13:14:17.256] next [13:14:17.256] invokeRestart(restart) [13:14:17.256] muffled <- TRUE [13:14:17.256] break [13:14:17.256] } [13:14:17.256] } [13:14:17.256] } [13:14:17.256] invisible(muffled) [13:14:17.256] } [13:14:17.256] muffleCondition(cond) [13:14:17.256] }) [13:14:17.256] })) [13:14:17.256] future::FutureResult(value = ...future.value$value, [13:14:17.256] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:14:17.256] ...future.rng), globalenv = if (FALSE) [13:14:17.256] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:14:17.256] ...future.globalenv.names)) [13:14:17.256] else NULL, started = ...future.startTime, version = "1.8") [13:14:17.256] }, condition = base::local({ [13:14:17.256] c <- base::c [13:14:17.256] inherits <- base::inherits [13:14:17.256] invokeRestart <- base::invokeRestart [13:14:17.256] length <- base::length [13:14:17.256] list <- base::list [13:14:17.256] seq.int <- base::seq.int [13:14:17.256] signalCondition <- base::signalCondition [13:14:17.256] sys.calls <- base::sys.calls [13:14:17.256] `[[` <- base::`[[` [13:14:17.256] `+` <- base::`+` [13:14:17.256] `<<-` <- base::`<<-` [13:14:17.256] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:14:17.256] calls[seq.int(from = from + 12L, to = length(calls) - [13:14:17.256] 3L)] [13:14:17.256] } [13:14:17.256] function(cond) { [13:14:17.256] is_error <- inherits(cond, "error") [13:14:17.256] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:14:17.256] NULL) [13:14:17.256] if (is_error) { [13:14:17.256] sessionInformation <- function() { [13:14:17.256] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:14:17.256] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:14:17.256] search = base::search(), system = base::Sys.info()) [13:14:17.256] } [13:14:17.256] ...future.conditions[[length(...future.conditions) + [13:14:17.256] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:14:17.256] cond$call), session = sessionInformation(), [13:14:17.256] timestamp = base::Sys.time(), signaled = 0L) [13:14:17.256] signalCondition(cond) [13:14:17.256] } [13:14:17.256] else if (!ignore && TRUE && inherits(cond, c("condition", [13:14:17.256] "immediateCondition"))) { [13:14:17.256] signal <- TRUE && inherits(cond, "immediateCondition") [13:14:17.256] ...future.conditions[[length(...future.conditions) + [13:14:17.256] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:14:17.256] if (TRUE && !signal) { [13:14:17.256] muffleCondition <- function (cond, pattern = "^muffle") [13:14:17.256] { [13:14:17.256] inherits <- base::inherits [13:14:17.256] invokeRestart <- base::invokeRestart [13:14:17.256] is.null <- base::is.null [13:14:17.256] muffled <- FALSE [13:14:17.256] if (inherits(cond, "message")) { [13:14:17.256] muffled <- grepl(pattern, "muffleMessage") [13:14:17.256] if (muffled) [13:14:17.256] invokeRestart("muffleMessage") [13:14:17.256] } [13:14:17.256] else if (inherits(cond, "warning")) { [13:14:17.256] muffled <- grepl(pattern, "muffleWarning") [13:14:17.256] if (muffled) [13:14:17.256] invokeRestart("muffleWarning") [13:14:17.256] } [13:14:17.256] else if (inherits(cond, "condition")) { [13:14:17.256] if (!is.null(pattern)) { [13:14:17.256] computeRestarts <- base::computeRestarts [13:14:17.256] grepl <- base::grepl [13:14:17.256] restarts <- computeRestarts(cond) [13:14:17.256] for (restart in restarts) { [13:14:17.256] name <- restart$name [13:14:17.256] if (is.null(name)) [13:14:17.256] next [13:14:17.256] if (!grepl(pattern, name)) [13:14:17.256] next [13:14:17.256] invokeRestart(restart) [13:14:17.256] muffled <- TRUE [13:14:17.256] break [13:14:17.256] } [13:14:17.256] } [13:14:17.256] } [13:14:17.256] invisible(muffled) [13:14:17.256] } [13:14:17.256] muffleCondition(cond, pattern = "^muffle") [13:14:17.256] } [13:14:17.256] } [13:14:17.256] else { [13:14:17.256] if (TRUE) { [13:14:17.256] muffleCondition <- function (cond, pattern = "^muffle") [13:14:17.256] { [13:14:17.256] inherits <- base::inherits [13:14:17.256] invokeRestart <- base::invokeRestart [13:14:17.256] is.null <- base::is.null [13:14:17.256] muffled <- FALSE [13:14:17.256] if (inherits(cond, "message")) { [13:14:17.256] muffled <- grepl(pattern, "muffleMessage") [13:14:17.256] if (muffled) [13:14:17.256] invokeRestart("muffleMessage") [13:14:17.256] } [13:14:17.256] else if (inherits(cond, "warning")) { [13:14:17.256] muffled <- grepl(pattern, "muffleWarning") [13:14:17.256] if (muffled) [13:14:17.256] invokeRestart("muffleWarning") [13:14:17.256] } [13:14:17.256] else if (inherits(cond, "condition")) { [13:14:17.256] if (!is.null(pattern)) { [13:14:17.256] computeRestarts <- base::computeRestarts [13:14:17.256] grepl <- base::grepl [13:14:17.256] restarts <- computeRestarts(cond) [13:14:17.256] for (restart in restarts) { [13:14:17.256] name <- restart$name [13:14:17.256] if (is.null(name)) [13:14:17.256] next [13:14:17.256] if (!grepl(pattern, name)) [13:14:17.256] next [13:14:17.256] invokeRestart(restart) [13:14:17.256] muffled <- TRUE [13:14:17.256] break [13:14:17.256] } [13:14:17.256] } [13:14:17.256] } [13:14:17.256] invisible(muffled) [13:14:17.256] } [13:14:17.256] muffleCondition(cond, pattern = "^muffle") [13:14:17.256] } [13:14:17.256] } [13:14:17.256] } [13:14:17.256] })) [13:14:17.256] }, error = function(ex) { [13:14:17.256] base::structure(base::list(value = NULL, visible = NULL, [13:14:17.256] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:14:17.256] ...future.rng), started = ...future.startTime, [13:14:17.256] finished = Sys.time(), session_uuid = NA_character_, [13:14:17.256] version = "1.8"), class = "FutureResult") [13:14:17.256] }, finally = { [13:14:17.256] if (!identical(...future.workdir, getwd())) [13:14:17.256] setwd(...future.workdir) [13:14:17.256] { [13:14:17.256] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:14:17.256] ...future.oldOptions$nwarnings <- NULL [13:14:17.256] } [13:14:17.256] base::options(...future.oldOptions) [13:14:17.256] if (.Platform$OS.type == "windows") { [13:14:17.256] old_names <- names(...future.oldEnvVars) [13:14:17.256] envs <- base::Sys.getenv() [13:14:17.256] names <- names(envs) [13:14:17.256] common <- intersect(names, old_names) [13:14:17.256] added <- setdiff(names, old_names) [13:14:17.256] removed <- setdiff(old_names, names) [13:14:17.256] changed <- common[...future.oldEnvVars[common] != [13:14:17.256] envs[common]] [13:14:17.256] NAMES <- toupper(changed) [13:14:17.256] args <- list() [13:14:17.256] for (kk in seq_along(NAMES)) { [13:14:17.256] name <- changed[[kk]] [13:14:17.256] NAME <- NAMES[[kk]] [13:14:17.256] if (name != NAME && is.element(NAME, old_names)) [13:14:17.256] next [13:14:17.256] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:17.256] } [13:14:17.256] NAMES <- toupper(added) [13:14:17.256] for (kk in seq_along(NAMES)) { [13:14:17.256] name <- added[[kk]] [13:14:17.256] NAME <- NAMES[[kk]] [13:14:17.256] if (name != NAME && is.element(NAME, old_names)) [13:14:17.256] next [13:14:17.256] args[[name]] <- "" [13:14:17.256] } [13:14:17.256] NAMES <- toupper(removed) [13:14:17.256] for (kk in seq_along(NAMES)) { [13:14:17.256] name <- removed[[kk]] [13:14:17.256] NAME <- NAMES[[kk]] [13:14:17.256] if (name != NAME && is.element(NAME, old_names)) [13:14:17.256] next [13:14:17.256] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:17.256] } [13:14:17.256] if (length(args) > 0) [13:14:17.256] base::do.call(base::Sys.setenv, args = args) [13:14:17.256] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:14:17.256] } [13:14:17.256] else { [13:14:17.256] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:14:17.256] } [13:14:17.256] { [13:14:17.256] if (base::length(...future.futureOptionsAdded) > [13:14:17.256] 0L) { [13:14:17.256] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:14:17.256] base::names(opts) <- ...future.futureOptionsAdded [13:14:17.256] base::options(opts) [13:14:17.256] } [13:14:17.256] { [13:14:17.256] { [13:14:17.256] base::options(mc.cores = ...future.mc.cores.old) [13:14:17.256] NULL [13:14:17.256] } [13:14:17.256] options(future.plan = NULL) [13:14:17.256] if (is.na(NA_character_)) [13:14:17.256] Sys.unsetenv("R_FUTURE_PLAN") [13:14:17.256] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:14:17.256] future::plan(list(function (..., workers = availableCores(), [13:14:17.256] lazy = FALSE, rscript_libs = .libPaths(), [13:14:17.256] envir = parent.frame()) [13:14:17.256] { [13:14:17.256] if (is.function(workers)) [13:14:17.256] workers <- workers() [13:14:17.256] workers <- structure(as.integer(workers), [13:14:17.256] class = class(workers)) [13:14:17.256] stop_if_not(length(workers) == 1, is.finite(workers), [13:14:17.256] workers >= 1) [13:14:17.256] if (workers == 1L && !inherits(workers, "AsIs")) { [13:14:17.256] return(sequential(..., lazy = TRUE, envir = envir)) [13:14:17.256] } [13:14:17.256] future <- MultisessionFuture(..., workers = workers, [13:14:17.256] lazy = lazy, rscript_libs = rscript_libs, [13:14:17.256] envir = envir) [13:14:17.256] if (!future$lazy) [13:14:17.256] future <- run(future) [13:14:17.256] invisible(future) [13:14:17.256] }), .cleanup = FALSE, .init = FALSE) [13:14:17.256] } [13:14:17.256] } [13:14:17.256] } [13:14:17.256] }) [13:14:17.256] if (TRUE) { [13:14:17.256] base::sink(type = "output", split = FALSE) [13:14:17.256] if (TRUE) { [13:14:17.256] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:14:17.256] } [13:14:17.256] else { [13:14:17.256] ...future.result["stdout"] <- base::list(NULL) [13:14:17.256] } [13:14:17.256] base::close(...future.stdout) [13:14:17.256] ...future.stdout <- NULL [13:14:17.256] } [13:14:17.256] ...future.result$conditions <- ...future.conditions [13:14:17.256] ...future.result$finished <- base::Sys.time() [13:14:17.256] ...future.result [13:14:17.256] } [13:14:17.334] MultisessionFuture started [13:14:17.334] result() for ClusterFuture ... [13:14:17.335] receiveMessageFromWorker() for ClusterFuture ... [13:14:17.335] - Validating connection of MultisessionFuture [13:14:17.391] - received message: FutureResult [13:14:17.392] - Received FutureResult [13:14:17.396] - Erased future from FutureRegistry [13:14:17.396] result() for ClusterFuture ... [13:14:17.396] - result already collected: FutureResult [13:14:17.396] result() for ClusterFuture ... done [13:14:17.397] receiveMessageFromWorker() for ClusterFuture ... done [13:14:17.397] result() for ClusterFuture ... done [13:14:17.397] result() for ClusterFuture ... [13:14:17.397] - result already collected: FutureResult [13:14:17.397] result() for ClusterFuture ... done [13:14:17.398] plan(): plan_init() of 'multisession', 'cluster', 'multiprocess', 'future', 'function' ... DONE [13:14:17.400] plan(): nbrOfWorkers() = 2 logi(0) logi(0) logi(0) logi(0) logi(0) int(0) int(0) Named chr [1:2] "integer" "character" - attr(*, "names")= chr [1:2] "x" "y" [13:14:17.404] future_lapply() ... [13:14:17.411] Number of chunks: 2 [13:14:17.411] getGlobalsAndPackagesXApply() ... [13:14:17.411] - future.globals: TRUE [13:14:17.411] getGlobalsAndPackages() ... [13:14:17.412] Searching for globals... [13:14:17.416] - globals found: [16] 'FUN', '{', '<-', 'x_FUN', 'if', '!=', 'length', 'times', 'stopf', 'stop_if_not', 'all', '==', 'dim', '%in%', 'typeof', 'valid_types' [13:14:17.417] Searching for globals ... DONE [13:14:17.417] Resolving globals: FALSE [13:14:17.418] The total size of the 7 globals is 92.00 KiB (94208 bytes) [13:14:17.419] The total size of the 7 globals exported for future expression ('FUN()') is 92.00 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). The three largest globals are 'stop_if_not' (44.12 KiB of class 'function'), 'stopf' (26.43 KiB of class 'function') and 'FUN' (21.22 KiB of class 'function') [13:14:17.419] - globals: [7] 'FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types' [13:14:17.419] - packages: [1] 'future.apply' [13:14:17.420] getGlobalsAndPackages() ... DONE [13:14:17.420] - globals found/used: [n=7] 'FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types' [13:14:17.420] - needed namespaces: [n=1] 'future.apply' [13:14:17.420] Finding globals ... DONE [13:14:17.420] - use_args: TRUE [13:14:17.421] - Getting '...' globals ... [13:14:17.421] resolve() on list ... [13:14:17.421] recursive: 0 [13:14:17.421] length: 1 [13:14:17.422] elements: '...' [13:14:17.422] length: 0 (resolved future 1) [13:14:17.422] resolve() on list ... DONE [13:14:17.422] - '...' content: [n=0] [13:14:17.422] List of 1 [13:14:17.422] $ ...: list() [13:14:17.422] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:14:17.422] - attr(*, "where")=List of 1 [13:14:17.422] ..$ ...: [13:14:17.422] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:14:17.422] - attr(*, "resolved")= logi TRUE [13:14:17.422] - attr(*, "total_size")= num NA [13:14:17.426] - Getting '...' globals ... DONE [13:14:17.426] Globals to be used in all futures (chunks): [n=8] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...' [13:14:17.427] List of 8 [13:14:17.427] $ ...future.FUN:function (x, ...) [13:14:17.427] $ x_FUN :function (x) [13:14:17.427] $ times : int 1 [13:14:17.427] $ stopf :function (fmt, ..., call. = TRUE, domain = NULL) [13:14:17.427] $ stop_if_not :function (...) [13:14:17.427] $ dim : NULL [13:14:17.427] $ valid_types : chr "character" [13:14:17.427] $ ... : list() [13:14:17.427] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:14:17.427] - attr(*, "where")=List of 8 [13:14:17.427] ..$ ...future.FUN: [13:14:17.427] ..$ x_FUN : [13:14:17.427] ..$ times : [13:14:17.427] ..$ stopf : [13:14:17.427] ..$ stop_if_not : [13:14:17.427] ..$ dim : [13:14:17.427] ..$ valid_types : [13:14:17.427] ..$ ... : [13:14:17.427] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:14:17.427] - attr(*, "resolved")= logi FALSE [13:14:17.427] - attr(*, "total_size")= num 94208 [13:14:17.434] Packages to be attached in all futures: [n=1] 'future.apply' [13:14:17.435] getGlobalsAndPackagesXApply() ... DONE [13:14:17.435] Number of futures (= number of chunks): 2 [13:14:17.435] Launching 2 futures (chunks) ... [13:14:17.435] Chunk #1 of 2 ... [13:14:17.436] - Finding globals in 'X' for chunk #1 ... [13:14:17.436] getGlobalsAndPackages() ... [13:14:17.436] Searching for globals... [13:14:17.436] [13:14:17.437] Searching for globals ... DONE [13:14:17.437] - globals: [0] [13:14:17.437] getGlobalsAndPackages() ... DONE [13:14:17.437] + additional globals found: [n=0] [13:14:17.437] + additional namespaces needed: [n=0] [13:14:17.437] - Finding globals in 'X' for chunk #1 ... DONE [13:14:17.438] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:14:17.438] - seeds: [13:14:17.438] - All globals exported: [n=11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:17.438] getGlobalsAndPackages() ... [13:14:17.438] - globals passed as-is: [11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:17.439] Resolving globals: FALSE [13:14:17.439] Tweak future expression to call with '...' arguments ... [13:14:17.439] { [13:14:17.439] do.call(function(...) { [13:14:17.439] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:17.439] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:17.439] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:17.439] on.exit(options(oopts), add = TRUE) [13:14:17.439] } [13:14:17.439] { [13:14:17.439] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:17.439] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:17.439] ...future.FUN(...future.X_jj, ...) [13:14:17.439] }) [13:14:17.439] } [13:14:17.439] }, args = future.call.arguments) [13:14:17.439] } [13:14:17.440] Tweak future expression to call with '...' arguments ... DONE [13:14:17.440] - globals: [11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:17.441] - packages: [1] 'future.apply' [13:14:17.441] getGlobalsAndPackages() ... DONE [13:14:17.441] run() for 'Future' ... [13:14:17.441] - state: 'created' [13:14:17.442] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:14:17.457] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:14:17.457] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:14:17.457] - Field: 'node' [13:14:17.457] - Field: 'label' [13:14:17.457] - Field: 'local' [13:14:17.458] - Field: 'owner' [13:14:17.458] - Field: 'envir' [13:14:17.458] - Field: 'workers' [13:14:17.458] - Field: 'packages' [13:14:17.458] - Field: 'gc' [13:14:17.459] - Field: 'conditions' [13:14:17.459] - Field: 'persistent' [13:14:17.459] - Field: 'expr' [13:14:17.459] - Field: 'uuid' [13:14:17.459] - Field: 'seed' [13:14:17.460] - Field: 'version' [13:14:17.460] - Field: 'result' [13:14:17.460] - Field: 'asynchronous' [13:14:17.460] - Field: 'calls' [13:14:17.461] - Field: 'globals' [13:14:17.461] - Field: 'stdout' [13:14:17.461] - Field: 'earlySignal' [13:14:17.461] - Field: 'lazy' [13:14:17.461] - Field: 'state' [13:14:17.462] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:14:17.462] - Launch lazy future ... [13:14:17.462] Packages needed by the future expression (n = 1): 'future.apply' [13:14:17.462] Packages needed by future strategies (n = 0): [13:14:17.463] { [13:14:17.463] { [13:14:17.463] { [13:14:17.463] ...future.startTime <- base::Sys.time() [13:14:17.463] { [13:14:17.463] { [13:14:17.463] { [13:14:17.463] { [13:14:17.463] { [13:14:17.463] base::local({ [13:14:17.463] has_future <- base::requireNamespace("future", [13:14:17.463] quietly = TRUE) [13:14:17.463] if (has_future) { [13:14:17.463] ns <- base::getNamespace("future") [13:14:17.463] version <- ns[[".package"]][["version"]] [13:14:17.463] if (is.null(version)) [13:14:17.463] version <- utils::packageVersion("future") [13:14:17.463] } [13:14:17.463] else { [13:14:17.463] version <- NULL [13:14:17.463] } [13:14:17.463] if (!has_future || version < "1.8.0") { [13:14:17.463] info <- base::c(r_version = base::gsub("R version ", [13:14:17.463] "", base::R.version$version.string), [13:14:17.463] platform = base::sprintf("%s (%s-bit)", [13:14:17.463] base::R.version$platform, 8 * [13:14:17.463] base::.Machine$sizeof.pointer), [13:14:17.463] os = base::paste(base::Sys.info()[base::c("sysname", [13:14:17.463] "release", "version")], collapse = " "), [13:14:17.463] hostname = base::Sys.info()[["nodename"]]) [13:14:17.463] info <- base::sprintf("%s: %s", base::names(info), [13:14:17.463] info) [13:14:17.463] info <- base::paste(info, collapse = "; ") [13:14:17.463] if (!has_future) { [13:14:17.463] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:14:17.463] info) [13:14:17.463] } [13:14:17.463] else { [13:14:17.463] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:14:17.463] info, version) [13:14:17.463] } [13:14:17.463] base::stop(msg) [13:14:17.463] } [13:14:17.463] }) [13:14:17.463] } [13:14:17.463] ...future.mc.cores.old <- base::getOption("mc.cores") [13:14:17.463] base::options(mc.cores = 1L) [13:14:17.463] } [13:14:17.463] base::local({ [13:14:17.463] for (pkg in "future.apply") { [13:14:17.463] base::loadNamespace(pkg) [13:14:17.463] base::library(pkg, character.only = TRUE) [13:14:17.463] } [13:14:17.463] }) [13:14:17.463] } [13:14:17.463] options(future.plan = NULL) [13:14:17.463] Sys.unsetenv("R_FUTURE_PLAN") [13:14:17.463] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:14:17.463] } [13:14:17.463] ...future.workdir <- getwd() [13:14:17.463] } [13:14:17.463] ...future.oldOptions <- base::as.list(base::.Options) [13:14:17.463] ...future.oldEnvVars <- base::Sys.getenv() [13:14:17.463] } [13:14:17.463] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:14:17.463] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:14:17.463] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:14:17.463] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:14:17.463] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:14:17.463] future.stdout.windows.reencode = NULL, width = 80L) [13:14:17.463] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:14:17.463] base::names(...future.oldOptions)) [13:14:17.463] } [13:14:17.463] if (FALSE) { [13:14:17.463] } [13:14:17.463] else { [13:14:17.463] if (TRUE) { [13:14:17.463] ...future.stdout <- base::rawConnection(base::raw(0L), [13:14:17.463] open = "w") [13:14:17.463] } [13:14:17.463] else { [13:14:17.463] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:14:17.463] windows = "NUL", "/dev/null"), open = "w") [13:14:17.463] } [13:14:17.463] base::sink(...future.stdout, type = "output", split = FALSE) [13:14:17.463] base::on.exit(if (!base::is.null(...future.stdout)) { [13:14:17.463] base::sink(type = "output", split = FALSE) [13:14:17.463] base::close(...future.stdout) [13:14:17.463] }, add = TRUE) [13:14:17.463] } [13:14:17.463] ...future.frame <- base::sys.nframe() [13:14:17.463] ...future.conditions <- base::list() [13:14:17.463] ...future.rng <- base::globalenv()$.Random.seed [13:14:17.463] if (FALSE) { [13:14:17.463] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:14:17.463] "...future.value", "...future.globalenv.names", ".Random.seed") [13:14:17.463] } [13:14:17.463] ...future.result <- base::tryCatch({ [13:14:17.463] base::withCallingHandlers({ [13:14:17.463] ...future.value <- base::withVisible(base::local({ [13:14:17.463] ...future.makeSendCondition <- local({ [13:14:17.463] sendCondition <- NULL [13:14:17.463] function(frame = 1L) { [13:14:17.463] if (is.function(sendCondition)) [13:14:17.463] return(sendCondition) [13:14:17.463] ns <- getNamespace("parallel") [13:14:17.463] if (exists("sendData", mode = "function", [13:14:17.463] envir = ns)) { [13:14:17.463] parallel_sendData <- get("sendData", mode = "function", [13:14:17.463] envir = ns) [13:14:17.463] envir <- sys.frame(frame) [13:14:17.463] master <- NULL [13:14:17.463] while (!identical(envir, .GlobalEnv) && [13:14:17.463] !identical(envir, emptyenv())) { [13:14:17.463] if (exists("master", mode = "list", envir = envir, [13:14:17.463] inherits = FALSE)) { [13:14:17.463] master <- get("master", mode = "list", [13:14:17.463] envir = envir, inherits = FALSE) [13:14:17.463] if (inherits(master, c("SOCKnode", [13:14:17.463] "SOCK0node"))) { [13:14:17.463] sendCondition <<- function(cond) { [13:14:17.463] data <- list(type = "VALUE", value = cond, [13:14:17.463] success = TRUE) [13:14:17.463] parallel_sendData(master, data) [13:14:17.463] } [13:14:17.463] return(sendCondition) [13:14:17.463] } [13:14:17.463] } [13:14:17.463] frame <- frame + 1L [13:14:17.463] envir <- sys.frame(frame) [13:14:17.463] } [13:14:17.463] } [13:14:17.463] sendCondition <<- function(cond) NULL [13:14:17.463] } [13:14:17.463] }) [13:14:17.463] withCallingHandlers({ [13:14:17.463] { [13:14:17.463] do.call(function(...) { [13:14:17.463] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:17.463] if (!identical(...future.globals.maxSize.org, [13:14:17.463] ...future.globals.maxSize)) { [13:14:17.463] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:17.463] on.exit(options(oopts), add = TRUE) [13:14:17.463] } [13:14:17.463] { [13:14:17.463] lapply(seq_along(...future.elements_ii), [13:14:17.463] FUN = function(jj) { [13:14:17.463] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:17.463] ...future.FUN(...future.X_jj, ...) [13:14:17.463] }) [13:14:17.463] } [13:14:17.463] }, args = future.call.arguments) [13:14:17.463] } [13:14:17.463] }, immediateCondition = function(cond) { [13:14:17.463] sendCondition <- ...future.makeSendCondition() [13:14:17.463] sendCondition(cond) [13:14:17.463] muffleCondition <- function (cond, pattern = "^muffle") [13:14:17.463] { [13:14:17.463] inherits <- base::inherits [13:14:17.463] invokeRestart <- base::invokeRestart [13:14:17.463] is.null <- base::is.null [13:14:17.463] muffled <- FALSE [13:14:17.463] if (inherits(cond, "message")) { [13:14:17.463] muffled <- grepl(pattern, "muffleMessage") [13:14:17.463] if (muffled) [13:14:17.463] invokeRestart("muffleMessage") [13:14:17.463] } [13:14:17.463] else if (inherits(cond, "warning")) { [13:14:17.463] muffled <- grepl(pattern, "muffleWarning") [13:14:17.463] if (muffled) [13:14:17.463] invokeRestart("muffleWarning") [13:14:17.463] } [13:14:17.463] else if (inherits(cond, "condition")) { [13:14:17.463] if (!is.null(pattern)) { [13:14:17.463] computeRestarts <- base::computeRestarts [13:14:17.463] grepl <- base::grepl [13:14:17.463] restarts <- computeRestarts(cond) [13:14:17.463] for (restart in restarts) { [13:14:17.463] name <- restart$name [13:14:17.463] if (is.null(name)) [13:14:17.463] next [13:14:17.463] if (!grepl(pattern, name)) [13:14:17.463] next [13:14:17.463] invokeRestart(restart) [13:14:17.463] muffled <- TRUE [13:14:17.463] break [13:14:17.463] } [13:14:17.463] } [13:14:17.463] } [13:14:17.463] invisible(muffled) [13:14:17.463] } [13:14:17.463] muffleCondition(cond) [13:14:17.463] }) [13:14:17.463] })) [13:14:17.463] future::FutureResult(value = ...future.value$value, [13:14:17.463] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:14:17.463] ...future.rng), globalenv = if (FALSE) [13:14:17.463] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:14:17.463] ...future.globalenv.names)) [13:14:17.463] else NULL, started = ...future.startTime, version = "1.8") [13:14:17.463] }, condition = base::local({ [13:14:17.463] c <- base::c [13:14:17.463] inherits <- base::inherits [13:14:17.463] invokeRestart <- base::invokeRestart [13:14:17.463] length <- base::length [13:14:17.463] list <- base::list [13:14:17.463] seq.int <- base::seq.int [13:14:17.463] signalCondition <- base::signalCondition [13:14:17.463] sys.calls <- base::sys.calls [13:14:17.463] `[[` <- base::`[[` [13:14:17.463] `+` <- base::`+` [13:14:17.463] `<<-` <- base::`<<-` [13:14:17.463] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:14:17.463] calls[seq.int(from = from + 12L, to = length(calls) - [13:14:17.463] 3L)] [13:14:17.463] } [13:14:17.463] function(cond) { [13:14:17.463] is_error <- inherits(cond, "error") [13:14:17.463] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:14:17.463] NULL) [13:14:17.463] if (is_error) { [13:14:17.463] sessionInformation <- function() { [13:14:17.463] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:14:17.463] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:14:17.463] search = base::search(), system = base::Sys.info()) [13:14:17.463] } [13:14:17.463] ...future.conditions[[length(...future.conditions) + [13:14:17.463] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:14:17.463] cond$call), session = sessionInformation(), [13:14:17.463] timestamp = base::Sys.time(), signaled = 0L) [13:14:17.463] signalCondition(cond) [13:14:17.463] } [13:14:17.463] else if (!ignore && TRUE && inherits(cond, c("condition", [13:14:17.463] "immediateCondition"))) { [13:14:17.463] signal <- TRUE && inherits(cond, "immediateCondition") [13:14:17.463] ...future.conditions[[length(...future.conditions) + [13:14:17.463] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:14:17.463] if (TRUE && !signal) { [13:14:17.463] muffleCondition <- function (cond, pattern = "^muffle") [13:14:17.463] { [13:14:17.463] inherits <- base::inherits [13:14:17.463] invokeRestart <- base::invokeRestart [13:14:17.463] is.null <- base::is.null [13:14:17.463] muffled <- FALSE [13:14:17.463] if (inherits(cond, "message")) { [13:14:17.463] muffled <- grepl(pattern, "muffleMessage") [13:14:17.463] if (muffled) [13:14:17.463] invokeRestart("muffleMessage") [13:14:17.463] } [13:14:17.463] else if (inherits(cond, "warning")) { [13:14:17.463] muffled <- grepl(pattern, "muffleWarning") [13:14:17.463] if (muffled) [13:14:17.463] invokeRestart("muffleWarning") [13:14:17.463] } [13:14:17.463] else if (inherits(cond, "condition")) { [13:14:17.463] if (!is.null(pattern)) { [13:14:17.463] computeRestarts <- base::computeRestarts [13:14:17.463] grepl <- base::grepl [13:14:17.463] restarts <- computeRestarts(cond) [13:14:17.463] for (restart in restarts) { [13:14:17.463] name <- restart$name [13:14:17.463] if (is.null(name)) [13:14:17.463] next [13:14:17.463] if (!grepl(pattern, name)) [13:14:17.463] next [13:14:17.463] invokeRestart(restart) [13:14:17.463] muffled <- TRUE [13:14:17.463] break [13:14:17.463] } [13:14:17.463] } [13:14:17.463] } [13:14:17.463] invisible(muffled) [13:14:17.463] } [13:14:17.463] muffleCondition(cond, pattern = "^muffle") [13:14:17.463] } [13:14:17.463] } [13:14:17.463] else { [13:14:17.463] if (TRUE) { [13:14:17.463] muffleCondition <- function (cond, pattern = "^muffle") [13:14:17.463] { [13:14:17.463] inherits <- base::inherits [13:14:17.463] invokeRestart <- base::invokeRestart [13:14:17.463] is.null <- base::is.null [13:14:17.463] muffled <- FALSE [13:14:17.463] if (inherits(cond, "message")) { [13:14:17.463] muffled <- grepl(pattern, "muffleMessage") [13:14:17.463] if (muffled) [13:14:17.463] invokeRestart("muffleMessage") [13:14:17.463] } [13:14:17.463] else if (inherits(cond, "warning")) { [13:14:17.463] muffled <- grepl(pattern, "muffleWarning") [13:14:17.463] if (muffled) [13:14:17.463] invokeRestart("muffleWarning") [13:14:17.463] } [13:14:17.463] else if (inherits(cond, "condition")) { [13:14:17.463] if (!is.null(pattern)) { [13:14:17.463] computeRestarts <- base::computeRestarts [13:14:17.463] grepl <- base::grepl [13:14:17.463] restarts <- computeRestarts(cond) [13:14:17.463] for (restart in restarts) { [13:14:17.463] name <- restart$name [13:14:17.463] if (is.null(name)) [13:14:17.463] next [13:14:17.463] if (!grepl(pattern, name)) [13:14:17.463] next [13:14:17.463] invokeRestart(restart) [13:14:17.463] muffled <- TRUE [13:14:17.463] break [13:14:17.463] } [13:14:17.463] } [13:14:17.463] } [13:14:17.463] invisible(muffled) [13:14:17.463] } [13:14:17.463] muffleCondition(cond, pattern = "^muffle") [13:14:17.463] } [13:14:17.463] } [13:14:17.463] } [13:14:17.463] })) [13:14:17.463] }, error = function(ex) { [13:14:17.463] base::structure(base::list(value = NULL, visible = NULL, [13:14:17.463] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:14:17.463] ...future.rng), started = ...future.startTime, [13:14:17.463] finished = Sys.time(), session_uuid = NA_character_, [13:14:17.463] version = "1.8"), class = "FutureResult") [13:14:17.463] }, finally = { [13:14:17.463] if (!identical(...future.workdir, getwd())) [13:14:17.463] setwd(...future.workdir) [13:14:17.463] { [13:14:17.463] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:14:17.463] ...future.oldOptions$nwarnings <- NULL [13:14:17.463] } [13:14:17.463] base::options(...future.oldOptions) [13:14:17.463] if (.Platform$OS.type == "windows") { [13:14:17.463] old_names <- names(...future.oldEnvVars) [13:14:17.463] envs <- base::Sys.getenv() [13:14:17.463] names <- names(envs) [13:14:17.463] common <- intersect(names, old_names) [13:14:17.463] added <- setdiff(names, old_names) [13:14:17.463] removed <- setdiff(old_names, names) [13:14:17.463] changed <- common[...future.oldEnvVars[common] != [13:14:17.463] envs[common]] [13:14:17.463] NAMES <- toupper(changed) [13:14:17.463] args <- list() [13:14:17.463] for (kk in seq_along(NAMES)) { [13:14:17.463] name <- changed[[kk]] [13:14:17.463] NAME <- NAMES[[kk]] [13:14:17.463] if (name != NAME && is.element(NAME, old_names)) [13:14:17.463] next [13:14:17.463] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:17.463] } [13:14:17.463] NAMES <- toupper(added) [13:14:17.463] for (kk in seq_along(NAMES)) { [13:14:17.463] name <- added[[kk]] [13:14:17.463] NAME <- NAMES[[kk]] [13:14:17.463] if (name != NAME && is.element(NAME, old_names)) [13:14:17.463] next [13:14:17.463] args[[name]] <- "" [13:14:17.463] } [13:14:17.463] NAMES <- toupper(removed) [13:14:17.463] for (kk in seq_along(NAMES)) { [13:14:17.463] name <- removed[[kk]] [13:14:17.463] NAME <- NAMES[[kk]] [13:14:17.463] if (name != NAME && is.element(NAME, old_names)) [13:14:17.463] next [13:14:17.463] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:17.463] } [13:14:17.463] if (length(args) > 0) [13:14:17.463] base::do.call(base::Sys.setenv, args = args) [13:14:17.463] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:14:17.463] } [13:14:17.463] else { [13:14:17.463] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:14:17.463] } [13:14:17.463] { [13:14:17.463] if (base::length(...future.futureOptionsAdded) > [13:14:17.463] 0L) { [13:14:17.463] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:14:17.463] base::names(opts) <- ...future.futureOptionsAdded [13:14:17.463] base::options(opts) [13:14:17.463] } [13:14:17.463] { [13:14:17.463] { [13:14:17.463] base::options(mc.cores = ...future.mc.cores.old) [13:14:17.463] NULL [13:14:17.463] } [13:14:17.463] options(future.plan = NULL) [13:14:17.463] if (is.na(NA_character_)) [13:14:17.463] Sys.unsetenv("R_FUTURE_PLAN") [13:14:17.463] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:14:17.463] future::plan(list(function (..., workers = availableCores(), [13:14:17.463] lazy = FALSE, rscript_libs = .libPaths(), [13:14:17.463] envir = parent.frame()) [13:14:17.463] { [13:14:17.463] if (is.function(workers)) [13:14:17.463] workers <- workers() [13:14:17.463] workers <- structure(as.integer(workers), [13:14:17.463] class = class(workers)) [13:14:17.463] stop_if_not(length(workers) == 1, is.finite(workers), [13:14:17.463] workers >= 1) [13:14:17.463] if (workers == 1L && !inherits(workers, "AsIs")) { [13:14:17.463] return(sequential(..., lazy = TRUE, envir = envir)) [13:14:17.463] } [13:14:17.463] future <- MultisessionFuture(..., workers = workers, [13:14:17.463] lazy = lazy, rscript_libs = rscript_libs, [13:14:17.463] envir = envir) [13:14:17.463] if (!future$lazy) [13:14:17.463] future <- run(future) [13:14:17.463] invisible(future) [13:14:17.463] }), .cleanup = FALSE, .init = FALSE) [13:14:17.463] } [13:14:17.463] } [13:14:17.463] } [13:14:17.463] }) [13:14:17.463] if (TRUE) { [13:14:17.463] base::sink(type = "output", split = FALSE) [13:14:17.463] if (TRUE) { [13:14:17.463] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:14:17.463] } [13:14:17.463] else { [13:14:17.463] ...future.result["stdout"] <- base::list(NULL) [13:14:17.463] } [13:14:17.463] base::close(...future.stdout) [13:14:17.463] ...future.stdout <- NULL [13:14:17.463] } [13:14:17.463] ...future.result$conditions <- ...future.conditions [13:14:17.463] ...future.result$finished <- base::Sys.time() [13:14:17.463] ...future.result [13:14:17.463] } [13:14:17.469] Exporting 11 global objects (92.00 KiB) to cluster node #1 ... [13:14:17.469] Exporting '...future.FUN' (21.22 KiB) to cluster node #1 ... [13:14:17.477] Exporting '...future.FUN' (21.22 KiB) to cluster node #1 ... DONE [13:14:17.477] Exporting 'x_FUN' (56 bytes) to cluster node #1 ... [13:14:17.478] Exporting 'x_FUN' (56 bytes) to cluster node #1 ... DONE [13:14:17.478] Exporting 'times' (56 bytes) to cluster node #1 ... [13:14:17.479] Exporting 'times' (56 bytes) to cluster node #1 ... DONE [13:14:17.479] Exporting 'stopf' (26.43 KiB) to cluster node #1 ... [13:14:17.479] Exporting 'stopf' (26.43 KiB) to cluster node #1 ... DONE [13:14:17.480] Exporting 'stop_if_not' (44.12 KiB) to cluster node #1 ... [13:14:17.480] Exporting 'stop_if_not' (44.12 KiB) to cluster node #1 ... DONE [13:14:17.480] Exporting 'dim' (0 bytes) to cluster node #1 ... [13:14:17.481] Exporting 'dim' (0 bytes) to cluster node #1 ... DONE [13:14:17.481] Exporting 'valid_types' (120 bytes) to cluster node #1 ... [13:14:17.481] Exporting 'valid_types' (120 bytes) to cluster node #1 ... DONE [13:14:17.482] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... [13:14:17.482] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... DONE [13:14:17.482] Exporting '...future.elements_ii' (96 bytes) to cluster node #1 ... [13:14:17.483] Exporting '...future.elements_ii' (96 bytes) to cluster node #1 ... DONE [13:14:17.483] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:14:17.483] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:14:17.484] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:14:17.484] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:14:17.484] Exporting 11 global objects (92.00 KiB) to cluster node #1 ... DONE [13:14:17.485] MultisessionFuture started [13:14:17.485] - Launch lazy future ... done [13:14:17.485] run() for 'MultisessionFuture' ... done [13:14:17.486] Created future: [13:14:17.513] receiveMessageFromWorker() for ClusterFuture ... [13:14:17.513] - Validating connection of MultisessionFuture [13:14:17.514] - received message: FutureResult [13:14:17.514] - Received FutureResult [13:14:17.514] - Erased future from FutureRegistry [13:14:17.514] result() for ClusterFuture ... [13:14:17.514] - result already collected: FutureResult [13:14:17.515] result() for ClusterFuture ... done [13:14:17.515] receiveMessageFromWorker() for ClusterFuture ... done [13:14:17.486] MultisessionFuture: [13:14:17.486] Label: 'future_vapply-1' [13:14:17.486] Expression: [13:14:17.486] { [13:14:17.486] do.call(function(...) { [13:14:17.486] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:17.486] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:17.486] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:17.486] on.exit(options(oopts), add = TRUE) [13:14:17.486] } [13:14:17.486] { [13:14:17.486] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:17.486] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:17.486] ...future.FUN(...future.X_jj, ...) [13:14:17.486] }) [13:14:17.486] } [13:14:17.486] }, args = future.call.arguments) [13:14:17.486] } [13:14:17.486] Lazy evaluation: FALSE [13:14:17.486] Asynchronous evaluation: TRUE [13:14:17.486] Local evaluation: TRUE [13:14:17.486] Environment: R_GlobalEnv [13:14:17.486] Capture standard output: TRUE [13:14:17.486] Capture condition classes: 'condition' (excluding 'nothing') [13:14:17.486] Globals: 11 objects totaling 92.09 KiB (function '...future.FUN' of 21.22 KiB, function 'x_FUN' of 56 bytes, integer 'times' of 56 bytes, function 'stopf' of 26.43 KiB, function 'stop_if_not' of 44.12 KiB, ...) [13:14:17.486] Packages: 1 packages ('future.apply') [13:14:17.486] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:14:17.486] Resolved: TRUE [13:14:17.486] Value: [13:14:17.486] Conditions captured: [13:14:17.486] Early signaling: FALSE [13:14:17.486] Owner process: 1bb7d580-628d-c90d-e38a-66de485868c4 [13:14:17.486] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:14:17.515] Chunk #1 of 2 ... DONE [13:14:17.515] Chunk #2 of 2 ... [13:14:17.516] - Finding globals in 'X' for chunk #2 ... [13:14:17.516] getGlobalsAndPackages() ... [13:14:17.516] Searching for globals... [13:14:17.516] [13:14:17.517] Searching for globals ... DONE [13:14:17.517] - globals: [0] [13:14:17.517] getGlobalsAndPackages() ... DONE [13:14:17.517] + additional globals found: [n=0] [13:14:17.517] + additional namespaces needed: [n=0] [13:14:17.518] - Finding globals in 'X' for chunk #2 ... DONE [13:14:17.518] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:14:17.518] - seeds: [13:14:17.518] - All globals exported: [n=11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:17.518] getGlobalsAndPackages() ... [13:14:17.519] - globals passed as-is: [11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:17.519] Resolving globals: FALSE [13:14:17.521] Tweak future expression to call with '...' arguments ... [13:14:17.522] { [13:14:17.522] do.call(function(...) { [13:14:17.522] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:17.522] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:17.522] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:17.522] on.exit(options(oopts), add = TRUE) [13:14:17.522] } [13:14:17.522] { [13:14:17.522] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:17.522] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:17.522] ...future.FUN(...future.X_jj, ...) [13:14:17.522] }) [13:14:17.522] } [13:14:17.522] }, args = future.call.arguments) [13:14:17.522] } [13:14:17.522] Tweak future expression to call with '...' arguments ... DONE [13:14:17.523] - globals: [11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:17.523] - packages: [1] 'future.apply' [13:14:17.523] getGlobalsAndPackages() ... DONE [13:14:17.524] run() for 'Future' ... [13:14:17.524] - state: 'created' [13:14:17.524] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:14:17.538] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:14:17.539] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:14:17.539] - Field: 'node' [13:14:17.539] - Field: 'label' [13:14:17.539] - Field: 'local' [13:14:17.539] - Field: 'owner' [13:14:17.540] - Field: 'envir' [13:14:17.540] - Field: 'workers' [13:14:17.540] - Field: 'packages' [13:14:17.540] - Field: 'gc' [13:14:17.540] - Field: 'conditions' [13:14:17.540] - Field: 'persistent' [13:14:17.541] - Field: 'expr' [13:14:17.541] - Field: 'uuid' [13:14:17.541] - Field: 'seed' [13:14:17.541] - Field: 'version' [13:14:17.541] - Field: 'result' [13:14:17.541] - Field: 'asynchronous' [13:14:17.542] - Field: 'calls' [13:14:17.542] - Field: 'globals' [13:14:17.542] - Field: 'stdout' [13:14:17.542] - Field: 'earlySignal' [13:14:17.542] - Field: 'lazy' [13:14:17.543] - Field: 'state' [13:14:17.543] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:14:17.543] - Launch lazy future ... [13:14:17.543] Packages needed by the future expression (n = 1): 'future.apply' [13:14:17.543] Packages needed by future strategies (n = 0): [13:14:17.544] { [13:14:17.544] { [13:14:17.544] { [13:14:17.544] ...future.startTime <- base::Sys.time() [13:14:17.544] { [13:14:17.544] { [13:14:17.544] { [13:14:17.544] { [13:14:17.544] { [13:14:17.544] base::local({ [13:14:17.544] has_future <- base::requireNamespace("future", [13:14:17.544] quietly = TRUE) [13:14:17.544] if (has_future) { [13:14:17.544] ns <- base::getNamespace("future") [13:14:17.544] version <- ns[[".package"]][["version"]] [13:14:17.544] if (is.null(version)) [13:14:17.544] version <- utils::packageVersion("future") [13:14:17.544] } [13:14:17.544] else { [13:14:17.544] version <- NULL [13:14:17.544] } [13:14:17.544] if (!has_future || version < "1.8.0") { [13:14:17.544] info <- base::c(r_version = base::gsub("R version ", [13:14:17.544] "", base::R.version$version.string), [13:14:17.544] platform = base::sprintf("%s (%s-bit)", [13:14:17.544] base::R.version$platform, 8 * [13:14:17.544] base::.Machine$sizeof.pointer), [13:14:17.544] os = base::paste(base::Sys.info()[base::c("sysname", [13:14:17.544] "release", "version")], collapse = " "), [13:14:17.544] hostname = base::Sys.info()[["nodename"]]) [13:14:17.544] info <- base::sprintf("%s: %s", base::names(info), [13:14:17.544] info) [13:14:17.544] info <- base::paste(info, collapse = "; ") [13:14:17.544] if (!has_future) { [13:14:17.544] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:14:17.544] info) [13:14:17.544] } [13:14:17.544] else { [13:14:17.544] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:14:17.544] info, version) [13:14:17.544] } [13:14:17.544] base::stop(msg) [13:14:17.544] } [13:14:17.544] }) [13:14:17.544] } [13:14:17.544] ...future.mc.cores.old <- base::getOption("mc.cores") [13:14:17.544] base::options(mc.cores = 1L) [13:14:17.544] } [13:14:17.544] base::local({ [13:14:17.544] for (pkg in "future.apply") { [13:14:17.544] base::loadNamespace(pkg) [13:14:17.544] base::library(pkg, character.only = TRUE) [13:14:17.544] } [13:14:17.544] }) [13:14:17.544] } [13:14:17.544] options(future.plan = NULL) [13:14:17.544] Sys.unsetenv("R_FUTURE_PLAN") [13:14:17.544] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:14:17.544] } [13:14:17.544] ...future.workdir <- getwd() [13:14:17.544] } [13:14:17.544] ...future.oldOptions <- base::as.list(base::.Options) [13:14:17.544] ...future.oldEnvVars <- base::Sys.getenv() [13:14:17.544] } [13:14:17.544] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:14:17.544] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:14:17.544] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:14:17.544] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:14:17.544] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:14:17.544] future.stdout.windows.reencode = NULL, width = 80L) [13:14:17.544] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:14:17.544] base::names(...future.oldOptions)) [13:14:17.544] } [13:14:17.544] if (FALSE) { [13:14:17.544] } [13:14:17.544] else { [13:14:17.544] if (TRUE) { [13:14:17.544] ...future.stdout <- base::rawConnection(base::raw(0L), [13:14:17.544] open = "w") [13:14:17.544] } [13:14:17.544] else { [13:14:17.544] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:14:17.544] windows = "NUL", "/dev/null"), open = "w") [13:14:17.544] } [13:14:17.544] base::sink(...future.stdout, type = "output", split = FALSE) [13:14:17.544] base::on.exit(if (!base::is.null(...future.stdout)) { [13:14:17.544] base::sink(type = "output", split = FALSE) [13:14:17.544] base::close(...future.stdout) [13:14:17.544] }, add = TRUE) [13:14:17.544] } [13:14:17.544] ...future.frame <- base::sys.nframe() [13:14:17.544] ...future.conditions <- base::list() [13:14:17.544] ...future.rng <- base::globalenv()$.Random.seed [13:14:17.544] if (FALSE) { [13:14:17.544] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:14:17.544] "...future.value", "...future.globalenv.names", ".Random.seed") [13:14:17.544] } [13:14:17.544] ...future.result <- base::tryCatch({ [13:14:17.544] base::withCallingHandlers({ [13:14:17.544] ...future.value <- base::withVisible(base::local({ [13:14:17.544] ...future.makeSendCondition <- local({ [13:14:17.544] sendCondition <- NULL [13:14:17.544] function(frame = 1L) { [13:14:17.544] if (is.function(sendCondition)) [13:14:17.544] return(sendCondition) [13:14:17.544] ns <- getNamespace("parallel") [13:14:17.544] if (exists("sendData", mode = "function", [13:14:17.544] envir = ns)) { [13:14:17.544] parallel_sendData <- get("sendData", mode = "function", [13:14:17.544] envir = ns) [13:14:17.544] envir <- sys.frame(frame) [13:14:17.544] master <- NULL [13:14:17.544] while (!identical(envir, .GlobalEnv) && [13:14:17.544] !identical(envir, emptyenv())) { [13:14:17.544] if (exists("master", mode = "list", envir = envir, [13:14:17.544] inherits = FALSE)) { [13:14:17.544] master <- get("master", mode = "list", [13:14:17.544] envir = envir, inherits = FALSE) [13:14:17.544] if (inherits(master, c("SOCKnode", [13:14:17.544] "SOCK0node"))) { [13:14:17.544] sendCondition <<- function(cond) { [13:14:17.544] data <- list(type = "VALUE", value = cond, [13:14:17.544] success = TRUE) [13:14:17.544] parallel_sendData(master, data) [13:14:17.544] } [13:14:17.544] return(sendCondition) [13:14:17.544] } [13:14:17.544] } [13:14:17.544] frame <- frame + 1L [13:14:17.544] envir <- sys.frame(frame) [13:14:17.544] } [13:14:17.544] } [13:14:17.544] sendCondition <<- function(cond) NULL [13:14:17.544] } [13:14:17.544] }) [13:14:17.544] withCallingHandlers({ [13:14:17.544] { [13:14:17.544] do.call(function(...) { [13:14:17.544] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:17.544] if (!identical(...future.globals.maxSize.org, [13:14:17.544] ...future.globals.maxSize)) { [13:14:17.544] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:17.544] on.exit(options(oopts), add = TRUE) [13:14:17.544] } [13:14:17.544] { [13:14:17.544] lapply(seq_along(...future.elements_ii), [13:14:17.544] FUN = function(jj) { [13:14:17.544] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:17.544] ...future.FUN(...future.X_jj, ...) [13:14:17.544] }) [13:14:17.544] } [13:14:17.544] }, args = future.call.arguments) [13:14:17.544] } [13:14:17.544] }, immediateCondition = function(cond) { [13:14:17.544] sendCondition <- ...future.makeSendCondition() [13:14:17.544] sendCondition(cond) [13:14:17.544] muffleCondition <- function (cond, pattern = "^muffle") [13:14:17.544] { [13:14:17.544] inherits <- base::inherits [13:14:17.544] invokeRestart <- base::invokeRestart [13:14:17.544] is.null <- base::is.null [13:14:17.544] muffled <- FALSE [13:14:17.544] if (inherits(cond, "message")) { [13:14:17.544] muffled <- grepl(pattern, "muffleMessage") [13:14:17.544] if (muffled) [13:14:17.544] invokeRestart("muffleMessage") [13:14:17.544] } [13:14:17.544] else if (inherits(cond, "warning")) { [13:14:17.544] muffled <- grepl(pattern, "muffleWarning") [13:14:17.544] if (muffled) [13:14:17.544] invokeRestart("muffleWarning") [13:14:17.544] } [13:14:17.544] else if (inherits(cond, "condition")) { [13:14:17.544] if (!is.null(pattern)) { [13:14:17.544] computeRestarts <- base::computeRestarts [13:14:17.544] grepl <- base::grepl [13:14:17.544] restarts <- computeRestarts(cond) [13:14:17.544] for (restart in restarts) { [13:14:17.544] name <- restart$name [13:14:17.544] if (is.null(name)) [13:14:17.544] next [13:14:17.544] if (!grepl(pattern, name)) [13:14:17.544] next [13:14:17.544] invokeRestart(restart) [13:14:17.544] muffled <- TRUE [13:14:17.544] break [13:14:17.544] } [13:14:17.544] } [13:14:17.544] } [13:14:17.544] invisible(muffled) [13:14:17.544] } [13:14:17.544] muffleCondition(cond) [13:14:17.544] }) [13:14:17.544] })) [13:14:17.544] future::FutureResult(value = ...future.value$value, [13:14:17.544] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:14:17.544] ...future.rng), globalenv = if (FALSE) [13:14:17.544] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:14:17.544] ...future.globalenv.names)) [13:14:17.544] else NULL, started = ...future.startTime, version = "1.8") [13:14:17.544] }, condition = base::local({ [13:14:17.544] c <- base::c [13:14:17.544] inherits <- base::inherits [13:14:17.544] invokeRestart <- base::invokeRestart [13:14:17.544] length <- base::length [13:14:17.544] list <- base::list [13:14:17.544] seq.int <- base::seq.int [13:14:17.544] signalCondition <- base::signalCondition [13:14:17.544] sys.calls <- base::sys.calls [13:14:17.544] `[[` <- base::`[[` [13:14:17.544] `+` <- base::`+` [13:14:17.544] `<<-` <- base::`<<-` [13:14:17.544] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:14:17.544] calls[seq.int(from = from + 12L, to = length(calls) - [13:14:17.544] 3L)] [13:14:17.544] } [13:14:17.544] function(cond) { [13:14:17.544] is_error <- inherits(cond, "error") [13:14:17.544] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:14:17.544] NULL) [13:14:17.544] if (is_error) { [13:14:17.544] sessionInformation <- function() { [13:14:17.544] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:14:17.544] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:14:17.544] search = base::search(), system = base::Sys.info()) [13:14:17.544] } [13:14:17.544] ...future.conditions[[length(...future.conditions) + [13:14:17.544] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:14:17.544] cond$call), session = sessionInformation(), [13:14:17.544] timestamp = base::Sys.time(), signaled = 0L) [13:14:17.544] signalCondition(cond) [13:14:17.544] } [13:14:17.544] else if (!ignore && TRUE && inherits(cond, c("condition", [13:14:17.544] "immediateCondition"))) { [13:14:17.544] signal <- TRUE && inherits(cond, "immediateCondition") [13:14:17.544] ...future.conditions[[length(...future.conditions) + [13:14:17.544] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:14:17.544] if (TRUE && !signal) { [13:14:17.544] muffleCondition <- function (cond, pattern = "^muffle") [13:14:17.544] { [13:14:17.544] inherits <- base::inherits [13:14:17.544] invokeRestart <- base::invokeRestart [13:14:17.544] is.null <- base::is.null [13:14:17.544] muffled <- FALSE [13:14:17.544] if (inherits(cond, "message")) { [13:14:17.544] muffled <- grepl(pattern, "muffleMessage") [13:14:17.544] if (muffled) [13:14:17.544] invokeRestart("muffleMessage") [13:14:17.544] } [13:14:17.544] else if (inherits(cond, "warning")) { [13:14:17.544] muffled <- grepl(pattern, "muffleWarning") [13:14:17.544] if (muffled) [13:14:17.544] invokeRestart("muffleWarning") [13:14:17.544] } [13:14:17.544] else if (inherits(cond, "condition")) { [13:14:17.544] if (!is.null(pattern)) { [13:14:17.544] computeRestarts <- base::computeRestarts [13:14:17.544] grepl <- base::grepl [13:14:17.544] restarts <- computeRestarts(cond) [13:14:17.544] for (restart in restarts) { [13:14:17.544] name <- restart$name [13:14:17.544] if (is.null(name)) [13:14:17.544] next [13:14:17.544] if (!grepl(pattern, name)) [13:14:17.544] next [13:14:17.544] invokeRestart(restart) [13:14:17.544] muffled <- TRUE [13:14:17.544] break [13:14:17.544] } [13:14:17.544] } [13:14:17.544] } [13:14:17.544] invisible(muffled) [13:14:17.544] } [13:14:17.544] muffleCondition(cond, pattern = "^muffle") [13:14:17.544] } [13:14:17.544] } [13:14:17.544] else { [13:14:17.544] if (TRUE) { [13:14:17.544] muffleCondition <- function (cond, pattern = "^muffle") [13:14:17.544] { [13:14:17.544] inherits <- base::inherits [13:14:17.544] invokeRestart <- base::invokeRestart [13:14:17.544] is.null <- base::is.null [13:14:17.544] muffled <- FALSE [13:14:17.544] if (inherits(cond, "message")) { [13:14:17.544] muffled <- grepl(pattern, "muffleMessage") [13:14:17.544] if (muffled) [13:14:17.544] invokeRestart("muffleMessage") [13:14:17.544] } [13:14:17.544] else if (inherits(cond, "warning")) { [13:14:17.544] muffled <- grepl(pattern, "muffleWarning") [13:14:17.544] if (muffled) [13:14:17.544] invokeRestart("muffleWarning") [13:14:17.544] } [13:14:17.544] else if (inherits(cond, "condition")) { [13:14:17.544] if (!is.null(pattern)) { [13:14:17.544] computeRestarts <- base::computeRestarts [13:14:17.544] grepl <- base::grepl [13:14:17.544] restarts <- computeRestarts(cond) [13:14:17.544] for (restart in restarts) { [13:14:17.544] name <- restart$name [13:14:17.544] if (is.null(name)) [13:14:17.544] next [13:14:17.544] if (!grepl(pattern, name)) [13:14:17.544] next [13:14:17.544] invokeRestart(restart) [13:14:17.544] muffled <- TRUE [13:14:17.544] break [13:14:17.544] } [13:14:17.544] } [13:14:17.544] } [13:14:17.544] invisible(muffled) [13:14:17.544] } [13:14:17.544] muffleCondition(cond, pattern = "^muffle") [13:14:17.544] } [13:14:17.544] } [13:14:17.544] } [13:14:17.544] })) [13:14:17.544] }, error = function(ex) { [13:14:17.544] base::structure(base::list(value = NULL, visible = NULL, [13:14:17.544] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:14:17.544] ...future.rng), started = ...future.startTime, [13:14:17.544] finished = Sys.time(), session_uuid = NA_character_, [13:14:17.544] version = "1.8"), class = "FutureResult") [13:14:17.544] }, finally = { [13:14:17.544] if (!identical(...future.workdir, getwd())) [13:14:17.544] setwd(...future.workdir) [13:14:17.544] { [13:14:17.544] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:14:17.544] ...future.oldOptions$nwarnings <- NULL [13:14:17.544] } [13:14:17.544] base::options(...future.oldOptions) [13:14:17.544] if (.Platform$OS.type == "windows") { [13:14:17.544] old_names <- names(...future.oldEnvVars) [13:14:17.544] envs <- base::Sys.getenv() [13:14:17.544] names <- names(envs) [13:14:17.544] common <- intersect(names, old_names) [13:14:17.544] added <- setdiff(names, old_names) [13:14:17.544] removed <- setdiff(old_names, names) [13:14:17.544] changed <- common[...future.oldEnvVars[common] != [13:14:17.544] envs[common]] [13:14:17.544] NAMES <- toupper(changed) [13:14:17.544] args <- list() [13:14:17.544] for (kk in seq_along(NAMES)) { [13:14:17.544] name <- changed[[kk]] [13:14:17.544] NAME <- NAMES[[kk]] [13:14:17.544] if (name != NAME && is.element(NAME, old_names)) [13:14:17.544] next [13:14:17.544] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:17.544] } [13:14:17.544] NAMES <- toupper(added) [13:14:17.544] for (kk in seq_along(NAMES)) { [13:14:17.544] name <- added[[kk]] [13:14:17.544] NAME <- NAMES[[kk]] [13:14:17.544] if (name != NAME && is.element(NAME, old_names)) [13:14:17.544] next [13:14:17.544] args[[name]] <- "" [13:14:17.544] } [13:14:17.544] NAMES <- toupper(removed) [13:14:17.544] for (kk in seq_along(NAMES)) { [13:14:17.544] name <- removed[[kk]] [13:14:17.544] NAME <- NAMES[[kk]] [13:14:17.544] if (name != NAME && is.element(NAME, old_names)) [13:14:17.544] next [13:14:17.544] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:17.544] } [13:14:17.544] if (length(args) > 0) [13:14:17.544] base::do.call(base::Sys.setenv, args = args) [13:14:17.544] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:14:17.544] } [13:14:17.544] else { [13:14:17.544] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:14:17.544] } [13:14:17.544] { [13:14:17.544] if (base::length(...future.futureOptionsAdded) > [13:14:17.544] 0L) { [13:14:17.544] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:14:17.544] base::names(opts) <- ...future.futureOptionsAdded [13:14:17.544] base::options(opts) [13:14:17.544] } [13:14:17.544] { [13:14:17.544] { [13:14:17.544] base::options(mc.cores = ...future.mc.cores.old) [13:14:17.544] NULL [13:14:17.544] } [13:14:17.544] options(future.plan = NULL) [13:14:17.544] if (is.na(NA_character_)) [13:14:17.544] Sys.unsetenv("R_FUTURE_PLAN") [13:14:17.544] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:14:17.544] future::plan(list(function (..., workers = availableCores(), [13:14:17.544] lazy = FALSE, rscript_libs = .libPaths(), [13:14:17.544] envir = parent.frame()) [13:14:17.544] { [13:14:17.544] if (is.function(workers)) [13:14:17.544] workers <- workers() [13:14:17.544] workers <- structure(as.integer(workers), [13:14:17.544] class = class(workers)) [13:14:17.544] stop_if_not(length(workers) == 1, is.finite(workers), [13:14:17.544] workers >= 1) [13:14:17.544] if (workers == 1L && !inherits(workers, "AsIs")) { [13:14:17.544] return(sequential(..., lazy = TRUE, envir = envir)) [13:14:17.544] } [13:14:17.544] future <- MultisessionFuture(..., workers = workers, [13:14:17.544] lazy = lazy, rscript_libs = rscript_libs, [13:14:17.544] envir = envir) [13:14:17.544] if (!future$lazy) [13:14:17.544] future <- run(future) [13:14:17.544] invisible(future) [13:14:17.544] }), .cleanup = FALSE, .init = FALSE) [13:14:17.544] } [13:14:17.544] } [13:14:17.544] } [13:14:17.544] }) [13:14:17.544] if (TRUE) { [13:14:17.544] base::sink(type = "output", split = FALSE) [13:14:17.544] if (TRUE) { [13:14:17.544] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:14:17.544] } [13:14:17.544] else { [13:14:17.544] ...future.result["stdout"] <- base::list(NULL) [13:14:17.544] } [13:14:17.544] base::close(...future.stdout) [13:14:17.544] ...future.stdout <- NULL [13:14:17.544] } [13:14:17.544] ...future.result$conditions <- ...future.conditions [13:14:17.544] ...future.result$finished <- base::Sys.time() [13:14:17.544] ...future.result [13:14:17.544] } [13:14:17.550] Exporting 11 global objects (92.00 KiB) to cluster node #1 ... [13:14:17.550] Exporting '...future.FUN' (21.22 KiB) to cluster node #1 ... [13:14:17.550] Exporting '...future.FUN' (21.22 KiB) to cluster node #1 ... DONE [13:14:17.551] Exporting 'x_FUN' (56 bytes) to cluster node #1 ... [13:14:17.551] Exporting 'x_FUN' (56 bytes) to cluster node #1 ... DONE [13:14:17.551] Exporting 'times' (56 bytes) to cluster node #1 ... [13:14:17.552] Exporting 'times' (56 bytes) to cluster node #1 ... DONE [13:14:17.552] Exporting 'stopf' (26.43 KiB) to cluster node #1 ... [13:14:17.552] Exporting 'stopf' (26.43 KiB) to cluster node #1 ... DONE [13:14:17.552] Exporting 'stop_if_not' (44.12 KiB) to cluster node #1 ... [13:14:17.553] Exporting 'stop_if_not' (44.12 KiB) to cluster node #1 ... DONE [13:14:17.553] Exporting 'dim' (0 bytes) to cluster node #1 ... [13:14:17.553] Exporting 'dim' (0 bytes) to cluster node #1 ... DONE [13:14:17.554] Exporting 'valid_types' (120 bytes) to cluster node #1 ... [13:14:17.554] Exporting 'valid_types' (120 bytes) to cluster node #1 ... DONE [13:14:17.554] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... [13:14:17.555] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... DONE [13:14:17.555] Exporting '...future.elements_ii' (736 bytes) to cluster node #1 ... [13:14:17.555] Exporting '...future.elements_ii' (736 bytes) to cluster node #1 ... DONE [13:14:17.556] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:14:17.556] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:14:17.556] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:14:17.557] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:14:17.557] Exporting 11 global objects (92.00 KiB) to cluster node #1 ... DONE [13:14:17.557] MultisessionFuture started [13:14:17.557] - Launch lazy future ... done [13:14:17.558] run() for 'MultisessionFuture' ... done [13:14:17.558] Created future: [13:14:17.576] receiveMessageFromWorker() for ClusterFuture ... [13:14:17.576] - Validating connection of MultisessionFuture [13:14:17.576] - received message: FutureResult [13:14:17.576] - Received FutureResult [13:14:17.577] - Erased future from FutureRegistry [13:14:17.577] result() for ClusterFuture ... [13:14:17.577] - result already collected: FutureResult [13:14:17.577] result() for ClusterFuture ... done [13:14:17.577] receiveMessageFromWorker() for ClusterFuture ... done [13:14:17.558] MultisessionFuture: [13:14:17.558] Label: 'future_vapply-2' [13:14:17.558] Expression: [13:14:17.558] { [13:14:17.558] do.call(function(...) { [13:14:17.558] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:17.558] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:17.558] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:17.558] on.exit(options(oopts), add = TRUE) [13:14:17.558] } [13:14:17.558] { [13:14:17.558] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:17.558] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:17.558] ...future.FUN(...future.X_jj, ...) [13:14:17.558] }) [13:14:17.558] } [13:14:17.558] }, args = future.call.arguments) [13:14:17.558] } [13:14:17.558] Lazy evaluation: FALSE [13:14:17.558] Asynchronous evaluation: TRUE [13:14:17.558] Local evaluation: TRUE [13:14:17.558] Environment: R_GlobalEnv [13:14:17.558] Capture standard output: TRUE [13:14:17.558] Capture condition classes: 'condition' (excluding 'nothing') [13:14:17.558] Globals: 11 objects totaling 92.72 KiB (function '...future.FUN' of 21.22 KiB, function 'x_FUN' of 56 bytes, integer 'times' of 56 bytes, function 'stopf' of 26.43 KiB, function 'stop_if_not' of 44.12 KiB, ...) [13:14:17.558] Packages: 1 packages ('future.apply') [13:14:17.558] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:14:17.558] Resolved: TRUE [13:14:17.558] Value: [13:14:17.558] Conditions captured: [13:14:17.558] Early signaling: FALSE [13:14:17.558] Owner process: 1bb7d580-628d-c90d-e38a-66de485868c4 [13:14:17.558] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:14:17.578] Chunk #2 of 2 ... DONE [13:14:17.578] Launching 2 futures (chunks) ... DONE [13:14:17.578] Resolving 2 futures (chunks) ... [13:14:17.578] resolve() on list ... [13:14:17.578] recursive: 0 [13:14:17.579] length: 2 [13:14:17.579] [13:14:17.579] Future #1 [13:14:17.579] result() for ClusterFuture ... [13:14:17.579] - result already collected: FutureResult [13:14:17.579] result() for ClusterFuture ... done [13:14:17.580] result() for ClusterFuture ... [13:14:17.580] - result already collected: FutureResult [13:14:17.580] result() for ClusterFuture ... done [13:14:17.580] signalConditionsASAP(MultisessionFuture, pos=1) ... [13:14:17.580] - nx: 2 [13:14:17.580] - relay: TRUE [13:14:17.581] - stdout: TRUE [13:14:17.581] - signal: TRUE [13:14:17.581] - resignal: FALSE [13:14:17.581] - force: TRUE [13:14:17.581] - relayed: [n=2] FALSE, FALSE [13:14:17.581] - queued futures: [n=2] FALSE, FALSE [13:14:17.582] - until=1 [13:14:17.582] - relaying element #1 [13:14:17.582] result() for ClusterFuture ... [13:14:17.582] - result already collected: FutureResult [13:14:17.582] result() for ClusterFuture ... done [13:14:17.582] result() for ClusterFuture ... [13:14:17.583] - result already collected: FutureResult [13:14:17.583] result() for ClusterFuture ... done [13:14:17.583] result() for ClusterFuture ... [13:14:17.583] - result already collected: FutureResult [13:14:17.583] result() for ClusterFuture ... done [13:14:17.583] result() for ClusterFuture ... [13:14:17.584] - result already collected: FutureResult [13:14:17.584] result() for ClusterFuture ... done [13:14:17.584] - relayed: [n=2] TRUE, FALSE [13:14:17.584] - queued futures: [n=2] TRUE, FALSE [13:14:17.584] signalConditionsASAP(MultisessionFuture, pos=1) ... done [13:14:17.584] length: 1 (resolved future 1) [13:14:17.585] Future #2 [13:14:17.585] result() for ClusterFuture ... [13:14:17.585] - result already collected: FutureResult [13:14:17.585] result() for ClusterFuture ... done [13:14:17.585] result() for ClusterFuture ... [13:14:17.585] - result already collected: FutureResult [13:14:17.585] result() for ClusterFuture ... done [13:14:17.586] signalConditionsASAP(MultisessionFuture, pos=2) ... [13:14:17.586] - nx: 2 [13:14:17.586] - relay: TRUE [13:14:17.586] - stdout: TRUE [13:14:17.586] - signal: TRUE [13:14:17.586] - resignal: FALSE [13:14:17.587] - force: TRUE [13:14:17.587] - relayed: [n=2] TRUE, FALSE [13:14:17.587] - queued futures: [n=2] TRUE, FALSE [13:14:17.587] - until=2 [13:14:17.587] - relaying element #2 [13:14:17.587] result() for ClusterFuture ... [13:14:17.588] - result already collected: FutureResult [13:14:17.588] result() for ClusterFuture ... done [13:14:17.588] result() for ClusterFuture ... [13:14:17.588] - result already collected: FutureResult [13:14:17.588] result() for ClusterFuture ... done [13:14:17.588] result() for ClusterFuture ... [13:14:17.589] - result already collected: FutureResult [13:14:17.589] result() for ClusterFuture ... done [13:14:17.589] result() for ClusterFuture ... [13:14:17.589] - result already collected: FutureResult [13:14:17.589] result() for ClusterFuture ... done [13:14:17.589] - relayed: [n=2] TRUE, TRUE [13:14:17.589] - queued futures: [n=2] TRUE, TRUE [13:14:17.590] signalConditionsASAP(MultisessionFuture, pos=2) ... done [13:14:17.590] length: 0 (resolved future 2) [13:14:17.590] Relaying remaining futures [13:14:17.590] signalConditionsASAP(NULL, pos=0) ... [13:14:17.590] - nx: 2 [13:14:17.590] - relay: TRUE [13:14:17.591] - stdout: TRUE [13:14:17.591] - signal: TRUE [13:14:17.591] - resignal: FALSE [13:14:17.591] - force: TRUE [13:14:17.591] - relayed: [n=2] TRUE, TRUE [13:14:17.591] - queued futures: [n=2] TRUE, TRUE - flush all [13:14:17.592] - relayed: [n=2] TRUE, TRUE [13:14:17.592] - queued futures: [n=2] TRUE, TRUE [13:14:17.592] signalConditionsASAP(NULL, pos=0) ... done [13:14:17.592] resolve() on list ... DONE [13:14:17.592] result() for ClusterFuture ... [13:14:17.592] - result already collected: FutureResult [13:14:17.592] result() for ClusterFuture ... done [13:14:17.593] result() for ClusterFuture ... [13:14:17.593] - result already collected: FutureResult [13:14:17.593] result() for ClusterFuture ... done [13:14:17.593] result() for ClusterFuture ... [13:14:17.593] - result already collected: FutureResult [13:14:17.593] result() for ClusterFuture ... done [13:14:17.594] result() for ClusterFuture ... [13:14:17.594] - result already collected: FutureResult [13:14:17.594] result() for ClusterFuture ... done [13:14:17.594] - Number of value chunks collected: 2 [13:14:17.594] Resolving 2 futures (chunks) ... DONE [13:14:17.594] Reducing values from 2 chunks ... [13:14:17.595] - Number of values collected after concatenation: 2 [13:14:17.595] - Number of values expected: 2 [13:14:17.595] Reducing values from 2 chunks ... DONE [13:14:17.595] future_lapply() ... DONE Named chr [1:2] "integer" "character" - attr(*, "names")= chr [1:2] "x" "y" num[0 , 1:10] [13:14:17.596] future_lapply() ... [13:14:17.601] Number of chunks: 2 [13:14:17.601] getGlobalsAndPackagesXApply() ... [13:14:17.602] - future.globals: TRUE [13:14:17.602] getGlobalsAndPackages() ... [13:14:17.602] Searching for globals... [13:14:17.606] - globals found: [17] 'FUN', '{', '<-', 'x_FUN', 'if', '!=', 'length', 'times', 'stopf', 'stop_if_not', 'all', '==', 'dim', '%in%', 'typeof', 'valid_types', 'double' [13:14:17.607] Searching for globals ... DONE [13:14:17.607] Resolving globals: FALSE [13:14:17.608] The total size of the 7 globals is 93.23 KiB (95472 bytes) [13:14:17.608] The total size of the 7 globals exported for future expression ('FUN()') is 93.23 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). The three largest globals are 'stop_if_not' (44.12 KiB of class 'function'), 'stopf' (26.43 KiB of class 'function') and 'FUN' (21.22 KiB of class 'function') [13:14:17.609] - globals: [7] 'FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types' [13:14:17.609] - packages: [1] 'future.apply' [13:14:17.609] getGlobalsAndPackages() ... DONE [13:14:17.609] - globals found/used: [n=7] 'FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types' [13:14:17.609] - needed namespaces: [n=1] 'future.apply' [13:14:17.610] Finding globals ... DONE [13:14:17.610] - use_args: TRUE [13:14:17.610] - Getting '...' globals ... [13:14:17.610] resolve() on list ... [13:14:17.610] recursive: 0 [13:14:17.611] length: 1 [13:14:17.611] elements: '...' [13:14:17.611] length: 0 (resolved future 1) [13:14:17.611] resolve() on list ... DONE [13:14:17.611] - '...' content: [n=0] [13:14:17.611] List of 1 [13:14:17.611] $ ...: list() [13:14:17.611] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:14:17.611] - attr(*, "where")=List of 1 [13:14:17.611] ..$ ...: [13:14:17.611] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:14:17.611] - attr(*, "resolved")= logi TRUE [13:14:17.611] - attr(*, "total_size")= num NA [13:14:17.615] - Getting '...' globals ... DONE [13:14:17.615] Globals to be used in all futures (chunks): [n=8] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...' [13:14:17.615] List of 8 [13:14:17.615] $ ...future.FUN:function (x, ...) [13:14:17.615] $ x_FUN :function (x) [13:14:17.615] $ times : int 0 [13:14:17.615] $ stopf :function (fmt, ..., call. = TRUE, domain = NULL) [13:14:17.615] $ stop_if_not :function (...) [13:14:17.615] $ dim : NULL [13:14:17.615] $ valid_types : chr [1:3] "logical" "integer" "double" [13:14:17.615] $ ... : list() [13:14:17.615] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:14:17.615] - attr(*, "where")=List of 8 [13:14:17.615] ..$ ...future.FUN: [13:14:17.615] ..$ x_FUN : [13:14:17.615] ..$ times : [13:14:17.615] ..$ stopf : [13:14:17.615] ..$ stop_if_not : [13:14:17.615] ..$ dim : [13:14:17.615] ..$ valid_types : [13:14:17.615] ..$ ... : [13:14:17.615] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:14:17.615] - attr(*, "resolved")= logi FALSE [13:14:17.615] - attr(*, "total_size")= num 95472 [13:14:17.622] Packages to be attached in all futures: [n=1] 'future.apply' [13:14:17.622] getGlobalsAndPackagesXApply() ... DONE [13:14:17.622] Number of futures (= number of chunks): 2 [13:14:17.622] Launching 2 futures (chunks) ... [13:14:17.622] Chunk #1 of 2 ... [13:14:17.623] - Finding globals in 'X' for chunk #1 ... [13:14:17.623] getGlobalsAndPackages() ... [13:14:17.623] Searching for globals... [13:14:17.623] [13:14:17.623] Searching for globals ... DONE [13:14:17.624] - globals: [0] [13:14:17.624] getGlobalsAndPackages() ... DONE [13:14:17.624] + additional globals found: [n=0] [13:14:17.624] + additional namespaces needed: [n=0] [13:14:17.624] - Finding globals in 'X' for chunk #1 ... DONE [13:14:17.624] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:14:17.625] - seeds: [13:14:17.625] - All globals exported: [n=11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:17.625] getGlobalsAndPackages() ... [13:14:17.625] - globals passed as-is: [11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:17.625] Resolving globals: FALSE [13:14:17.625] Tweak future expression to call with '...' arguments ... [13:14:17.626] { [13:14:17.626] do.call(function(...) { [13:14:17.626] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:17.626] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:17.626] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:17.626] on.exit(options(oopts), add = TRUE) [13:14:17.626] } [13:14:17.626] { [13:14:17.626] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:17.626] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:17.626] ...future.FUN(...future.X_jj, ...) [13:14:17.626] }) [13:14:17.626] } [13:14:17.626] }, args = future.call.arguments) [13:14:17.626] } [13:14:17.626] Tweak future expression to call with '...' arguments ... DONE [13:14:17.627] - globals: [11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:17.627] - packages: [1] 'future.apply' [13:14:17.627] getGlobalsAndPackages() ... DONE [13:14:17.628] run() for 'Future' ... [13:14:17.628] - state: 'created' [13:14:17.628] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:14:17.642] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:14:17.642] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:14:17.643] - Field: 'node' [13:14:17.643] - Field: 'label' [13:14:17.643] - Field: 'local' [13:14:17.643] - Field: 'owner' [13:14:17.643] - Field: 'envir' [13:14:17.644] - Field: 'workers' [13:14:17.644] - Field: 'packages' [13:14:17.644] - Field: 'gc' [13:14:17.644] - Field: 'conditions' [13:14:17.644] - Field: 'persistent' [13:14:17.644] - Field: 'expr' [13:14:17.645] - Field: 'uuid' [13:14:17.645] - Field: 'seed' [13:14:17.645] - Field: 'version' [13:14:17.645] - Field: 'result' [13:14:17.645] - Field: 'asynchronous' [13:14:17.645] - Field: 'calls' [13:14:17.646] - Field: 'globals' [13:14:17.646] - Field: 'stdout' [13:14:17.646] - Field: 'earlySignal' [13:14:17.646] - Field: 'lazy' [13:14:17.646] - Field: 'state' [13:14:17.647] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:14:17.647] - Launch lazy future ... [13:14:17.647] Packages needed by the future expression (n = 1): 'future.apply' [13:14:17.647] Packages needed by future strategies (n = 0): [13:14:17.648] { [13:14:17.648] { [13:14:17.648] { [13:14:17.648] ...future.startTime <- base::Sys.time() [13:14:17.648] { [13:14:17.648] { [13:14:17.648] { [13:14:17.648] { [13:14:17.648] { [13:14:17.648] base::local({ [13:14:17.648] has_future <- base::requireNamespace("future", [13:14:17.648] quietly = TRUE) [13:14:17.648] if (has_future) { [13:14:17.648] ns <- base::getNamespace("future") [13:14:17.648] version <- ns[[".package"]][["version"]] [13:14:17.648] if (is.null(version)) [13:14:17.648] version <- utils::packageVersion("future") [13:14:17.648] } [13:14:17.648] else { [13:14:17.648] version <- NULL [13:14:17.648] } [13:14:17.648] if (!has_future || version < "1.8.0") { [13:14:17.648] info <- base::c(r_version = base::gsub("R version ", [13:14:17.648] "", base::R.version$version.string), [13:14:17.648] platform = base::sprintf("%s (%s-bit)", [13:14:17.648] base::R.version$platform, 8 * [13:14:17.648] base::.Machine$sizeof.pointer), [13:14:17.648] os = base::paste(base::Sys.info()[base::c("sysname", [13:14:17.648] "release", "version")], collapse = " "), [13:14:17.648] hostname = base::Sys.info()[["nodename"]]) [13:14:17.648] info <- base::sprintf("%s: %s", base::names(info), [13:14:17.648] info) [13:14:17.648] info <- base::paste(info, collapse = "; ") [13:14:17.648] if (!has_future) { [13:14:17.648] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:14:17.648] info) [13:14:17.648] } [13:14:17.648] else { [13:14:17.648] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:14:17.648] info, version) [13:14:17.648] } [13:14:17.648] base::stop(msg) [13:14:17.648] } [13:14:17.648] }) [13:14:17.648] } [13:14:17.648] ...future.mc.cores.old <- base::getOption("mc.cores") [13:14:17.648] base::options(mc.cores = 1L) [13:14:17.648] } [13:14:17.648] base::local({ [13:14:17.648] for (pkg in "future.apply") { [13:14:17.648] base::loadNamespace(pkg) [13:14:17.648] base::library(pkg, character.only = TRUE) [13:14:17.648] } [13:14:17.648] }) [13:14:17.648] } [13:14:17.648] options(future.plan = NULL) [13:14:17.648] Sys.unsetenv("R_FUTURE_PLAN") [13:14:17.648] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:14:17.648] } [13:14:17.648] ...future.workdir <- getwd() [13:14:17.648] } [13:14:17.648] ...future.oldOptions <- base::as.list(base::.Options) [13:14:17.648] ...future.oldEnvVars <- base::Sys.getenv() [13:14:17.648] } [13:14:17.648] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:14:17.648] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:14:17.648] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:14:17.648] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:14:17.648] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:14:17.648] future.stdout.windows.reencode = NULL, width = 80L) [13:14:17.648] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:14:17.648] base::names(...future.oldOptions)) [13:14:17.648] } [13:14:17.648] if (FALSE) { [13:14:17.648] } [13:14:17.648] else { [13:14:17.648] if (TRUE) { [13:14:17.648] ...future.stdout <- base::rawConnection(base::raw(0L), [13:14:17.648] open = "w") [13:14:17.648] } [13:14:17.648] else { [13:14:17.648] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:14:17.648] windows = "NUL", "/dev/null"), open = "w") [13:14:17.648] } [13:14:17.648] base::sink(...future.stdout, type = "output", split = FALSE) [13:14:17.648] base::on.exit(if (!base::is.null(...future.stdout)) { [13:14:17.648] base::sink(type = "output", split = FALSE) [13:14:17.648] base::close(...future.stdout) [13:14:17.648] }, add = TRUE) [13:14:17.648] } [13:14:17.648] ...future.frame <- base::sys.nframe() [13:14:17.648] ...future.conditions <- base::list() [13:14:17.648] ...future.rng <- base::globalenv()$.Random.seed [13:14:17.648] if (FALSE) { [13:14:17.648] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:14:17.648] "...future.value", "...future.globalenv.names", ".Random.seed") [13:14:17.648] } [13:14:17.648] ...future.result <- base::tryCatch({ [13:14:17.648] base::withCallingHandlers({ [13:14:17.648] ...future.value <- base::withVisible(base::local({ [13:14:17.648] ...future.makeSendCondition <- local({ [13:14:17.648] sendCondition <- NULL [13:14:17.648] function(frame = 1L) { [13:14:17.648] if (is.function(sendCondition)) [13:14:17.648] return(sendCondition) [13:14:17.648] ns <- getNamespace("parallel") [13:14:17.648] if (exists("sendData", mode = "function", [13:14:17.648] envir = ns)) { [13:14:17.648] parallel_sendData <- get("sendData", mode = "function", [13:14:17.648] envir = ns) [13:14:17.648] envir <- sys.frame(frame) [13:14:17.648] master <- NULL [13:14:17.648] while (!identical(envir, .GlobalEnv) && [13:14:17.648] !identical(envir, emptyenv())) { [13:14:17.648] if (exists("master", mode = "list", envir = envir, [13:14:17.648] inherits = FALSE)) { [13:14:17.648] master <- get("master", mode = "list", [13:14:17.648] envir = envir, inherits = FALSE) [13:14:17.648] if (inherits(master, c("SOCKnode", [13:14:17.648] "SOCK0node"))) { [13:14:17.648] sendCondition <<- function(cond) { [13:14:17.648] data <- list(type = "VALUE", value = cond, [13:14:17.648] success = TRUE) [13:14:17.648] parallel_sendData(master, data) [13:14:17.648] } [13:14:17.648] return(sendCondition) [13:14:17.648] } [13:14:17.648] } [13:14:17.648] frame <- frame + 1L [13:14:17.648] envir <- sys.frame(frame) [13:14:17.648] } [13:14:17.648] } [13:14:17.648] sendCondition <<- function(cond) NULL [13:14:17.648] } [13:14:17.648] }) [13:14:17.648] withCallingHandlers({ [13:14:17.648] { [13:14:17.648] do.call(function(...) { [13:14:17.648] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:17.648] if (!identical(...future.globals.maxSize.org, [13:14:17.648] ...future.globals.maxSize)) { [13:14:17.648] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:17.648] on.exit(options(oopts), add = TRUE) [13:14:17.648] } [13:14:17.648] { [13:14:17.648] lapply(seq_along(...future.elements_ii), [13:14:17.648] FUN = function(jj) { [13:14:17.648] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:17.648] ...future.FUN(...future.X_jj, ...) [13:14:17.648] }) [13:14:17.648] } [13:14:17.648] }, args = future.call.arguments) [13:14:17.648] } [13:14:17.648] }, immediateCondition = function(cond) { [13:14:17.648] sendCondition <- ...future.makeSendCondition() [13:14:17.648] sendCondition(cond) [13:14:17.648] muffleCondition <- function (cond, pattern = "^muffle") [13:14:17.648] { [13:14:17.648] inherits <- base::inherits [13:14:17.648] invokeRestart <- base::invokeRestart [13:14:17.648] is.null <- base::is.null [13:14:17.648] muffled <- FALSE [13:14:17.648] if (inherits(cond, "message")) { [13:14:17.648] muffled <- grepl(pattern, "muffleMessage") [13:14:17.648] if (muffled) [13:14:17.648] invokeRestart("muffleMessage") [13:14:17.648] } [13:14:17.648] else if (inherits(cond, "warning")) { [13:14:17.648] muffled <- grepl(pattern, "muffleWarning") [13:14:17.648] if (muffled) [13:14:17.648] invokeRestart("muffleWarning") [13:14:17.648] } [13:14:17.648] else if (inherits(cond, "condition")) { [13:14:17.648] if (!is.null(pattern)) { [13:14:17.648] computeRestarts <- base::computeRestarts [13:14:17.648] grepl <- base::grepl [13:14:17.648] restarts <- computeRestarts(cond) [13:14:17.648] for (restart in restarts) { [13:14:17.648] name <- restart$name [13:14:17.648] if (is.null(name)) [13:14:17.648] next [13:14:17.648] if (!grepl(pattern, name)) [13:14:17.648] next [13:14:17.648] invokeRestart(restart) [13:14:17.648] muffled <- TRUE [13:14:17.648] break [13:14:17.648] } [13:14:17.648] } [13:14:17.648] } [13:14:17.648] invisible(muffled) [13:14:17.648] } [13:14:17.648] muffleCondition(cond) [13:14:17.648] }) [13:14:17.648] })) [13:14:17.648] future::FutureResult(value = ...future.value$value, [13:14:17.648] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:14:17.648] ...future.rng), globalenv = if (FALSE) [13:14:17.648] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:14:17.648] ...future.globalenv.names)) [13:14:17.648] else NULL, started = ...future.startTime, version = "1.8") [13:14:17.648] }, condition = base::local({ [13:14:17.648] c <- base::c [13:14:17.648] inherits <- base::inherits [13:14:17.648] invokeRestart <- base::invokeRestart [13:14:17.648] length <- base::length [13:14:17.648] list <- base::list [13:14:17.648] seq.int <- base::seq.int [13:14:17.648] signalCondition <- base::signalCondition [13:14:17.648] sys.calls <- base::sys.calls [13:14:17.648] `[[` <- base::`[[` [13:14:17.648] `+` <- base::`+` [13:14:17.648] `<<-` <- base::`<<-` [13:14:17.648] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:14:17.648] calls[seq.int(from = from + 12L, to = length(calls) - [13:14:17.648] 3L)] [13:14:17.648] } [13:14:17.648] function(cond) { [13:14:17.648] is_error <- inherits(cond, "error") [13:14:17.648] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:14:17.648] NULL) [13:14:17.648] if (is_error) { [13:14:17.648] sessionInformation <- function() { [13:14:17.648] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:14:17.648] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:14:17.648] search = base::search(), system = base::Sys.info()) [13:14:17.648] } [13:14:17.648] ...future.conditions[[length(...future.conditions) + [13:14:17.648] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:14:17.648] cond$call), session = sessionInformation(), [13:14:17.648] timestamp = base::Sys.time(), signaled = 0L) [13:14:17.648] signalCondition(cond) [13:14:17.648] } [13:14:17.648] else if (!ignore && TRUE && inherits(cond, c("condition", [13:14:17.648] "immediateCondition"))) { [13:14:17.648] signal <- TRUE && inherits(cond, "immediateCondition") [13:14:17.648] ...future.conditions[[length(...future.conditions) + [13:14:17.648] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:14:17.648] if (TRUE && !signal) { [13:14:17.648] muffleCondition <- function (cond, pattern = "^muffle") [13:14:17.648] { [13:14:17.648] inherits <- base::inherits [13:14:17.648] invokeRestart <- base::invokeRestart [13:14:17.648] is.null <- base::is.null [13:14:17.648] muffled <- FALSE [13:14:17.648] if (inherits(cond, "message")) { [13:14:17.648] muffled <- grepl(pattern, "muffleMessage") [13:14:17.648] if (muffled) [13:14:17.648] invokeRestart("muffleMessage") [13:14:17.648] } [13:14:17.648] else if (inherits(cond, "warning")) { [13:14:17.648] muffled <- grepl(pattern, "muffleWarning") [13:14:17.648] if (muffled) [13:14:17.648] invokeRestart("muffleWarning") [13:14:17.648] } [13:14:17.648] else if (inherits(cond, "condition")) { [13:14:17.648] if (!is.null(pattern)) { [13:14:17.648] computeRestarts <- base::computeRestarts [13:14:17.648] grepl <- base::grepl [13:14:17.648] restarts <- computeRestarts(cond) [13:14:17.648] for (restart in restarts) { [13:14:17.648] name <- restart$name [13:14:17.648] if (is.null(name)) [13:14:17.648] next [13:14:17.648] if (!grepl(pattern, name)) [13:14:17.648] next [13:14:17.648] invokeRestart(restart) [13:14:17.648] muffled <- TRUE [13:14:17.648] break [13:14:17.648] } [13:14:17.648] } [13:14:17.648] } [13:14:17.648] invisible(muffled) [13:14:17.648] } [13:14:17.648] muffleCondition(cond, pattern = "^muffle") [13:14:17.648] } [13:14:17.648] } [13:14:17.648] else { [13:14:17.648] if (TRUE) { [13:14:17.648] muffleCondition <- function (cond, pattern = "^muffle") [13:14:17.648] { [13:14:17.648] inherits <- base::inherits [13:14:17.648] invokeRestart <- base::invokeRestart [13:14:17.648] is.null <- base::is.null [13:14:17.648] muffled <- FALSE [13:14:17.648] if (inherits(cond, "message")) { [13:14:17.648] muffled <- grepl(pattern, "muffleMessage") [13:14:17.648] if (muffled) [13:14:17.648] invokeRestart("muffleMessage") [13:14:17.648] } [13:14:17.648] else if (inherits(cond, "warning")) { [13:14:17.648] muffled <- grepl(pattern, "muffleWarning") [13:14:17.648] if (muffled) [13:14:17.648] invokeRestart("muffleWarning") [13:14:17.648] } [13:14:17.648] else if (inherits(cond, "condition")) { [13:14:17.648] if (!is.null(pattern)) { [13:14:17.648] computeRestarts <- base::computeRestarts [13:14:17.648] grepl <- base::grepl [13:14:17.648] restarts <- computeRestarts(cond) [13:14:17.648] for (restart in restarts) { [13:14:17.648] name <- restart$name [13:14:17.648] if (is.null(name)) [13:14:17.648] next [13:14:17.648] if (!grepl(pattern, name)) [13:14:17.648] next [13:14:17.648] invokeRestart(restart) [13:14:17.648] muffled <- TRUE [13:14:17.648] break [13:14:17.648] } [13:14:17.648] } [13:14:17.648] } [13:14:17.648] invisible(muffled) [13:14:17.648] } [13:14:17.648] muffleCondition(cond, pattern = "^muffle") [13:14:17.648] } [13:14:17.648] } [13:14:17.648] } [13:14:17.648] })) [13:14:17.648] }, error = function(ex) { [13:14:17.648] base::structure(base::list(value = NULL, visible = NULL, [13:14:17.648] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:14:17.648] ...future.rng), started = ...future.startTime, [13:14:17.648] finished = Sys.time(), session_uuid = NA_character_, [13:14:17.648] version = "1.8"), class = "FutureResult") [13:14:17.648] }, finally = { [13:14:17.648] if (!identical(...future.workdir, getwd())) [13:14:17.648] setwd(...future.workdir) [13:14:17.648] { [13:14:17.648] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:14:17.648] ...future.oldOptions$nwarnings <- NULL [13:14:17.648] } [13:14:17.648] base::options(...future.oldOptions) [13:14:17.648] if (.Platform$OS.type == "windows") { [13:14:17.648] old_names <- names(...future.oldEnvVars) [13:14:17.648] envs <- base::Sys.getenv() [13:14:17.648] names <- names(envs) [13:14:17.648] common <- intersect(names, old_names) [13:14:17.648] added <- setdiff(names, old_names) [13:14:17.648] removed <- setdiff(old_names, names) [13:14:17.648] changed <- common[...future.oldEnvVars[common] != [13:14:17.648] envs[common]] [13:14:17.648] NAMES <- toupper(changed) [13:14:17.648] args <- list() [13:14:17.648] for (kk in seq_along(NAMES)) { [13:14:17.648] name <- changed[[kk]] [13:14:17.648] NAME <- NAMES[[kk]] [13:14:17.648] if (name != NAME && is.element(NAME, old_names)) [13:14:17.648] next [13:14:17.648] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:17.648] } [13:14:17.648] NAMES <- toupper(added) [13:14:17.648] for (kk in seq_along(NAMES)) { [13:14:17.648] name <- added[[kk]] [13:14:17.648] NAME <- NAMES[[kk]] [13:14:17.648] if (name != NAME && is.element(NAME, old_names)) [13:14:17.648] next [13:14:17.648] args[[name]] <- "" [13:14:17.648] } [13:14:17.648] NAMES <- toupper(removed) [13:14:17.648] for (kk in seq_along(NAMES)) { [13:14:17.648] name <- removed[[kk]] [13:14:17.648] NAME <- NAMES[[kk]] [13:14:17.648] if (name != NAME && is.element(NAME, old_names)) [13:14:17.648] next [13:14:17.648] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:17.648] } [13:14:17.648] if (length(args) > 0) [13:14:17.648] base::do.call(base::Sys.setenv, args = args) [13:14:17.648] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:14:17.648] } [13:14:17.648] else { [13:14:17.648] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:14:17.648] } [13:14:17.648] { [13:14:17.648] if (base::length(...future.futureOptionsAdded) > [13:14:17.648] 0L) { [13:14:17.648] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:14:17.648] base::names(opts) <- ...future.futureOptionsAdded [13:14:17.648] base::options(opts) [13:14:17.648] } [13:14:17.648] { [13:14:17.648] { [13:14:17.648] base::options(mc.cores = ...future.mc.cores.old) [13:14:17.648] NULL [13:14:17.648] } [13:14:17.648] options(future.plan = NULL) [13:14:17.648] if (is.na(NA_character_)) [13:14:17.648] Sys.unsetenv("R_FUTURE_PLAN") [13:14:17.648] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:14:17.648] future::plan(list(function (..., workers = availableCores(), [13:14:17.648] lazy = FALSE, rscript_libs = .libPaths(), [13:14:17.648] envir = parent.frame()) [13:14:17.648] { [13:14:17.648] if (is.function(workers)) [13:14:17.648] workers <- workers() [13:14:17.648] workers <- structure(as.integer(workers), [13:14:17.648] class = class(workers)) [13:14:17.648] stop_if_not(length(workers) == 1, is.finite(workers), [13:14:17.648] workers >= 1) [13:14:17.648] if (workers == 1L && !inherits(workers, "AsIs")) { [13:14:17.648] return(sequential(..., lazy = TRUE, envir = envir)) [13:14:17.648] } [13:14:17.648] future <- MultisessionFuture(..., workers = workers, [13:14:17.648] lazy = lazy, rscript_libs = rscript_libs, [13:14:17.648] envir = envir) [13:14:17.648] if (!future$lazy) [13:14:17.648] future <- run(future) [13:14:17.648] invisible(future) [13:14:17.648] }), .cleanup = FALSE, .init = FALSE) [13:14:17.648] } [13:14:17.648] } [13:14:17.648] } [13:14:17.648] }) [13:14:17.648] if (TRUE) { [13:14:17.648] base::sink(type = "output", split = FALSE) [13:14:17.648] if (TRUE) { [13:14:17.648] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:14:17.648] } [13:14:17.648] else { [13:14:17.648] ...future.result["stdout"] <- base::list(NULL) [13:14:17.648] } [13:14:17.648] base::close(...future.stdout) [13:14:17.648] ...future.stdout <- NULL [13:14:17.648] } [13:14:17.648] ...future.result$conditions <- ...future.conditions [13:14:17.648] ...future.result$finished <- base::Sys.time() [13:14:17.648] ...future.result [13:14:17.648] } [13:14:17.653] Exporting 11 global objects (93.23 KiB) to cluster node #1 ... [13:14:17.654] Exporting '...future.FUN' (21.22 KiB) to cluster node #1 ... [13:14:17.654] Exporting '...future.FUN' (21.22 KiB) to cluster node #1 ... DONE [13:14:17.654] Exporting 'x_FUN' (1.16 KiB) to cluster node #1 ... [13:14:17.655] Exporting 'x_FUN' (1.16 KiB) to cluster node #1 ... DONE [13:14:17.655] Exporting 'times' (56 bytes) to cluster node #1 ... [13:14:17.655] Exporting 'times' (56 bytes) to cluster node #1 ... DONE [13:14:17.656] Exporting 'stopf' (26.43 KiB) to cluster node #1 ... [13:14:17.656] Exporting 'stopf' (26.43 KiB) to cluster node #1 ... DONE [13:14:17.656] Exporting 'stop_if_not' (44.12 KiB) to cluster node #1 ... [13:14:17.657] Exporting 'stop_if_not' (44.12 KiB) to cluster node #1 ... DONE [13:14:17.657] Exporting 'dim' (0 bytes) to cluster node #1 ... [13:14:17.657] Exporting 'dim' (0 bytes) to cluster node #1 ... DONE [13:14:17.657] Exporting 'valid_types' (248 bytes) to cluster node #1 ... [13:14:17.658] Exporting 'valid_types' (248 bytes) to cluster node #1 ... DONE [13:14:17.658] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... [13:14:17.659] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... DONE [13:14:17.659] Exporting '...future.elements_ii' (280 bytes) to cluster node #1 ... [13:14:17.659] Exporting '...future.elements_ii' (280 bytes) to cluster node #1 ... DONE [13:14:17.659] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:14:17.660] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:14:17.660] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:14:17.660] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:14:17.661] Exporting 11 global objects (93.23 KiB) to cluster node #1 ... DONE [13:14:17.661] MultisessionFuture started [13:14:17.661] - Launch lazy future ... done [13:14:17.662] run() for 'MultisessionFuture' ... done [13:14:17.662] Created future: [13:14:17.680] receiveMessageFromWorker() for ClusterFuture ... [13:14:17.680] - Validating connection of MultisessionFuture [13:14:17.680] - received message: FutureResult [13:14:17.681] - Received FutureResult [13:14:17.681] - Erased future from FutureRegistry [13:14:17.681] result() for ClusterFuture ... [13:14:17.681] - result already collected: FutureResult [13:14:17.681] result() for ClusterFuture ... done [13:14:17.681] receiveMessageFromWorker() for ClusterFuture ... done [13:14:17.662] MultisessionFuture: [13:14:17.662] Label: 'future_vapply-1' [13:14:17.662] Expression: [13:14:17.662] { [13:14:17.662] do.call(function(...) { [13:14:17.662] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:17.662] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:17.662] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:17.662] on.exit(options(oopts), add = TRUE) [13:14:17.662] } [13:14:17.662] { [13:14:17.662] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:17.662] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:17.662] ...future.FUN(...future.X_jj, ...) [13:14:17.662] }) [13:14:17.662] } [13:14:17.662] }, args = future.call.arguments) [13:14:17.662] } [13:14:17.662] Lazy evaluation: FALSE [13:14:17.662] Asynchronous evaluation: TRUE [13:14:17.662] Local evaluation: TRUE [13:14:17.662] Environment: R_GlobalEnv [13:14:17.662] Capture standard output: TRUE [13:14:17.662] Capture condition classes: 'condition' (excluding 'nothing') [13:14:17.662] Globals: 11 objects totaling 93.51 KiB (function '...future.FUN' of 21.22 KiB, function 'x_FUN' of 1.16 KiB, integer 'times' of 56 bytes, function 'stopf' of 26.43 KiB, function 'stop_if_not' of 44.12 KiB, ...) [13:14:17.662] Packages: 1 packages ('future.apply') [13:14:17.662] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:14:17.662] Resolved: TRUE [13:14:17.662] Value: [13:14:17.662] Conditions captured: [13:14:17.662] Early signaling: FALSE [13:14:17.662] Owner process: 1bb7d580-628d-c90d-e38a-66de485868c4 [13:14:17.662] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:14:17.682] Chunk #1 of 2 ... DONE [13:14:17.682] Chunk #2 of 2 ... [13:14:17.682] - Finding globals in 'X' for chunk #2 ... [13:14:17.682] getGlobalsAndPackages() ... [13:14:17.683] Searching for globals... [13:14:17.683] [13:14:17.683] Searching for globals ... DONE [13:14:17.683] - globals: [0] [13:14:17.683] getGlobalsAndPackages() ... DONE [13:14:17.684] + additional globals found: [n=0] [13:14:17.684] + additional namespaces needed: [n=0] [13:14:17.684] - Finding globals in 'X' for chunk #2 ... DONE [13:14:17.684] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:14:17.684] - seeds: [13:14:17.684] - All globals exported: [n=11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:17.685] getGlobalsAndPackages() ... [13:14:17.685] - globals passed as-is: [11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:17.685] Resolving globals: FALSE [13:14:17.685] Tweak future expression to call with '...' arguments ... [13:14:17.685] { [13:14:17.685] do.call(function(...) { [13:14:17.685] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:17.685] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:17.685] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:17.685] on.exit(options(oopts), add = TRUE) [13:14:17.685] } [13:14:17.685] { [13:14:17.685] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:17.685] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:17.685] ...future.FUN(...future.X_jj, ...) [13:14:17.685] }) [13:14:17.685] } [13:14:17.685] }, args = future.call.arguments) [13:14:17.685] } [13:14:17.686] Tweak future expression to call with '...' arguments ... DONE [13:14:17.687] - globals: [11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:17.687] - packages: [1] 'future.apply' [13:14:17.687] getGlobalsAndPackages() ... DONE [13:14:17.687] run() for 'Future' ... [13:14:17.688] - state: 'created' [13:14:17.688] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:14:17.702] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:14:17.702] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:14:17.702] - Field: 'node' [13:14:17.703] - Field: 'label' [13:14:17.703] - Field: 'local' [13:14:17.703] - Field: 'owner' [13:14:17.703] - Field: 'envir' [13:14:17.703] - Field: 'workers' [13:14:17.704] - Field: 'packages' [13:14:17.704] - Field: 'gc' [13:14:17.704] - Field: 'conditions' [13:14:17.704] - Field: 'persistent' [13:14:17.704] - Field: 'expr' [13:14:17.704] - Field: 'uuid' [13:14:17.705] - Field: 'seed' [13:14:17.705] - Field: 'version' [13:14:17.705] - Field: 'result' [13:14:17.705] - Field: 'asynchronous' [13:14:17.705] - Field: 'calls' [13:14:17.705] - Field: 'globals' [13:14:17.706] - Field: 'stdout' [13:14:17.706] - Field: 'earlySignal' [13:14:17.706] - Field: 'lazy' [13:14:17.706] - Field: 'state' [13:14:17.706] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:14:17.707] - Launch lazy future ... [13:14:17.707] Packages needed by the future expression (n = 1): 'future.apply' [13:14:17.707] Packages needed by future strategies (n = 0): [13:14:17.708] { [13:14:17.708] { [13:14:17.708] { [13:14:17.708] ...future.startTime <- base::Sys.time() [13:14:17.708] { [13:14:17.708] { [13:14:17.708] { [13:14:17.708] { [13:14:17.708] { [13:14:17.708] base::local({ [13:14:17.708] has_future <- base::requireNamespace("future", [13:14:17.708] quietly = TRUE) [13:14:17.708] if (has_future) { [13:14:17.708] ns <- base::getNamespace("future") [13:14:17.708] version <- ns[[".package"]][["version"]] [13:14:17.708] if (is.null(version)) [13:14:17.708] version <- utils::packageVersion("future") [13:14:17.708] } [13:14:17.708] else { [13:14:17.708] version <- NULL [13:14:17.708] } [13:14:17.708] if (!has_future || version < "1.8.0") { [13:14:17.708] info <- base::c(r_version = base::gsub("R version ", [13:14:17.708] "", base::R.version$version.string), [13:14:17.708] platform = base::sprintf("%s (%s-bit)", [13:14:17.708] base::R.version$platform, 8 * [13:14:17.708] base::.Machine$sizeof.pointer), [13:14:17.708] os = base::paste(base::Sys.info()[base::c("sysname", [13:14:17.708] "release", "version")], collapse = " "), [13:14:17.708] hostname = base::Sys.info()[["nodename"]]) [13:14:17.708] info <- base::sprintf("%s: %s", base::names(info), [13:14:17.708] info) [13:14:17.708] info <- base::paste(info, collapse = "; ") [13:14:17.708] if (!has_future) { [13:14:17.708] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:14:17.708] info) [13:14:17.708] } [13:14:17.708] else { [13:14:17.708] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:14:17.708] info, version) [13:14:17.708] } [13:14:17.708] base::stop(msg) [13:14:17.708] } [13:14:17.708] }) [13:14:17.708] } [13:14:17.708] ...future.mc.cores.old <- base::getOption("mc.cores") [13:14:17.708] base::options(mc.cores = 1L) [13:14:17.708] } [13:14:17.708] base::local({ [13:14:17.708] for (pkg in "future.apply") { [13:14:17.708] base::loadNamespace(pkg) [13:14:17.708] base::library(pkg, character.only = TRUE) [13:14:17.708] } [13:14:17.708] }) [13:14:17.708] } [13:14:17.708] options(future.plan = NULL) [13:14:17.708] Sys.unsetenv("R_FUTURE_PLAN") [13:14:17.708] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:14:17.708] } [13:14:17.708] ...future.workdir <- getwd() [13:14:17.708] } [13:14:17.708] ...future.oldOptions <- base::as.list(base::.Options) [13:14:17.708] ...future.oldEnvVars <- base::Sys.getenv() [13:14:17.708] } [13:14:17.708] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:14:17.708] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:14:17.708] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:14:17.708] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:14:17.708] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:14:17.708] future.stdout.windows.reencode = NULL, width = 80L) [13:14:17.708] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:14:17.708] base::names(...future.oldOptions)) [13:14:17.708] } [13:14:17.708] if (FALSE) { [13:14:17.708] } [13:14:17.708] else { [13:14:17.708] if (TRUE) { [13:14:17.708] ...future.stdout <- base::rawConnection(base::raw(0L), [13:14:17.708] open = "w") [13:14:17.708] } [13:14:17.708] else { [13:14:17.708] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:14:17.708] windows = "NUL", "/dev/null"), open = "w") [13:14:17.708] } [13:14:17.708] base::sink(...future.stdout, type = "output", split = FALSE) [13:14:17.708] base::on.exit(if (!base::is.null(...future.stdout)) { [13:14:17.708] base::sink(type = "output", split = FALSE) [13:14:17.708] base::close(...future.stdout) [13:14:17.708] }, add = TRUE) [13:14:17.708] } [13:14:17.708] ...future.frame <- base::sys.nframe() [13:14:17.708] ...future.conditions <- base::list() [13:14:17.708] ...future.rng <- base::globalenv()$.Random.seed [13:14:17.708] if (FALSE) { [13:14:17.708] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:14:17.708] "...future.value", "...future.globalenv.names", ".Random.seed") [13:14:17.708] } [13:14:17.708] ...future.result <- base::tryCatch({ [13:14:17.708] base::withCallingHandlers({ [13:14:17.708] ...future.value <- base::withVisible(base::local({ [13:14:17.708] ...future.makeSendCondition <- local({ [13:14:17.708] sendCondition <- NULL [13:14:17.708] function(frame = 1L) { [13:14:17.708] if (is.function(sendCondition)) [13:14:17.708] return(sendCondition) [13:14:17.708] ns <- getNamespace("parallel") [13:14:17.708] if (exists("sendData", mode = "function", [13:14:17.708] envir = ns)) { [13:14:17.708] parallel_sendData <- get("sendData", mode = "function", [13:14:17.708] envir = ns) [13:14:17.708] envir <- sys.frame(frame) [13:14:17.708] master <- NULL [13:14:17.708] while (!identical(envir, .GlobalEnv) && [13:14:17.708] !identical(envir, emptyenv())) { [13:14:17.708] if (exists("master", mode = "list", envir = envir, [13:14:17.708] inherits = FALSE)) { [13:14:17.708] master <- get("master", mode = "list", [13:14:17.708] envir = envir, inherits = FALSE) [13:14:17.708] if (inherits(master, c("SOCKnode", [13:14:17.708] "SOCK0node"))) { [13:14:17.708] sendCondition <<- function(cond) { [13:14:17.708] data <- list(type = "VALUE", value = cond, [13:14:17.708] success = TRUE) [13:14:17.708] parallel_sendData(master, data) [13:14:17.708] } [13:14:17.708] return(sendCondition) [13:14:17.708] } [13:14:17.708] } [13:14:17.708] frame <- frame + 1L [13:14:17.708] envir <- sys.frame(frame) [13:14:17.708] } [13:14:17.708] } [13:14:17.708] sendCondition <<- function(cond) NULL [13:14:17.708] } [13:14:17.708] }) [13:14:17.708] withCallingHandlers({ [13:14:17.708] { [13:14:17.708] do.call(function(...) { [13:14:17.708] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:17.708] if (!identical(...future.globals.maxSize.org, [13:14:17.708] ...future.globals.maxSize)) { [13:14:17.708] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:17.708] on.exit(options(oopts), add = TRUE) [13:14:17.708] } [13:14:17.708] { [13:14:17.708] lapply(seq_along(...future.elements_ii), [13:14:17.708] FUN = function(jj) { [13:14:17.708] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:17.708] ...future.FUN(...future.X_jj, ...) [13:14:17.708] }) [13:14:17.708] } [13:14:17.708] }, args = future.call.arguments) [13:14:17.708] } [13:14:17.708] }, immediateCondition = function(cond) { [13:14:17.708] sendCondition <- ...future.makeSendCondition() [13:14:17.708] sendCondition(cond) [13:14:17.708] muffleCondition <- function (cond, pattern = "^muffle") [13:14:17.708] { [13:14:17.708] inherits <- base::inherits [13:14:17.708] invokeRestart <- base::invokeRestart [13:14:17.708] is.null <- base::is.null [13:14:17.708] muffled <- FALSE [13:14:17.708] if (inherits(cond, "message")) { [13:14:17.708] muffled <- grepl(pattern, "muffleMessage") [13:14:17.708] if (muffled) [13:14:17.708] invokeRestart("muffleMessage") [13:14:17.708] } [13:14:17.708] else if (inherits(cond, "warning")) { [13:14:17.708] muffled <- grepl(pattern, "muffleWarning") [13:14:17.708] if (muffled) [13:14:17.708] invokeRestart("muffleWarning") [13:14:17.708] } [13:14:17.708] else if (inherits(cond, "condition")) { [13:14:17.708] if (!is.null(pattern)) { [13:14:17.708] computeRestarts <- base::computeRestarts [13:14:17.708] grepl <- base::grepl [13:14:17.708] restarts <- computeRestarts(cond) [13:14:17.708] for (restart in restarts) { [13:14:17.708] name <- restart$name [13:14:17.708] if (is.null(name)) [13:14:17.708] next [13:14:17.708] if (!grepl(pattern, name)) [13:14:17.708] next [13:14:17.708] invokeRestart(restart) [13:14:17.708] muffled <- TRUE [13:14:17.708] break [13:14:17.708] } [13:14:17.708] } [13:14:17.708] } [13:14:17.708] invisible(muffled) [13:14:17.708] } [13:14:17.708] muffleCondition(cond) [13:14:17.708] }) [13:14:17.708] })) [13:14:17.708] future::FutureResult(value = ...future.value$value, [13:14:17.708] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:14:17.708] ...future.rng), globalenv = if (FALSE) [13:14:17.708] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:14:17.708] ...future.globalenv.names)) [13:14:17.708] else NULL, started = ...future.startTime, version = "1.8") [13:14:17.708] }, condition = base::local({ [13:14:17.708] c <- base::c [13:14:17.708] inherits <- base::inherits [13:14:17.708] invokeRestart <- base::invokeRestart [13:14:17.708] length <- base::length [13:14:17.708] list <- base::list [13:14:17.708] seq.int <- base::seq.int [13:14:17.708] signalCondition <- base::signalCondition [13:14:17.708] sys.calls <- base::sys.calls [13:14:17.708] `[[` <- base::`[[` [13:14:17.708] `+` <- base::`+` [13:14:17.708] `<<-` <- base::`<<-` [13:14:17.708] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:14:17.708] calls[seq.int(from = from + 12L, to = length(calls) - [13:14:17.708] 3L)] [13:14:17.708] } [13:14:17.708] function(cond) { [13:14:17.708] is_error <- inherits(cond, "error") [13:14:17.708] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:14:17.708] NULL) [13:14:17.708] if (is_error) { [13:14:17.708] sessionInformation <- function() { [13:14:17.708] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:14:17.708] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:14:17.708] search = base::search(), system = base::Sys.info()) [13:14:17.708] } [13:14:17.708] ...future.conditions[[length(...future.conditions) + [13:14:17.708] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:14:17.708] cond$call), session = sessionInformation(), [13:14:17.708] timestamp = base::Sys.time(), signaled = 0L) [13:14:17.708] signalCondition(cond) [13:14:17.708] } [13:14:17.708] else if (!ignore && TRUE && inherits(cond, c("condition", [13:14:17.708] "immediateCondition"))) { [13:14:17.708] signal <- TRUE && inherits(cond, "immediateCondition") [13:14:17.708] ...future.conditions[[length(...future.conditions) + [13:14:17.708] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:14:17.708] if (TRUE && !signal) { [13:14:17.708] muffleCondition <- function (cond, pattern = "^muffle") [13:14:17.708] { [13:14:17.708] inherits <- base::inherits [13:14:17.708] invokeRestart <- base::invokeRestart [13:14:17.708] is.null <- base::is.null [13:14:17.708] muffled <- FALSE [13:14:17.708] if (inherits(cond, "message")) { [13:14:17.708] muffled <- grepl(pattern, "muffleMessage") [13:14:17.708] if (muffled) [13:14:17.708] invokeRestart("muffleMessage") [13:14:17.708] } [13:14:17.708] else if (inherits(cond, "warning")) { [13:14:17.708] muffled <- grepl(pattern, "muffleWarning") [13:14:17.708] if (muffled) [13:14:17.708] invokeRestart("muffleWarning") [13:14:17.708] } [13:14:17.708] else if (inherits(cond, "condition")) { [13:14:17.708] if (!is.null(pattern)) { [13:14:17.708] computeRestarts <- base::computeRestarts [13:14:17.708] grepl <- base::grepl [13:14:17.708] restarts <- computeRestarts(cond) [13:14:17.708] for (restart in restarts) { [13:14:17.708] name <- restart$name [13:14:17.708] if (is.null(name)) [13:14:17.708] next [13:14:17.708] if (!grepl(pattern, name)) [13:14:17.708] next [13:14:17.708] invokeRestart(restart) [13:14:17.708] muffled <- TRUE [13:14:17.708] break [13:14:17.708] } [13:14:17.708] } [13:14:17.708] } [13:14:17.708] invisible(muffled) [13:14:17.708] } [13:14:17.708] muffleCondition(cond, pattern = "^muffle") [13:14:17.708] } [13:14:17.708] } [13:14:17.708] else { [13:14:17.708] if (TRUE) { [13:14:17.708] muffleCondition <- function (cond, pattern = "^muffle") [13:14:17.708] { [13:14:17.708] inherits <- base::inherits [13:14:17.708] invokeRestart <- base::invokeRestart [13:14:17.708] is.null <- base::is.null [13:14:17.708] muffled <- FALSE [13:14:17.708] if (inherits(cond, "message")) { [13:14:17.708] muffled <- grepl(pattern, "muffleMessage") [13:14:17.708] if (muffled) [13:14:17.708] invokeRestart("muffleMessage") [13:14:17.708] } [13:14:17.708] else if (inherits(cond, "warning")) { [13:14:17.708] muffled <- grepl(pattern, "muffleWarning") [13:14:17.708] if (muffled) [13:14:17.708] invokeRestart("muffleWarning") [13:14:17.708] } [13:14:17.708] else if (inherits(cond, "condition")) { [13:14:17.708] if (!is.null(pattern)) { [13:14:17.708] computeRestarts <- base::computeRestarts [13:14:17.708] grepl <- base::grepl [13:14:17.708] restarts <- computeRestarts(cond) [13:14:17.708] for (restart in restarts) { [13:14:17.708] name <- restart$name [13:14:17.708] if (is.null(name)) [13:14:17.708] next [13:14:17.708] if (!grepl(pattern, name)) [13:14:17.708] next [13:14:17.708] invokeRestart(restart) [13:14:17.708] muffled <- TRUE [13:14:17.708] break [13:14:17.708] } [13:14:17.708] } [13:14:17.708] } [13:14:17.708] invisible(muffled) [13:14:17.708] } [13:14:17.708] muffleCondition(cond, pattern = "^muffle") [13:14:17.708] } [13:14:17.708] } [13:14:17.708] } [13:14:17.708] })) [13:14:17.708] }, error = function(ex) { [13:14:17.708] base::structure(base::list(value = NULL, visible = NULL, [13:14:17.708] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:14:17.708] ...future.rng), started = ...future.startTime, [13:14:17.708] finished = Sys.time(), session_uuid = NA_character_, [13:14:17.708] version = "1.8"), class = "FutureResult") [13:14:17.708] }, finally = { [13:14:17.708] if (!identical(...future.workdir, getwd())) [13:14:17.708] setwd(...future.workdir) [13:14:17.708] { [13:14:17.708] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:14:17.708] ...future.oldOptions$nwarnings <- NULL [13:14:17.708] } [13:14:17.708] base::options(...future.oldOptions) [13:14:17.708] if (.Platform$OS.type == "windows") { [13:14:17.708] old_names <- names(...future.oldEnvVars) [13:14:17.708] envs <- base::Sys.getenv() [13:14:17.708] names <- names(envs) [13:14:17.708] common <- intersect(names, old_names) [13:14:17.708] added <- setdiff(names, old_names) [13:14:17.708] removed <- setdiff(old_names, names) [13:14:17.708] changed <- common[...future.oldEnvVars[common] != [13:14:17.708] envs[common]] [13:14:17.708] NAMES <- toupper(changed) [13:14:17.708] args <- list() [13:14:17.708] for (kk in seq_along(NAMES)) { [13:14:17.708] name <- changed[[kk]] [13:14:17.708] NAME <- NAMES[[kk]] [13:14:17.708] if (name != NAME && is.element(NAME, old_names)) [13:14:17.708] next [13:14:17.708] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:17.708] } [13:14:17.708] NAMES <- toupper(added) [13:14:17.708] for (kk in seq_along(NAMES)) { [13:14:17.708] name <- added[[kk]] [13:14:17.708] NAME <- NAMES[[kk]] [13:14:17.708] if (name != NAME && is.element(NAME, old_names)) [13:14:17.708] next [13:14:17.708] args[[name]] <- "" [13:14:17.708] } [13:14:17.708] NAMES <- toupper(removed) [13:14:17.708] for (kk in seq_along(NAMES)) { [13:14:17.708] name <- removed[[kk]] [13:14:17.708] NAME <- NAMES[[kk]] [13:14:17.708] if (name != NAME && is.element(NAME, old_names)) [13:14:17.708] next [13:14:17.708] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:17.708] } [13:14:17.708] if (length(args) > 0) [13:14:17.708] base::do.call(base::Sys.setenv, args = args) [13:14:17.708] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:14:17.708] } [13:14:17.708] else { [13:14:17.708] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:14:17.708] } [13:14:17.708] { [13:14:17.708] if (base::length(...future.futureOptionsAdded) > [13:14:17.708] 0L) { [13:14:17.708] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:14:17.708] base::names(opts) <- ...future.futureOptionsAdded [13:14:17.708] base::options(opts) [13:14:17.708] } [13:14:17.708] { [13:14:17.708] { [13:14:17.708] base::options(mc.cores = ...future.mc.cores.old) [13:14:17.708] NULL [13:14:17.708] } [13:14:17.708] options(future.plan = NULL) [13:14:17.708] if (is.na(NA_character_)) [13:14:17.708] Sys.unsetenv("R_FUTURE_PLAN") [13:14:17.708] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:14:17.708] future::plan(list(function (..., workers = availableCores(), [13:14:17.708] lazy = FALSE, rscript_libs = .libPaths(), [13:14:17.708] envir = parent.frame()) [13:14:17.708] { [13:14:17.708] if (is.function(workers)) [13:14:17.708] workers <- workers() [13:14:17.708] workers <- structure(as.integer(workers), [13:14:17.708] class = class(workers)) [13:14:17.708] stop_if_not(length(workers) == 1, is.finite(workers), [13:14:17.708] workers >= 1) [13:14:17.708] if (workers == 1L && !inherits(workers, "AsIs")) { [13:14:17.708] return(sequential(..., lazy = TRUE, envir = envir)) [13:14:17.708] } [13:14:17.708] future <- MultisessionFuture(..., workers = workers, [13:14:17.708] lazy = lazy, rscript_libs = rscript_libs, [13:14:17.708] envir = envir) [13:14:17.708] if (!future$lazy) [13:14:17.708] future <- run(future) [13:14:17.708] invisible(future) [13:14:17.708] }), .cleanup = FALSE, .init = FALSE) [13:14:17.708] } [13:14:17.708] } [13:14:17.708] } [13:14:17.708] }) [13:14:17.708] if (TRUE) { [13:14:17.708] base::sink(type = "output", split = FALSE) [13:14:17.708] if (TRUE) { [13:14:17.708] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:14:17.708] } [13:14:17.708] else { [13:14:17.708] ...future.result["stdout"] <- base::list(NULL) [13:14:17.708] } [13:14:17.708] base::close(...future.stdout) [13:14:17.708] ...future.stdout <- NULL [13:14:17.708] } [13:14:17.708] ...future.result$conditions <- ...future.conditions [13:14:17.708] ...future.result$finished <- base::Sys.time() [13:14:17.708] ...future.result [13:14:17.708] } [13:14:17.713] Exporting 11 global objects (93.23 KiB) to cluster node #1 ... [13:14:17.713] Exporting '...future.FUN' (21.22 KiB) to cluster node #1 ... [13:14:17.714] Exporting '...future.FUN' (21.22 KiB) to cluster node #1 ... DONE [13:14:17.714] Exporting 'x_FUN' (1.16 KiB) to cluster node #1 ... [13:14:17.715] Exporting 'x_FUN' (1.16 KiB) to cluster node #1 ... DONE [13:14:17.715] Exporting 'times' (56 bytes) to cluster node #1 ... [13:14:17.715] Exporting 'times' (56 bytes) to cluster node #1 ... DONE [13:14:17.715] Exporting 'stopf' (26.43 KiB) to cluster node #1 ... [13:14:17.716] Exporting 'stopf' (26.43 KiB) to cluster node #1 ... DONE [13:14:17.716] Exporting 'stop_if_not' (44.12 KiB) to cluster node #1 ... [13:14:17.716] Exporting 'stop_if_not' (44.12 KiB) to cluster node #1 ... DONE [13:14:17.717] Exporting 'dim' (0 bytes) to cluster node #1 ... [13:14:17.717] Exporting 'dim' (0 bytes) to cluster node #1 ... DONE [13:14:17.717] Exporting 'valid_types' (248 bytes) to cluster node #1 ... [13:14:17.718] Exporting 'valid_types' (248 bytes) to cluster node #1 ... DONE [13:14:17.718] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... [13:14:17.718] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... DONE [13:14:17.718] Exporting '...future.elements_ii' (280 bytes) to cluster node #1 ... [13:14:17.719] Exporting '...future.elements_ii' (280 bytes) to cluster node #1 ... DONE [13:14:17.719] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:14:17.721] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:14:17.722] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:14:17.722] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:14:17.722] Exporting 11 global objects (93.23 KiB) to cluster node #1 ... DONE [13:14:17.723] MultisessionFuture started [13:14:17.723] - Launch lazy future ... done [13:14:17.723] run() for 'MultisessionFuture' ... done [13:14:17.723] Created future: [13:14:17.739] receiveMessageFromWorker() for ClusterFuture ... [13:14:17.740] - Validating connection of MultisessionFuture [13:14:17.740] - received message: FutureResult [13:14:17.740] - Received FutureResult [13:14:17.740] - Erased future from FutureRegistry [13:14:17.740] result() for ClusterFuture ... [13:14:17.741] - result already collected: FutureResult [13:14:17.741] result() for ClusterFuture ... done [13:14:17.741] receiveMessageFromWorker() for ClusterFuture ... done [13:14:17.724] MultisessionFuture: [13:14:17.724] Label: 'future_vapply-2' [13:14:17.724] Expression: [13:14:17.724] { [13:14:17.724] do.call(function(...) { [13:14:17.724] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:17.724] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:17.724] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:17.724] on.exit(options(oopts), add = TRUE) [13:14:17.724] } [13:14:17.724] { [13:14:17.724] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:17.724] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:17.724] ...future.FUN(...future.X_jj, ...) [13:14:17.724] }) [13:14:17.724] } [13:14:17.724] }, args = future.call.arguments) [13:14:17.724] } [13:14:17.724] Lazy evaluation: FALSE [13:14:17.724] Asynchronous evaluation: TRUE [13:14:17.724] Local evaluation: TRUE [13:14:17.724] Environment: R_GlobalEnv [13:14:17.724] Capture standard output: TRUE [13:14:17.724] Capture condition classes: 'condition' (excluding 'nothing') [13:14:17.724] Globals: 11 objects totaling 93.51 KiB (function '...future.FUN' of 21.22 KiB, function 'x_FUN' of 1.16 KiB, integer 'times' of 56 bytes, function 'stopf' of 26.43 KiB, function 'stop_if_not' of 44.12 KiB, ...) [13:14:17.724] Packages: 1 packages ('future.apply') [13:14:17.724] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:14:17.724] Resolved: TRUE [13:14:17.724] Value: [13:14:17.724] Conditions captured: [13:14:17.724] Early signaling: FALSE [13:14:17.724] Owner process: 1bb7d580-628d-c90d-e38a-66de485868c4 [13:14:17.724] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:14:17.741] Chunk #2 of 2 ... DONE [13:14:17.742] Launching 2 futures (chunks) ... DONE [13:14:17.742] Resolving 2 futures (chunks) ... [13:14:17.742] resolve() on list ... [13:14:17.742] recursive: 0 [13:14:17.742] length: 2 [13:14:17.742] [13:14:17.742] Future #1 [13:14:17.743] result() for ClusterFuture ... [13:14:17.743] - result already collected: FutureResult [13:14:17.743] result() for ClusterFuture ... done [13:14:17.743] result() for ClusterFuture ... [13:14:17.743] - result already collected: FutureResult [13:14:17.743] result() for ClusterFuture ... done [13:14:17.744] signalConditionsASAP(MultisessionFuture, pos=1) ... [13:14:17.744] - nx: 2 [13:14:17.744] - relay: TRUE [13:14:17.744] - stdout: TRUE [13:14:17.744] - signal: TRUE [13:14:17.744] - resignal: FALSE [13:14:17.744] - force: TRUE [13:14:17.745] - relayed: [n=2] FALSE, FALSE [13:14:17.745] - queued futures: [n=2] FALSE, FALSE [13:14:17.745] - until=1 [13:14:17.745] - relaying element #1 [13:14:17.745] result() for ClusterFuture ... [13:14:17.745] - result already collected: FutureResult [13:14:17.746] result() for ClusterFuture ... done [13:14:17.746] result() for ClusterFuture ... [13:14:17.746] - result already collected: FutureResult [13:14:17.746] result() for ClusterFuture ... done [13:14:17.746] result() for ClusterFuture ... [13:14:17.746] - result already collected: FutureResult [13:14:17.747] result() for ClusterFuture ... done [13:14:17.747] result() for ClusterFuture ... [13:14:17.747] - result already collected: FutureResult [13:14:17.747] result() for ClusterFuture ... done [13:14:17.747] - relayed: [n=2] TRUE, FALSE [13:14:17.747] - queued futures: [n=2] TRUE, FALSE [13:14:17.747] signalConditionsASAP(MultisessionFuture, pos=1) ... done [13:14:17.748] length: 1 (resolved future 1) [13:14:17.748] Future #2 [13:14:17.748] result() for ClusterFuture ... [13:14:17.748] - result already collected: FutureResult [13:14:17.748] result() for ClusterFuture ... done [13:14:17.748] result() for ClusterFuture ... [13:14:17.749] - result already collected: FutureResult [13:14:17.749] result() for ClusterFuture ... done [13:14:17.749] signalConditionsASAP(MultisessionFuture, pos=2) ... [13:14:17.749] - nx: 2 [13:14:17.749] - relay: TRUE [13:14:17.749] - stdout: TRUE [13:14:17.750] - signal: TRUE [13:14:17.750] - resignal: FALSE [13:14:17.750] - force: TRUE [13:14:17.750] - relayed: [n=2] TRUE, FALSE [13:14:17.750] - queued futures: [n=2] TRUE, FALSE [13:14:17.750] - until=2 [13:14:17.750] - relaying element #2 [13:14:17.751] result() for ClusterFuture ... [13:14:17.751] - result already collected: FutureResult [13:14:17.751] result() for ClusterFuture ... done [13:14:17.751] result() for ClusterFuture ... [13:14:17.751] - result already collected: FutureResult [13:14:17.751] result() for ClusterFuture ... done [13:14:17.752] result() for ClusterFuture ... [13:14:17.752] - result already collected: FutureResult [13:14:17.752] result() for ClusterFuture ... done [13:14:17.752] result() for ClusterFuture ... [13:14:17.752] - result already collected: FutureResult [13:14:17.752] result() for ClusterFuture ... done [13:14:17.753] - relayed: [n=2] TRUE, TRUE [13:14:17.753] - queued futures: [n=2] TRUE, TRUE [13:14:17.753] signalConditionsASAP(MultisessionFuture, pos=2) ... done [13:14:17.753] length: 0 (resolved future 2) [13:14:17.753] Relaying remaining futures [13:14:17.754] signalConditionsASAP(NULL, pos=0) ... [13:14:17.754] - nx: 2 [13:14:17.754] - relay: TRUE [13:14:17.754] - stdout: TRUE [13:14:17.754] - signal: TRUE [13:14:17.754] - resignal: FALSE [13:14:17.754] - force: TRUE [13:14:17.755] - relayed: [n=2] TRUE, TRUE [13:14:17.755] - queued futures: [n=2] TRUE, TRUE - flush all [13:14:17.755] - relayed: [n=2] TRUE, TRUE [13:14:17.755] - queued futures: [n=2] TRUE, TRUE [13:14:17.755] signalConditionsASAP(NULL, pos=0) ... done [13:14:17.755] resolve() on list ... DONE [13:14:17.756] result() for ClusterFuture ... [13:14:17.756] - result already collected: FutureResult [13:14:17.756] result() for ClusterFuture ... done [13:14:17.756] result() for ClusterFuture ... [13:14:17.756] - result already collected: FutureResult [13:14:17.756] result() for ClusterFuture ... done [13:14:17.757] result() for ClusterFuture ... [13:14:17.757] - result already collected: FutureResult [13:14:17.757] result() for ClusterFuture ... done [13:14:17.757] result() for ClusterFuture ... [13:14:17.757] - result already collected: FutureResult [13:14:17.757] result() for ClusterFuture ... done [13:14:17.758] - Number of value chunks collected: 2 [13:14:17.758] Resolving 2 futures (chunks) ... DONE [13:14:17.758] Reducing values from 2 chunks ... [13:14:17.758] - Number of values collected after concatenation: 10 [13:14:17.758] - Number of values expected: 10 [13:14:17.758] Reducing values from 2 chunks ... DONE [13:14:17.758] future_lapply() ... DONE num[0 , 1:10] int[0 , 1:10] [13:14:17.760] future_lapply() ... [13:14:17.764] Number of chunks: 2 [13:14:17.764] getGlobalsAndPackagesXApply() ... [13:14:17.765] - future.globals: TRUE [13:14:17.765] getGlobalsAndPackages() ... [13:14:17.765] Searching for globals... [13:14:17.769] - globals found: [17] 'FUN', '{', '<-', 'x_FUN', 'if', '!=', 'length', 'times', 'stopf', 'stop_if_not', 'all', '==', 'dim', '%in%', 'typeof', 'valid_types', 'integer' [13:14:17.770] Searching for globals ... DONE [13:14:17.770] Resolving globals: FALSE [13:14:17.771] The total size of the 7 globals is 93.16 KiB (95400 bytes) [13:14:17.771] The total size of the 7 globals exported for future expression ('FUN()') is 93.16 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). The three largest globals are 'stop_if_not' (44.12 KiB of class 'function'), 'stopf' (26.43 KiB of class 'function') and 'FUN' (21.22 KiB of class 'function') [13:14:17.772] - globals: [7] 'FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types' [13:14:17.772] - packages: [1] 'future.apply' [13:14:17.772] getGlobalsAndPackages() ... DONE [13:14:17.772] - globals found/used: [n=7] 'FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types' [13:14:17.772] - needed namespaces: [n=1] 'future.apply' [13:14:17.773] Finding globals ... DONE [13:14:17.773] - use_args: TRUE [13:14:17.773] - Getting '...' globals ... [13:14:17.773] resolve() on list ... [13:14:17.773] recursive: 0 [13:14:17.774] length: 1 [13:14:17.774] elements: '...' [13:14:17.774] length: 0 (resolved future 1) [13:14:17.774] resolve() on list ... DONE [13:14:17.774] - '...' content: [n=0] [13:14:17.774] List of 1 [13:14:17.774] $ ...: list() [13:14:17.774] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:14:17.774] - attr(*, "where")=List of 1 [13:14:17.774] ..$ ...: [13:14:17.774] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:14:17.774] - attr(*, "resolved")= logi TRUE [13:14:17.774] - attr(*, "total_size")= num NA [13:14:17.778] - Getting '...' globals ... DONE [13:14:17.778] Globals to be used in all futures (chunks): [n=8] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...' [13:14:17.778] List of 8 [13:14:17.778] $ ...future.FUN:function (x, ...) [13:14:17.778] $ x_FUN :function (x) [13:14:17.778] $ times : int 0 [13:14:17.778] $ stopf :function (fmt, ..., call. = TRUE, domain = NULL) [13:14:17.778] $ stop_if_not :function (...) [13:14:17.778] $ dim : NULL [13:14:17.778] $ valid_types : chr [1:2] "logical" "integer" [13:14:17.778] $ ... : list() [13:14:17.778] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:14:17.778] - attr(*, "where")=List of 8 [13:14:17.778] ..$ ...future.FUN: [13:14:17.778] ..$ x_FUN : [13:14:17.778] ..$ times : [13:14:17.778] ..$ stopf : [13:14:17.778] ..$ stop_if_not : [13:14:17.778] ..$ dim : [13:14:17.778] ..$ valid_types : [13:14:17.778] ..$ ... : [13:14:17.778] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:14:17.778] - attr(*, "resolved")= logi FALSE [13:14:17.778] - attr(*, "total_size")= num 95400 [13:14:17.784] Packages to be attached in all futures: [n=1] 'future.apply' [13:14:17.785] getGlobalsAndPackagesXApply() ... DONE [13:14:17.785] Number of futures (= number of chunks): 2 [13:14:17.785] Launching 2 futures (chunks) ... [13:14:17.785] Chunk #1 of 2 ... [13:14:17.786] - Finding globals in 'X' for chunk #1 ... [13:14:17.786] getGlobalsAndPackages() ... [13:14:17.786] Searching for globals... [13:14:17.787] [13:14:17.787] Searching for globals ... DONE [13:14:17.787] - globals: [0] [13:14:17.787] getGlobalsAndPackages() ... DONE [13:14:17.787] + additional globals found: [n=0] [13:14:17.788] + additional namespaces needed: [n=0] [13:14:17.788] - Finding globals in 'X' for chunk #1 ... DONE [13:14:17.788] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:14:17.788] - seeds: [13:14:17.788] - All globals exported: [n=11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:17.788] getGlobalsAndPackages() ... [13:14:17.789] - globals passed as-is: [11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:17.789] Resolving globals: FALSE [13:14:17.789] Tweak future expression to call with '...' arguments ... [13:14:17.789] { [13:14:17.789] do.call(function(...) { [13:14:17.789] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:17.789] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:17.789] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:17.789] on.exit(options(oopts), add = TRUE) [13:14:17.789] } [13:14:17.789] { [13:14:17.789] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:17.789] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:17.789] ...future.FUN(...future.X_jj, ...) [13:14:17.789] }) [13:14:17.789] } [13:14:17.789] }, args = future.call.arguments) [13:14:17.789] } [13:14:17.790] Tweak future expression to call with '...' arguments ... DONE [13:14:17.790] - globals: [11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:17.790] - packages: [1] 'future.apply' [13:14:17.791] getGlobalsAndPackages() ... DONE [13:14:17.791] run() for 'Future' ... [13:14:17.791] - state: 'created' [13:14:17.791] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:14:17.805] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:14:17.806] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:14:17.806] - Field: 'node' [13:14:17.806] - Field: 'label' [13:14:17.806] - Field: 'local' [13:14:17.806] - Field: 'owner' [13:14:17.806] - Field: 'envir' [13:14:17.807] - Field: 'workers' [13:14:17.807] - Field: 'packages' [13:14:17.807] - Field: 'gc' [13:14:17.807] - Field: 'conditions' [13:14:17.807] - Field: 'persistent' [13:14:17.808] - Field: 'expr' [13:14:17.808] - Field: 'uuid' [13:14:17.808] - Field: 'seed' [13:14:17.808] - Field: 'version' [13:14:17.808] - Field: 'result' [13:14:17.808] - Field: 'asynchronous' [13:14:17.809] - Field: 'calls' [13:14:17.809] - Field: 'globals' [13:14:17.809] - Field: 'stdout' [13:14:17.809] - Field: 'earlySignal' [13:14:17.809] - Field: 'lazy' [13:14:17.809] - Field: 'state' [13:14:17.810] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:14:17.810] - Launch lazy future ... [13:14:17.810] Packages needed by the future expression (n = 1): 'future.apply' [13:14:17.810] Packages needed by future strategies (n = 0): [13:14:17.811] { [13:14:17.811] { [13:14:17.811] { [13:14:17.811] ...future.startTime <- base::Sys.time() [13:14:17.811] { [13:14:17.811] { [13:14:17.811] { [13:14:17.811] { [13:14:17.811] { [13:14:17.811] base::local({ [13:14:17.811] has_future <- base::requireNamespace("future", [13:14:17.811] quietly = TRUE) [13:14:17.811] if (has_future) { [13:14:17.811] ns <- base::getNamespace("future") [13:14:17.811] version <- ns[[".package"]][["version"]] [13:14:17.811] if (is.null(version)) [13:14:17.811] version <- utils::packageVersion("future") [13:14:17.811] } [13:14:17.811] else { [13:14:17.811] version <- NULL [13:14:17.811] } [13:14:17.811] if (!has_future || version < "1.8.0") { [13:14:17.811] info <- base::c(r_version = base::gsub("R version ", [13:14:17.811] "", base::R.version$version.string), [13:14:17.811] platform = base::sprintf("%s (%s-bit)", [13:14:17.811] base::R.version$platform, 8 * [13:14:17.811] base::.Machine$sizeof.pointer), [13:14:17.811] os = base::paste(base::Sys.info()[base::c("sysname", [13:14:17.811] "release", "version")], collapse = " "), [13:14:17.811] hostname = base::Sys.info()[["nodename"]]) [13:14:17.811] info <- base::sprintf("%s: %s", base::names(info), [13:14:17.811] info) [13:14:17.811] info <- base::paste(info, collapse = "; ") [13:14:17.811] if (!has_future) { [13:14:17.811] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:14:17.811] info) [13:14:17.811] } [13:14:17.811] else { [13:14:17.811] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:14:17.811] info, version) [13:14:17.811] } [13:14:17.811] base::stop(msg) [13:14:17.811] } [13:14:17.811] }) [13:14:17.811] } [13:14:17.811] ...future.mc.cores.old <- base::getOption("mc.cores") [13:14:17.811] base::options(mc.cores = 1L) [13:14:17.811] } [13:14:17.811] base::local({ [13:14:17.811] for (pkg in "future.apply") { [13:14:17.811] base::loadNamespace(pkg) [13:14:17.811] base::library(pkg, character.only = TRUE) [13:14:17.811] } [13:14:17.811] }) [13:14:17.811] } [13:14:17.811] options(future.plan = NULL) [13:14:17.811] Sys.unsetenv("R_FUTURE_PLAN") [13:14:17.811] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:14:17.811] } [13:14:17.811] ...future.workdir <- getwd() [13:14:17.811] } [13:14:17.811] ...future.oldOptions <- base::as.list(base::.Options) [13:14:17.811] ...future.oldEnvVars <- base::Sys.getenv() [13:14:17.811] } [13:14:17.811] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:14:17.811] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:14:17.811] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:14:17.811] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:14:17.811] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:14:17.811] future.stdout.windows.reencode = NULL, width = 80L) [13:14:17.811] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:14:17.811] base::names(...future.oldOptions)) [13:14:17.811] } [13:14:17.811] if (FALSE) { [13:14:17.811] } [13:14:17.811] else { [13:14:17.811] if (TRUE) { [13:14:17.811] ...future.stdout <- base::rawConnection(base::raw(0L), [13:14:17.811] open = "w") [13:14:17.811] } [13:14:17.811] else { [13:14:17.811] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:14:17.811] windows = "NUL", "/dev/null"), open = "w") [13:14:17.811] } [13:14:17.811] base::sink(...future.stdout, type = "output", split = FALSE) [13:14:17.811] base::on.exit(if (!base::is.null(...future.stdout)) { [13:14:17.811] base::sink(type = "output", split = FALSE) [13:14:17.811] base::close(...future.stdout) [13:14:17.811] }, add = TRUE) [13:14:17.811] } [13:14:17.811] ...future.frame <- base::sys.nframe() [13:14:17.811] ...future.conditions <- base::list() [13:14:17.811] ...future.rng <- base::globalenv()$.Random.seed [13:14:17.811] if (FALSE) { [13:14:17.811] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:14:17.811] "...future.value", "...future.globalenv.names", ".Random.seed") [13:14:17.811] } [13:14:17.811] ...future.result <- base::tryCatch({ [13:14:17.811] base::withCallingHandlers({ [13:14:17.811] ...future.value <- base::withVisible(base::local({ [13:14:17.811] ...future.makeSendCondition <- local({ [13:14:17.811] sendCondition <- NULL [13:14:17.811] function(frame = 1L) { [13:14:17.811] if (is.function(sendCondition)) [13:14:17.811] return(sendCondition) [13:14:17.811] ns <- getNamespace("parallel") [13:14:17.811] if (exists("sendData", mode = "function", [13:14:17.811] envir = ns)) { [13:14:17.811] parallel_sendData <- get("sendData", mode = "function", [13:14:17.811] envir = ns) [13:14:17.811] envir <- sys.frame(frame) [13:14:17.811] master <- NULL [13:14:17.811] while (!identical(envir, .GlobalEnv) && [13:14:17.811] !identical(envir, emptyenv())) { [13:14:17.811] if (exists("master", mode = "list", envir = envir, [13:14:17.811] inherits = FALSE)) { [13:14:17.811] master <- get("master", mode = "list", [13:14:17.811] envir = envir, inherits = FALSE) [13:14:17.811] if (inherits(master, c("SOCKnode", [13:14:17.811] "SOCK0node"))) { [13:14:17.811] sendCondition <<- function(cond) { [13:14:17.811] data <- list(type = "VALUE", value = cond, [13:14:17.811] success = TRUE) [13:14:17.811] parallel_sendData(master, data) [13:14:17.811] } [13:14:17.811] return(sendCondition) [13:14:17.811] } [13:14:17.811] } [13:14:17.811] frame <- frame + 1L [13:14:17.811] envir <- sys.frame(frame) [13:14:17.811] } [13:14:17.811] } [13:14:17.811] sendCondition <<- function(cond) NULL [13:14:17.811] } [13:14:17.811] }) [13:14:17.811] withCallingHandlers({ [13:14:17.811] { [13:14:17.811] do.call(function(...) { [13:14:17.811] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:17.811] if (!identical(...future.globals.maxSize.org, [13:14:17.811] ...future.globals.maxSize)) { [13:14:17.811] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:17.811] on.exit(options(oopts), add = TRUE) [13:14:17.811] } [13:14:17.811] { [13:14:17.811] lapply(seq_along(...future.elements_ii), [13:14:17.811] FUN = function(jj) { [13:14:17.811] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:17.811] ...future.FUN(...future.X_jj, ...) [13:14:17.811] }) [13:14:17.811] } [13:14:17.811] }, args = future.call.arguments) [13:14:17.811] } [13:14:17.811] }, immediateCondition = function(cond) { [13:14:17.811] sendCondition <- ...future.makeSendCondition() [13:14:17.811] sendCondition(cond) [13:14:17.811] muffleCondition <- function (cond, pattern = "^muffle") [13:14:17.811] { [13:14:17.811] inherits <- base::inherits [13:14:17.811] invokeRestart <- base::invokeRestart [13:14:17.811] is.null <- base::is.null [13:14:17.811] muffled <- FALSE [13:14:17.811] if (inherits(cond, "message")) { [13:14:17.811] muffled <- grepl(pattern, "muffleMessage") [13:14:17.811] if (muffled) [13:14:17.811] invokeRestart("muffleMessage") [13:14:17.811] } [13:14:17.811] else if (inherits(cond, "warning")) { [13:14:17.811] muffled <- grepl(pattern, "muffleWarning") [13:14:17.811] if (muffled) [13:14:17.811] invokeRestart("muffleWarning") [13:14:17.811] } [13:14:17.811] else if (inherits(cond, "condition")) { [13:14:17.811] if (!is.null(pattern)) { [13:14:17.811] computeRestarts <- base::computeRestarts [13:14:17.811] grepl <- base::grepl [13:14:17.811] restarts <- computeRestarts(cond) [13:14:17.811] for (restart in restarts) { [13:14:17.811] name <- restart$name [13:14:17.811] if (is.null(name)) [13:14:17.811] next [13:14:17.811] if (!grepl(pattern, name)) [13:14:17.811] next [13:14:17.811] invokeRestart(restart) [13:14:17.811] muffled <- TRUE [13:14:17.811] break [13:14:17.811] } [13:14:17.811] } [13:14:17.811] } [13:14:17.811] invisible(muffled) [13:14:17.811] } [13:14:17.811] muffleCondition(cond) [13:14:17.811] }) [13:14:17.811] })) [13:14:17.811] future::FutureResult(value = ...future.value$value, [13:14:17.811] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:14:17.811] ...future.rng), globalenv = if (FALSE) [13:14:17.811] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:14:17.811] ...future.globalenv.names)) [13:14:17.811] else NULL, started = ...future.startTime, version = "1.8") [13:14:17.811] }, condition = base::local({ [13:14:17.811] c <- base::c [13:14:17.811] inherits <- base::inherits [13:14:17.811] invokeRestart <- base::invokeRestart [13:14:17.811] length <- base::length [13:14:17.811] list <- base::list [13:14:17.811] seq.int <- base::seq.int [13:14:17.811] signalCondition <- base::signalCondition [13:14:17.811] sys.calls <- base::sys.calls [13:14:17.811] `[[` <- base::`[[` [13:14:17.811] `+` <- base::`+` [13:14:17.811] `<<-` <- base::`<<-` [13:14:17.811] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:14:17.811] calls[seq.int(from = from + 12L, to = length(calls) - [13:14:17.811] 3L)] [13:14:17.811] } [13:14:17.811] function(cond) { [13:14:17.811] is_error <- inherits(cond, "error") [13:14:17.811] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:14:17.811] NULL) [13:14:17.811] if (is_error) { [13:14:17.811] sessionInformation <- function() { [13:14:17.811] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:14:17.811] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:14:17.811] search = base::search(), system = base::Sys.info()) [13:14:17.811] } [13:14:17.811] ...future.conditions[[length(...future.conditions) + [13:14:17.811] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:14:17.811] cond$call), session = sessionInformation(), [13:14:17.811] timestamp = base::Sys.time(), signaled = 0L) [13:14:17.811] signalCondition(cond) [13:14:17.811] } [13:14:17.811] else if (!ignore && TRUE && inherits(cond, c("condition", [13:14:17.811] "immediateCondition"))) { [13:14:17.811] signal <- TRUE && inherits(cond, "immediateCondition") [13:14:17.811] ...future.conditions[[length(...future.conditions) + [13:14:17.811] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:14:17.811] if (TRUE && !signal) { [13:14:17.811] muffleCondition <- function (cond, pattern = "^muffle") [13:14:17.811] { [13:14:17.811] inherits <- base::inherits [13:14:17.811] invokeRestart <- base::invokeRestart [13:14:17.811] is.null <- base::is.null [13:14:17.811] muffled <- FALSE [13:14:17.811] if (inherits(cond, "message")) { [13:14:17.811] muffled <- grepl(pattern, "muffleMessage") [13:14:17.811] if (muffled) [13:14:17.811] invokeRestart("muffleMessage") [13:14:17.811] } [13:14:17.811] else if (inherits(cond, "warning")) { [13:14:17.811] muffled <- grepl(pattern, "muffleWarning") [13:14:17.811] if (muffled) [13:14:17.811] invokeRestart("muffleWarning") [13:14:17.811] } [13:14:17.811] else if (inherits(cond, "condition")) { [13:14:17.811] if (!is.null(pattern)) { [13:14:17.811] computeRestarts <- base::computeRestarts [13:14:17.811] grepl <- base::grepl [13:14:17.811] restarts <- computeRestarts(cond) [13:14:17.811] for (restart in restarts) { [13:14:17.811] name <- restart$name [13:14:17.811] if (is.null(name)) [13:14:17.811] next [13:14:17.811] if (!grepl(pattern, name)) [13:14:17.811] next [13:14:17.811] invokeRestart(restart) [13:14:17.811] muffled <- TRUE [13:14:17.811] break [13:14:17.811] } [13:14:17.811] } [13:14:17.811] } [13:14:17.811] invisible(muffled) [13:14:17.811] } [13:14:17.811] muffleCondition(cond, pattern = "^muffle") [13:14:17.811] } [13:14:17.811] } [13:14:17.811] else { [13:14:17.811] if (TRUE) { [13:14:17.811] muffleCondition <- function (cond, pattern = "^muffle") [13:14:17.811] { [13:14:17.811] inherits <- base::inherits [13:14:17.811] invokeRestart <- base::invokeRestart [13:14:17.811] is.null <- base::is.null [13:14:17.811] muffled <- FALSE [13:14:17.811] if (inherits(cond, "message")) { [13:14:17.811] muffled <- grepl(pattern, "muffleMessage") [13:14:17.811] if (muffled) [13:14:17.811] invokeRestart("muffleMessage") [13:14:17.811] } [13:14:17.811] else if (inherits(cond, "warning")) { [13:14:17.811] muffled <- grepl(pattern, "muffleWarning") [13:14:17.811] if (muffled) [13:14:17.811] invokeRestart("muffleWarning") [13:14:17.811] } [13:14:17.811] else if (inherits(cond, "condition")) { [13:14:17.811] if (!is.null(pattern)) { [13:14:17.811] computeRestarts <- base::computeRestarts [13:14:17.811] grepl <- base::grepl [13:14:17.811] restarts <- computeRestarts(cond) [13:14:17.811] for (restart in restarts) { [13:14:17.811] name <- restart$name [13:14:17.811] if (is.null(name)) [13:14:17.811] next [13:14:17.811] if (!grepl(pattern, name)) [13:14:17.811] next [13:14:17.811] invokeRestart(restart) [13:14:17.811] muffled <- TRUE [13:14:17.811] break [13:14:17.811] } [13:14:17.811] } [13:14:17.811] } [13:14:17.811] invisible(muffled) [13:14:17.811] } [13:14:17.811] muffleCondition(cond, pattern = "^muffle") [13:14:17.811] } [13:14:17.811] } [13:14:17.811] } [13:14:17.811] })) [13:14:17.811] }, error = function(ex) { [13:14:17.811] base::structure(base::list(value = NULL, visible = NULL, [13:14:17.811] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:14:17.811] ...future.rng), started = ...future.startTime, [13:14:17.811] finished = Sys.time(), session_uuid = NA_character_, [13:14:17.811] version = "1.8"), class = "FutureResult") [13:14:17.811] }, finally = { [13:14:17.811] if (!identical(...future.workdir, getwd())) [13:14:17.811] setwd(...future.workdir) [13:14:17.811] { [13:14:17.811] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:14:17.811] ...future.oldOptions$nwarnings <- NULL [13:14:17.811] } [13:14:17.811] base::options(...future.oldOptions) [13:14:17.811] if (.Platform$OS.type == "windows") { [13:14:17.811] old_names <- names(...future.oldEnvVars) [13:14:17.811] envs <- base::Sys.getenv() [13:14:17.811] names <- names(envs) [13:14:17.811] common <- intersect(names, old_names) [13:14:17.811] added <- setdiff(names, old_names) [13:14:17.811] removed <- setdiff(old_names, names) [13:14:17.811] changed <- common[...future.oldEnvVars[common] != [13:14:17.811] envs[common]] [13:14:17.811] NAMES <- toupper(changed) [13:14:17.811] args <- list() [13:14:17.811] for (kk in seq_along(NAMES)) { [13:14:17.811] name <- changed[[kk]] [13:14:17.811] NAME <- NAMES[[kk]] [13:14:17.811] if (name != NAME && is.element(NAME, old_names)) [13:14:17.811] next [13:14:17.811] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:17.811] } [13:14:17.811] NAMES <- toupper(added) [13:14:17.811] for (kk in seq_along(NAMES)) { [13:14:17.811] name <- added[[kk]] [13:14:17.811] NAME <- NAMES[[kk]] [13:14:17.811] if (name != NAME && is.element(NAME, old_names)) [13:14:17.811] next [13:14:17.811] args[[name]] <- "" [13:14:17.811] } [13:14:17.811] NAMES <- toupper(removed) [13:14:17.811] for (kk in seq_along(NAMES)) { [13:14:17.811] name <- removed[[kk]] [13:14:17.811] NAME <- NAMES[[kk]] [13:14:17.811] if (name != NAME && is.element(NAME, old_names)) [13:14:17.811] next [13:14:17.811] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:17.811] } [13:14:17.811] if (length(args) > 0) [13:14:17.811] base::do.call(base::Sys.setenv, args = args) [13:14:17.811] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:14:17.811] } [13:14:17.811] else { [13:14:17.811] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:14:17.811] } [13:14:17.811] { [13:14:17.811] if (base::length(...future.futureOptionsAdded) > [13:14:17.811] 0L) { [13:14:17.811] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:14:17.811] base::names(opts) <- ...future.futureOptionsAdded [13:14:17.811] base::options(opts) [13:14:17.811] } [13:14:17.811] { [13:14:17.811] { [13:14:17.811] base::options(mc.cores = ...future.mc.cores.old) [13:14:17.811] NULL [13:14:17.811] } [13:14:17.811] options(future.plan = NULL) [13:14:17.811] if (is.na(NA_character_)) [13:14:17.811] Sys.unsetenv("R_FUTURE_PLAN") [13:14:17.811] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:14:17.811] future::plan(list(function (..., workers = availableCores(), [13:14:17.811] lazy = FALSE, rscript_libs = .libPaths(), [13:14:17.811] envir = parent.frame()) [13:14:17.811] { [13:14:17.811] if (is.function(workers)) [13:14:17.811] workers <- workers() [13:14:17.811] workers <- structure(as.integer(workers), [13:14:17.811] class = class(workers)) [13:14:17.811] stop_if_not(length(workers) == 1, is.finite(workers), [13:14:17.811] workers >= 1) [13:14:17.811] if (workers == 1L && !inherits(workers, "AsIs")) { [13:14:17.811] return(sequential(..., lazy = TRUE, envir = envir)) [13:14:17.811] } [13:14:17.811] future <- MultisessionFuture(..., workers = workers, [13:14:17.811] lazy = lazy, rscript_libs = rscript_libs, [13:14:17.811] envir = envir) [13:14:17.811] if (!future$lazy) [13:14:17.811] future <- run(future) [13:14:17.811] invisible(future) [13:14:17.811] }), .cleanup = FALSE, .init = FALSE) [13:14:17.811] } [13:14:17.811] } [13:14:17.811] } [13:14:17.811] }) [13:14:17.811] if (TRUE) { [13:14:17.811] base::sink(type = "output", split = FALSE) [13:14:17.811] if (TRUE) { [13:14:17.811] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:14:17.811] } [13:14:17.811] else { [13:14:17.811] ...future.result["stdout"] <- base::list(NULL) [13:14:17.811] } [13:14:17.811] base::close(...future.stdout) [13:14:17.811] ...future.stdout <- NULL [13:14:17.811] } [13:14:17.811] ...future.result$conditions <- ...future.conditions [13:14:17.811] ...future.result$finished <- base::Sys.time() [13:14:17.811] ...future.result [13:14:17.811] } [13:14:17.816] Exporting 11 global objects (93.16 KiB) to cluster node #1 ... [13:14:17.817] Exporting '...future.FUN' (21.22 KiB) to cluster node #1 ... [13:14:17.817] Exporting '...future.FUN' (21.22 KiB) to cluster node #1 ... DONE [13:14:17.817] Exporting 'x_FUN' (1.16 KiB) to cluster node #1 ... [13:14:17.818] Exporting 'x_FUN' (1.16 KiB) to cluster node #1 ... DONE [13:14:17.818] Exporting 'times' (56 bytes) to cluster node #1 ... [13:14:17.818] Exporting 'times' (56 bytes) to cluster node #1 ... DONE [13:14:17.819] Exporting 'stopf' (26.43 KiB) to cluster node #1 ... [13:14:17.819] Exporting 'stopf' (26.43 KiB) to cluster node #1 ... DONE [13:14:17.819] Exporting 'stop_if_not' (44.12 KiB) to cluster node #1 ... [13:14:17.820] Exporting 'stop_if_not' (44.12 KiB) to cluster node #1 ... DONE [13:14:17.820] Exporting 'dim' (0 bytes) to cluster node #1 ... [13:14:17.820] Exporting 'dim' (0 bytes) to cluster node #1 ... DONE [13:14:17.820] Exporting 'valid_types' (176 bytes) to cluster node #1 ... [13:14:17.821] Exporting 'valid_types' (176 bytes) to cluster node #1 ... DONE [13:14:17.821] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... [13:14:17.821] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... DONE [13:14:17.822] Exporting '...future.elements_ii' (280 bytes) to cluster node #1 ... [13:14:17.822] Exporting '...future.elements_ii' (280 bytes) to cluster node #1 ... DONE [13:14:17.822] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:14:17.823] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:14:17.823] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:14:17.823] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:14:17.824] Exporting 11 global objects (93.16 KiB) to cluster node #1 ... DONE [13:14:17.824] MultisessionFuture started [13:14:17.824] - Launch lazy future ... done [13:14:17.825] run() for 'MultisessionFuture' ... done [13:14:17.825] Created future: [13:14:17.843] receiveMessageFromWorker() for ClusterFuture ... [13:14:17.844] - Validating connection of MultisessionFuture [13:14:17.844] - received message: FutureResult [13:14:17.844] - Received FutureResult [13:14:17.844] - Erased future from FutureRegistry [13:14:17.844] result() for ClusterFuture ... [13:14:17.845] - result already collected: FutureResult [13:14:17.845] result() for ClusterFuture ... done [13:14:17.845] receiveMessageFromWorker() for ClusterFuture ... done [13:14:17.825] MultisessionFuture: [13:14:17.825] Label: 'future_vapply-1' [13:14:17.825] Expression: [13:14:17.825] { [13:14:17.825] do.call(function(...) { [13:14:17.825] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:17.825] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:17.825] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:17.825] on.exit(options(oopts), add = TRUE) [13:14:17.825] } [13:14:17.825] { [13:14:17.825] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:17.825] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:17.825] ...future.FUN(...future.X_jj, ...) [13:14:17.825] }) [13:14:17.825] } [13:14:17.825] }, args = future.call.arguments) [13:14:17.825] } [13:14:17.825] Lazy evaluation: FALSE [13:14:17.825] Asynchronous evaluation: TRUE [13:14:17.825] Local evaluation: TRUE [13:14:17.825] Environment: R_GlobalEnv [13:14:17.825] Capture standard output: TRUE [13:14:17.825] Capture condition classes: 'condition' (excluding 'nothing') [13:14:17.825] Globals: 11 objects totaling 93.44 KiB (function '...future.FUN' of 21.22 KiB, function 'x_FUN' of 1.16 KiB, integer 'times' of 56 bytes, function 'stopf' of 26.43 KiB, function 'stop_if_not' of 44.12 KiB, ...) [13:14:17.825] Packages: 1 packages ('future.apply') [13:14:17.825] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:14:17.825] Resolved: TRUE [13:14:17.825] Value: [13:14:17.825] Conditions captured: [13:14:17.825] Early signaling: FALSE [13:14:17.825] Owner process: 1bb7d580-628d-c90d-e38a-66de485868c4 [13:14:17.825] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:14:17.845] Chunk #1 of 2 ... DONE [13:14:17.845] Chunk #2 of 2 ... [13:14:17.846] - Finding globals in 'X' for chunk #2 ... [13:14:17.846] getGlobalsAndPackages() ... [13:14:17.846] Searching for globals... [13:14:17.846] [13:14:17.847] Searching for globals ... DONE [13:14:17.847] - globals: [0] [13:14:17.847] getGlobalsAndPackages() ... DONE [13:14:17.847] + additional globals found: [n=0] [13:14:17.847] + additional namespaces needed: [n=0] [13:14:17.847] - Finding globals in 'X' for chunk #2 ... DONE [13:14:17.848] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:14:17.848] - seeds: [13:14:17.848] - All globals exported: [n=11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:17.848] getGlobalsAndPackages() ... [13:14:17.848] - globals passed as-is: [11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:17.849] Resolving globals: FALSE [13:14:17.849] Tweak future expression to call with '...' arguments ... [13:14:17.849] { [13:14:17.849] do.call(function(...) { [13:14:17.849] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:17.849] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:17.849] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:17.849] on.exit(options(oopts), add = TRUE) [13:14:17.849] } [13:14:17.849] { [13:14:17.849] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:17.849] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:17.849] ...future.FUN(...future.X_jj, ...) [13:14:17.849] }) [13:14:17.849] } [13:14:17.849] }, args = future.call.arguments) [13:14:17.849] } [13:14:17.849] Tweak future expression to call with '...' arguments ... DONE [13:14:17.850] - globals: [11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:17.850] - packages: [1] 'future.apply' [13:14:17.850] getGlobalsAndPackages() ... DONE [13:14:17.851] run() for 'Future' ... [13:14:17.851] - state: 'created' [13:14:17.851] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:14:17.865] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:14:17.866] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:14:17.866] - Field: 'node' [13:14:17.866] - Field: 'label' [13:14:17.866] - Field: 'local' [13:14:17.866] - Field: 'owner' [13:14:17.867] - Field: 'envir' [13:14:17.867] - Field: 'workers' [13:14:17.867] - Field: 'packages' [13:14:17.867] - Field: 'gc' [13:14:17.867] - Field: 'conditions' [13:14:17.867] - Field: 'persistent' [13:14:17.868] - Field: 'expr' [13:14:17.868] - Field: 'uuid' [13:14:17.868] - Field: 'seed' [13:14:17.868] - Field: 'version' [13:14:17.868] - Field: 'result' [13:14:17.868] - Field: 'asynchronous' [13:14:17.869] - Field: 'calls' [13:14:17.869] - Field: 'globals' [13:14:17.869] - Field: 'stdout' [13:14:17.869] - Field: 'earlySignal' [13:14:17.869] - Field: 'lazy' [13:14:17.870] - Field: 'state' [13:14:17.870] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:14:17.870] - Launch lazy future ... [13:14:17.870] Packages needed by the future expression (n = 1): 'future.apply' [13:14:17.870] Packages needed by future strategies (n = 0): [13:14:17.871] { [13:14:17.871] { [13:14:17.871] { [13:14:17.871] ...future.startTime <- base::Sys.time() [13:14:17.871] { [13:14:17.871] { [13:14:17.871] { [13:14:17.871] { [13:14:17.871] { [13:14:17.871] base::local({ [13:14:17.871] has_future <- base::requireNamespace("future", [13:14:17.871] quietly = TRUE) [13:14:17.871] if (has_future) { [13:14:17.871] ns <- base::getNamespace("future") [13:14:17.871] version <- ns[[".package"]][["version"]] [13:14:17.871] if (is.null(version)) [13:14:17.871] version <- utils::packageVersion("future") [13:14:17.871] } [13:14:17.871] else { [13:14:17.871] version <- NULL [13:14:17.871] } [13:14:17.871] if (!has_future || version < "1.8.0") { [13:14:17.871] info <- base::c(r_version = base::gsub("R version ", [13:14:17.871] "", base::R.version$version.string), [13:14:17.871] platform = base::sprintf("%s (%s-bit)", [13:14:17.871] base::R.version$platform, 8 * [13:14:17.871] base::.Machine$sizeof.pointer), [13:14:17.871] os = base::paste(base::Sys.info()[base::c("sysname", [13:14:17.871] "release", "version")], collapse = " "), [13:14:17.871] hostname = base::Sys.info()[["nodename"]]) [13:14:17.871] info <- base::sprintf("%s: %s", base::names(info), [13:14:17.871] info) [13:14:17.871] info <- base::paste(info, collapse = "; ") [13:14:17.871] if (!has_future) { [13:14:17.871] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:14:17.871] info) [13:14:17.871] } [13:14:17.871] else { [13:14:17.871] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:14:17.871] info, version) [13:14:17.871] } [13:14:17.871] base::stop(msg) [13:14:17.871] } [13:14:17.871] }) [13:14:17.871] } [13:14:17.871] ...future.mc.cores.old <- base::getOption("mc.cores") [13:14:17.871] base::options(mc.cores = 1L) [13:14:17.871] } [13:14:17.871] base::local({ [13:14:17.871] for (pkg in "future.apply") { [13:14:17.871] base::loadNamespace(pkg) [13:14:17.871] base::library(pkg, character.only = TRUE) [13:14:17.871] } [13:14:17.871] }) [13:14:17.871] } [13:14:17.871] options(future.plan = NULL) [13:14:17.871] Sys.unsetenv("R_FUTURE_PLAN") [13:14:17.871] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:14:17.871] } [13:14:17.871] ...future.workdir <- getwd() [13:14:17.871] } [13:14:17.871] ...future.oldOptions <- base::as.list(base::.Options) [13:14:17.871] ...future.oldEnvVars <- base::Sys.getenv() [13:14:17.871] } [13:14:17.871] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:14:17.871] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:14:17.871] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:14:17.871] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:14:17.871] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:14:17.871] future.stdout.windows.reencode = NULL, width = 80L) [13:14:17.871] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:14:17.871] base::names(...future.oldOptions)) [13:14:17.871] } [13:14:17.871] if (FALSE) { [13:14:17.871] } [13:14:17.871] else { [13:14:17.871] if (TRUE) { [13:14:17.871] ...future.stdout <- base::rawConnection(base::raw(0L), [13:14:17.871] open = "w") [13:14:17.871] } [13:14:17.871] else { [13:14:17.871] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:14:17.871] windows = "NUL", "/dev/null"), open = "w") [13:14:17.871] } [13:14:17.871] base::sink(...future.stdout, type = "output", split = FALSE) [13:14:17.871] base::on.exit(if (!base::is.null(...future.stdout)) { [13:14:17.871] base::sink(type = "output", split = FALSE) [13:14:17.871] base::close(...future.stdout) [13:14:17.871] }, add = TRUE) [13:14:17.871] } [13:14:17.871] ...future.frame <- base::sys.nframe() [13:14:17.871] ...future.conditions <- base::list() [13:14:17.871] ...future.rng <- base::globalenv()$.Random.seed [13:14:17.871] if (FALSE) { [13:14:17.871] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:14:17.871] "...future.value", "...future.globalenv.names", ".Random.seed") [13:14:17.871] } [13:14:17.871] ...future.result <- base::tryCatch({ [13:14:17.871] base::withCallingHandlers({ [13:14:17.871] ...future.value <- base::withVisible(base::local({ [13:14:17.871] ...future.makeSendCondition <- local({ [13:14:17.871] sendCondition <- NULL [13:14:17.871] function(frame = 1L) { [13:14:17.871] if (is.function(sendCondition)) [13:14:17.871] return(sendCondition) [13:14:17.871] ns <- getNamespace("parallel") [13:14:17.871] if (exists("sendData", mode = "function", [13:14:17.871] envir = ns)) { [13:14:17.871] parallel_sendData <- get("sendData", mode = "function", [13:14:17.871] envir = ns) [13:14:17.871] envir <- sys.frame(frame) [13:14:17.871] master <- NULL [13:14:17.871] while (!identical(envir, .GlobalEnv) && [13:14:17.871] !identical(envir, emptyenv())) { [13:14:17.871] if (exists("master", mode = "list", envir = envir, [13:14:17.871] inherits = FALSE)) { [13:14:17.871] master <- get("master", mode = "list", [13:14:17.871] envir = envir, inherits = FALSE) [13:14:17.871] if (inherits(master, c("SOCKnode", [13:14:17.871] "SOCK0node"))) { [13:14:17.871] sendCondition <<- function(cond) { [13:14:17.871] data <- list(type = "VALUE", value = cond, [13:14:17.871] success = TRUE) [13:14:17.871] parallel_sendData(master, data) [13:14:17.871] } [13:14:17.871] return(sendCondition) [13:14:17.871] } [13:14:17.871] } [13:14:17.871] frame <- frame + 1L [13:14:17.871] envir <- sys.frame(frame) [13:14:17.871] } [13:14:17.871] } [13:14:17.871] sendCondition <<- function(cond) NULL [13:14:17.871] } [13:14:17.871] }) [13:14:17.871] withCallingHandlers({ [13:14:17.871] { [13:14:17.871] do.call(function(...) { [13:14:17.871] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:17.871] if (!identical(...future.globals.maxSize.org, [13:14:17.871] ...future.globals.maxSize)) { [13:14:17.871] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:17.871] on.exit(options(oopts), add = TRUE) [13:14:17.871] } [13:14:17.871] { [13:14:17.871] lapply(seq_along(...future.elements_ii), [13:14:17.871] FUN = function(jj) { [13:14:17.871] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:17.871] ...future.FUN(...future.X_jj, ...) [13:14:17.871] }) [13:14:17.871] } [13:14:17.871] }, args = future.call.arguments) [13:14:17.871] } [13:14:17.871] }, immediateCondition = function(cond) { [13:14:17.871] sendCondition <- ...future.makeSendCondition() [13:14:17.871] sendCondition(cond) [13:14:17.871] muffleCondition <- function (cond, pattern = "^muffle") [13:14:17.871] { [13:14:17.871] inherits <- base::inherits [13:14:17.871] invokeRestart <- base::invokeRestart [13:14:17.871] is.null <- base::is.null [13:14:17.871] muffled <- FALSE [13:14:17.871] if (inherits(cond, "message")) { [13:14:17.871] muffled <- grepl(pattern, "muffleMessage") [13:14:17.871] if (muffled) [13:14:17.871] invokeRestart("muffleMessage") [13:14:17.871] } [13:14:17.871] else if (inherits(cond, "warning")) { [13:14:17.871] muffled <- grepl(pattern, "muffleWarning") [13:14:17.871] if (muffled) [13:14:17.871] invokeRestart("muffleWarning") [13:14:17.871] } [13:14:17.871] else if (inherits(cond, "condition")) { [13:14:17.871] if (!is.null(pattern)) { [13:14:17.871] computeRestarts <- base::computeRestarts [13:14:17.871] grepl <- base::grepl [13:14:17.871] restarts <- computeRestarts(cond) [13:14:17.871] for (restart in restarts) { [13:14:17.871] name <- restart$name [13:14:17.871] if (is.null(name)) [13:14:17.871] next [13:14:17.871] if (!grepl(pattern, name)) [13:14:17.871] next [13:14:17.871] invokeRestart(restart) [13:14:17.871] muffled <- TRUE [13:14:17.871] break [13:14:17.871] } [13:14:17.871] } [13:14:17.871] } [13:14:17.871] invisible(muffled) [13:14:17.871] } [13:14:17.871] muffleCondition(cond) [13:14:17.871] }) [13:14:17.871] })) [13:14:17.871] future::FutureResult(value = ...future.value$value, [13:14:17.871] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:14:17.871] ...future.rng), globalenv = if (FALSE) [13:14:17.871] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:14:17.871] ...future.globalenv.names)) [13:14:17.871] else NULL, started = ...future.startTime, version = "1.8") [13:14:17.871] }, condition = base::local({ [13:14:17.871] c <- base::c [13:14:17.871] inherits <- base::inherits [13:14:17.871] invokeRestart <- base::invokeRestart [13:14:17.871] length <- base::length [13:14:17.871] list <- base::list [13:14:17.871] seq.int <- base::seq.int [13:14:17.871] signalCondition <- base::signalCondition [13:14:17.871] sys.calls <- base::sys.calls [13:14:17.871] `[[` <- base::`[[` [13:14:17.871] `+` <- base::`+` [13:14:17.871] `<<-` <- base::`<<-` [13:14:17.871] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:14:17.871] calls[seq.int(from = from + 12L, to = length(calls) - [13:14:17.871] 3L)] [13:14:17.871] } [13:14:17.871] function(cond) { [13:14:17.871] is_error <- inherits(cond, "error") [13:14:17.871] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:14:17.871] NULL) [13:14:17.871] if (is_error) { [13:14:17.871] sessionInformation <- function() { [13:14:17.871] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:14:17.871] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:14:17.871] search = base::search(), system = base::Sys.info()) [13:14:17.871] } [13:14:17.871] ...future.conditions[[length(...future.conditions) + [13:14:17.871] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:14:17.871] cond$call), session = sessionInformation(), [13:14:17.871] timestamp = base::Sys.time(), signaled = 0L) [13:14:17.871] signalCondition(cond) [13:14:17.871] } [13:14:17.871] else if (!ignore && TRUE && inherits(cond, c("condition", [13:14:17.871] "immediateCondition"))) { [13:14:17.871] signal <- TRUE && inherits(cond, "immediateCondition") [13:14:17.871] ...future.conditions[[length(...future.conditions) + [13:14:17.871] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:14:17.871] if (TRUE && !signal) { [13:14:17.871] muffleCondition <- function (cond, pattern = "^muffle") [13:14:17.871] { [13:14:17.871] inherits <- base::inherits [13:14:17.871] invokeRestart <- base::invokeRestart [13:14:17.871] is.null <- base::is.null [13:14:17.871] muffled <- FALSE [13:14:17.871] if (inherits(cond, "message")) { [13:14:17.871] muffled <- grepl(pattern, "muffleMessage") [13:14:17.871] if (muffled) [13:14:17.871] invokeRestart("muffleMessage") [13:14:17.871] } [13:14:17.871] else if (inherits(cond, "warning")) { [13:14:17.871] muffled <- grepl(pattern, "muffleWarning") [13:14:17.871] if (muffled) [13:14:17.871] invokeRestart("muffleWarning") [13:14:17.871] } [13:14:17.871] else if (inherits(cond, "condition")) { [13:14:17.871] if (!is.null(pattern)) { [13:14:17.871] computeRestarts <- base::computeRestarts [13:14:17.871] grepl <- base::grepl [13:14:17.871] restarts <- computeRestarts(cond) [13:14:17.871] for (restart in restarts) { [13:14:17.871] name <- restart$name [13:14:17.871] if (is.null(name)) [13:14:17.871] next [13:14:17.871] if (!grepl(pattern, name)) [13:14:17.871] next [13:14:17.871] invokeRestart(restart) [13:14:17.871] muffled <- TRUE [13:14:17.871] break [13:14:17.871] } [13:14:17.871] } [13:14:17.871] } [13:14:17.871] invisible(muffled) [13:14:17.871] } [13:14:17.871] muffleCondition(cond, pattern = "^muffle") [13:14:17.871] } [13:14:17.871] } [13:14:17.871] else { [13:14:17.871] if (TRUE) { [13:14:17.871] muffleCondition <- function (cond, pattern = "^muffle") [13:14:17.871] { [13:14:17.871] inherits <- base::inherits [13:14:17.871] invokeRestart <- base::invokeRestart [13:14:17.871] is.null <- base::is.null [13:14:17.871] muffled <- FALSE [13:14:17.871] if (inherits(cond, "message")) { [13:14:17.871] muffled <- grepl(pattern, "muffleMessage") [13:14:17.871] if (muffled) [13:14:17.871] invokeRestart("muffleMessage") [13:14:17.871] } [13:14:17.871] else if (inherits(cond, "warning")) { [13:14:17.871] muffled <- grepl(pattern, "muffleWarning") [13:14:17.871] if (muffled) [13:14:17.871] invokeRestart("muffleWarning") [13:14:17.871] } [13:14:17.871] else if (inherits(cond, "condition")) { [13:14:17.871] if (!is.null(pattern)) { [13:14:17.871] computeRestarts <- base::computeRestarts [13:14:17.871] grepl <- base::grepl [13:14:17.871] restarts <- computeRestarts(cond) [13:14:17.871] for (restart in restarts) { [13:14:17.871] name <- restart$name [13:14:17.871] if (is.null(name)) [13:14:17.871] next [13:14:17.871] if (!grepl(pattern, name)) [13:14:17.871] next [13:14:17.871] invokeRestart(restart) [13:14:17.871] muffled <- TRUE [13:14:17.871] break [13:14:17.871] } [13:14:17.871] } [13:14:17.871] } [13:14:17.871] invisible(muffled) [13:14:17.871] } [13:14:17.871] muffleCondition(cond, pattern = "^muffle") [13:14:17.871] } [13:14:17.871] } [13:14:17.871] } [13:14:17.871] })) [13:14:17.871] }, error = function(ex) { [13:14:17.871] base::structure(base::list(value = NULL, visible = NULL, [13:14:17.871] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:14:17.871] ...future.rng), started = ...future.startTime, [13:14:17.871] finished = Sys.time(), session_uuid = NA_character_, [13:14:17.871] version = "1.8"), class = "FutureResult") [13:14:17.871] }, finally = { [13:14:17.871] if (!identical(...future.workdir, getwd())) [13:14:17.871] setwd(...future.workdir) [13:14:17.871] { [13:14:17.871] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:14:17.871] ...future.oldOptions$nwarnings <- NULL [13:14:17.871] } [13:14:17.871] base::options(...future.oldOptions) [13:14:17.871] if (.Platform$OS.type == "windows") { [13:14:17.871] old_names <- names(...future.oldEnvVars) [13:14:17.871] envs <- base::Sys.getenv() [13:14:17.871] names <- names(envs) [13:14:17.871] common <- intersect(names, old_names) [13:14:17.871] added <- setdiff(names, old_names) [13:14:17.871] removed <- setdiff(old_names, names) [13:14:17.871] changed <- common[...future.oldEnvVars[common] != [13:14:17.871] envs[common]] [13:14:17.871] NAMES <- toupper(changed) [13:14:17.871] args <- list() [13:14:17.871] for (kk in seq_along(NAMES)) { [13:14:17.871] name <- changed[[kk]] [13:14:17.871] NAME <- NAMES[[kk]] [13:14:17.871] if (name != NAME && is.element(NAME, old_names)) [13:14:17.871] next [13:14:17.871] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:17.871] } [13:14:17.871] NAMES <- toupper(added) [13:14:17.871] for (kk in seq_along(NAMES)) { [13:14:17.871] name <- added[[kk]] [13:14:17.871] NAME <- NAMES[[kk]] [13:14:17.871] if (name != NAME && is.element(NAME, old_names)) [13:14:17.871] next [13:14:17.871] args[[name]] <- "" [13:14:17.871] } [13:14:17.871] NAMES <- toupper(removed) [13:14:17.871] for (kk in seq_along(NAMES)) { [13:14:17.871] name <- removed[[kk]] [13:14:17.871] NAME <- NAMES[[kk]] [13:14:17.871] if (name != NAME && is.element(NAME, old_names)) [13:14:17.871] next [13:14:17.871] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:17.871] } [13:14:17.871] if (length(args) > 0) [13:14:17.871] base::do.call(base::Sys.setenv, args = args) [13:14:17.871] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:14:17.871] } [13:14:17.871] else { [13:14:17.871] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:14:17.871] } [13:14:17.871] { [13:14:17.871] if (base::length(...future.futureOptionsAdded) > [13:14:17.871] 0L) { [13:14:17.871] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:14:17.871] base::names(opts) <- ...future.futureOptionsAdded [13:14:17.871] base::options(opts) [13:14:17.871] } [13:14:17.871] { [13:14:17.871] { [13:14:17.871] base::options(mc.cores = ...future.mc.cores.old) [13:14:17.871] NULL [13:14:17.871] } [13:14:17.871] options(future.plan = NULL) [13:14:17.871] if (is.na(NA_character_)) [13:14:17.871] Sys.unsetenv("R_FUTURE_PLAN") [13:14:17.871] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:14:17.871] future::plan(list(function (..., workers = availableCores(), [13:14:17.871] lazy = FALSE, rscript_libs = .libPaths(), [13:14:17.871] envir = parent.frame()) [13:14:17.871] { [13:14:17.871] if (is.function(workers)) [13:14:17.871] workers <- workers() [13:14:17.871] workers <- structure(as.integer(workers), [13:14:17.871] class = class(workers)) [13:14:17.871] stop_if_not(length(workers) == 1, is.finite(workers), [13:14:17.871] workers >= 1) [13:14:17.871] if (workers == 1L && !inherits(workers, "AsIs")) { [13:14:17.871] return(sequential(..., lazy = TRUE, envir = envir)) [13:14:17.871] } [13:14:17.871] future <- MultisessionFuture(..., workers = workers, [13:14:17.871] lazy = lazy, rscript_libs = rscript_libs, [13:14:17.871] envir = envir) [13:14:17.871] if (!future$lazy) [13:14:17.871] future <- run(future) [13:14:17.871] invisible(future) [13:14:17.871] }), .cleanup = FALSE, .init = FALSE) [13:14:17.871] } [13:14:17.871] } [13:14:17.871] } [13:14:17.871] }) [13:14:17.871] if (TRUE) { [13:14:17.871] base::sink(type = "output", split = FALSE) [13:14:17.871] if (TRUE) { [13:14:17.871] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:14:17.871] } [13:14:17.871] else { [13:14:17.871] ...future.result["stdout"] <- base::list(NULL) [13:14:17.871] } [13:14:17.871] base::close(...future.stdout) [13:14:17.871] ...future.stdout <- NULL [13:14:17.871] } [13:14:17.871] ...future.result$conditions <- ...future.conditions [13:14:17.871] ...future.result$finished <- base::Sys.time() [13:14:17.871] ...future.result [13:14:17.871] } [13:14:17.876] Exporting 11 global objects (93.16 KiB) to cluster node #1 ... [13:14:17.877] Exporting '...future.FUN' (21.22 KiB) to cluster node #1 ... [13:14:17.877] Exporting '...future.FUN' (21.22 KiB) to cluster node #1 ... DONE [13:14:17.877] Exporting 'x_FUN' (1.16 KiB) to cluster node #1 ... [13:14:17.878] Exporting 'x_FUN' (1.16 KiB) to cluster node #1 ... DONE [13:14:17.878] Exporting 'times' (56 bytes) to cluster node #1 ... [13:14:17.878] Exporting 'times' (56 bytes) to cluster node #1 ... DONE [13:14:17.879] Exporting 'stopf' (26.43 KiB) to cluster node #1 ... [13:14:17.879] Exporting 'stopf' (26.43 KiB) to cluster node #1 ... DONE [13:14:17.879] Exporting 'stop_if_not' (44.12 KiB) to cluster node #1 ... [13:14:17.880] Exporting 'stop_if_not' (44.12 KiB) to cluster node #1 ... DONE [13:14:17.880] Exporting 'dim' (0 bytes) to cluster node #1 ... [13:14:17.880] Exporting 'dim' (0 bytes) to cluster node #1 ... DONE [13:14:17.880] Exporting 'valid_types' (176 bytes) to cluster node #1 ... [13:14:17.881] Exporting 'valid_types' (176 bytes) to cluster node #1 ... DONE [13:14:17.881] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... [13:14:17.881] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... DONE [13:14:17.882] Exporting '...future.elements_ii' (280 bytes) to cluster node #1 ... [13:14:17.882] Exporting '...future.elements_ii' (280 bytes) to cluster node #1 ... DONE [13:14:17.882] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:14:17.883] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:14:17.883] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:14:17.883] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:14:17.883] Exporting 11 global objects (93.16 KiB) to cluster node #1 ... DONE [13:14:17.884] MultisessionFuture started [13:14:17.884] - Launch lazy future ... done [13:14:17.884] run() for 'MultisessionFuture' ... done [13:14:17.884] Created future: [13:14:17.902] receiveMessageFromWorker() for ClusterFuture ... [13:14:17.903] - Validating connection of MultisessionFuture [13:14:17.903] - received message: FutureResult [13:14:17.903] - Received FutureResult [13:14:17.903] - Erased future from FutureRegistry [13:14:17.903] result() for ClusterFuture ... [13:14:17.904] - result already collected: FutureResult [13:14:17.904] result() for ClusterFuture ... done [13:14:17.904] receiveMessageFromWorker() for ClusterFuture ... done [13:14:17.885] MultisessionFuture: [13:14:17.885] Label: 'future_vapply-2' [13:14:17.885] Expression: [13:14:17.885] { [13:14:17.885] do.call(function(...) { [13:14:17.885] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:17.885] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:17.885] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:17.885] on.exit(options(oopts), add = TRUE) [13:14:17.885] } [13:14:17.885] { [13:14:17.885] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:17.885] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:17.885] ...future.FUN(...future.X_jj, ...) [13:14:17.885] }) [13:14:17.885] } [13:14:17.885] }, args = future.call.arguments) [13:14:17.885] } [13:14:17.885] Lazy evaluation: FALSE [13:14:17.885] Asynchronous evaluation: TRUE [13:14:17.885] Local evaluation: TRUE [13:14:17.885] Environment: R_GlobalEnv [13:14:17.885] Capture standard output: TRUE [13:14:17.885] Capture condition classes: 'condition' (excluding 'nothing') [13:14:17.885] Globals: 11 objects totaling 93.44 KiB (function '...future.FUN' of 21.22 KiB, function 'x_FUN' of 1.16 KiB, integer 'times' of 56 bytes, function 'stopf' of 26.43 KiB, function 'stop_if_not' of 44.12 KiB, ...) [13:14:17.885] Packages: 1 packages ('future.apply') [13:14:17.885] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:14:17.885] Resolved: TRUE [13:14:17.885] Value: [13:14:17.885] Conditions captured: [13:14:17.885] Early signaling: FALSE [13:14:17.885] Owner process: 1bb7d580-628d-c90d-e38a-66de485868c4 [13:14:17.885] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:14:17.904] Chunk #2 of 2 ... DONE [13:14:17.904] Launching 2 futures (chunks) ... DONE [13:14:17.905] Resolving 2 futures (chunks) ... [13:14:17.905] resolve() on list ... [13:14:17.905] recursive: 0 [13:14:17.905] length: 2 [13:14:17.905] [13:14:17.905] Future #1 [13:14:17.906] result() for ClusterFuture ... [13:14:17.906] - result already collected: FutureResult [13:14:17.906] result() for ClusterFuture ... done [13:14:17.906] result() for ClusterFuture ... [13:14:17.906] - result already collected: FutureResult [13:14:17.906] result() for ClusterFuture ... done [13:14:17.907] signalConditionsASAP(MultisessionFuture, pos=1) ... [13:14:17.907] - nx: 2 [13:14:17.907] - relay: TRUE [13:14:17.907] - stdout: TRUE [13:14:17.907] - signal: TRUE [13:14:17.907] - resignal: FALSE [13:14:17.907] - force: TRUE [13:14:17.908] - relayed: [n=2] FALSE, FALSE [13:14:17.908] - queued futures: [n=2] FALSE, FALSE [13:14:17.908] - until=1 [13:14:17.908] - relaying element #1 [13:14:17.908] result() for ClusterFuture ... [13:14:17.908] - result already collected: FutureResult [13:14:17.909] result() for ClusterFuture ... done [13:14:17.909] result() for ClusterFuture ... [13:14:17.909] - result already collected: FutureResult [13:14:17.909] result() for ClusterFuture ... done [13:14:17.909] result() for ClusterFuture ... [13:14:17.909] - result already collected: FutureResult [13:14:17.910] result() for ClusterFuture ... done [13:14:17.910] result() for ClusterFuture ... [13:14:17.910] - result already collected: FutureResult [13:14:17.910] result() for ClusterFuture ... done [13:14:17.910] - relayed: [n=2] TRUE, FALSE [13:14:17.910] - queued futures: [n=2] TRUE, FALSE [13:14:17.911] signalConditionsASAP(MultisessionFuture, pos=1) ... done [13:14:17.911] length: 1 (resolved future 1) [13:14:17.911] Future #2 [13:14:17.911] result() for ClusterFuture ... [13:14:17.911] - result already collected: FutureResult [13:14:17.911] result() for ClusterFuture ... done [13:14:17.912] result() for ClusterFuture ... [13:14:17.912] - result already collected: FutureResult [13:14:17.912] result() for ClusterFuture ... done [13:14:17.912] signalConditionsASAP(MultisessionFuture, pos=2) ... [13:14:17.912] - nx: 2 [13:14:17.912] - relay: TRUE [13:14:17.913] - stdout: TRUE [13:14:17.913] - signal: TRUE [13:14:17.913] - resignal: FALSE [13:14:17.913] - force: TRUE [13:14:17.913] - relayed: [n=2] TRUE, FALSE [13:14:17.913] - queued futures: [n=2] TRUE, FALSE [13:14:17.913] - until=2 [13:14:17.914] - relaying element #2 [13:14:17.914] result() for ClusterFuture ... [13:14:17.914] - result already collected: FutureResult [13:14:17.914] result() for ClusterFuture ... done [13:14:17.914] result() for ClusterFuture ... [13:14:17.914] - result already collected: FutureResult [13:14:17.915] result() for ClusterFuture ... done [13:14:17.915] result() for ClusterFuture ... [13:14:17.915] - result already collected: FutureResult [13:14:17.915] result() for ClusterFuture ... done [13:14:17.915] result() for ClusterFuture ... [13:14:17.915] - result already collected: FutureResult [13:14:17.916] result() for ClusterFuture ... done [13:14:17.916] - relayed: [n=2] TRUE, TRUE [13:14:17.916] - queued futures: [n=2] TRUE, TRUE [13:14:17.916] signalConditionsASAP(MultisessionFuture, pos=2) ... done [13:14:17.916] length: 0 (resolved future 2) [13:14:17.916] Relaying remaining futures [13:14:17.917] signalConditionsASAP(NULL, pos=0) ... [13:14:17.919] - nx: 2 [13:14:17.919] - relay: TRUE [13:14:17.919] - stdout: TRUE [13:14:17.919] - signal: TRUE [13:14:17.919] - resignal: FALSE [13:14:17.919] - force: TRUE [13:14:17.920] - relayed: [n=2] TRUE, TRUE [13:14:17.920] - queued futures: [n=2] TRUE, TRUE - flush all [13:14:17.920] - relayed: [n=2] TRUE, TRUE [13:14:17.920] - queued futures: [n=2] TRUE, TRUE [13:14:17.920] signalConditionsASAP(NULL, pos=0) ... done [13:14:17.920] resolve() on list ... DONE [13:14:17.921] result() for ClusterFuture ... [13:14:17.921] - result already collected: FutureResult [13:14:17.921] result() for ClusterFuture ... done [13:14:17.921] result() for ClusterFuture ... [13:14:17.921] - result already collected: FutureResult [13:14:17.921] result() for ClusterFuture ... done [13:14:17.922] result() for ClusterFuture ... [13:14:17.922] - result already collected: FutureResult [13:14:17.922] result() for ClusterFuture ... done [13:14:17.922] result() for ClusterFuture ... [13:14:17.922] - result already collected: FutureResult [13:14:17.922] result() for ClusterFuture ... done [13:14:17.922] - Number of value chunks collected: 2 [13:14:17.923] Resolving 2 futures (chunks) ... DONE [13:14:17.923] Reducing values from 2 chunks ... [13:14:17.923] - Number of values collected after concatenation: 10 [13:14:17.923] - Number of values expected: 10 [13:14:17.923] Reducing values from 2 chunks ... DONE [13:14:17.923] future_lapply() ... DONE int[0 , 1:10] num [1:10] 1 1.41 1.73 2 2.24 ... [13:14:17.924] future_lapply() ... [13:14:17.929] Number of chunks: 2 [13:14:17.929] getGlobalsAndPackagesXApply() ... [13:14:17.929] - future.globals: TRUE [13:14:17.930] getGlobalsAndPackages() ... [13:14:17.930] Searching for globals... [13:14:17.934] - globals found: [16] 'FUN', '{', '<-', 'x_FUN', 'if', '!=', 'length', 'times', 'stopf', 'stop_if_not', 'all', '==', 'dim', '%in%', 'typeof', 'valid_types' [13:14:17.934] Searching for globals ... DONE [13:14:17.934] Resolving globals: FALSE [13:14:17.935] The total size of the 7 globals is 92.12 KiB (94336 bytes) [13:14:17.936] The total size of the 7 globals exported for future expression ('FUN()') is 92.12 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). The three largest globals are 'stop_if_not' (44.12 KiB of class 'function'), 'stopf' (26.43 KiB of class 'function') and 'FUN' (21.22 KiB of class 'function') [13:14:17.936] - globals: [7] 'FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types' [13:14:17.936] - packages: [1] 'future.apply' [13:14:17.937] getGlobalsAndPackages() ... DONE [13:14:17.937] - globals found/used: [n=7] 'FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types' [13:14:17.937] - needed namespaces: [n=1] 'future.apply' [13:14:17.937] Finding globals ... DONE [13:14:17.937] - use_args: TRUE [13:14:17.938] - Getting '...' globals ... [13:14:17.938] resolve() on list ... [13:14:17.938] recursive: 0 [13:14:17.938] length: 1 [13:14:17.938] elements: '...' [13:14:17.939] length: 0 (resolved future 1) [13:14:17.939] resolve() on list ... DONE [13:14:17.939] - '...' content: [n=0] [13:14:17.939] List of 1 [13:14:17.939] $ ...: list() [13:14:17.939] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:14:17.939] - attr(*, "where")=List of 1 [13:14:17.939] ..$ ...: [13:14:17.939] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:14:17.939] - attr(*, "resolved")= logi TRUE [13:14:17.939] - attr(*, "total_size")= num NA [13:14:17.942] - Getting '...' globals ... DONE [13:14:17.943] Globals to be used in all futures (chunks): [n=8] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...' [13:14:17.943] List of 8 [13:14:17.943] $ ...future.FUN:function (x, ...) [13:14:17.943] $ x_FUN :function (x) [13:14:17.943] $ times : int 1 [13:14:17.943] $ stopf :function (fmt, ..., call. = TRUE, domain = NULL) [13:14:17.943] $ stop_if_not :function (...) [13:14:17.943] $ dim : NULL [13:14:17.943] $ valid_types : chr [1:3] "logical" "integer" "double" [13:14:17.943] $ ... : list() [13:14:17.943] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:14:17.943] - attr(*, "where")=List of 8 [13:14:17.943] ..$ ...future.FUN: [13:14:17.943] ..$ x_FUN : [13:14:17.943] ..$ times : [13:14:17.943] ..$ stopf : [13:14:17.943] ..$ stop_if_not : [13:14:17.943] ..$ dim : [13:14:17.943] ..$ valid_types : [13:14:17.943] ..$ ... : [13:14:17.943] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:14:17.943] - attr(*, "resolved")= logi FALSE [13:14:17.943] - attr(*, "total_size")= num 94336 [13:14:17.949] Packages to be attached in all futures: [n=1] 'future.apply' [13:14:17.950] getGlobalsAndPackagesXApply() ... DONE [13:14:17.950] Number of futures (= number of chunks): 2 [13:14:17.950] Launching 2 futures (chunks) ... [13:14:17.950] Chunk #1 of 2 ... [13:14:17.950] - Finding globals in 'X' for chunk #1 ... [13:14:17.951] getGlobalsAndPackages() ... [13:14:17.951] Searching for globals... [13:14:17.951] [13:14:17.951] Searching for globals ... DONE [13:14:17.951] - globals: [0] [13:14:17.952] getGlobalsAndPackages() ... DONE [13:14:17.952] + additional globals found: [n=0] [13:14:17.952] + additional namespaces needed: [n=0] [13:14:17.952] - Finding globals in 'X' for chunk #1 ... DONE [13:14:17.952] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:14:17.952] - seeds: [13:14:17.953] - All globals exported: [n=11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:17.953] getGlobalsAndPackages() ... [13:14:17.953] - globals passed as-is: [11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:17.953] Resolving globals: FALSE [13:14:17.953] Tweak future expression to call with '...' arguments ... [13:14:17.954] { [13:14:17.954] do.call(function(...) { [13:14:17.954] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:17.954] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:17.954] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:17.954] on.exit(options(oopts), add = TRUE) [13:14:17.954] } [13:14:17.954] { [13:14:17.954] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:17.954] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:17.954] ...future.FUN(...future.X_jj, ...) [13:14:17.954] }) [13:14:17.954] } [13:14:17.954] }, args = future.call.arguments) [13:14:17.954] } [13:14:17.954] Tweak future expression to call with '...' arguments ... DONE [13:14:17.955] - globals: [11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:17.955] - packages: [1] 'future.apply' [13:14:17.955] getGlobalsAndPackages() ... DONE [13:14:17.955] run() for 'Future' ... [13:14:17.956] - state: 'created' [13:14:17.956] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:14:17.970] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:14:17.970] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:14:17.970] - Field: 'node' [13:14:17.970] - Field: 'label' [13:14:17.971] - Field: 'local' [13:14:17.971] - Field: 'owner' [13:14:17.971] - Field: 'envir' [13:14:17.971] - Field: 'workers' [13:14:17.971] - Field: 'packages' [13:14:17.972] - Field: 'gc' [13:14:17.972] - Field: 'conditions' [13:14:17.972] - Field: 'persistent' [13:14:17.972] - Field: 'expr' [13:14:17.972] - Field: 'uuid' [13:14:17.972] - Field: 'seed' [13:14:17.973] - Field: 'version' [13:14:17.973] - Field: 'result' [13:14:17.973] - Field: 'asynchronous' [13:14:17.973] - Field: 'calls' [13:14:17.973] - Field: 'globals' [13:14:17.973] - Field: 'stdout' [13:14:17.974] - Field: 'earlySignal' [13:14:17.974] - Field: 'lazy' [13:14:17.974] - Field: 'state' [13:14:17.974] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:14:17.974] - Launch lazy future ... [13:14:17.975] Packages needed by the future expression (n = 1): 'future.apply' [13:14:17.975] Packages needed by future strategies (n = 0): [13:14:17.976] { [13:14:17.976] { [13:14:17.976] { [13:14:17.976] ...future.startTime <- base::Sys.time() [13:14:17.976] { [13:14:17.976] { [13:14:17.976] { [13:14:17.976] { [13:14:17.976] { [13:14:17.976] base::local({ [13:14:17.976] has_future <- base::requireNamespace("future", [13:14:17.976] quietly = TRUE) [13:14:17.976] if (has_future) { [13:14:17.976] ns <- base::getNamespace("future") [13:14:17.976] version <- ns[[".package"]][["version"]] [13:14:17.976] if (is.null(version)) [13:14:17.976] version <- utils::packageVersion("future") [13:14:17.976] } [13:14:17.976] else { [13:14:17.976] version <- NULL [13:14:17.976] } [13:14:17.976] if (!has_future || version < "1.8.0") { [13:14:17.976] info <- base::c(r_version = base::gsub("R version ", [13:14:17.976] "", base::R.version$version.string), [13:14:17.976] platform = base::sprintf("%s (%s-bit)", [13:14:17.976] base::R.version$platform, 8 * [13:14:17.976] base::.Machine$sizeof.pointer), [13:14:17.976] os = base::paste(base::Sys.info()[base::c("sysname", [13:14:17.976] "release", "version")], collapse = " "), [13:14:17.976] hostname = base::Sys.info()[["nodename"]]) [13:14:17.976] info <- base::sprintf("%s: %s", base::names(info), [13:14:17.976] info) [13:14:17.976] info <- base::paste(info, collapse = "; ") [13:14:17.976] if (!has_future) { [13:14:17.976] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:14:17.976] info) [13:14:17.976] } [13:14:17.976] else { [13:14:17.976] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:14:17.976] info, version) [13:14:17.976] } [13:14:17.976] base::stop(msg) [13:14:17.976] } [13:14:17.976] }) [13:14:17.976] } [13:14:17.976] ...future.mc.cores.old <- base::getOption("mc.cores") [13:14:17.976] base::options(mc.cores = 1L) [13:14:17.976] } [13:14:17.976] base::local({ [13:14:17.976] for (pkg in "future.apply") { [13:14:17.976] base::loadNamespace(pkg) [13:14:17.976] base::library(pkg, character.only = TRUE) [13:14:17.976] } [13:14:17.976] }) [13:14:17.976] } [13:14:17.976] options(future.plan = NULL) [13:14:17.976] Sys.unsetenv("R_FUTURE_PLAN") [13:14:17.976] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:14:17.976] } [13:14:17.976] ...future.workdir <- getwd() [13:14:17.976] } [13:14:17.976] ...future.oldOptions <- base::as.list(base::.Options) [13:14:17.976] ...future.oldEnvVars <- base::Sys.getenv() [13:14:17.976] } [13:14:17.976] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:14:17.976] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:14:17.976] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:14:17.976] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:14:17.976] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:14:17.976] future.stdout.windows.reencode = NULL, width = 80L) [13:14:17.976] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:14:17.976] base::names(...future.oldOptions)) [13:14:17.976] } [13:14:17.976] if (FALSE) { [13:14:17.976] } [13:14:17.976] else { [13:14:17.976] if (TRUE) { [13:14:17.976] ...future.stdout <- base::rawConnection(base::raw(0L), [13:14:17.976] open = "w") [13:14:17.976] } [13:14:17.976] else { [13:14:17.976] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:14:17.976] windows = "NUL", "/dev/null"), open = "w") [13:14:17.976] } [13:14:17.976] base::sink(...future.stdout, type = "output", split = FALSE) [13:14:17.976] base::on.exit(if (!base::is.null(...future.stdout)) { [13:14:17.976] base::sink(type = "output", split = FALSE) [13:14:17.976] base::close(...future.stdout) [13:14:17.976] }, add = TRUE) [13:14:17.976] } [13:14:17.976] ...future.frame <- base::sys.nframe() [13:14:17.976] ...future.conditions <- base::list() [13:14:17.976] ...future.rng <- base::globalenv()$.Random.seed [13:14:17.976] if (FALSE) { [13:14:17.976] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:14:17.976] "...future.value", "...future.globalenv.names", ".Random.seed") [13:14:17.976] } [13:14:17.976] ...future.result <- base::tryCatch({ [13:14:17.976] base::withCallingHandlers({ [13:14:17.976] ...future.value <- base::withVisible(base::local({ [13:14:17.976] ...future.makeSendCondition <- local({ [13:14:17.976] sendCondition <- NULL [13:14:17.976] function(frame = 1L) { [13:14:17.976] if (is.function(sendCondition)) [13:14:17.976] return(sendCondition) [13:14:17.976] ns <- getNamespace("parallel") [13:14:17.976] if (exists("sendData", mode = "function", [13:14:17.976] envir = ns)) { [13:14:17.976] parallel_sendData <- get("sendData", mode = "function", [13:14:17.976] envir = ns) [13:14:17.976] envir <- sys.frame(frame) [13:14:17.976] master <- NULL [13:14:17.976] while (!identical(envir, .GlobalEnv) && [13:14:17.976] !identical(envir, emptyenv())) { [13:14:17.976] if (exists("master", mode = "list", envir = envir, [13:14:17.976] inherits = FALSE)) { [13:14:17.976] master <- get("master", mode = "list", [13:14:17.976] envir = envir, inherits = FALSE) [13:14:17.976] if (inherits(master, c("SOCKnode", [13:14:17.976] "SOCK0node"))) { [13:14:17.976] sendCondition <<- function(cond) { [13:14:17.976] data <- list(type = "VALUE", value = cond, [13:14:17.976] success = TRUE) [13:14:17.976] parallel_sendData(master, data) [13:14:17.976] } [13:14:17.976] return(sendCondition) [13:14:17.976] } [13:14:17.976] } [13:14:17.976] frame <- frame + 1L [13:14:17.976] envir <- sys.frame(frame) [13:14:17.976] } [13:14:17.976] } [13:14:17.976] sendCondition <<- function(cond) NULL [13:14:17.976] } [13:14:17.976] }) [13:14:17.976] withCallingHandlers({ [13:14:17.976] { [13:14:17.976] do.call(function(...) { [13:14:17.976] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:17.976] if (!identical(...future.globals.maxSize.org, [13:14:17.976] ...future.globals.maxSize)) { [13:14:17.976] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:17.976] on.exit(options(oopts), add = TRUE) [13:14:17.976] } [13:14:17.976] { [13:14:17.976] lapply(seq_along(...future.elements_ii), [13:14:17.976] FUN = function(jj) { [13:14:17.976] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:17.976] ...future.FUN(...future.X_jj, ...) [13:14:17.976] }) [13:14:17.976] } [13:14:17.976] }, args = future.call.arguments) [13:14:17.976] } [13:14:17.976] }, immediateCondition = function(cond) { [13:14:17.976] sendCondition <- ...future.makeSendCondition() [13:14:17.976] sendCondition(cond) [13:14:17.976] muffleCondition <- function (cond, pattern = "^muffle") [13:14:17.976] { [13:14:17.976] inherits <- base::inherits [13:14:17.976] invokeRestart <- base::invokeRestart [13:14:17.976] is.null <- base::is.null [13:14:17.976] muffled <- FALSE [13:14:17.976] if (inherits(cond, "message")) { [13:14:17.976] muffled <- grepl(pattern, "muffleMessage") [13:14:17.976] if (muffled) [13:14:17.976] invokeRestart("muffleMessage") [13:14:17.976] } [13:14:17.976] else if (inherits(cond, "warning")) { [13:14:17.976] muffled <- grepl(pattern, "muffleWarning") [13:14:17.976] if (muffled) [13:14:17.976] invokeRestart("muffleWarning") [13:14:17.976] } [13:14:17.976] else if (inherits(cond, "condition")) { [13:14:17.976] if (!is.null(pattern)) { [13:14:17.976] computeRestarts <- base::computeRestarts [13:14:17.976] grepl <- base::grepl [13:14:17.976] restarts <- computeRestarts(cond) [13:14:17.976] for (restart in restarts) { [13:14:17.976] name <- restart$name [13:14:17.976] if (is.null(name)) [13:14:17.976] next [13:14:17.976] if (!grepl(pattern, name)) [13:14:17.976] next [13:14:17.976] invokeRestart(restart) [13:14:17.976] muffled <- TRUE [13:14:17.976] break [13:14:17.976] } [13:14:17.976] } [13:14:17.976] } [13:14:17.976] invisible(muffled) [13:14:17.976] } [13:14:17.976] muffleCondition(cond) [13:14:17.976] }) [13:14:17.976] })) [13:14:17.976] future::FutureResult(value = ...future.value$value, [13:14:17.976] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:14:17.976] ...future.rng), globalenv = if (FALSE) [13:14:17.976] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:14:17.976] ...future.globalenv.names)) [13:14:17.976] else NULL, started = ...future.startTime, version = "1.8") [13:14:17.976] }, condition = base::local({ [13:14:17.976] c <- base::c [13:14:17.976] inherits <- base::inherits [13:14:17.976] invokeRestart <- base::invokeRestart [13:14:17.976] length <- base::length [13:14:17.976] list <- base::list [13:14:17.976] seq.int <- base::seq.int [13:14:17.976] signalCondition <- base::signalCondition [13:14:17.976] sys.calls <- base::sys.calls [13:14:17.976] `[[` <- base::`[[` [13:14:17.976] `+` <- base::`+` [13:14:17.976] `<<-` <- base::`<<-` [13:14:17.976] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:14:17.976] calls[seq.int(from = from + 12L, to = length(calls) - [13:14:17.976] 3L)] [13:14:17.976] } [13:14:17.976] function(cond) { [13:14:17.976] is_error <- inherits(cond, "error") [13:14:17.976] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:14:17.976] NULL) [13:14:17.976] if (is_error) { [13:14:17.976] sessionInformation <- function() { [13:14:17.976] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:14:17.976] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:14:17.976] search = base::search(), system = base::Sys.info()) [13:14:17.976] } [13:14:17.976] ...future.conditions[[length(...future.conditions) + [13:14:17.976] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:14:17.976] cond$call), session = sessionInformation(), [13:14:17.976] timestamp = base::Sys.time(), signaled = 0L) [13:14:17.976] signalCondition(cond) [13:14:17.976] } [13:14:17.976] else if (!ignore && TRUE && inherits(cond, c("condition", [13:14:17.976] "immediateCondition"))) { [13:14:17.976] signal <- TRUE && inherits(cond, "immediateCondition") [13:14:17.976] ...future.conditions[[length(...future.conditions) + [13:14:17.976] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:14:17.976] if (TRUE && !signal) { [13:14:17.976] muffleCondition <- function (cond, pattern = "^muffle") [13:14:17.976] { [13:14:17.976] inherits <- base::inherits [13:14:17.976] invokeRestart <- base::invokeRestart [13:14:17.976] is.null <- base::is.null [13:14:17.976] muffled <- FALSE [13:14:17.976] if (inherits(cond, "message")) { [13:14:17.976] muffled <- grepl(pattern, "muffleMessage") [13:14:17.976] if (muffled) [13:14:17.976] invokeRestart("muffleMessage") [13:14:17.976] } [13:14:17.976] else if (inherits(cond, "warning")) { [13:14:17.976] muffled <- grepl(pattern, "muffleWarning") [13:14:17.976] if (muffled) [13:14:17.976] invokeRestart("muffleWarning") [13:14:17.976] } [13:14:17.976] else if (inherits(cond, "condition")) { [13:14:17.976] if (!is.null(pattern)) { [13:14:17.976] computeRestarts <- base::computeRestarts [13:14:17.976] grepl <- base::grepl [13:14:17.976] restarts <- computeRestarts(cond) [13:14:17.976] for (restart in restarts) { [13:14:17.976] name <- restart$name [13:14:17.976] if (is.null(name)) [13:14:17.976] next [13:14:17.976] if (!grepl(pattern, name)) [13:14:17.976] next [13:14:17.976] invokeRestart(restart) [13:14:17.976] muffled <- TRUE [13:14:17.976] break [13:14:17.976] } [13:14:17.976] } [13:14:17.976] } [13:14:17.976] invisible(muffled) [13:14:17.976] } [13:14:17.976] muffleCondition(cond, pattern = "^muffle") [13:14:17.976] } [13:14:17.976] } [13:14:17.976] else { [13:14:17.976] if (TRUE) { [13:14:17.976] muffleCondition <- function (cond, pattern = "^muffle") [13:14:17.976] { [13:14:17.976] inherits <- base::inherits [13:14:17.976] invokeRestart <- base::invokeRestart [13:14:17.976] is.null <- base::is.null [13:14:17.976] muffled <- FALSE [13:14:17.976] if (inherits(cond, "message")) { [13:14:17.976] muffled <- grepl(pattern, "muffleMessage") [13:14:17.976] if (muffled) [13:14:17.976] invokeRestart("muffleMessage") [13:14:17.976] } [13:14:17.976] else if (inherits(cond, "warning")) { [13:14:17.976] muffled <- grepl(pattern, "muffleWarning") [13:14:17.976] if (muffled) [13:14:17.976] invokeRestart("muffleWarning") [13:14:17.976] } [13:14:17.976] else if (inherits(cond, "condition")) { [13:14:17.976] if (!is.null(pattern)) { [13:14:17.976] computeRestarts <- base::computeRestarts [13:14:17.976] grepl <- base::grepl [13:14:17.976] restarts <- computeRestarts(cond) [13:14:17.976] for (restart in restarts) { [13:14:17.976] name <- restart$name [13:14:17.976] if (is.null(name)) [13:14:17.976] next [13:14:17.976] if (!grepl(pattern, name)) [13:14:17.976] next [13:14:17.976] invokeRestart(restart) [13:14:17.976] muffled <- TRUE [13:14:17.976] break [13:14:17.976] } [13:14:17.976] } [13:14:17.976] } [13:14:17.976] invisible(muffled) [13:14:17.976] } [13:14:17.976] muffleCondition(cond, pattern = "^muffle") [13:14:17.976] } [13:14:17.976] } [13:14:17.976] } [13:14:17.976] })) [13:14:17.976] }, error = function(ex) { [13:14:17.976] base::structure(base::list(value = NULL, visible = NULL, [13:14:17.976] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:14:17.976] ...future.rng), started = ...future.startTime, [13:14:17.976] finished = Sys.time(), session_uuid = NA_character_, [13:14:17.976] version = "1.8"), class = "FutureResult") [13:14:17.976] }, finally = { [13:14:17.976] if (!identical(...future.workdir, getwd())) [13:14:17.976] setwd(...future.workdir) [13:14:17.976] { [13:14:17.976] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:14:17.976] ...future.oldOptions$nwarnings <- NULL [13:14:17.976] } [13:14:17.976] base::options(...future.oldOptions) [13:14:17.976] if (.Platform$OS.type == "windows") { [13:14:17.976] old_names <- names(...future.oldEnvVars) [13:14:17.976] envs <- base::Sys.getenv() [13:14:17.976] names <- names(envs) [13:14:17.976] common <- intersect(names, old_names) [13:14:17.976] added <- setdiff(names, old_names) [13:14:17.976] removed <- setdiff(old_names, names) [13:14:17.976] changed <- common[...future.oldEnvVars[common] != [13:14:17.976] envs[common]] [13:14:17.976] NAMES <- toupper(changed) [13:14:17.976] args <- list() [13:14:17.976] for (kk in seq_along(NAMES)) { [13:14:17.976] name <- changed[[kk]] [13:14:17.976] NAME <- NAMES[[kk]] [13:14:17.976] if (name != NAME && is.element(NAME, old_names)) [13:14:17.976] next [13:14:17.976] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:17.976] } [13:14:17.976] NAMES <- toupper(added) [13:14:17.976] for (kk in seq_along(NAMES)) { [13:14:17.976] name <- added[[kk]] [13:14:17.976] NAME <- NAMES[[kk]] [13:14:17.976] if (name != NAME && is.element(NAME, old_names)) [13:14:17.976] next [13:14:17.976] args[[name]] <- "" [13:14:17.976] } [13:14:17.976] NAMES <- toupper(removed) [13:14:17.976] for (kk in seq_along(NAMES)) { [13:14:17.976] name <- removed[[kk]] [13:14:17.976] NAME <- NAMES[[kk]] [13:14:17.976] if (name != NAME && is.element(NAME, old_names)) [13:14:17.976] next [13:14:17.976] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:17.976] } [13:14:17.976] if (length(args) > 0) [13:14:17.976] base::do.call(base::Sys.setenv, args = args) [13:14:17.976] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:14:17.976] } [13:14:17.976] else { [13:14:17.976] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:14:17.976] } [13:14:17.976] { [13:14:17.976] if (base::length(...future.futureOptionsAdded) > [13:14:17.976] 0L) { [13:14:17.976] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:14:17.976] base::names(opts) <- ...future.futureOptionsAdded [13:14:17.976] base::options(opts) [13:14:17.976] } [13:14:17.976] { [13:14:17.976] { [13:14:17.976] base::options(mc.cores = ...future.mc.cores.old) [13:14:17.976] NULL [13:14:17.976] } [13:14:17.976] options(future.plan = NULL) [13:14:17.976] if (is.na(NA_character_)) [13:14:17.976] Sys.unsetenv("R_FUTURE_PLAN") [13:14:17.976] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:14:17.976] future::plan(list(function (..., workers = availableCores(), [13:14:17.976] lazy = FALSE, rscript_libs = .libPaths(), [13:14:17.976] envir = parent.frame()) [13:14:17.976] { [13:14:17.976] if (is.function(workers)) [13:14:17.976] workers <- workers() [13:14:17.976] workers <- structure(as.integer(workers), [13:14:17.976] class = class(workers)) [13:14:17.976] stop_if_not(length(workers) == 1, is.finite(workers), [13:14:17.976] workers >= 1) [13:14:17.976] if (workers == 1L && !inherits(workers, "AsIs")) { [13:14:17.976] return(sequential(..., lazy = TRUE, envir = envir)) [13:14:17.976] } [13:14:17.976] future <- MultisessionFuture(..., workers = workers, [13:14:17.976] lazy = lazy, rscript_libs = rscript_libs, [13:14:17.976] envir = envir) [13:14:17.976] if (!future$lazy) [13:14:17.976] future <- run(future) [13:14:17.976] invisible(future) [13:14:17.976] }), .cleanup = FALSE, .init = FALSE) [13:14:17.976] } [13:14:17.976] } [13:14:17.976] } [13:14:17.976] }) [13:14:17.976] if (TRUE) { [13:14:17.976] base::sink(type = "output", split = FALSE) [13:14:17.976] if (TRUE) { [13:14:17.976] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:14:17.976] } [13:14:17.976] else { [13:14:17.976] ...future.result["stdout"] <- base::list(NULL) [13:14:17.976] } [13:14:17.976] base::close(...future.stdout) [13:14:17.976] ...future.stdout <- NULL [13:14:17.976] } [13:14:17.976] ...future.result$conditions <- ...future.conditions [13:14:17.976] ...future.result$finished <- base::Sys.time() [13:14:17.976] ...future.result [13:14:17.976] } [13:14:17.981] Exporting 11 global objects (92.12 KiB) to cluster node #1 ... [13:14:17.981] Exporting '...future.FUN' (21.22 KiB) to cluster node #1 ... [13:14:17.982] Exporting '...future.FUN' (21.22 KiB) to cluster node #1 ... DONE [13:14:17.982] Exporting 'x_FUN' (56 bytes) to cluster node #1 ... [13:14:17.982] Exporting 'x_FUN' (56 bytes) to cluster node #1 ... DONE [13:14:17.983] Exporting 'times' (56 bytes) to cluster node #1 ... [13:14:17.983] Exporting 'times' (56 bytes) to cluster node #1 ... DONE [13:14:17.983] Exporting 'stopf' (26.43 KiB) to cluster node #1 ... [13:14:17.984] Exporting 'stopf' (26.43 KiB) to cluster node #1 ... DONE [13:14:17.984] Exporting 'stop_if_not' (44.12 KiB) to cluster node #1 ... [13:14:17.984] Exporting 'stop_if_not' (44.12 KiB) to cluster node #1 ... DONE [13:14:17.984] Exporting 'dim' (0 bytes) to cluster node #1 ... [13:14:17.985] Exporting 'dim' (0 bytes) to cluster node #1 ... DONE [13:14:17.985] Exporting 'valid_types' (248 bytes) to cluster node #1 ... [13:14:17.985] Exporting 'valid_types' (248 bytes) to cluster node #1 ... DONE [13:14:17.986] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... [13:14:17.986] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... DONE [13:14:17.986] Exporting '...future.elements_ii' (280 bytes) to cluster node #1 ... [13:14:17.987] Exporting '...future.elements_ii' (280 bytes) to cluster node #1 ... DONE [13:14:17.987] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:14:17.987] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:14:17.987] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:14:17.988] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:14:17.988] Exporting 11 global objects (92.12 KiB) to cluster node #1 ... DONE [13:14:17.989] MultisessionFuture started [13:14:17.989] - Launch lazy future ... done [13:14:17.989] run() for 'MultisessionFuture' ... done [13:14:17.989] Created future: [13:14:18.008] receiveMessageFromWorker() for ClusterFuture ... [13:14:18.008] - Validating connection of MultisessionFuture [13:14:18.008] - received message: FutureResult [13:14:18.008] - Received FutureResult [13:14:18.009] - Erased future from FutureRegistry [13:14:18.009] result() for ClusterFuture ... [13:14:18.009] - result already collected: FutureResult [13:14:18.009] result() for ClusterFuture ... done [13:14:18.009] receiveMessageFromWorker() for ClusterFuture ... done [13:14:17.989] MultisessionFuture: [13:14:17.989] Label: 'future_vapply-1' [13:14:17.989] Expression: [13:14:17.989] { [13:14:17.989] do.call(function(...) { [13:14:17.989] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:17.989] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:17.989] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:17.989] on.exit(options(oopts), add = TRUE) [13:14:17.989] } [13:14:17.989] { [13:14:17.989] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:17.989] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:17.989] ...future.FUN(...future.X_jj, ...) [13:14:17.989] }) [13:14:17.989] } [13:14:17.989] }, args = future.call.arguments) [13:14:17.989] } [13:14:17.989] Lazy evaluation: FALSE [13:14:17.989] Asynchronous evaluation: TRUE [13:14:17.989] Local evaluation: TRUE [13:14:17.989] Environment: R_GlobalEnv [13:14:17.989] Capture standard output: TRUE [13:14:17.989] Capture condition classes: 'condition' (excluding 'nothing') [13:14:17.989] Globals: 11 objects totaling 92.40 KiB (function '...future.FUN' of 21.22 KiB, function 'x_FUN' of 56 bytes, integer 'times' of 56 bytes, function 'stopf' of 26.43 KiB, function 'stop_if_not' of 44.12 KiB, ...) [13:14:17.989] Packages: 1 packages ('future.apply') [13:14:17.989] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:14:17.989] Resolved: TRUE [13:14:17.989] Value: [13:14:17.989] Conditions captured: [13:14:17.989] Early signaling: FALSE [13:14:17.989] Owner process: 1bb7d580-628d-c90d-e38a-66de485868c4 [13:14:17.989] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:14:18.010] Chunk #1 of 2 ... DONE [13:14:18.010] Chunk #2 of 2 ... [13:14:18.010] - Finding globals in 'X' for chunk #2 ... [13:14:18.010] getGlobalsAndPackages() ... [13:14:18.010] Searching for globals... [13:14:18.011] [13:14:18.011] Searching for globals ... DONE [13:14:18.011] - globals: [0] [13:14:18.011] getGlobalsAndPackages() ... DONE [13:14:18.011] + additional globals found: [n=0] [13:14:18.011] + additional namespaces needed: [n=0] [13:14:18.012] - Finding globals in 'X' for chunk #2 ... DONE [13:14:18.012] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:14:18.012] - seeds: [13:14:18.012] - All globals exported: [n=11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:18.012] getGlobalsAndPackages() ... [13:14:18.012] - globals passed as-is: [11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:18.013] Resolving globals: FALSE [13:14:18.013] Tweak future expression to call with '...' arguments ... [13:14:18.013] { [13:14:18.013] do.call(function(...) { [13:14:18.013] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:18.013] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:18.013] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:18.013] on.exit(options(oopts), add = TRUE) [13:14:18.013] } [13:14:18.013] { [13:14:18.013] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:18.013] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:18.013] ...future.FUN(...future.X_jj, ...) [13:14:18.013] }) [13:14:18.013] } [13:14:18.013] }, args = future.call.arguments) [13:14:18.013] } [13:14:18.013] Tweak future expression to call with '...' arguments ... DONE [13:14:18.014] - globals: [11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:18.014] - packages: [1] 'future.apply' [13:14:18.015] getGlobalsAndPackages() ... DONE [13:14:18.015] run() for 'Future' ... [13:14:18.015] - state: 'created' [13:14:18.015] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:14:18.029] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:14:18.029] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:14:18.030] - Field: 'node' [13:14:18.030] - Field: 'label' [13:14:18.030] - Field: 'local' [13:14:18.030] - Field: 'owner' [13:14:18.030] - Field: 'envir' [13:14:18.031] - Field: 'workers' [13:14:18.031] - Field: 'packages' [13:14:18.031] - Field: 'gc' [13:14:18.031] - Field: 'conditions' [13:14:18.031] - Field: 'persistent' [13:14:18.031] - Field: 'expr' [13:14:18.032] - Field: 'uuid' [13:14:18.032] - Field: 'seed' [13:14:18.032] - Field: 'version' [13:14:18.032] - Field: 'result' [13:14:18.032] - Field: 'asynchronous' [13:14:18.033] - Field: 'calls' [13:14:18.033] - Field: 'globals' [13:14:18.033] - Field: 'stdout' [13:14:18.033] - Field: 'earlySignal' [13:14:18.033] - Field: 'lazy' [13:14:18.033] - Field: 'state' [13:14:18.034] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:14:18.034] - Launch lazy future ... [13:14:18.034] Packages needed by the future expression (n = 1): 'future.apply' [13:14:18.034] Packages needed by future strategies (n = 0): [13:14:18.035] { [13:14:18.035] { [13:14:18.035] { [13:14:18.035] ...future.startTime <- base::Sys.time() [13:14:18.035] { [13:14:18.035] { [13:14:18.035] { [13:14:18.035] { [13:14:18.035] { [13:14:18.035] base::local({ [13:14:18.035] has_future <- base::requireNamespace("future", [13:14:18.035] quietly = TRUE) [13:14:18.035] if (has_future) { [13:14:18.035] ns <- base::getNamespace("future") [13:14:18.035] version <- ns[[".package"]][["version"]] [13:14:18.035] if (is.null(version)) [13:14:18.035] version <- utils::packageVersion("future") [13:14:18.035] } [13:14:18.035] else { [13:14:18.035] version <- NULL [13:14:18.035] } [13:14:18.035] if (!has_future || version < "1.8.0") { [13:14:18.035] info <- base::c(r_version = base::gsub("R version ", [13:14:18.035] "", base::R.version$version.string), [13:14:18.035] platform = base::sprintf("%s (%s-bit)", [13:14:18.035] base::R.version$platform, 8 * [13:14:18.035] base::.Machine$sizeof.pointer), [13:14:18.035] os = base::paste(base::Sys.info()[base::c("sysname", [13:14:18.035] "release", "version")], collapse = " "), [13:14:18.035] hostname = base::Sys.info()[["nodename"]]) [13:14:18.035] info <- base::sprintf("%s: %s", base::names(info), [13:14:18.035] info) [13:14:18.035] info <- base::paste(info, collapse = "; ") [13:14:18.035] if (!has_future) { [13:14:18.035] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:14:18.035] info) [13:14:18.035] } [13:14:18.035] else { [13:14:18.035] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:14:18.035] info, version) [13:14:18.035] } [13:14:18.035] base::stop(msg) [13:14:18.035] } [13:14:18.035] }) [13:14:18.035] } [13:14:18.035] ...future.mc.cores.old <- base::getOption("mc.cores") [13:14:18.035] base::options(mc.cores = 1L) [13:14:18.035] } [13:14:18.035] base::local({ [13:14:18.035] for (pkg in "future.apply") { [13:14:18.035] base::loadNamespace(pkg) [13:14:18.035] base::library(pkg, character.only = TRUE) [13:14:18.035] } [13:14:18.035] }) [13:14:18.035] } [13:14:18.035] options(future.plan = NULL) [13:14:18.035] Sys.unsetenv("R_FUTURE_PLAN") [13:14:18.035] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:14:18.035] } [13:14:18.035] ...future.workdir <- getwd() [13:14:18.035] } [13:14:18.035] ...future.oldOptions <- base::as.list(base::.Options) [13:14:18.035] ...future.oldEnvVars <- base::Sys.getenv() [13:14:18.035] } [13:14:18.035] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:14:18.035] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:14:18.035] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:14:18.035] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:14:18.035] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:14:18.035] future.stdout.windows.reencode = NULL, width = 80L) [13:14:18.035] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:14:18.035] base::names(...future.oldOptions)) [13:14:18.035] } [13:14:18.035] if (FALSE) { [13:14:18.035] } [13:14:18.035] else { [13:14:18.035] if (TRUE) { [13:14:18.035] ...future.stdout <- base::rawConnection(base::raw(0L), [13:14:18.035] open = "w") [13:14:18.035] } [13:14:18.035] else { [13:14:18.035] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:14:18.035] windows = "NUL", "/dev/null"), open = "w") [13:14:18.035] } [13:14:18.035] base::sink(...future.stdout, type = "output", split = FALSE) [13:14:18.035] base::on.exit(if (!base::is.null(...future.stdout)) { [13:14:18.035] base::sink(type = "output", split = FALSE) [13:14:18.035] base::close(...future.stdout) [13:14:18.035] }, add = TRUE) [13:14:18.035] } [13:14:18.035] ...future.frame <- base::sys.nframe() [13:14:18.035] ...future.conditions <- base::list() [13:14:18.035] ...future.rng <- base::globalenv()$.Random.seed [13:14:18.035] if (FALSE) { [13:14:18.035] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:14:18.035] "...future.value", "...future.globalenv.names", ".Random.seed") [13:14:18.035] } [13:14:18.035] ...future.result <- base::tryCatch({ [13:14:18.035] base::withCallingHandlers({ [13:14:18.035] ...future.value <- base::withVisible(base::local({ [13:14:18.035] ...future.makeSendCondition <- local({ [13:14:18.035] sendCondition <- NULL [13:14:18.035] function(frame = 1L) { [13:14:18.035] if (is.function(sendCondition)) [13:14:18.035] return(sendCondition) [13:14:18.035] ns <- getNamespace("parallel") [13:14:18.035] if (exists("sendData", mode = "function", [13:14:18.035] envir = ns)) { [13:14:18.035] parallel_sendData <- get("sendData", mode = "function", [13:14:18.035] envir = ns) [13:14:18.035] envir <- sys.frame(frame) [13:14:18.035] master <- NULL [13:14:18.035] while (!identical(envir, .GlobalEnv) && [13:14:18.035] !identical(envir, emptyenv())) { [13:14:18.035] if (exists("master", mode = "list", envir = envir, [13:14:18.035] inherits = FALSE)) { [13:14:18.035] master <- get("master", mode = "list", [13:14:18.035] envir = envir, inherits = FALSE) [13:14:18.035] if (inherits(master, c("SOCKnode", [13:14:18.035] "SOCK0node"))) { [13:14:18.035] sendCondition <<- function(cond) { [13:14:18.035] data <- list(type = "VALUE", value = cond, [13:14:18.035] success = TRUE) [13:14:18.035] parallel_sendData(master, data) [13:14:18.035] } [13:14:18.035] return(sendCondition) [13:14:18.035] } [13:14:18.035] } [13:14:18.035] frame <- frame + 1L [13:14:18.035] envir <- sys.frame(frame) [13:14:18.035] } [13:14:18.035] } [13:14:18.035] sendCondition <<- function(cond) NULL [13:14:18.035] } [13:14:18.035] }) [13:14:18.035] withCallingHandlers({ [13:14:18.035] { [13:14:18.035] do.call(function(...) { [13:14:18.035] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:18.035] if (!identical(...future.globals.maxSize.org, [13:14:18.035] ...future.globals.maxSize)) { [13:14:18.035] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:18.035] on.exit(options(oopts), add = TRUE) [13:14:18.035] } [13:14:18.035] { [13:14:18.035] lapply(seq_along(...future.elements_ii), [13:14:18.035] FUN = function(jj) { [13:14:18.035] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:18.035] ...future.FUN(...future.X_jj, ...) [13:14:18.035] }) [13:14:18.035] } [13:14:18.035] }, args = future.call.arguments) [13:14:18.035] } [13:14:18.035] }, immediateCondition = function(cond) { [13:14:18.035] sendCondition <- ...future.makeSendCondition() [13:14:18.035] sendCondition(cond) [13:14:18.035] muffleCondition <- function (cond, pattern = "^muffle") [13:14:18.035] { [13:14:18.035] inherits <- base::inherits [13:14:18.035] invokeRestart <- base::invokeRestart [13:14:18.035] is.null <- base::is.null [13:14:18.035] muffled <- FALSE [13:14:18.035] if (inherits(cond, "message")) { [13:14:18.035] muffled <- grepl(pattern, "muffleMessage") [13:14:18.035] if (muffled) [13:14:18.035] invokeRestart("muffleMessage") [13:14:18.035] } [13:14:18.035] else if (inherits(cond, "warning")) { [13:14:18.035] muffled <- grepl(pattern, "muffleWarning") [13:14:18.035] if (muffled) [13:14:18.035] invokeRestart("muffleWarning") [13:14:18.035] } [13:14:18.035] else if (inherits(cond, "condition")) { [13:14:18.035] if (!is.null(pattern)) { [13:14:18.035] computeRestarts <- base::computeRestarts [13:14:18.035] grepl <- base::grepl [13:14:18.035] restarts <- computeRestarts(cond) [13:14:18.035] for (restart in restarts) { [13:14:18.035] name <- restart$name [13:14:18.035] if (is.null(name)) [13:14:18.035] next [13:14:18.035] if (!grepl(pattern, name)) [13:14:18.035] next [13:14:18.035] invokeRestart(restart) [13:14:18.035] muffled <- TRUE [13:14:18.035] break [13:14:18.035] } [13:14:18.035] } [13:14:18.035] } [13:14:18.035] invisible(muffled) [13:14:18.035] } [13:14:18.035] muffleCondition(cond) [13:14:18.035] }) [13:14:18.035] })) [13:14:18.035] future::FutureResult(value = ...future.value$value, [13:14:18.035] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:14:18.035] ...future.rng), globalenv = if (FALSE) [13:14:18.035] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:14:18.035] ...future.globalenv.names)) [13:14:18.035] else NULL, started = ...future.startTime, version = "1.8") [13:14:18.035] }, condition = base::local({ [13:14:18.035] c <- base::c [13:14:18.035] inherits <- base::inherits [13:14:18.035] invokeRestart <- base::invokeRestart [13:14:18.035] length <- base::length [13:14:18.035] list <- base::list [13:14:18.035] seq.int <- base::seq.int [13:14:18.035] signalCondition <- base::signalCondition [13:14:18.035] sys.calls <- base::sys.calls [13:14:18.035] `[[` <- base::`[[` [13:14:18.035] `+` <- base::`+` [13:14:18.035] `<<-` <- base::`<<-` [13:14:18.035] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:14:18.035] calls[seq.int(from = from + 12L, to = length(calls) - [13:14:18.035] 3L)] [13:14:18.035] } [13:14:18.035] function(cond) { [13:14:18.035] is_error <- inherits(cond, "error") [13:14:18.035] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:14:18.035] NULL) [13:14:18.035] if (is_error) { [13:14:18.035] sessionInformation <- function() { [13:14:18.035] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:14:18.035] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:14:18.035] search = base::search(), system = base::Sys.info()) [13:14:18.035] } [13:14:18.035] ...future.conditions[[length(...future.conditions) + [13:14:18.035] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:14:18.035] cond$call), session = sessionInformation(), [13:14:18.035] timestamp = base::Sys.time(), signaled = 0L) [13:14:18.035] signalCondition(cond) [13:14:18.035] } [13:14:18.035] else if (!ignore && TRUE && inherits(cond, c("condition", [13:14:18.035] "immediateCondition"))) { [13:14:18.035] signal <- TRUE && inherits(cond, "immediateCondition") [13:14:18.035] ...future.conditions[[length(...future.conditions) + [13:14:18.035] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:14:18.035] if (TRUE && !signal) { [13:14:18.035] muffleCondition <- function (cond, pattern = "^muffle") [13:14:18.035] { [13:14:18.035] inherits <- base::inherits [13:14:18.035] invokeRestart <- base::invokeRestart [13:14:18.035] is.null <- base::is.null [13:14:18.035] muffled <- FALSE [13:14:18.035] if (inherits(cond, "message")) { [13:14:18.035] muffled <- grepl(pattern, "muffleMessage") [13:14:18.035] if (muffled) [13:14:18.035] invokeRestart("muffleMessage") [13:14:18.035] } [13:14:18.035] else if (inherits(cond, "warning")) { [13:14:18.035] muffled <- grepl(pattern, "muffleWarning") [13:14:18.035] if (muffled) [13:14:18.035] invokeRestart("muffleWarning") [13:14:18.035] } [13:14:18.035] else if (inherits(cond, "condition")) { [13:14:18.035] if (!is.null(pattern)) { [13:14:18.035] computeRestarts <- base::computeRestarts [13:14:18.035] grepl <- base::grepl [13:14:18.035] restarts <- computeRestarts(cond) [13:14:18.035] for (restart in restarts) { [13:14:18.035] name <- restart$name [13:14:18.035] if (is.null(name)) [13:14:18.035] next [13:14:18.035] if (!grepl(pattern, name)) [13:14:18.035] next [13:14:18.035] invokeRestart(restart) [13:14:18.035] muffled <- TRUE [13:14:18.035] break [13:14:18.035] } [13:14:18.035] } [13:14:18.035] } [13:14:18.035] invisible(muffled) [13:14:18.035] } [13:14:18.035] muffleCondition(cond, pattern = "^muffle") [13:14:18.035] } [13:14:18.035] } [13:14:18.035] else { [13:14:18.035] if (TRUE) { [13:14:18.035] muffleCondition <- function (cond, pattern = "^muffle") [13:14:18.035] { [13:14:18.035] inherits <- base::inherits [13:14:18.035] invokeRestart <- base::invokeRestart [13:14:18.035] is.null <- base::is.null [13:14:18.035] muffled <- FALSE [13:14:18.035] if (inherits(cond, "message")) { [13:14:18.035] muffled <- grepl(pattern, "muffleMessage") [13:14:18.035] if (muffled) [13:14:18.035] invokeRestart("muffleMessage") [13:14:18.035] } [13:14:18.035] else if (inherits(cond, "warning")) { [13:14:18.035] muffled <- grepl(pattern, "muffleWarning") [13:14:18.035] if (muffled) [13:14:18.035] invokeRestart("muffleWarning") [13:14:18.035] } [13:14:18.035] else if (inherits(cond, "condition")) { [13:14:18.035] if (!is.null(pattern)) { [13:14:18.035] computeRestarts <- base::computeRestarts [13:14:18.035] grepl <- base::grepl [13:14:18.035] restarts <- computeRestarts(cond) [13:14:18.035] for (restart in restarts) { [13:14:18.035] name <- restart$name [13:14:18.035] if (is.null(name)) [13:14:18.035] next [13:14:18.035] if (!grepl(pattern, name)) [13:14:18.035] next [13:14:18.035] invokeRestart(restart) [13:14:18.035] muffled <- TRUE [13:14:18.035] break [13:14:18.035] } [13:14:18.035] } [13:14:18.035] } [13:14:18.035] invisible(muffled) [13:14:18.035] } [13:14:18.035] muffleCondition(cond, pattern = "^muffle") [13:14:18.035] } [13:14:18.035] } [13:14:18.035] } [13:14:18.035] })) [13:14:18.035] }, error = function(ex) { [13:14:18.035] base::structure(base::list(value = NULL, visible = NULL, [13:14:18.035] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:14:18.035] ...future.rng), started = ...future.startTime, [13:14:18.035] finished = Sys.time(), session_uuid = NA_character_, [13:14:18.035] version = "1.8"), class = "FutureResult") [13:14:18.035] }, finally = { [13:14:18.035] if (!identical(...future.workdir, getwd())) [13:14:18.035] setwd(...future.workdir) [13:14:18.035] { [13:14:18.035] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:14:18.035] ...future.oldOptions$nwarnings <- NULL [13:14:18.035] } [13:14:18.035] base::options(...future.oldOptions) [13:14:18.035] if (.Platform$OS.type == "windows") { [13:14:18.035] old_names <- names(...future.oldEnvVars) [13:14:18.035] envs <- base::Sys.getenv() [13:14:18.035] names <- names(envs) [13:14:18.035] common <- intersect(names, old_names) [13:14:18.035] added <- setdiff(names, old_names) [13:14:18.035] removed <- setdiff(old_names, names) [13:14:18.035] changed <- common[...future.oldEnvVars[common] != [13:14:18.035] envs[common]] [13:14:18.035] NAMES <- toupper(changed) [13:14:18.035] args <- list() [13:14:18.035] for (kk in seq_along(NAMES)) { [13:14:18.035] name <- changed[[kk]] [13:14:18.035] NAME <- NAMES[[kk]] [13:14:18.035] if (name != NAME && is.element(NAME, old_names)) [13:14:18.035] next [13:14:18.035] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:18.035] } [13:14:18.035] NAMES <- toupper(added) [13:14:18.035] for (kk in seq_along(NAMES)) { [13:14:18.035] name <- added[[kk]] [13:14:18.035] NAME <- NAMES[[kk]] [13:14:18.035] if (name != NAME && is.element(NAME, old_names)) [13:14:18.035] next [13:14:18.035] args[[name]] <- "" [13:14:18.035] } [13:14:18.035] NAMES <- toupper(removed) [13:14:18.035] for (kk in seq_along(NAMES)) { [13:14:18.035] name <- removed[[kk]] [13:14:18.035] NAME <- NAMES[[kk]] [13:14:18.035] if (name != NAME && is.element(NAME, old_names)) [13:14:18.035] next [13:14:18.035] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:18.035] } [13:14:18.035] if (length(args) > 0) [13:14:18.035] base::do.call(base::Sys.setenv, args = args) [13:14:18.035] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:14:18.035] } [13:14:18.035] else { [13:14:18.035] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:14:18.035] } [13:14:18.035] { [13:14:18.035] if (base::length(...future.futureOptionsAdded) > [13:14:18.035] 0L) { [13:14:18.035] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:14:18.035] base::names(opts) <- ...future.futureOptionsAdded [13:14:18.035] base::options(opts) [13:14:18.035] } [13:14:18.035] { [13:14:18.035] { [13:14:18.035] base::options(mc.cores = ...future.mc.cores.old) [13:14:18.035] NULL [13:14:18.035] } [13:14:18.035] options(future.plan = NULL) [13:14:18.035] if (is.na(NA_character_)) [13:14:18.035] Sys.unsetenv("R_FUTURE_PLAN") [13:14:18.035] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:14:18.035] future::plan(list(function (..., workers = availableCores(), [13:14:18.035] lazy = FALSE, rscript_libs = .libPaths(), [13:14:18.035] envir = parent.frame()) [13:14:18.035] { [13:14:18.035] if (is.function(workers)) [13:14:18.035] workers <- workers() [13:14:18.035] workers <- structure(as.integer(workers), [13:14:18.035] class = class(workers)) [13:14:18.035] stop_if_not(length(workers) == 1, is.finite(workers), [13:14:18.035] workers >= 1) [13:14:18.035] if (workers == 1L && !inherits(workers, "AsIs")) { [13:14:18.035] return(sequential(..., lazy = TRUE, envir = envir)) [13:14:18.035] } [13:14:18.035] future <- MultisessionFuture(..., workers = workers, [13:14:18.035] lazy = lazy, rscript_libs = rscript_libs, [13:14:18.035] envir = envir) [13:14:18.035] if (!future$lazy) [13:14:18.035] future <- run(future) [13:14:18.035] invisible(future) [13:14:18.035] }), .cleanup = FALSE, .init = FALSE) [13:14:18.035] } [13:14:18.035] } [13:14:18.035] } [13:14:18.035] }) [13:14:18.035] if (TRUE) { [13:14:18.035] base::sink(type = "output", split = FALSE) [13:14:18.035] if (TRUE) { [13:14:18.035] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:14:18.035] } [13:14:18.035] else { [13:14:18.035] ...future.result["stdout"] <- base::list(NULL) [13:14:18.035] } [13:14:18.035] base::close(...future.stdout) [13:14:18.035] ...future.stdout <- NULL [13:14:18.035] } [13:14:18.035] ...future.result$conditions <- ...future.conditions [13:14:18.035] ...future.result$finished <- base::Sys.time() [13:14:18.035] ...future.result [13:14:18.035] } [13:14:18.040] Exporting 11 global objects (92.12 KiB) to cluster node #1 ... [13:14:18.041] Exporting '...future.FUN' (21.22 KiB) to cluster node #1 ... [13:14:18.041] Exporting '...future.FUN' (21.22 KiB) to cluster node #1 ... DONE [13:14:18.041] Exporting 'x_FUN' (56 bytes) to cluster node #1 ... [13:14:18.042] Exporting 'x_FUN' (56 bytes) to cluster node #1 ... DONE [13:14:18.042] Exporting 'times' (56 bytes) to cluster node #1 ... [13:14:18.042] Exporting 'times' (56 bytes) to cluster node #1 ... DONE [13:14:18.042] Exporting 'stopf' (26.43 KiB) to cluster node #1 ... [13:14:18.043] Exporting 'stopf' (26.43 KiB) to cluster node #1 ... DONE [13:14:18.043] Exporting 'stop_if_not' (44.12 KiB) to cluster node #1 ... [13:14:18.043] Exporting 'stop_if_not' (44.12 KiB) to cluster node #1 ... DONE [13:14:18.044] Exporting 'dim' (0 bytes) to cluster node #1 ... [13:14:18.044] Exporting 'dim' (0 bytes) to cluster node #1 ... DONE [13:14:18.044] Exporting 'valid_types' (248 bytes) to cluster node #1 ... [13:14:18.045] Exporting 'valid_types' (248 bytes) to cluster node #1 ... DONE [13:14:18.045] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... [13:14:18.045] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... DONE [13:14:18.046] Exporting '...future.elements_ii' (280 bytes) to cluster node #1 ... [13:14:18.046] Exporting '...future.elements_ii' (280 bytes) to cluster node #1 ... DONE [13:14:18.046] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:14:18.046] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:14:18.047] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:14:18.047] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:14:18.047] Exporting 11 global objects (92.12 KiB) to cluster node #1 ... DONE [13:14:18.048] MultisessionFuture started [13:14:18.048] - Launch lazy future ... done [13:14:18.048] run() for 'MultisessionFuture' ... done [13:14:18.048] Created future: [13:14:18.065] receiveMessageFromWorker() for ClusterFuture ... [13:14:18.065] - Validating connection of MultisessionFuture [13:14:18.065] - received message: FutureResult [13:14:18.065] - Received FutureResult [13:14:18.066] - Erased future from FutureRegistry [13:14:18.066] result() for ClusterFuture ... [13:14:18.066] - result already collected: FutureResult [13:14:18.066] result() for ClusterFuture ... done [13:14:18.066] receiveMessageFromWorker() for ClusterFuture ... done [13:14:18.048] MultisessionFuture: [13:14:18.048] Label: 'future_vapply-2' [13:14:18.048] Expression: [13:14:18.048] { [13:14:18.048] do.call(function(...) { [13:14:18.048] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:18.048] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:18.048] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:18.048] on.exit(options(oopts), add = TRUE) [13:14:18.048] } [13:14:18.048] { [13:14:18.048] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:18.048] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:18.048] ...future.FUN(...future.X_jj, ...) [13:14:18.048] }) [13:14:18.048] } [13:14:18.048] }, args = future.call.arguments) [13:14:18.048] } [13:14:18.048] Lazy evaluation: FALSE [13:14:18.048] Asynchronous evaluation: TRUE [13:14:18.048] Local evaluation: TRUE [13:14:18.048] Environment: R_GlobalEnv [13:14:18.048] Capture standard output: TRUE [13:14:18.048] Capture condition classes: 'condition' (excluding 'nothing') [13:14:18.048] Globals: 11 objects totaling 92.40 KiB (function '...future.FUN' of 21.22 KiB, function 'x_FUN' of 56 bytes, integer 'times' of 56 bytes, function 'stopf' of 26.43 KiB, function 'stop_if_not' of 44.12 KiB, ...) [13:14:18.048] Packages: 1 packages ('future.apply') [13:14:18.048] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:14:18.048] Resolved: TRUE [13:14:18.048] Value: [13:14:18.048] Conditions captured: [13:14:18.048] Early signaling: FALSE [13:14:18.048] Owner process: 1bb7d580-628d-c90d-e38a-66de485868c4 [13:14:18.048] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:14:18.067] Chunk #2 of 2 ... DONE [13:14:18.067] Launching 2 futures (chunks) ... DONE [13:14:18.067] Resolving 2 futures (chunks) ... [13:14:18.067] resolve() on list ... [13:14:18.067] recursive: 0 [13:14:18.067] length: 2 [13:14:18.068] [13:14:18.068] Future #1 [13:14:18.068] result() for ClusterFuture ... [13:14:18.068] - result already collected: FutureResult [13:14:18.068] result() for ClusterFuture ... done [13:14:18.068] result() for ClusterFuture ... [13:14:18.069] - result already collected: FutureResult [13:14:18.069] result() for ClusterFuture ... done [13:14:18.069] signalConditionsASAP(MultisessionFuture, pos=1) ... [13:14:18.069] - nx: 2 [13:14:18.069] - relay: TRUE [13:14:18.069] - stdout: TRUE [13:14:18.069] - signal: TRUE [13:14:18.070] - resignal: FALSE [13:14:18.070] - force: TRUE [13:14:18.070] - relayed: [n=2] FALSE, FALSE [13:14:18.070] - queued futures: [n=2] FALSE, FALSE [13:14:18.070] - until=1 [13:14:18.070] - relaying element #1 [13:14:18.071] result() for ClusterFuture ... [13:14:18.071] - result already collected: FutureResult [13:14:18.071] result() for ClusterFuture ... done [13:14:18.071] result() for ClusterFuture ... [13:14:18.071] - result already collected: FutureResult [13:14:18.071] result() for ClusterFuture ... done [13:14:18.072] result() for ClusterFuture ... [13:14:18.072] - result already collected: FutureResult [13:14:18.072] result() for ClusterFuture ... done [13:14:18.072] result() for ClusterFuture ... [13:14:18.072] - result already collected: FutureResult [13:14:18.072] result() for ClusterFuture ... done [13:14:18.073] - relayed: [n=2] TRUE, FALSE [13:14:18.073] - queued futures: [n=2] TRUE, FALSE [13:14:18.073] signalConditionsASAP(MultisessionFuture, pos=1) ... done [13:14:18.073] length: 1 (resolved future 1) [13:14:18.073] Future #2 [13:14:18.073] result() for ClusterFuture ... [13:14:18.074] - result already collected: FutureResult [13:14:18.074] result() for ClusterFuture ... done [13:14:18.074] result() for ClusterFuture ... [13:14:18.074] - result already collected: FutureResult [13:14:18.074] result() for ClusterFuture ... done [13:14:18.074] signalConditionsASAP(MultisessionFuture, pos=2) ... [13:14:18.075] - nx: 2 [13:14:18.075] - relay: TRUE [13:14:18.075] - stdout: TRUE [13:14:18.075] - signal: TRUE [13:14:18.075] - resignal: FALSE [13:14:18.075] - force: TRUE [13:14:18.075] - relayed: [n=2] TRUE, FALSE [13:14:18.076] - queued futures: [n=2] TRUE, FALSE [13:14:18.076] - until=2 [13:14:18.076] - relaying element #2 [13:14:18.076] result() for ClusterFuture ... [13:14:18.076] - result already collected: FutureResult [13:14:18.076] result() for ClusterFuture ... done [13:14:18.077] result() for ClusterFuture ... [13:14:18.077] - result already collected: FutureResult [13:14:18.077] result() for ClusterFuture ... done [13:14:18.077] result() for ClusterFuture ... [13:14:18.077] - result already collected: FutureResult [13:14:18.077] result() for ClusterFuture ... done [13:14:18.078] result() for ClusterFuture ... [13:14:18.078] - result already collected: FutureResult [13:14:18.078] result() for ClusterFuture ... done [13:14:18.078] - relayed: [n=2] TRUE, TRUE [13:14:18.078] - queued futures: [n=2] TRUE, TRUE [13:14:18.078] signalConditionsASAP(MultisessionFuture, pos=2) ... done [13:14:18.079] length: 0 (resolved future 2) [13:14:18.079] Relaying remaining futures [13:14:18.079] signalConditionsASAP(NULL, pos=0) ... [13:14:18.079] - nx: 2 [13:14:18.079] - relay: TRUE [13:14:18.079] - stdout: TRUE [13:14:18.079] - signal: TRUE [13:14:18.080] - resignal: FALSE [13:14:18.080] - force: TRUE [13:14:18.080] - relayed: [n=2] TRUE, TRUE [13:14:18.080] - queued futures: [n=2] TRUE, TRUE - flush all [13:14:18.080] - relayed: [n=2] TRUE, TRUE [13:14:18.080] - queued futures: [n=2] TRUE, TRUE [13:14:18.081] signalConditionsASAP(NULL, pos=0) ... done [13:14:18.081] resolve() on list ... DONE [13:14:18.081] result() for ClusterFuture ... [13:14:18.081] - result already collected: FutureResult [13:14:18.081] result() for ClusterFuture ... done [13:14:18.081] result() for ClusterFuture ... [13:14:18.082] - result already collected: FutureResult [13:14:18.082] result() for ClusterFuture ... done [13:14:18.082] result() for ClusterFuture ... [13:14:18.082] - result already collected: FutureResult [13:14:18.082] result() for ClusterFuture ... done [13:14:18.082] result() for ClusterFuture ... [13:14:18.083] - result already collected: FutureResult [13:14:18.083] result() for ClusterFuture ... done [13:14:18.083] - Number of value chunks collected: 2 [13:14:18.083] Resolving 2 futures (chunks) ... DONE [13:14:18.083] Reducing values from 2 chunks ... [13:14:18.083] - Number of values collected after concatenation: 10 [13:14:18.084] - Number of values expected: 10 [13:14:18.084] Reducing values from 2 chunks ... DONE [13:14:18.084] future_lapply() ... DONE num [1:10] 1 1.41 1.73 2 2.24 ... num [1:2, 1:10] 1 1 2 4 3 9 4 16 5 25 ... [13:14:18.085] future_lapply() ... [13:14:18.089] Number of chunks: 2 [13:14:18.090] getGlobalsAndPackagesXApply() ... [13:14:18.090] - future.globals: TRUE [13:14:18.090] getGlobalsAndPackages() ... [13:14:18.090] Searching for globals... [13:14:18.097] - globals found: [18] 'FUN', '{', '<-', 'x_FUN', 'if', '!=', 'length', 'times', 'stopf', 'stop_if_not', 'all', '==', 'dim', '%in%', 'typeof', 'valid_types', 'c', '^' [13:14:18.097] Searching for globals ... DONE [13:14:18.097] Resolving globals: FALSE [13:14:18.098] The total size of the 7 globals is 94.20 KiB (96456 bytes) [13:14:18.099] The total size of the 7 globals exported for future expression ('FUN()') is 94.20 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). The three largest globals are 'stop_if_not' (44.12 KiB of class 'function'), 'stopf' (26.43 KiB of class 'function') and 'FUN' (21.22 KiB of class 'function') [13:14:18.099] - globals: [7] 'FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types' [13:14:18.099] - packages: [1] 'future.apply' [13:14:18.100] getGlobalsAndPackages() ... DONE [13:14:18.100] - globals found/used: [n=7] 'FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types' [13:14:18.100] - needed namespaces: [n=1] 'future.apply' [13:14:18.100] Finding globals ... DONE [13:14:18.100] - use_args: TRUE [13:14:18.100] - Getting '...' globals ... [13:14:18.101] resolve() on list ... [13:14:18.101] recursive: 0 [13:14:18.101] length: 1 [13:14:18.101] elements: '...' [13:14:18.101] length: 0 (resolved future 1) [13:14:18.102] resolve() on list ... DONE [13:14:18.102] - '...' content: [n=0] [13:14:18.102] List of 1 [13:14:18.102] $ ...: list() [13:14:18.102] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:14:18.102] - attr(*, "where")=List of 1 [13:14:18.102] ..$ ...: [13:14:18.102] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:14:18.102] - attr(*, "resolved")= logi TRUE [13:14:18.102] - attr(*, "total_size")= num NA [13:14:18.105] - Getting '...' globals ... DONE [13:14:18.105] Globals to be used in all futures (chunks): [n=8] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...' [13:14:18.105] List of 8 [13:14:18.105] $ ...future.FUN:function (x, ...) [13:14:18.105] $ x_FUN :function (x) [13:14:18.105] $ times : int 2 [13:14:18.105] $ stopf :function (fmt, ..., call. = TRUE, domain = NULL) [13:14:18.105] $ stop_if_not :function (...) [13:14:18.105] $ dim : NULL [13:14:18.105] $ valid_types : chr [1:3] "logical" "integer" "double" [13:14:18.105] $ ... : list() [13:14:18.105] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:14:18.105] - attr(*, "where")=List of 8 [13:14:18.105] ..$ ...future.FUN: [13:14:18.105] ..$ x_FUN : [13:14:18.105] ..$ times : [13:14:18.105] ..$ stopf : [13:14:18.105] ..$ stop_if_not : [13:14:18.105] ..$ dim : [13:14:18.105] ..$ valid_types : [13:14:18.105] ..$ ... : [13:14:18.105] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:14:18.105] - attr(*, "resolved")= logi FALSE [13:14:18.105] - attr(*, "total_size")= num 96456 [13:14:18.112] Packages to be attached in all futures: [n=1] 'future.apply' [13:14:18.112] getGlobalsAndPackagesXApply() ... DONE [13:14:18.112] Number of futures (= number of chunks): 2 [13:14:18.113] Launching 2 futures (chunks) ... [13:14:18.113] Chunk #1 of 2 ... [13:14:18.113] - Finding globals in 'X' for chunk #1 ... [13:14:18.113] getGlobalsAndPackages() ... [13:14:18.113] Searching for globals... [13:14:18.114] [13:14:18.114] Searching for globals ... DONE [13:14:18.114] - globals: [0] [13:14:18.114] getGlobalsAndPackages() ... DONE [13:14:18.114] + additional globals found: [n=0] [13:14:18.115] + additional namespaces needed: [n=0] [13:14:18.115] - Finding globals in 'X' for chunk #1 ... DONE [13:14:18.115] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:14:18.115] - seeds: [13:14:18.115] - All globals exported: [n=11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:18.115] getGlobalsAndPackages() ... [13:14:18.116] - globals passed as-is: [11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:18.116] Resolving globals: FALSE [13:14:18.116] Tweak future expression to call with '...' arguments ... [13:14:18.116] { [13:14:18.116] do.call(function(...) { [13:14:18.116] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:18.116] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:18.116] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:18.116] on.exit(options(oopts), add = TRUE) [13:14:18.116] } [13:14:18.116] { [13:14:18.116] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:18.116] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:18.116] ...future.FUN(...future.X_jj, ...) [13:14:18.116] }) [13:14:18.116] } [13:14:18.116] }, args = future.call.arguments) [13:14:18.116] } [13:14:18.117] Tweak future expression to call with '...' arguments ... DONE [13:14:18.117] - globals: [11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:18.117] - packages: [1] 'future.apply' [13:14:18.118] getGlobalsAndPackages() ... DONE [13:14:18.118] run() for 'Future' ... [13:14:18.118] - state: 'created' [13:14:18.118] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:14:18.132] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:14:18.133] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:14:18.133] - Field: 'node' [13:14:18.133] - Field: 'label' [13:14:18.133] - Field: 'local' [13:14:18.133] - Field: 'owner' [13:14:18.134] - Field: 'envir' [13:14:18.134] - Field: 'workers' [13:14:18.134] - Field: 'packages' [13:14:18.134] - Field: 'gc' [13:14:18.134] - Field: 'conditions' [13:14:18.135] - Field: 'persistent' [13:14:18.135] - Field: 'expr' [13:14:18.135] - Field: 'uuid' [13:14:18.135] - Field: 'seed' [13:14:18.135] - Field: 'version' [13:14:18.135] - Field: 'result' [13:14:18.136] - Field: 'asynchronous' [13:14:18.136] - Field: 'calls' [13:14:18.136] - Field: 'globals' [13:14:18.136] - Field: 'stdout' [13:14:18.136] - Field: 'earlySignal' [13:14:18.136] - Field: 'lazy' [13:14:18.137] - Field: 'state' [13:14:18.137] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:14:18.137] - Launch lazy future ... [13:14:18.137] Packages needed by the future expression (n = 1): 'future.apply' [13:14:18.138] Packages needed by future strategies (n = 0): [13:14:18.138] { [13:14:18.138] { [13:14:18.138] { [13:14:18.138] ...future.startTime <- base::Sys.time() [13:14:18.138] { [13:14:18.138] { [13:14:18.138] { [13:14:18.138] { [13:14:18.138] { [13:14:18.138] base::local({ [13:14:18.138] has_future <- base::requireNamespace("future", [13:14:18.138] quietly = TRUE) [13:14:18.138] if (has_future) { [13:14:18.138] ns <- base::getNamespace("future") [13:14:18.138] version <- ns[[".package"]][["version"]] [13:14:18.138] if (is.null(version)) [13:14:18.138] version <- utils::packageVersion("future") [13:14:18.138] } [13:14:18.138] else { [13:14:18.138] version <- NULL [13:14:18.138] } [13:14:18.138] if (!has_future || version < "1.8.0") { [13:14:18.138] info <- base::c(r_version = base::gsub("R version ", [13:14:18.138] "", base::R.version$version.string), [13:14:18.138] platform = base::sprintf("%s (%s-bit)", [13:14:18.138] base::R.version$platform, 8 * [13:14:18.138] base::.Machine$sizeof.pointer), [13:14:18.138] os = base::paste(base::Sys.info()[base::c("sysname", [13:14:18.138] "release", "version")], collapse = " "), [13:14:18.138] hostname = base::Sys.info()[["nodename"]]) [13:14:18.138] info <- base::sprintf("%s: %s", base::names(info), [13:14:18.138] info) [13:14:18.138] info <- base::paste(info, collapse = "; ") [13:14:18.138] if (!has_future) { [13:14:18.138] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:14:18.138] info) [13:14:18.138] } [13:14:18.138] else { [13:14:18.138] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:14:18.138] info, version) [13:14:18.138] } [13:14:18.138] base::stop(msg) [13:14:18.138] } [13:14:18.138] }) [13:14:18.138] } [13:14:18.138] ...future.mc.cores.old <- base::getOption("mc.cores") [13:14:18.138] base::options(mc.cores = 1L) [13:14:18.138] } [13:14:18.138] base::local({ [13:14:18.138] for (pkg in "future.apply") { [13:14:18.138] base::loadNamespace(pkg) [13:14:18.138] base::library(pkg, character.only = TRUE) [13:14:18.138] } [13:14:18.138] }) [13:14:18.138] } [13:14:18.138] options(future.plan = NULL) [13:14:18.138] Sys.unsetenv("R_FUTURE_PLAN") [13:14:18.138] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:14:18.138] } [13:14:18.138] ...future.workdir <- getwd() [13:14:18.138] } [13:14:18.138] ...future.oldOptions <- base::as.list(base::.Options) [13:14:18.138] ...future.oldEnvVars <- base::Sys.getenv() [13:14:18.138] } [13:14:18.138] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:14:18.138] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:14:18.138] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:14:18.138] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:14:18.138] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:14:18.138] future.stdout.windows.reencode = NULL, width = 80L) [13:14:18.138] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:14:18.138] base::names(...future.oldOptions)) [13:14:18.138] } [13:14:18.138] if (FALSE) { [13:14:18.138] } [13:14:18.138] else { [13:14:18.138] if (TRUE) { [13:14:18.138] ...future.stdout <- base::rawConnection(base::raw(0L), [13:14:18.138] open = "w") [13:14:18.138] } [13:14:18.138] else { [13:14:18.138] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:14:18.138] windows = "NUL", "/dev/null"), open = "w") [13:14:18.138] } [13:14:18.138] base::sink(...future.stdout, type = "output", split = FALSE) [13:14:18.138] base::on.exit(if (!base::is.null(...future.stdout)) { [13:14:18.138] base::sink(type = "output", split = FALSE) [13:14:18.138] base::close(...future.stdout) [13:14:18.138] }, add = TRUE) [13:14:18.138] } [13:14:18.138] ...future.frame <- base::sys.nframe() [13:14:18.138] ...future.conditions <- base::list() [13:14:18.138] ...future.rng <- base::globalenv()$.Random.seed [13:14:18.138] if (FALSE) { [13:14:18.138] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:14:18.138] "...future.value", "...future.globalenv.names", ".Random.seed") [13:14:18.138] } [13:14:18.138] ...future.result <- base::tryCatch({ [13:14:18.138] base::withCallingHandlers({ [13:14:18.138] ...future.value <- base::withVisible(base::local({ [13:14:18.138] ...future.makeSendCondition <- local({ [13:14:18.138] sendCondition <- NULL [13:14:18.138] function(frame = 1L) { [13:14:18.138] if (is.function(sendCondition)) [13:14:18.138] return(sendCondition) [13:14:18.138] ns <- getNamespace("parallel") [13:14:18.138] if (exists("sendData", mode = "function", [13:14:18.138] envir = ns)) { [13:14:18.138] parallel_sendData <- get("sendData", mode = "function", [13:14:18.138] envir = ns) [13:14:18.138] envir <- sys.frame(frame) [13:14:18.138] master <- NULL [13:14:18.138] while (!identical(envir, .GlobalEnv) && [13:14:18.138] !identical(envir, emptyenv())) { [13:14:18.138] if (exists("master", mode = "list", envir = envir, [13:14:18.138] inherits = FALSE)) { [13:14:18.138] master <- get("master", mode = "list", [13:14:18.138] envir = envir, inherits = FALSE) [13:14:18.138] if (inherits(master, c("SOCKnode", [13:14:18.138] "SOCK0node"))) { [13:14:18.138] sendCondition <<- function(cond) { [13:14:18.138] data <- list(type = "VALUE", value = cond, [13:14:18.138] success = TRUE) [13:14:18.138] parallel_sendData(master, data) [13:14:18.138] } [13:14:18.138] return(sendCondition) [13:14:18.138] } [13:14:18.138] } [13:14:18.138] frame <- frame + 1L [13:14:18.138] envir <- sys.frame(frame) [13:14:18.138] } [13:14:18.138] } [13:14:18.138] sendCondition <<- function(cond) NULL [13:14:18.138] } [13:14:18.138] }) [13:14:18.138] withCallingHandlers({ [13:14:18.138] { [13:14:18.138] do.call(function(...) { [13:14:18.138] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:18.138] if (!identical(...future.globals.maxSize.org, [13:14:18.138] ...future.globals.maxSize)) { [13:14:18.138] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:18.138] on.exit(options(oopts), add = TRUE) [13:14:18.138] } [13:14:18.138] { [13:14:18.138] lapply(seq_along(...future.elements_ii), [13:14:18.138] FUN = function(jj) { [13:14:18.138] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:18.138] ...future.FUN(...future.X_jj, ...) [13:14:18.138] }) [13:14:18.138] } [13:14:18.138] }, args = future.call.arguments) [13:14:18.138] } [13:14:18.138] }, immediateCondition = function(cond) { [13:14:18.138] sendCondition <- ...future.makeSendCondition() [13:14:18.138] sendCondition(cond) [13:14:18.138] muffleCondition <- function (cond, pattern = "^muffle") [13:14:18.138] { [13:14:18.138] inherits <- base::inherits [13:14:18.138] invokeRestart <- base::invokeRestart [13:14:18.138] is.null <- base::is.null [13:14:18.138] muffled <- FALSE [13:14:18.138] if (inherits(cond, "message")) { [13:14:18.138] muffled <- grepl(pattern, "muffleMessage") [13:14:18.138] if (muffled) [13:14:18.138] invokeRestart("muffleMessage") [13:14:18.138] } [13:14:18.138] else if (inherits(cond, "warning")) { [13:14:18.138] muffled <- grepl(pattern, "muffleWarning") [13:14:18.138] if (muffled) [13:14:18.138] invokeRestart("muffleWarning") [13:14:18.138] } [13:14:18.138] else if (inherits(cond, "condition")) { [13:14:18.138] if (!is.null(pattern)) { [13:14:18.138] computeRestarts <- base::computeRestarts [13:14:18.138] grepl <- base::grepl [13:14:18.138] restarts <- computeRestarts(cond) [13:14:18.138] for (restart in restarts) { [13:14:18.138] name <- restart$name [13:14:18.138] if (is.null(name)) [13:14:18.138] next [13:14:18.138] if (!grepl(pattern, name)) [13:14:18.138] next [13:14:18.138] invokeRestart(restart) [13:14:18.138] muffled <- TRUE [13:14:18.138] break [13:14:18.138] } [13:14:18.138] } [13:14:18.138] } [13:14:18.138] invisible(muffled) [13:14:18.138] } [13:14:18.138] muffleCondition(cond) [13:14:18.138] }) [13:14:18.138] })) [13:14:18.138] future::FutureResult(value = ...future.value$value, [13:14:18.138] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:14:18.138] ...future.rng), globalenv = if (FALSE) [13:14:18.138] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:14:18.138] ...future.globalenv.names)) [13:14:18.138] else NULL, started = ...future.startTime, version = "1.8") [13:14:18.138] }, condition = base::local({ [13:14:18.138] c <- base::c [13:14:18.138] inherits <- base::inherits [13:14:18.138] invokeRestart <- base::invokeRestart [13:14:18.138] length <- base::length [13:14:18.138] list <- base::list [13:14:18.138] seq.int <- base::seq.int [13:14:18.138] signalCondition <- base::signalCondition [13:14:18.138] sys.calls <- base::sys.calls [13:14:18.138] `[[` <- base::`[[` [13:14:18.138] `+` <- base::`+` [13:14:18.138] `<<-` <- base::`<<-` [13:14:18.138] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:14:18.138] calls[seq.int(from = from + 12L, to = length(calls) - [13:14:18.138] 3L)] [13:14:18.138] } [13:14:18.138] function(cond) { [13:14:18.138] is_error <- inherits(cond, "error") [13:14:18.138] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:14:18.138] NULL) [13:14:18.138] if (is_error) { [13:14:18.138] sessionInformation <- function() { [13:14:18.138] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:14:18.138] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:14:18.138] search = base::search(), system = base::Sys.info()) [13:14:18.138] } [13:14:18.138] ...future.conditions[[length(...future.conditions) + [13:14:18.138] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:14:18.138] cond$call), session = sessionInformation(), [13:14:18.138] timestamp = base::Sys.time(), signaled = 0L) [13:14:18.138] signalCondition(cond) [13:14:18.138] } [13:14:18.138] else if (!ignore && TRUE && inherits(cond, c("condition", [13:14:18.138] "immediateCondition"))) { [13:14:18.138] signal <- TRUE && inherits(cond, "immediateCondition") [13:14:18.138] ...future.conditions[[length(...future.conditions) + [13:14:18.138] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:14:18.138] if (TRUE && !signal) { [13:14:18.138] muffleCondition <- function (cond, pattern = "^muffle") [13:14:18.138] { [13:14:18.138] inherits <- base::inherits [13:14:18.138] invokeRestart <- base::invokeRestart [13:14:18.138] is.null <- base::is.null [13:14:18.138] muffled <- FALSE [13:14:18.138] if (inherits(cond, "message")) { [13:14:18.138] muffled <- grepl(pattern, "muffleMessage") [13:14:18.138] if (muffled) [13:14:18.138] invokeRestart("muffleMessage") [13:14:18.138] } [13:14:18.138] else if (inherits(cond, "warning")) { [13:14:18.138] muffled <- grepl(pattern, "muffleWarning") [13:14:18.138] if (muffled) [13:14:18.138] invokeRestart("muffleWarning") [13:14:18.138] } [13:14:18.138] else if (inherits(cond, "condition")) { [13:14:18.138] if (!is.null(pattern)) { [13:14:18.138] computeRestarts <- base::computeRestarts [13:14:18.138] grepl <- base::grepl [13:14:18.138] restarts <- computeRestarts(cond) [13:14:18.138] for (restart in restarts) { [13:14:18.138] name <- restart$name [13:14:18.138] if (is.null(name)) [13:14:18.138] next [13:14:18.138] if (!grepl(pattern, name)) [13:14:18.138] next [13:14:18.138] invokeRestart(restart) [13:14:18.138] muffled <- TRUE [13:14:18.138] break [13:14:18.138] } [13:14:18.138] } [13:14:18.138] } [13:14:18.138] invisible(muffled) [13:14:18.138] } [13:14:18.138] muffleCondition(cond, pattern = "^muffle") [13:14:18.138] } [13:14:18.138] } [13:14:18.138] else { [13:14:18.138] if (TRUE) { [13:14:18.138] muffleCondition <- function (cond, pattern = "^muffle") [13:14:18.138] { [13:14:18.138] inherits <- base::inherits [13:14:18.138] invokeRestart <- base::invokeRestart [13:14:18.138] is.null <- base::is.null [13:14:18.138] muffled <- FALSE [13:14:18.138] if (inherits(cond, "message")) { [13:14:18.138] muffled <- grepl(pattern, "muffleMessage") [13:14:18.138] if (muffled) [13:14:18.138] invokeRestart("muffleMessage") [13:14:18.138] } [13:14:18.138] else if (inherits(cond, "warning")) { [13:14:18.138] muffled <- grepl(pattern, "muffleWarning") [13:14:18.138] if (muffled) [13:14:18.138] invokeRestart("muffleWarning") [13:14:18.138] } [13:14:18.138] else if (inherits(cond, "condition")) { [13:14:18.138] if (!is.null(pattern)) { [13:14:18.138] computeRestarts <- base::computeRestarts [13:14:18.138] grepl <- base::grepl [13:14:18.138] restarts <- computeRestarts(cond) [13:14:18.138] for (restart in restarts) { [13:14:18.138] name <- restart$name [13:14:18.138] if (is.null(name)) [13:14:18.138] next [13:14:18.138] if (!grepl(pattern, name)) [13:14:18.138] next [13:14:18.138] invokeRestart(restart) [13:14:18.138] muffled <- TRUE [13:14:18.138] break [13:14:18.138] } [13:14:18.138] } [13:14:18.138] } [13:14:18.138] invisible(muffled) [13:14:18.138] } [13:14:18.138] muffleCondition(cond, pattern = "^muffle") [13:14:18.138] } [13:14:18.138] } [13:14:18.138] } [13:14:18.138] })) [13:14:18.138] }, error = function(ex) { [13:14:18.138] base::structure(base::list(value = NULL, visible = NULL, [13:14:18.138] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:14:18.138] ...future.rng), started = ...future.startTime, [13:14:18.138] finished = Sys.time(), session_uuid = NA_character_, [13:14:18.138] version = "1.8"), class = "FutureResult") [13:14:18.138] }, finally = { [13:14:18.138] if (!identical(...future.workdir, getwd())) [13:14:18.138] setwd(...future.workdir) [13:14:18.138] { [13:14:18.138] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:14:18.138] ...future.oldOptions$nwarnings <- NULL [13:14:18.138] } [13:14:18.138] base::options(...future.oldOptions) [13:14:18.138] if (.Platform$OS.type == "windows") { [13:14:18.138] old_names <- names(...future.oldEnvVars) [13:14:18.138] envs <- base::Sys.getenv() [13:14:18.138] names <- names(envs) [13:14:18.138] common <- intersect(names, old_names) [13:14:18.138] added <- setdiff(names, old_names) [13:14:18.138] removed <- setdiff(old_names, names) [13:14:18.138] changed <- common[...future.oldEnvVars[common] != [13:14:18.138] envs[common]] [13:14:18.138] NAMES <- toupper(changed) [13:14:18.138] args <- list() [13:14:18.138] for (kk in seq_along(NAMES)) { [13:14:18.138] name <- changed[[kk]] [13:14:18.138] NAME <- NAMES[[kk]] [13:14:18.138] if (name != NAME && is.element(NAME, old_names)) [13:14:18.138] next [13:14:18.138] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:18.138] } [13:14:18.138] NAMES <- toupper(added) [13:14:18.138] for (kk in seq_along(NAMES)) { [13:14:18.138] name <- added[[kk]] [13:14:18.138] NAME <- NAMES[[kk]] [13:14:18.138] if (name != NAME && is.element(NAME, old_names)) [13:14:18.138] next [13:14:18.138] args[[name]] <- "" [13:14:18.138] } [13:14:18.138] NAMES <- toupper(removed) [13:14:18.138] for (kk in seq_along(NAMES)) { [13:14:18.138] name <- removed[[kk]] [13:14:18.138] NAME <- NAMES[[kk]] [13:14:18.138] if (name != NAME && is.element(NAME, old_names)) [13:14:18.138] next [13:14:18.138] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:18.138] } [13:14:18.138] if (length(args) > 0) [13:14:18.138] base::do.call(base::Sys.setenv, args = args) [13:14:18.138] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:14:18.138] } [13:14:18.138] else { [13:14:18.138] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:14:18.138] } [13:14:18.138] { [13:14:18.138] if (base::length(...future.futureOptionsAdded) > [13:14:18.138] 0L) { [13:14:18.138] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:14:18.138] base::names(opts) <- ...future.futureOptionsAdded [13:14:18.138] base::options(opts) [13:14:18.138] } [13:14:18.138] { [13:14:18.138] { [13:14:18.138] base::options(mc.cores = ...future.mc.cores.old) [13:14:18.138] NULL [13:14:18.138] } [13:14:18.138] options(future.plan = NULL) [13:14:18.138] if (is.na(NA_character_)) [13:14:18.138] Sys.unsetenv("R_FUTURE_PLAN") [13:14:18.138] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:14:18.138] future::plan(list(function (..., workers = availableCores(), [13:14:18.138] lazy = FALSE, rscript_libs = .libPaths(), [13:14:18.138] envir = parent.frame()) [13:14:18.138] { [13:14:18.138] if (is.function(workers)) [13:14:18.138] workers <- workers() [13:14:18.138] workers <- structure(as.integer(workers), [13:14:18.138] class = class(workers)) [13:14:18.138] stop_if_not(length(workers) == 1, is.finite(workers), [13:14:18.138] workers >= 1) [13:14:18.138] if (workers == 1L && !inherits(workers, "AsIs")) { [13:14:18.138] return(sequential(..., lazy = TRUE, envir = envir)) [13:14:18.138] } [13:14:18.138] future <- MultisessionFuture(..., workers = workers, [13:14:18.138] lazy = lazy, rscript_libs = rscript_libs, [13:14:18.138] envir = envir) [13:14:18.138] if (!future$lazy) [13:14:18.138] future <- run(future) [13:14:18.138] invisible(future) [13:14:18.138] }), .cleanup = FALSE, .init = FALSE) [13:14:18.138] } [13:14:18.138] } [13:14:18.138] } [13:14:18.138] }) [13:14:18.138] if (TRUE) { [13:14:18.138] base::sink(type = "output", split = FALSE) [13:14:18.138] if (TRUE) { [13:14:18.138] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:14:18.138] } [13:14:18.138] else { [13:14:18.138] ...future.result["stdout"] <- base::list(NULL) [13:14:18.138] } [13:14:18.138] base::close(...future.stdout) [13:14:18.138] ...future.stdout <- NULL [13:14:18.138] } [13:14:18.138] ...future.result$conditions <- ...future.conditions [13:14:18.138] ...future.result$finished <- base::Sys.time() [13:14:18.138] ...future.result [13:14:18.138] } [13:14:18.144] Exporting 11 global objects (94.20 KiB) to cluster node #1 ... [13:14:18.144] Exporting '...future.FUN' (21.22 KiB) to cluster node #1 ... [13:14:18.144] Exporting '...future.FUN' (21.22 KiB) to cluster node #1 ... DONE [13:14:18.145] Exporting 'x_FUN' (2.12 KiB) to cluster node #1 ... [13:14:18.145] Exporting 'x_FUN' (2.12 KiB) to cluster node #1 ... DONE [13:14:18.145] Exporting 'times' (56 bytes) to cluster node #1 ... [13:14:18.146] Exporting 'times' (56 bytes) to cluster node #1 ... DONE [13:14:18.146] Exporting 'stopf' (26.43 KiB) to cluster node #1 ... [13:14:18.146] Exporting 'stopf' (26.43 KiB) to cluster node #1 ... DONE [13:14:18.146] Exporting 'stop_if_not' (44.12 KiB) to cluster node #1 ... [13:14:18.147] Exporting 'stop_if_not' (44.12 KiB) to cluster node #1 ... DONE [13:14:18.147] Exporting 'dim' (0 bytes) to cluster node #1 ... [13:14:18.147] Exporting 'dim' (0 bytes) to cluster node #1 ... DONE [13:14:18.148] Exporting 'valid_types' (248 bytes) to cluster node #1 ... [13:14:18.148] Exporting 'valid_types' (248 bytes) to cluster node #1 ... DONE [13:14:18.148] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... [13:14:18.149] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... DONE [13:14:18.149] Exporting '...future.elements_ii' (280 bytes) to cluster node #1 ... [13:14:18.149] Exporting '...future.elements_ii' (280 bytes) to cluster node #1 ... DONE [13:14:18.149] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:14:18.150] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:14:18.150] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:14:18.150] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:14:18.151] Exporting 11 global objects (94.20 KiB) to cluster node #1 ... DONE [13:14:18.151] MultisessionFuture started [13:14:18.151] - Launch lazy future ... done [13:14:18.152] run() for 'MultisessionFuture' ... done [13:14:18.152] Created future: [13:14:18.171] receiveMessageFromWorker() for ClusterFuture ... [13:14:18.171] - Validating connection of MultisessionFuture [13:14:18.171] - received message: FutureResult [13:14:18.171] - Received FutureResult [13:14:18.171] - Erased future from FutureRegistry [13:14:18.172] result() for ClusterFuture ... [13:14:18.172] - result already collected: FutureResult [13:14:18.172] result() for ClusterFuture ... done [13:14:18.172] receiveMessageFromWorker() for ClusterFuture ... done [13:14:18.152] MultisessionFuture: [13:14:18.152] Label: 'future_vapply-1' [13:14:18.152] Expression: [13:14:18.152] { [13:14:18.152] do.call(function(...) { [13:14:18.152] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:18.152] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:18.152] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:18.152] on.exit(options(oopts), add = TRUE) [13:14:18.152] } [13:14:18.152] { [13:14:18.152] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:18.152] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:18.152] ...future.FUN(...future.X_jj, ...) [13:14:18.152] }) [13:14:18.152] } [13:14:18.152] }, args = future.call.arguments) [13:14:18.152] } [13:14:18.152] Lazy evaluation: FALSE [13:14:18.152] Asynchronous evaluation: TRUE [13:14:18.152] Local evaluation: TRUE [13:14:18.152] Environment: R_GlobalEnv [13:14:18.152] Capture standard output: TRUE [13:14:18.152] Capture condition classes: 'condition' (excluding 'nothing') [13:14:18.152] Globals: 11 objects totaling 94.47 KiB (function '...future.FUN' of 21.22 KiB, function 'x_FUN' of 2.12 KiB, integer 'times' of 56 bytes, function 'stopf' of 26.43 KiB, function 'stop_if_not' of 44.12 KiB, ...) [13:14:18.152] Packages: 1 packages ('future.apply') [13:14:18.152] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:14:18.152] Resolved: TRUE [13:14:18.152] Value: [13:14:18.152] Conditions captured: [13:14:18.152] Early signaling: FALSE [13:14:18.152] Owner process: 1bb7d580-628d-c90d-e38a-66de485868c4 [13:14:18.152] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:14:18.173] Chunk #1 of 2 ... DONE [13:14:18.173] Chunk #2 of 2 ... [13:14:18.173] - Finding globals in 'X' for chunk #2 ... [13:14:18.173] getGlobalsAndPackages() ... [13:14:18.173] Searching for globals... [13:14:18.174] [13:14:18.174] Searching for globals ... DONE [13:14:18.174] - globals: [0] [13:14:18.174] getGlobalsAndPackages() ... DONE [13:14:18.174] + additional globals found: [n=0] [13:14:18.174] + additional namespaces needed: [n=0] [13:14:18.175] - Finding globals in 'X' for chunk #2 ... DONE [13:14:18.175] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:14:18.175] - seeds: [13:14:18.175] - All globals exported: [n=11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:18.175] getGlobalsAndPackages() ... [13:14:18.175] - globals passed as-is: [11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:18.176] Resolving globals: FALSE [13:14:18.176] Tweak future expression to call with '...' arguments ... [13:14:18.176] { [13:14:18.176] do.call(function(...) { [13:14:18.176] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:18.176] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:18.176] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:18.176] on.exit(options(oopts), add = TRUE) [13:14:18.176] } [13:14:18.176] { [13:14:18.176] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:18.176] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:18.176] ...future.FUN(...future.X_jj, ...) [13:14:18.176] }) [13:14:18.176] } [13:14:18.176] }, args = future.call.arguments) [13:14:18.176] } [13:14:18.176] Tweak future expression to call with '...' arguments ... DONE [13:14:18.177] - globals: [11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:18.177] - packages: [1] 'future.apply' [13:14:18.177] getGlobalsAndPackages() ... DONE [13:14:18.178] run() for 'Future' ... [13:14:18.178] - state: 'created' [13:14:18.178] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:14:18.192] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:14:18.192] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:14:18.193] - Field: 'node' [13:14:18.193] - Field: 'label' [13:14:18.193] - Field: 'local' [13:14:18.193] - Field: 'owner' [13:14:18.193] - Field: 'envir' [13:14:18.193] - Field: 'workers' [13:14:18.194] - Field: 'packages' [13:14:18.194] - Field: 'gc' [13:14:18.194] - Field: 'conditions' [13:14:18.194] - Field: 'persistent' [13:14:18.194] - Field: 'expr' [13:14:18.195] - Field: 'uuid' [13:14:18.195] - Field: 'seed' [13:14:18.195] - Field: 'version' [13:14:18.195] - Field: 'result' [13:14:18.195] - Field: 'asynchronous' [13:14:18.195] - Field: 'calls' [13:14:18.196] - Field: 'globals' [13:14:18.196] - Field: 'stdout' [13:14:18.196] - Field: 'earlySignal' [13:14:18.196] - Field: 'lazy' [13:14:18.196] - Field: 'state' [13:14:18.196] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:14:18.197] - Launch lazy future ... [13:14:18.197] Packages needed by the future expression (n = 1): 'future.apply' [13:14:18.197] Packages needed by future strategies (n = 0): [13:14:18.198] { [13:14:18.198] { [13:14:18.198] { [13:14:18.198] ...future.startTime <- base::Sys.time() [13:14:18.198] { [13:14:18.198] { [13:14:18.198] { [13:14:18.198] { [13:14:18.198] { [13:14:18.198] base::local({ [13:14:18.198] has_future <- base::requireNamespace("future", [13:14:18.198] quietly = TRUE) [13:14:18.198] if (has_future) { [13:14:18.198] ns <- base::getNamespace("future") [13:14:18.198] version <- ns[[".package"]][["version"]] [13:14:18.198] if (is.null(version)) [13:14:18.198] version <- utils::packageVersion("future") [13:14:18.198] } [13:14:18.198] else { [13:14:18.198] version <- NULL [13:14:18.198] } [13:14:18.198] if (!has_future || version < "1.8.0") { [13:14:18.198] info <- base::c(r_version = base::gsub("R version ", [13:14:18.198] "", base::R.version$version.string), [13:14:18.198] platform = base::sprintf("%s (%s-bit)", [13:14:18.198] base::R.version$platform, 8 * [13:14:18.198] base::.Machine$sizeof.pointer), [13:14:18.198] os = base::paste(base::Sys.info()[base::c("sysname", [13:14:18.198] "release", "version")], collapse = " "), [13:14:18.198] hostname = base::Sys.info()[["nodename"]]) [13:14:18.198] info <- base::sprintf("%s: %s", base::names(info), [13:14:18.198] info) [13:14:18.198] info <- base::paste(info, collapse = "; ") [13:14:18.198] if (!has_future) { [13:14:18.198] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:14:18.198] info) [13:14:18.198] } [13:14:18.198] else { [13:14:18.198] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:14:18.198] info, version) [13:14:18.198] } [13:14:18.198] base::stop(msg) [13:14:18.198] } [13:14:18.198] }) [13:14:18.198] } [13:14:18.198] ...future.mc.cores.old <- base::getOption("mc.cores") [13:14:18.198] base::options(mc.cores = 1L) [13:14:18.198] } [13:14:18.198] base::local({ [13:14:18.198] for (pkg in "future.apply") { [13:14:18.198] base::loadNamespace(pkg) [13:14:18.198] base::library(pkg, character.only = TRUE) [13:14:18.198] } [13:14:18.198] }) [13:14:18.198] } [13:14:18.198] options(future.plan = NULL) [13:14:18.198] Sys.unsetenv("R_FUTURE_PLAN") [13:14:18.198] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:14:18.198] } [13:14:18.198] ...future.workdir <- getwd() [13:14:18.198] } [13:14:18.198] ...future.oldOptions <- base::as.list(base::.Options) [13:14:18.198] ...future.oldEnvVars <- base::Sys.getenv() [13:14:18.198] } [13:14:18.198] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:14:18.198] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:14:18.198] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:14:18.198] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:14:18.198] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:14:18.198] future.stdout.windows.reencode = NULL, width = 80L) [13:14:18.198] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:14:18.198] base::names(...future.oldOptions)) [13:14:18.198] } [13:14:18.198] if (FALSE) { [13:14:18.198] } [13:14:18.198] else { [13:14:18.198] if (TRUE) { [13:14:18.198] ...future.stdout <- base::rawConnection(base::raw(0L), [13:14:18.198] open = "w") [13:14:18.198] } [13:14:18.198] else { [13:14:18.198] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:14:18.198] windows = "NUL", "/dev/null"), open = "w") [13:14:18.198] } [13:14:18.198] base::sink(...future.stdout, type = "output", split = FALSE) [13:14:18.198] base::on.exit(if (!base::is.null(...future.stdout)) { [13:14:18.198] base::sink(type = "output", split = FALSE) [13:14:18.198] base::close(...future.stdout) [13:14:18.198] }, add = TRUE) [13:14:18.198] } [13:14:18.198] ...future.frame <- base::sys.nframe() [13:14:18.198] ...future.conditions <- base::list() [13:14:18.198] ...future.rng <- base::globalenv()$.Random.seed [13:14:18.198] if (FALSE) { [13:14:18.198] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:14:18.198] "...future.value", "...future.globalenv.names", ".Random.seed") [13:14:18.198] } [13:14:18.198] ...future.result <- base::tryCatch({ [13:14:18.198] base::withCallingHandlers({ [13:14:18.198] ...future.value <- base::withVisible(base::local({ [13:14:18.198] ...future.makeSendCondition <- local({ [13:14:18.198] sendCondition <- NULL [13:14:18.198] function(frame = 1L) { [13:14:18.198] if (is.function(sendCondition)) [13:14:18.198] return(sendCondition) [13:14:18.198] ns <- getNamespace("parallel") [13:14:18.198] if (exists("sendData", mode = "function", [13:14:18.198] envir = ns)) { [13:14:18.198] parallel_sendData <- get("sendData", mode = "function", [13:14:18.198] envir = ns) [13:14:18.198] envir <- sys.frame(frame) [13:14:18.198] master <- NULL [13:14:18.198] while (!identical(envir, .GlobalEnv) && [13:14:18.198] !identical(envir, emptyenv())) { [13:14:18.198] if (exists("master", mode = "list", envir = envir, [13:14:18.198] inherits = FALSE)) { [13:14:18.198] master <- get("master", mode = "list", [13:14:18.198] envir = envir, inherits = FALSE) [13:14:18.198] if (inherits(master, c("SOCKnode", [13:14:18.198] "SOCK0node"))) { [13:14:18.198] sendCondition <<- function(cond) { [13:14:18.198] data <- list(type = "VALUE", value = cond, [13:14:18.198] success = TRUE) [13:14:18.198] parallel_sendData(master, data) [13:14:18.198] } [13:14:18.198] return(sendCondition) [13:14:18.198] } [13:14:18.198] } [13:14:18.198] frame <- frame + 1L [13:14:18.198] envir <- sys.frame(frame) [13:14:18.198] } [13:14:18.198] } [13:14:18.198] sendCondition <<- function(cond) NULL [13:14:18.198] } [13:14:18.198] }) [13:14:18.198] withCallingHandlers({ [13:14:18.198] { [13:14:18.198] do.call(function(...) { [13:14:18.198] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:18.198] if (!identical(...future.globals.maxSize.org, [13:14:18.198] ...future.globals.maxSize)) { [13:14:18.198] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:18.198] on.exit(options(oopts), add = TRUE) [13:14:18.198] } [13:14:18.198] { [13:14:18.198] lapply(seq_along(...future.elements_ii), [13:14:18.198] FUN = function(jj) { [13:14:18.198] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:18.198] ...future.FUN(...future.X_jj, ...) [13:14:18.198] }) [13:14:18.198] } [13:14:18.198] }, args = future.call.arguments) [13:14:18.198] } [13:14:18.198] }, immediateCondition = function(cond) { [13:14:18.198] sendCondition <- ...future.makeSendCondition() [13:14:18.198] sendCondition(cond) [13:14:18.198] muffleCondition <- function (cond, pattern = "^muffle") [13:14:18.198] { [13:14:18.198] inherits <- base::inherits [13:14:18.198] invokeRestart <- base::invokeRestart [13:14:18.198] is.null <- base::is.null [13:14:18.198] muffled <- FALSE [13:14:18.198] if (inherits(cond, "message")) { [13:14:18.198] muffled <- grepl(pattern, "muffleMessage") [13:14:18.198] if (muffled) [13:14:18.198] invokeRestart("muffleMessage") [13:14:18.198] } [13:14:18.198] else if (inherits(cond, "warning")) { [13:14:18.198] muffled <- grepl(pattern, "muffleWarning") [13:14:18.198] if (muffled) [13:14:18.198] invokeRestart("muffleWarning") [13:14:18.198] } [13:14:18.198] else if (inherits(cond, "condition")) { [13:14:18.198] if (!is.null(pattern)) { [13:14:18.198] computeRestarts <- base::computeRestarts [13:14:18.198] grepl <- base::grepl [13:14:18.198] restarts <- computeRestarts(cond) [13:14:18.198] for (restart in restarts) { [13:14:18.198] name <- restart$name [13:14:18.198] if (is.null(name)) [13:14:18.198] next [13:14:18.198] if (!grepl(pattern, name)) [13:14:18.198] next [13:14:18.198] invokeRestart(restart) [13:14:18.198] muffled <- TRUE [13:14:18.198] break [13:14:18.198] } [13:14:18.198] } [13:14:18.198] } [13:14:18.198] invisible(muffled) [13:14:18.198] } [13:14:18.198] muffleCondition(cond) [13:14:18.198] }) [13:14:18.198] })) [13:14:18.198] future::FutureResult(value = ...future.value$value, [13:14:18.198] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:14:18.198] ...future.rng), globalenv = if (FALSE) [13:14:18.198] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:14:18.198] ...future.globalenv.names)) [13:14:18.198] else NULL, started = ...future.startTime, version = "1.8") [13:14:18.198] }, condition = base::local({ [13:14:18.198] c <- base::c [13:14:18.198] inherits <- base::inherits [13:14:18.198] invokeRestart <- base::invokeRestart [13:14:18.198] length <- base::length [13:14:18.198] list <- base::list [13:14:18.198] seq.int <- base::seq.int [13:14:18.198] signalCondition <- base::signalCondition [13:14:18.198] sys.calls <- base::sys.calls [13:14:18.198] `[[` <- base::`[[` [13:14:18.198] `+` <- base::`+` [13:14:18.198] `<<-` <- base::`<<-` [13:14:18.198] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:14:18.198] calls[seq.int(from = from + 12L, to = length(calls) - [13:14:18.198] 3L)] [13:14:18.198] } [13:14:18.198] function(cond) { [13:14:18.198] is_error <- inherits(cond, "error") [13:14:18.198] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:14:18.198] NULL) [13:14:18.198] if (is_error) { [13:14:18.198] sessionInformation <- function() { [13:14:18.198] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:14:18.198] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:14:18.198] search = base::search(), system = base::Sys.info()) [13:14:18.198] } [13:14:18.198] ...future.conditions[[length(...future.conditions) + [13:14:18.198] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:14:18.198] cond$call), session = sessionInformation(), [13:14:18.198] timestamp = base::Sys.time(), signaled = 0L) [13:14:18.198] signalCondition(cond) [13:14:18.198] } [13:14:18.198] else if (!ignore && TRUE && inherits(cond, c("condition", [13:14:18.198] "immediateCondition"))) { [13:14:18.198] signal <- TRUE && inherits(cond, "immediateCondition") [13:14:18.198] ...future.conditions[[length(...future.conditions) + [13:14:18.198] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:14:18.198] if (TRUE && !signal) { [13:14:18.198] muffleCondition <- function (cond, pattern = "^muffle") [13:14:18.198] { [13:14:18.198] inherits <- base::inherits [13:14:18.198] invokeRestart <- base::invokeRestart [13:14:18.198] is.null <- base::is.null [13:14:18.198] muffled <- FALSE [13:14:18.198] if (inherits(cond, "message")) { [13:14:18.198] muffled <- grepl(pattern, "muffleMessage") [13:14:18.198] if (muffled) [13:14:18.198] invokeRestart("muffleMessage") [13:14:18.198] } [13:14:18.198] else if (inherits(cond, "warning")) { [13:14:18.198] muffled <- grepl(pattern, "muffleWarning") [13:14:18.198] if (muffled) [13:14:18.198] invokeRestart("muffleWarning") [13:14:18.198] } [13:14:18.198] else if (inherits(cond, "condition")) { [13:14:18.198] if (!is.null(pattern)) { [13:14:18.198] computeRestarts <- base::computeRestarts [13:14:18.198] grepl <- base::grepl [13:14:18.198] restarts <- computeRestarts(cond) [13:14:18.198] for (restart in restarts) { [13:14:18.198] name <- restart$name [13:14:18.198] if (is.null(name)) [13:14:18.198] next [13:14:18.198] if (!grepl(pattern, name)) [13:14:18.198] next [13:14:18.198] invokeRestart(restart) [13:14:18.198] muffled <- TRUE [13:14:18.198] break [13:14:18.198] } [13:14:18.198] } [13:14:18.198] } [13:14:18.198] invisible(muffled) [13:14:18.198] } [13:14:18.198] muffleCondition(cond, pattern = "^muffle") [13:14:18.198] } [13:14:18.198] } [13:14:18.198] else { [13:14:18.198] if (TRUE) { [13:14:18.198] muffleCondition <- function (cond, pattern = "^muffle") [13:14:18.198] { [13:14:18.198] inherits <- base::inherits [13:14:18.198] invokeRestart <- base::invokeRestart [13:14:18.198] is.null <- base::is.null [13:14:18.198] muffled <- FALSE [13:14:18.198] if (inherits(cond, "message")) { [13:14:18.198] muffled <- grepl(pattern, "muffleMessage") [13:14:18.198] if (muffled) [13:14:18.198] invokeRestart("muffleMessage") [13:14:18.198] } [13:14:18.198] else if (inherits(cond, "warning")) { [13:14:18.198] muffled <- grepl(pattern, "muffleWarning") [13:14:18.198] if (muffled) [13:14:18.198] invokeRestart("muffleWarning") [13:14:18.198] } [13:14:18.198] else if (inherits(cond, "condition")) { [13:14:18.198] if (!is.null(pattern)) { [13:14:18.198] computeRestarts <- base::computeRestarts [13:14:18.198] grepl <- base::grepl [13:14:18.198] restarts <- computeRestarts(cond) [13:14:18.198] for (restart in restarts) { [13:14:18.198] name <- restart$name [13:14:18.198] if (is.null(name)) [13:14:18.198] next [13:14:18.198] if (!grepl(pattern, name)) [13:14:18.198] next [13:14:18.198] invokeRestart(restart) [13:14:18.198] muffled <- TRUE [13:14:18.198] break [13:14:18.198] } [13:14:18.198] } [13:14:18.198] } [13:14:18.198] invisible(muffled) [13:14:18.198] } [13:14:18.198] muffleCondition(cond, pattern = "^muffle") [13:14:18.198] } [13:14:18.198] } [13:14:18.198] } [13:14:18.198] })) [13:14:18.198] }, error = function(ex) { [13:14:18.198] base::structure(base::list(value = NULL, visible = NULL, [13:14:18.198] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:14:18.198] ...future.rng), started = ...future.startTime, [13:14:18.198] finished = Sys.time(), session_uuid = NA_character_, [13:14:18.198] version = "1.8"), class = "FutureResult") [13:14:18.198] }, finally = { [13:14:18.198] if (!identical(...future.workdir, getwd())) [13:14:18.198] setwd(...future.workdir) [13:14:18.198] { [13:14:18.198] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:14:18.198] ...future.oldOptions$nwarnings <- NULL [13:14:18.198] } [13:14:18.198] base::options(...future.oldOptions) [13:14:18.198] if (.Platform$OS.type == "windows") { [13:14:18.198] old_names <- names(...future.oldEnvVars) [13:14:18.198] envs <- base::Sys.getenv() [13:14:18.198] names <- names(envs) [13:14:18.198] common <- intersect(names, old_names) [13:14:18.198] added <- setdiff(names, old_names) [13:14:18.198] removed <- setdiff(old_names, names) [13:14:18.198] changed <- common[...future.oldEnvVars[common] != [13:14:18.198] envs[common]] [13:14:18.198] NAMES <- toupper(changed) [13:14:18.198] args <- list() [13:14:18.198] for (kk in seq_along(NAMES)) { [13:14:18.198] name <- changed[[kk]] [13:14:18.198] NAME <- NAMES[[kk]] [13:14:18.198] if (name != NAME && is.element(NAME, old_names)) [13:14:18.198] next [13:14:18.198] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:18.198] } [13:14:18.198] NAMES <- toupper(added) [13:14:18.198] for (kk in seq_along(NAMES)) { [13:14:18.198] name <- added[[kk]] [13:14:18.198] NAME <- NAMES[[kk]] [13:14:18.198] if (name != NAME && is.element(NAME, old_names)) [13:14:18.198] next [13:14:18.198] args[[name]] <- "" [13:14:18.198] } [13:14:18.198] NAMES <- toupper(removed) [13:14:18.198] for (kk in seq_along(NAMES)) { [13:14:18.198] name <- removed[[kk]] [13:14:18.198] NAME <- NAMES[[kk]] [13:14:18.198] if (name != NAME && is.element(NAME, old_names)) [13:14:18.198] next [13:14:18.198] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:18.198] } [13:14:18.198] if (length(args) > 0) [13:14:18.198] base::do.call(base::Sys.setenv, args = args) [13:14:18.198] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:14:18.198] } [13:14:18.198] else { [13:14:18.198] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:14:18.198] } [13:14:18.198] { [13:14:18.198] if (base::length(...future.futureOptionsAdded) > [13:14:18.198] 0L) { [13:14:18.198] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:14:18.198] base::names(opts) <- ...future.futureOptionsAdded [13:14:18.198] base::options(opts) [13:14:18.198] } [13:14:18.198] { [13:14:18.198] { [13:14:18.198] base::options(mc.cores = ...future.mc.cores.old) [13:14:18.198] NULL [13:14:18.198] } [13:14:18.198] options(future.plan = NULL) [13:14:18.198] if (is.na(NA_character_)) [13:14:18.198] Sys.unsetenv("R_FUTURE_PLAN") [13:14:18.198] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:14:18.198] future::plan(list(function (..., workers = availableCores(), [13:14:18.198] lazy = FALSE, rscript_libs = .libPaths(), [13:14:18.198] envir = parent.frame()) [13:14:18.198] { [13:14:18.198] if (is.function(workers)) [13:14:18.198] workers <- workers() [13:14:18.198] workers <- structure(as.integer(workers), [13:14:18.198] class = class(workers)) [13:14:18.198] stop_if_not(length(workers) == 1, is.finite(workers), [13:14:18.198] workers >= 1) [13:14:18.198] if (workers == 1L && !inherits(workers, "AsIs")) { [13:14:18.198] return(sequential(..., lazy = TRUE, envir = envir)) [13:14:18.198] } [13:14:18.198] future <- MultisessionFuture(..., workers = workers, [13:14:18.198] lazy = lazy, rscript_libs = rscript_libs, [13:14:18.198] envir = envir) [13:14:18.198] if (!future$lazy) [13:14:18.198] future <- run(future) [13:14:18.198] invisible(future) [13:14:18.198] }), .cleanup = FALSE, .init = FALSE) [13:14:18.198] } [13:14:18.198] } [13:14:18.198] } [13:14:18.198] }) [13:14:18.198] if (TRUE) { [13:14:18.198] base::sink(type = "output", split = FALSE) [13:14:18.198] if (TRUE) { [13:14:18.198] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:14:18.198] } [13:14:18.198] else { [13:14:18.198] ...future.result["stdout"] <- base::list(NULL) [13:14:18.198] } [13:14:18.198] base::close(...future.stdout) [13:14:18.198] ...future.stdout <- NULL [13:14:18.198] } [13:14:18.198] ...future.result$conditions <- ...future.conditions [13:14:18.198] ...future.result$finished <- base::Sys.time() [13:14:18.198] ...future.result [13:14:18.198] } [13:14:18.203] Exporting 11 global objects (94.20 KiB) to cluster node #1 ... [13:14:18.203] Exporting '...future.FUN' (21.22 KiB) to cluster node #1 ... [13:14:18.204] Exporting '...future.FUN' (21.22 KiB) to cluster node #1 ... DONE [13:14:18.204] Exporting 'x_FUN' (2.12 KiB) to cluster node #1 ... [13:14:18.205] Exporting 'x_FUN' (2.12 KiB) to cluster node #1 ... DONE [13:14:18.205] Exporting 'times' (56 bytes) to cluster node #1 ... [13:14:18.205] Exporting 'times' (56 bytes) to cluster node #1 ... DONE [13:14:18.205] Exporting 'stopf' (26.43 KiB) to cluster node #1 ... [13:14:18.206] Exporting 'stopf' (26.43 KiB) to cluster node #1 ... DONE [13:14:18.206] Exporting 'stop_if_not' (44.12 KiB) to cluster node #1 ... [13:14:18.206] Exporting 'stop_if_not' (44.12 KiB) to cluster node #1 ... DONE [13:14:18.207] Exporting 'dim' (0 bytes) to cluster node #1 ... [13:14:18.207] Exporting 'dim' (0 bytes) to cluster node #1 ... DONE [13:14:18.207] Exporting 'valid_types' (248 bytes) to cluster node #1 ... [13:14:18.208] Exporting 'valid_types' (248 bytes) to cluster node #1 ... DONE [13:14:18.208] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... [13:14:18.208] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... DONE [13:14:18.208] Exporting '...future.elements_ii' (280 bytes) to cluster node #1 ... [13:14:18.209] Exporting '...future.elements_ii' (280 bytes) to cluster node #1 ... DONE [13:14:18.209] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:14:18.209] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:14:18.210] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:14:18.210] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:14:18.210] Exporting 11 global objects (94.20 KiB) to cluster node #1 ... DONE [13:14:18.211] MultisessionFuture started [13:14:18.211] - Launch lazy future ... done [13:14:18.211] run() for 'MultisessionFuture' ... done [13:14:18.211] Created future: [13:14:18.229] receiveMessageFromWorker() for ClusterFuture ... [13:14:18.229] - Validating connection of MultisessionFuture [13:14:18.230] - received message: FutureResult [13:14:18.230] - Received FutureResult [13:14:18.230] - Erased future from FutureRegistry [13:14:18.230] result() for ClusterFuture ... [13:14:18.230] - result already collected: FutureResult [13:14:18.230] result() for ClusterFuture ... done [13:14:18.231] receiveMessageFromWorker() for ClusterFuture ... done [13:14:18.211] MultisessionFuture: [13:14:18.211] Label: 'future_vapply-2' [13:14:18.211] Expression: [13:14:18.211] { [13:14:18.211] do.call(function(...) { [13:14:18.211] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:18.211] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:18.211] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:18.211] on.exit(options(oopts), add = TRUE) [13:14:18.211] } [13:14:18.211] { [13:14:18.211] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:18.211] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:18.211] ...future.FUN(...future.X_jj, ...) [13:14:18.211] }) [13:14:18.211] } [13:14:18.211] }, args = future.call.arguments) [13:14:18.211] } [13:14:18.211] Lazy evaluation: FALSE [13:14:18.211] Asynchronous evaluation: TRUE [13:14:18.211] Local evaluation: TRUE [13:14:18.211] Environment: R_GlobalEnv [13:14:18.211] Capture standard output: TRUE [13:14:18.211] Capture condition classes: 'condition' (excluding 'nothing') [13:14:18.211] Globals: 11 objects totaling 94.47 KiB (function '...future.FUN' of 21.22 KiB, function 'x_FUN' of 2.12 KiB, integer 'times' of 56 bytes, function 'stopf' of 26.43 KiB, function 'stop_if_not' of 44.12 KiB, ...) [13:14:18.211] Packages: 1 packages ('future.apply') [13:14:18.211] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:14:18.211] Resolved: TRUE [13:14:18.211] Value: [13:14:18.211] Conditions captured: [13:14:18.211] Early signaling: FALSE [13:14:18.211] Owner process: 1bb7d580-628d-c90d-e38a-66de485868c4 [13:14:18.211] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:14:18.231] Chunk #2 of 2 ... DONE [13:14:18.231] Launching 2 futures (chunks) ... DONE [13:14:18.231] Resolving 2 futures (chunks) ... [13:14:18.232] resolve() on list ... [13:14:18.232] recursive: 0 [13:14:18.232] length: 2 [13:14:18.232] [13:14:18.232] Future #1 [13:14:18.232] result() for ClusterFuture ... [13:14:18.233] - result already collected: FutureResult [13:14:18.233] result() for ClusterFuture ... done [13:14:18.233] result() for ClusterFuture ... [13:14:18.233] - result already collected: FutureResult [13:14:18.233] result() for ClusterFuture ... done [13:14:18.233] signalConditionsASAP(MultisessionFuture, pos=1) ... [13:14:18.234] - nx: 2 [13:14:18.234] - relay: TRUE [13:14:18.234] - stdout: TRUE [13:14:18.234] - signal: TRUE [13:14:18.234] - resignal: FALSE [13:14:18.234] - force: TRUE [13:14:18.234] - relayed: [n=2] FALSE, FALSE [13:14:18.235] - queued futures: [n=2] FALSE, FALSE [13:14:18.235] - until=1 [13:14:18.235] - relaying element #1 [13:14:18.235] result() for ClusterFuture ... [13:14:18.235] - result already collected: FutureResult [13:14:18.235] result() for ClusterFuture ... done [13:14:18.236] result() for ClusterFuture ... [13:14:18.236] - result already collected: FutureResult [13:14:18.236] result() for ClusterFuture ... done [13:14:18.236] result() for ClusterFuture ... [13:14:18.236] - result already collected: FutureResult [13:14:18.236] result() for ClusterFuture ... done [13:14:18.237] result() for ClusterFuture ... [13:14:18.237] - result already collected: FutureResult [13:14:18.237] result() for ClusterFuture ... done [13:14:18.237] - relayed: [n=2] TRUE, FALSE [13:14:18.237] - queued futures: [n=2] TRUE, FALSE [13:14:18.237] signalConditionsASAP(MultisessionFuture, pos=1) ... done [13:14:18.238] length: 1 (resolved future 1) [13:14:18.238] Future #2 [13:14:18.238] result() for ClusterFuture ... [13:14:18.238] - result already collected: FutureResult [13:14:18.238] result() for ClusterFuture ... done [13:14:18.238] result() for ClusterFuture ... [13:14:18.238] - result already collected: FutureResult [13:14:18.239] result() for ClusterFuture ... done [13:14:18.239] signalConditionsASAP(MultisessionFuture, pos=2) ... [13:14:18.239] - nx: 2 [13:14:18.239] - relay: TRUE [13:14:18.239] - stdout: TRUE [13:14:18.239] - signal: TRUE [13:14:18.240] - resignal: FALSE [13:14:18.240] - force: TRUE [13:14:18.240] - relayed: [n=2] TRUE, FALSE [13:14:18.240] - queued futures: [n=2] TRUE, FALSE [13:14:18.240] - until=2 [13:14:18.240] - relaying element #2 [13:14:18.241] result() for ClusterFuture ... [13:14:18.241] - result already collected: FutureResult [13:14:18.241] result() for ClusterFuture ... done [13:14:18.241] result() for ClusterFuture ... [13:14:18.241] - result already collected: FutureResult [13:14:18.241] result() for ClusterFuture ... done [13:14:18.241] result() for ClusterFuture ... [13:14:18.242] - result already collected: FutureResult [13:14:18.242] result() for ClusterFuture ... done [13:14:18.242] result() for ClusterFuture ... [13:14:18.242] - result already collected: FutureResult [13:14:18.242] result() for ClusterFuture ... done [13:14:18.242] - relayed: [n=2] TRUE, TRUE [13:14:18.243] - queued futures: [n=2] TRUE, TRUE [13:14:18.243] signalConditionsASAP(MultisessionFuture, pos=2) ... done [13:14:18.243] length: 0 (resolved future 2) [13:14:18.243] Relaying remaining futures [13:14:18.243] signalConditionsASAP(NULL, pos=0) ... [13:14:18.243] - nx: 2 [13:14:18.244] - relay: TRUE [13:14:18.244] - stdout: TRUE [13:14:18.244] - signal: TRUE [13:14:18.244] - resignal: FALSE [13:14:18.244] - force: TRUE [13:14:18.244] - relayed: [n=2] TRUE, TRUE [13:14:18.244] - queued futures: [n=2] TRUE, TRUE - flush all [13:14:18.245] - relayed: [n=2] TRUE, TRUE [13:14:18.245] - queued futures: [n=2] TRUE, TRUE [13:14:18.245] signalConditionsASAP(NULL, pos=0) ... done [13:14:18.245] resolve() on list ... DONE [13:14:18.245] result() for ClusterFuture ... [13:14:18.245] - result already collected: FutureResult [13:14:18.246] result() for ClusterFuture ... done [13:14:18.246] result() for ClusterFuture ... [13:14:18.246] - result already collected: FutureResult [13:14:18.246] result() for ClusterFuture ... done [13:14:18.246] result() for ClusterFuture ... [13:14:18.246] - result already collected: FutureResult [13:14:18.247] result() for ClusterFuture ... done [13:14:18.247] result() for ClusterFuture ... [13:14:18.247] - result already collected: FutureResult [13:14:18.247] result() for ClusterFuture ... done [13:14:18.247] - Number of value chunks collected: 2 [13:14:18.247] Resolving 2 futures (chunks) ... DONE [13:14:18.248] Reducing values from 2 chunks ... [13:14:18.248] - Number of values collected after concatenation: 10 [13:14:18.248] - Number of values expected: 10 [13:14:18.248] Reducing values from 2 chunks ... DONE [13:14:18.248] future_lapply() ... DONE num [1:2, 1:10] 1 1 2 4 3 9 4 16 5 25 ... int [1:2, 1:2, 1:10] 1 1 1 1 2 2 2 2 3 3 ... [13:14:18.249] future_lapply() ... [13:14:18.254] Number of chunks: 2 [13:14:18.254] getGlobalsAndPackagesXApply() ... [13:14:18.255] - future.globals: TRUE [13:14:18.255] getGlobalsAndPackages() ... [13:14:18.255] Searching for globals... [13:14:18.259] - globals found: [17] 'FUN', '{', '<-', 'x_FUN', 'if', '!=', 'length', 'times', 'stopf', 'stop_if_not', 'all', '==', 'dim', '%in%', 'typeof', 'valid_types', 'matrix' [13:14:18.260] Searching for globals ... DONE [13:14:18.260] Resolving globals: FALSE [13:14:18.261] The total size of the 7 globals is 94.95 KiB (97232 bytes) [13:14:18.261] The total size of the 7 globals exported for future expression ('FUN()') is 94.95 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). The three largest globals are 'stop_if_not' (44.12 KiB of class 'function'), 'stopf' (26.43 KiB of class 'function') and 'FUN' (21.22 KiB of class 'function') [13:14:18.262] - globals: [7] 'FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types' [13:14:18.262] - packages: [1] 'future.apply' [13:14:18.262] getGlobalsAndPackages() ... DONE [13:14:18.262] - globals found/used: [n=7] 'FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types' [13:14:18.262] - needed namespaces: [n=1] 'future.apply' [13:14:18.263] Finding globals ... DONE [13:14:18.263] - use_args: TRUE [13:14:18.263] - Getting '...' globals ... [13:14:18.263] resolve() on list ... [13:14:18.263] recursive: 0 [13:14:18.264] length: 1 [13:14:18.264] elements: '...' [13:14:18.264] length: 0 (resolved future 1) [13:14:18.264] resolve() on list ... DONE [13:14:18.264] - '...' content: [n=0] [13:14:18.264] List of 1 [13:14:18.264] $ ...: list() [13:14:18.264] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:14:18.264] - attr(*, "where")=List of 1 [13:14:18.264] ..$ ...: [13:14:18.264] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:14:18.264] - attr(*, "resolved")= logi TRUE [13:14:18.264] - attr(*, "total_size")= num NA [13:14:18.268] - Getting '...' globals ... DONE [13:14:18.268] Globals to be used in all futures (chunks): [n=8] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...' [13:14:18.268] List of 8 [13:14:18.268] $ ...future.FUN:function (x, ...) [13:14:18.268] $ x_FUN :function (x) [13:14:18.268] $ times : int 4 [13:14:18.268] $ stopf :function (fmt, ..., call. = TRUE, domain = NULL) [13:14:18.268] $ stop_if_not :function (...) [13:14:18.268] $ dim : int [1:2] 2 2 [13:14:18.268] $ valid_types : chr [1:2] "logical" "integer" [13:14:18.268] $ ... : list() [13:14:18.268] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:14:18.268] - attr(*, "where")=List of 8 [13:14:18.268] ..$ ...future.FUN: [13:14:18.268] ..$ x_FUN : [13:14:18.268] ..$ times : [13:14:18.268] ..$ stopf : [13:14:18.268] ..$ stop_if_not : [13:14:18.268] ..$ dim : [13:14:18.268] ..$ valid_types : [13:14:18.268] ..$ ... : [13:14:18.268] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:14:18.268] - attr(*, "resolved")= logi FALSE [13:14:18.268] - attr(*, "total_size")= num 97232 [13:14:18.277] Packages to be attached in all futures: [n=1] 'future.apply' [13:14:18.277] getGlobalsAndPackagesXApply() ... DONE [13:14:18.277] Number of futures (= number of chunks): 2 [13:14:18.277] Launching 2 futures (chunks) ... [13:14:18.278] Chunk #1 of 2 ... [13:14:18.278] - Finding globals in 'X' for chunk #1 ... [13:14:18.278] getGlobalsAndPackages() ... [13:14:18.278] Searching for globals... [13:14:18.278] [13:14:18.279] Searching for globals ... DONE [13:14:18.279] - globals: [0] [13:14:18.279] getGlobalsAndPackages() ... DONE [13:14:18.279] + additional globals found: [n=0] [13:14:18.279] + additional namespaces needed: [n=0] [13:14:18.279] - Finding globals in 'X' for chunk #1 ... DONE [13:14:18.280] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:14:18.280] - seeds: [13:14:18.280] - All globals exported: [n=11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:18.280] getGlobalsAndPackages() ... [13:14:18.280] - globals passed as-is: [11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:18.280] Resolving globals: FALSE [13:14:18.281] Tweak future expression to call with '...' arguments ... [13:14:18.281] { [13:14:18.281] do.call(function(...) { [13:14:18.281] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:18.281] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:18.281] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:18.281] on.exit(options(oopts), add = TRUE) [13:14:18.281] } [13:14:18.281] { [13:14:18.281] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:18.281] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:18.281] ...future.FUN(...future.X_jj, ...) [13:14:18.281] }) [13:14:18.281] } [13:14:18.281] }, args = future.call.arguments) [13:14:18.281] } [13:14:18.281] Tweak future expression to call with '...' arguments ... DONE [13:14:18.282] - globals: [11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:18.282] - packages: [1] 'future.apply' [13:14:18.282] getGlobalsAndPackages() ... DONE [13:14:18.283] run() for 'Future' ... [13:14:18.283] - state: 'created' [13:14:18.283] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:14:18.300] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:14:18.300] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:14:18.300] - Field: 'node' [13:14:18.300] - Field: 'label' [13:14:18.301] - Field: 'local' [13:14:18.301] - Field: 'owner' [13:14:18.301] - Field: 'envir' [13:14:18.301] - Field: 'workers' [13:14:18.301] - Field: 'packages' [13:14:18.301] - Field: 'gc' [13:14:18.302] - Field: 'conditions' [13:14:18.302] - Field: 'persistent' [13:14:18.302] - Field: 'expr' [13:14:18.302] - Field: 'uuid' [13:14:18.302] - Field: 'seed' [13:14:18.302] - Field: 'version' [13:14:18.303] - Field: 'result' [13:14:18.303] - Field: 'asynchronous' [13:14:18.303] - Field: 'calls' [13:14:18.303] - Field: 'globals' [13:14:18.303] - Field: 'stdout' [13:14:18.304] - Field: 'earlySignal' [13:14:18.304] - Field: 'lazy' [13:14:18.304] - Field: 'state' [13:14:18.304] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:14:18.304] - Launch lazy future ... [13:14:18.305] Packages needed by the future expression (n = 1): 'future.apply' [13:14:18.305] Packages needed by future strategies (n = 0): [13:14:18.305] { [13:14:18.305] { [13:14:18.305] { [13:14:18.305] ...future.startTime <- base::Sys.time() [13:14:18.305] { [13:14:18.305] { [13:14:18.305] { [13:14:18.305] { [13:14:18.305] { [13:14:18.305] base::local({ [13:14:18.305] has_future <- base::requireNamespace("future", [13:14:18.305] quietly = TRUE) [13:14:18.305] if (has_future) { [13:14:18.305] ns <- base::getNamespace("future") [13:14:18.305] version <- ns[[".package"]][["version"]] [13:14:18.305] if (is.null(version)) [13:14:18.305] version <- utils::packageVersion("future") [13:14:18.305] } [13:14:18.305] else { [13:14:18.305] version <- NULL [13:14:18.305] } [13:14:18.305] if (!has_future || version < "1.8.0") { [13:14:18.305] info <- base::c(r_version = base::gsub("R version ", [13:14:18.305] "", base::R.version$version.string), [13:14:18.305] platform = base::sprintf("%s (%s-bit)", [13:14:18.305] base::R.version$platform, 8 * [13:14:18.305] base::.Machine$sizeof.pointer), [13:14:18.305] os = base::paste(base::Sys.info()[base::c("sysname", [13:14:18.305] "release", "version")], collapse = " "), [13:14:18.305] hostname = base::Sys.info()[["nodename"]]) [13:14:18.305] info <- base::sprintf("%s: %s", base::names(info), [13:14:18.305] info) [13:14:18.305] info <- base::paste(info, collapse = "; ") [13:14:18.305] if (!has_future) { [13:14:18.305] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:14:18.305] info) [13:14:18.305] } [13:14:18.305] else { [13:14:18.305] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:14:18.305] info, version) [13:14:18.305] } [13:14:18.305] base::stop(msg) [13:14:18.305] } [13:14:18.305] }) [13:14:18.305] } [13:14:18.305] ...future.mc.cores.old <- base::getOption("mc.cores") [13:14:18.305] base::options(mc.cores = 1L) [13:14:18.305] } [13:14:18.305] base::local({ [13:14:18.305] for (pkg in "future.apply") { [13:14:18.305] base::loadNamespace(pkg) [13:14:18.305] base::library(pkg, character.only = TRUE) [13:14:18.305] } [13:14:18.305] }) [13:14:18.305] } [13:14:18.305] options(future.plan = NULL) [13:14:18.305] Sys.unsetenv("R_FUTURE_PLAN") [13:14:18.305] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:14:18.305] } [13:14:18.305] ...future.workdir <- getwd() [13:14:18.305] } [13:14:18.305] ...future.oldOptions <- base::as.list(base::.Options) [13:14:18.305] ...future.oldEnvVars <- base::Sys.getenv() [13:14:18.305] } [13:14:18.305] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:14:18.305] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:14:18.305] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:14:18.305] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:14:18.305] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:14:18.305] future.stdout.windows.reencode = NULL, width = 80L) [13:14:18.305] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:14:18.305] base::names(...future.oldOptions)) [13:14:18.305] } [13:14:18.305] if (FALSE) { [13:14:18.305] } [13:14:18.305] else { [13:14:18.305] if (TRUE) { [13:14:18.305] ...future.stdout <- base::rawConnection(base::raw(0L), [13:14:18.305] open = "w") [13:14:18.305] } [13:14:18.305] else { [13:14:18.305] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:14:18.305] windows = "NUL", "/dev/null"), open = "w") [13:14:18.305] } [13:14:18.305] base::sink(...future.stdout, type = "output", split = FALSE) [13:14:18.305] base::on.exit(if (!base::is.null(...future.stdout)) { [13:14:18.305] base::sink(type = "output", split = FALSE) [13:14:18.305] base::close(...future.stdout) [13:14:18.305] }, add = TRUE) [13:14:18.305] } [13:14:18.305] ...future.frame <- base::sys.nframe() [13:14:18.305] ...future.conditions <- base::list() [13:14:18.305] ...future.rng <- base::globalenv()$.Random.seed [13:14:18.305] if (FALSE) { [13:14:18.305] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:14:18.305] "...future.value", "...future.globalenv.names", ".Random.seed") [13:14:18.305] } [13:14:18.305] ...future.result <- base::tryCatch({ [13:14:18.305] base::withCallingHandlers({ [13:14:18.305] ...future.value <- base::withVisible(base::local({ [13:14:18.305] ...future.makeSendCondition <- local({ [13:14:18.305] sendCondition <- NULL [13:14:18.305] function(frame = 1L) { [13:14:18.305] if (is.function(sendCondition)) [13:14:18.305] return(sendCondition) [13:14:18.305] ns <- getNamespace("parallel") [13:14:18.305] if (exists("sendData", mode = "function", [13:14:18.305] envir = ns)) { [13:14:18.305] parallel_sendData <- get("sendData", mode = "function", [13:14:18.305] envir = ns) [13:14:18.305] envir <- sys.frame(frame) [13:14:18.305] master <- NULL [13:14:18.305] while (!identical(envir, .GlobalEnv) && [13:14:18.305] !identical(envir, emptyenv())) { [13:14:18.305] if (exists("master", mode = "list", envir = envir, [13:14:18.305] inherits = FALSE)) { [13:14:18.305] master <- get("master", mode = "list", [13:14:18.305] envir = envir, inherits = FALSE) [13:14:18.305] if (inherits(master, c("SOCKnode", [13:14:18.305] "SOCK0node"))) { [13:14:18.305] sendCondition <<- function(cond) { [13:14:18.305] data <- list(type = "VALUE", value = cond, [13:14:18.305] success = TRUE) [13:14:18.305] parallel_sendData(master, data) [13:14:18.305] } [13:14:18.305] return(sendCondition) [13:14:18.305] } [13:14:18.305] } [13:14:18.305] frame <- frame + 1L [13:14:18.305] envir <- sys.frame(frame) [13:14:18.305] } [13:14:18.305] } [13:14:18.305] sendCondition <<- function(cond) NULL [13:14:18.305] } [13:14:18.305] }) [13:14:18.305] withCallingHandlers({ [13:14:18.305] { [13:14:18.305] do.call(function(...) { [13:14:18.305] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:18.305] if (!identical(...future.globals.maxSize.org, [13:14:18.305] ...future.globals.maxSize)) { [13:14:18.305] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:18.305] on.exit(options(oopts), add = TRUE) [13:14:18.305] } [13:14:18.305] { [13:14:18.305] lapply(seq_along(...future.elements_ii), [13:14:18.305] FUN = function(jj) { [13:14:18.305] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:18.305] ...future.FUN(...future.X_jj, ...) [13:14:18.305] }) [13:14:18.305] } [13:14:18.305] }, args = future.call.arguments) [13:14:18.305] } [13:14:18.305] }, immediateCondition = function(cond) { [13:14:18.305] sendCondition <- ...future.makeSendCondition() [13:14:18.305] sendCondition(cond) [13:14:18.305] muffleCondition <- function (cond, pattern = "^muffle") [13:14:18.305] { [13:14:18.305] inherits <- base::inherits [13:14:18.305] invokeRestart <- base::invokeRestart [13:14:18.305] is.null <- base::is.null [13:14:18.305] muffled <- FALSE [13:14:18.305] if (inherits(cond, "message")) { [13:14:18.305] muffled <- grepl(pattern, "muffleMessage") [13:14:18.305] if (muffled) [13:14:18.305] invokeRestart("muffleMessage") [13:14:18.305] } [13:14:18.305] else if (inherits(cond, "warning")) { [13:14:18.305] muffled <- grepl(pattern, "muffleWarning") [13:14:18.305] if (muffled) [13:14:18.305] invokeRestart("muffleWarning") [13:14:18.305] } [13:14:18.305] else if (inherits(cond, "condition")) { [13:14:18.305] if (!is.null(pattern)) { [13:14:18.305] computeRestarts <- base::computeRestarts [13:14:18.305] grepl <- base::grepl [13:14:18.305] restarts <- computeRestarts(cond) [13:14:18.305] for (restart in restarts) { [13:14:18.305] name <- restart$name [13:14:18.305] if (is.null(name)) [13:14:18.305] next [13:14:18.305] if (!grepl(pattern, name)) [13:14:18.305] next [13:14:18.305] invokeRestart(restart) [13:14:18.305] muffled <- TRUE [13:14:18.305] break [13:14:18.305] } [13:14:18.305] } [13:14:18.305] } [13:14:18.305] invisible(muffled) [13:14:18.305] } [13:14:18.305] muffleCondition(cond) [13:14:18.305] }) [13:14:18.305] })) [13:14:18.305] future::FutureResult(value = ...future.value$value, [13:14:18.305] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:14:18.305] ...future.rng), globalenv = if (FALSE) [13:14:18.305] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:14:18.305] ...future.globalenv.names)) [13:14:18.305] else NULL, started = ...future.startTime, version = "1.8") [13:14:18.305] }, condition = base::local({ [13:14:18.305] c <- base::c [13:14:18.305] inherits <- base::inherits [13:14:18.305] invokeRestart <- base::invokeRestart [13:14:18.305] length <- base::length [13:14:18.305] list <- base::list [13:14:18.305] seq.int <- base::seq.int [13:14:18.305] signalCondition <- base::signalCondition [13:14:18.305] sys.calls <- base::sys.calls [13:14:18.305] `[[` <- base::`[[` [13:14:18.305] `+` <- base::`+` [13:14:18.305] `<<-` <- base::`<<-` [13:14:18.305] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:14:18.305] calls[seq.int(from = from + 12L, to = length(calls) - [13:14:18.305] 3L)] [13:14:18.305] } [13:14:18.305] function(cond) { [13:14:18.305] is_error <- inherits(cond, "error") [13:14:18.305] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:14:18.305] NULL) [13:14:18.305] if (is_error) { [13:14:18.305] sessionInformation <- function() { [13:14:18.305] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:14:18.305] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:14:18.305] search = base::search(), system = base::Sys.info()) [13:14:18.305] } [13:14:18.305] ...future.conditions[[length(...future.conditions) + [13:14:18.305] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:14:18.305] cond$call), session = sessionInformation(), [13:14:18.305] timestamp = base::Sys.time(), signaled = 0L) [13:14:18.305] signalCondition(cond) [13:14:18.305] } [13:14:18.305] else if (!ignore && TRUE && inherits(cond, c("condition", [13:14:18.305] "immediateCondition"))) { [13:14:18.305] signal <- TRUE && inherits(cond, "immediateCondition") [13:14:18.305] ...future.conditions[[length(...future.conditions) + [13:14:18.305] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:14:18.305] if (TRUE && !signal) { [13:14:18.305] muffleCondition <- function (cond, pattern = "^muffle") [13:14:18.305] { [13:14:18.305] inherits <- base::inherits [13:14:18.305] invokeRestart <- base::invokeRestart [13:14:18.305] is.null <- base::is.null [13:14:18.305] muffled <- FALSE [13:14:18.305] if (inherits(cond, "message")) { [13:14:18.305] muffled <- grepl(pattern, "muffleMessage") [13:14:18.305] if (muffled) [13:14:18.305] invokeRestart("muffleMessage") [13:14:18.305] } [13:14:18.305] else if (inherits(cond, "warning")) { [13:14:18.305] muffled <- grepl(pattern, "muffleWarning") [13:14:18.305] if (muffled) [13:14:18.305] invokeRestart("muffleWarning") [13:14:18.305] } [13:14:18.305] else if (inherits(cond, "condition")) { [13:14:18.305] if (!is.null(pattern)) { [13:14:18.305] computeRestarts <- base::computeRestarts [13:14:18.305] grepl <- base::grepl [13:14:18.305] restarts <- computeRestarts(cond) [13:14:18.305] for (restart in restarts) { [13:14:18.305] name <- restart$name [13:14:18.305] if (is.null(name)) [13:14:18.305] next [13:14:18.305] if (!grepl(pattern, name)) [13:14:18.305] next [13:14:18.305] invokeRestart(restart) [13:14:18.305] muffled <- TRUE [13:14:18.305] break [13:14:18.305] } [13:14:18.305] } [13:14:18.305] } [13:14:18.305] invisible(muffled) [13:14:18.305] } [13:14:18.305] muffleCondition(cond, pattern = "^muffle") [13:14:18.305] } [13:14:18.305] } [13:14:18.305] else { [13:14:18.305] if (TRUE) { [13:14:18.305] muffleCondition <- function (cond, pattern = "^muffle") [13:14:18.305] { [13:14:18.305] inherits <- base::inherits [13:14:18.305] invokeRestart <- base::invokeRestart [13:14:18.305] is.null <- base::is.null [13:14:18.305] muffled <- FALSE [13:14:18.305] if (inherits(cond, "message")) { [13:14:18.305] muffled <- grepl(pattern, "muffleMessage") [13:14:18.305] if (muffled) [13:14:18.305] invokeRestart("muffleMessage") [13:14:18.305] } [13:14:18.305] else if (inherits(cond, "warning")) { [13:14:18.305] muffled <- grepl(pattern, "muffleWarning") [13:14:18.305] if (muffled) [13:14:18.305] invokeRestart("muffleWarning") [13:14:18.305] } [13:14:18.305] else if (inherits(cond, "condition")) { [13:14:18.305] if (!is.null(pattern)) { [13:14:18.305] computeRestarts <- base::computeRestarts [13:14:18.305] grepl <- base::grepl [13:14:18.305] restarts <- computeRestarts(cond) [13:14:18.305] for (restart in restarts) { [13:14:18.305] name <- restart$name [13:14:18.305] if (is.null(name)) [13:14:18.305] next [13:14:18.305] if (!grepl(pattern, name)) [13:14:18.305] next [13:14:18.305] invokeRestart(restart) [13:14:18.305] muffled <- TRUE [13:14:18.305] break [13:14:18.305] } [13:14:18.305] } [13:14:18.305] } [13:14:18.305] invisible(muffled) [13:14:18.305] } [13:14:18.305] muffleCondition(cond, pattern = "^muffle") [13:14:18.305] } [13:14:18.305] } [13:14:18.305] } [13:14:18.305] })) [13:14:18.305] }, error = function(ex) { [13:14:18.305] base::structure(base::list(value = NULL, visible = NULL, [13:14:18.305] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:14:18.305] ...future.rng), started = ...future.startTime, [13:14:18.305] finished = Sys.time(), session_uuid = NA_character_, [13:14:18.305] version = "1.8"), class = "FutureResult") [13:14:18.305] }, finally = { [13:14:18.305] if (!identical(...future.workdir, getwd())) [13:14:18.305] setwd(...future.workdir) [13:14:18.305] { [13:14:18.305] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:14:18.305] ...future.oldOptions$nwarnings <- NULL [13:14:18.305] } [13:14:18.305] base::options(...future.oldOptions) [13:14:18.305] if (.Platform$OS.type == "windows") { [13:14:18.305] old_names <- names(...future.oldEnvVars) [13:14:18.305] envs <- base::Sys.getenv() [13:14:18.305] names <- names(envs) [13:14:18.305] common <- intersect(names, old_names) [13:14:18.305] added <- setdiff(names, old_names) [13:14:18.305] removed <- setdiff(old_names, names) [13:14:18.305] changed <- common[...future.oldEnvVars[common] != [13:14:18.305] envs[common]] [13:14:18.305] NAMES <- toupper(changed) [13:14:18.305] args <- list() [13:14:18.305] for (kk in seq_along(NAMES)) { [13:14:18.305] name <- changed[[kk]] [13:14:18.305] NAME <- NAMES[[kk]] [13:14:18.305] if (name != NAME && is.element(NAME, old_names)) [13:14:18.305] next [13:14:18.305] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:18.305] } [13:14:18.305] NAMES <- toupper(added) [13:14:18.305] for (kk in seq_along(NAMES)) { [13:14:18.305] name <- added[[kk]] [13:14:18.305] NAME <- NAMES[[kk]] [13:14:18.305] if (name != NAME && is.element(NAME, old_names)) [13:14:18.305] next [13:14:18.305] args[[name]] <- "" [13:14:18.305] } [13:14:18.305] NAMES <- toupper(removed) [13:14:18.305] for (kk in seq_along(NAMES)) { [13:14:18.305] name <- removed[[kk]] [13:14:18.305] NAME <- NAMES[[kk]] [13:14:18.305] if (name != NAME && is.element(NAME, old_names)) [13:14:18.305] next [13:14:18.305] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:18.305] } [13:14:18.305] if (length(args) > 0) [13:14:18.305] base::do.call(base::Sys.setenv, args = args) [13:14:18.305] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:14:18.305] } [13:14:18.305] else { [13:14:18.305] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:14:18.305] } [13:14:18.305] { [13:14:18.305] if (base::length(...future.futureOptionsAdded) > [13:14:18.305] 0L) { [13:14:18.305] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:14:18.305] base::names(opts) <- ...future.futureOptionsAdded [13:14:18.305] base::options(opts) [13:14:18.305] } [13:14:18.305] { [13:14:18.305] { [13:14:18.305] base::options(mc.cores = ...future.mc.cores.old) [13:14:18.305] NULL [13:14:18.305] } [13:14:18.305] options(future.plan = NULL) [13:14:18.305] if (is.na(NA_character_)) [13:14:18.305] Sys.unsetenv("R_FUTURE_PLAN") [13:14:18.305] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:14:18.305] future::plan(list(function (..., workers = availableCores(), [13:14:18.305] lazy = FALSE, rscript_libs = .libPaths(), [13:14:18.305] envir = parent.frame()) [13:14:18.305] { [13:14:18.305] if (is.function(workers)) [13:14:18.305] workers <- workers() [13:14:18.305] workers <- structure(as.integer(workers), [13:14:18.305] class = class(workers)) [13:14:18.305] stop_if_not(length(workers) == 1, is.finite(workers), [13:14:18.305] workers >= 1) [13:14:18.305] if (workers == 1L && !inherits(workers, "AsIs")) { [13:14:18.305] return(sequential(..., lazy = TRUE, envir = envir)) [13:14:18.305] } [13:14:18.305] future <- MultisessionFuture(..., workers = workers, [13:14:18.305] lazy = lazy, rscript_libs = rscript_libs, [13:14:18.305] envir = envir) [13:14:18.305] if (!future$lazy) [13:14:18.305] future <- run(future) [13:14:18.305] invisible(future) [13:14:18.305] }), .cleanup = FALSE, .init = FALSE) [13:14:18.305] } [13:14:18.305] } [13:14:18.305] } [13:14:18.305] }) [13:14:18.305] if (TRUE) { [13:14:18.305] base::sink(type = "output", split = FALSE) [13:14:18.305] if (TRUE) { [13:14:18.305] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:14:18.305] } [13:14:18.305] else { [13:14:18.305] ...future.result["stdout"] <- base::list(NULL) [13:14:18.305] } [13:14:18.305] base::close(...future.stdout) [13:14:18.305] ...future.stdout <- NULL [13:14:18.305] } [13:14:18.305] ...future.result$conditions <- ...future.conditions [13:14:18.305] ...future.result$finished <- base::Sys.time() [13:14:18.305] ...future.result [13:14:18.305] } [13:14:18.311] Exporting 11 global objects (94.95 KiB) to cluster node #1 ... [13:14:18.311] Exporting '...future.FUN' (21.22 KiB) to cluster node #1 ... [13:14:18.312] Exporting '...future.FUN' (21.22 KiB) to cluster node #1 ... DONE [13:14:18.312] Exporting 'x_FUN' (2.90 KiB) to cluster node #1 ... [13:14:18.312] Exporting 'x_FUN' (2.90 KiB) to cluster node #1 ... DONE [13:14:18.312] Exporting 'times' (56 bytes) to cluster node #1 ... [13:14:18.313] Exporting 'times' (56 bytes) to cluster node #1 ... DONE [13:14:18.313] Exporting 'stopf' (26.43 KiB) to cluster node #1 ... [13:14:18.313] Exporting 'stopf' (26.43 KiB) to cluster node #1 ... DONE [13:14:18.314] Exporting 'stop_if_not' (44.12 KiB) to cluster node #1 ... [13:14:18.314] Exporting 'stop_if_not' (44.12 KiB) to cluster node #1 ... DONE [13:14:18.314] Exporting 'dim' (56 bytes) to cluster node #1 ... [13:14:18.315] Exporting 'dim' (56 bytes) to cluster node #1 ... DONE [13:14:18.315] Exporting 'valid_types' (176 bytes) to cluster node #1 ... [13:14:18.315] Exporting 'valid_types' (176 bytes) to cluster node #1 ... DONE [13:14:18.316] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... [13:14:18.316] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... DONE [13:14:18.316] Exporting '...future.elements_ii' (280 bytes) to cluster node #1 ... [13:14:18.317] Exporting '...future.elements_ii' (280 bytes) to cluster node #1 ... DONE [13:14:18.317] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:14:18.317] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:14:18.317] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:14:18.318] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:14:18.318] Exporting 11 global objects (94.95 KiB) to cluster node #1 ... DONE [13:14:18.318] MultisessionFuture started [13:14:18.319] - Launch lazy future ... done [13:14:18.319] run() for 'MultisessionFuture' ... done [13:14:18.319] Created future: [13:14:18.338] receiveMessageFromWorker() for ClusterFuture ... [13:14:18.338] - Validating connection of MultisessionFuture [13:14:18.338] - received message: FutureResult [13:14:18.338] - Received FutureResult [13:14:18.338] - Erased future from FutureRegistry [13:14:18.339] result() for ClusterFuture ... [13:14:18.339] - result already collected: FutureResult [13:14:18.339] result() for ClusterFuture ... done [13:14:18.339] receiveMessageFromWorker() for ClusterFuture ... done [13:14:18.319] MultisessionFuture: [13:14:18.319] Label: 'future_vapply-1' [13:14:18.319] Expression: [13:14:18.319] { [13:14:18.319] do.call(function(...) { [13:14:18.319] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:18.319] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:18.319] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:18.319] on.exit(options(oopts), add = TRUE) [13:14:18.319] } [13:14:18.319] { [13:14:18.319] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:18.319] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:18.319] ...future.FUN(...future.X_jj, ...) [13:14:18.319] }) [13:14:18.319] } [13:14:18.319] }, args = future.call.arguments) [13:14:18.319] } [13:14:18.319] Lazy evaluation: FALSE [13:14:18.319] Asynchronous evaluation: TRUE [13:14:18.319] Local evaluation: TRUE [13:14:18.319] Environment: R_GlobalEnv [13:14:18.319] Capture standard output: TRUE [13:14:18.319] Capture condition classes: 'condition' (excluding 'nothing') [13:14:18.319] Globals: 11 objects totaling 95.23 KiB (function '...future.FUN' of 21.22 KiB, function 'x_FUN' of 2.90 KiB, integer 'times' of 56 bytes, function 'stopf' of 26.43 KiB, function 'stop_if_not' of 44.12 KiB, ...) [13:14:18.319] Packages: 1 packages ('future.apply') [13:14:18.319] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:14:18.319] Resolved: TRUE [13:14:18.319] Value: [13:14:18.319] Conditions captured: [13:14:18.319] Early signaling: FALSE [13:14:18.319] Owner process: 1bb7d580-628d-c90d-e38a-66de485868c4 [13:14:18.319] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:14:18.340] Chunk #1 of 2 ... DONE [13:14:18.340] Chunk #2 of 2 ... [13:14:18.340] - Finding globals in 'X' for chunk #2 ... [13:14:18.340] getGlobalsAndPackages() ... [13:14:18.340] Searching for globals... [13:14:18.341] [13:14:18.341] Searching for globals ... DONE [13:14:18.341] - globals: [0] [13:14:18.341] getGlobalsAndPackages() ... DONE [13:14:18.341] + additional globals found: [n=0] [13:14:18.341] + additional namespaces needed: [n=0] [13:14:18.342] - Finding globals in 'X' for chunk #2 ... DONE [13:14:18.342] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:14:18.342] - seeds: [13:14:18.342] - All globals exported: [n=11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:18.342] getGlobalsAndPackages() ... [13:14:18.342] - globals passed as-is: [11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:18.343] Resolving globals: FALSE [13:14:18.343] Tweak future expression to call with '...' arguments ... [13:14:18.343] { [13:14:18.343] do.call(function(...) { [13:14:18.343] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:18.343] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:18.343] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:18.343] on.exit(options(oopts), add = TRUE) [13:14:18.343] } [13:14:18.343] { [13:14:18.343] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:18.343] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:18.343] ...future.FUN(...future.X_jj, ...) [13:14:18.343] }) [13:14:18.343] } [13:14:18.343] }, args = future.call.arguments) [13:14:18.343] } [13:14:18.343] Tweak future expression to call with '...' arguments ... DONE [13:14:18.344] - globals: [11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:18.344] - packages: [1] 'future.apply' [13:14:18.344] getGlobalsAndPackages() ... DONE [13:14:18.345] run() for 'Future' ... [13:14:18.345] - state: 'created' [13:14:18.345] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:14:18.359] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:14:18.359] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:14:18.360] - Field: 'node' [13:14:18.360] - Field: 'label' [13:14:18.360] - Field: 'local' [13:14:18.360] - Field: 'owner' [13:14:18.360] - Field: 'envir' [13:14:18.361] - Field: 'workers' [13:14:18.361] - Field: 'packages' [13:14:18.361] - Field: 'gc' [13:14:18.361] - Field: 'conditions' [13:14:18.361] - Field: 'persistent' [13:14:18.361] - Field: 'expr' [13:14:18.362] - Field: 'uuid' [13:14:18.362] - Field: 'seed' [13:14:18.362] - Field: 'version' [13:14:18.362] - Field: 'result' [13:14:18.362] - Field: 'asynchronous' [13:14:18.363] - Field: 'calls' [13:14:18.363] - Field: 'globals' [13:14:18.363] - Field: 'stdout' [13:14:18.363] - Field: 'earlySignal' [13:14:18.363] - Field: 'lazy' [13:14:18.363] - Field: 'state' [13:14:18.364] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:14:18.364] - Launch lazy future ... [13:14:18.364] Packages needed by the future expression (n = 1): 'future.apply' [13:14:18.364] Packages needed by future strategies (n = 0): [13:14:18.365] { [13:14:18.365] { [13:14:18.365] { [13:14:18.365] ...future.startTime <- base::Sys.time() [13:14:18.365] { [13:14:18.365] { [13:14:18.365] { [13:14:18.365] { [13:14:18.365] { [13:14:18.365] base::local({ [13:14:18.365] has_future <- base::requireNamespace("future", [13:14:18.365] quietly = TRUE) [13:14:18.365] if (has_future) { [13:14:18.365] ns <- base::getNamespace("future") [13:14:18.365] version <- ns[[".package"]][["version"]] [13:14:18.365] if (is.null(version)) [13:14:18.365] version <- utils::packageVersion("future") [13:14:18.365] } [13:14:18.365] else { [13:14:18.365] version <- NULL [13:14:18.365] } [13:14:18.365] if (!has_future || version < "1.8.0") { [13:14:18.365] info <- base::c(r_version = base::gsub("R version ", [13:14:18.365] "", base::R.version$version.string), [13:14:18.365] platform = base::sprintf("%s (%s-bit)", [13:14:18.365] base::R.version$platform, 8 * [13:14:18.365] base::.Machine$sizeof.pointer), [13:14:18.365] os = base::paste(base::Sys.info()[base::c("sysname", [13:14:18.365] "release", "version")], collapse = " "), [13:14:18.365] hostname = base::Sys.info()[["nodename"]]) [13:14:18.365] info <- base::sprintf("%s: %s", base::names(info), [13:14:18.365] info) [13:14:18.365] info <- base::paste(info, collapse = "; ") [13:14:18.365] if (!has_future) { [13:14:18.365] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:14:18.365] info) [13:14:18.365] } [13:14:18.365] else { [13:14:18.365] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:14:18.365] info, version) [13:14:18.365] } [13:14:18.365] base::stop(msg) [13:14:18.365] } [13:14:18.365] }) [13:14:18.365] } [13:14:18.365] ...future.mc.cores.old <- base::getOption("mc.cores") [13:14:18.365] base::options(mc.cores = 1L) [13:14:18.365] } [13:14:18.365] base::local({ [13:14:18.365] for (pkg in "future.apply") { [13:14:18.365] base::loadNamespace(pkg) [13:14:18.365] base::library(pkg, character.only = TRUE) [13:14:18.365] } [13:14:18.365] }) [13:14:18.365] } [13:14:18.365] options(future.plan = NULL) [13:14:18.365] Sys.unsetenv("R_FUTURE_PLAN") [13:14:18.365] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:14:18.365] } [13:14:18.365] ...future.workdir <- getwd() [13:14:18.365] } [13:14:18.365] ...future.oldOptions <- base::as.list(base::.Options) [13:14:18.365] ...future.oldEnvVars <- base::Sys.getenv() [13:14:18.365] } [13:14:18.365] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:14:18.365] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:14:18.365] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:14:18.365] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:14:18.365] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:14:18.365] future.stdout.windows.reencode = NULL, width = 80L) [13:14:18.365] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:14:18.365] base::names(...future.oldOptions)) [13:14:18.365] } [13:14:18.365] if (FALSE) { [13:14:18.365] } [13:14:18.365] else { [13:14:18.365] if (TRUE) { [13:14:18.365] ...future.stdout <- base::rawConnection(base::raw(0L), [13:14:18.365] open = "w") [13:14:18.365] } [13:14:18.365] else { [13:14:18.365] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:14:18.365] windows = "NUL", "/dev/null"), open = "w") [13:14:18.365] } [13:14:18.365] base::sink(...future.stdout, type = "output", split = FALSE) [13:14:18.365] base::on.exit(if (!base::is.null(...future.stdout)) { [13:14:18.365] base::sink(type = "output", split = FALSE) [13:14:18.365] base::close(...future.stdout) [13:14:18.365] }, add = TRUE) [13:14:18.365] } [13:14:18.365] ...future.frame <- base::sys.nframe() [13:14:18.365] ...future.conditions <- base::list() [13:14:18.365] ...future.rng <- base::globalenv()$.Random.seed [13:14:18.365] if (FALSE) { [13:14:18.365] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:14:18.365] "...future.value", "...future.globalenv.names", ".Random.seed") [13:14:18.365] } [13:14:18.365] ...future.result <- base::tryCatch({ [13:14:18.365] base::withCallingHandlers({ [13:14:18.365] ...future.value <- base::withVisible(base::local({ [13:14:18.365] ...future.makeSendCondition <- local({ [13:14:18.365] sendCondition <- NULL [13:14:18.365] function(frame = 1L) { [13:14:18.365] if (is.function(sendCondition)) [13:14:18.365] return(sendCondition) [13:14:18.365] ns <- getNamespace("parallel") [13:14:18.365] if (exists("sendData", mode = "function", [13:14:18.365] envir = ns)) { [13:14:18.365] parallel_sendData <- get("sendData", mode = "function", [13:14:18.365] envir = ns) [13:14:18.365] envir <- sys.frame(frame) [13:14:18.365] master <- NULL [13:14:18.365] while (!identical(envir, .GlobalEnv) && [13:14:18.365] !identical(envir, emptyenv())) { [13:14:18.365] if (exists("master", mode = "list", envir = envir, [13:14:18.365] inherits = FALSE)) { [13:14:18.365] master <- get("master", mode = "list", [13:14:18.365] envir = envir, inherits = FALSE) [13:14:18.365] if (inherits(master, c("SOCKnode", [13:14:18.365] "SOCK0node"))) { [13:14:18.365] sendCondition <<- function(cond) { [13:14:18.365] data <- list(type = "VALUE", value = cond, [13:14:18.365] success = TRUE) [13:14:18.365] parallel_sendData(master, data) [13:14:18.365] } [13:14:18.365] return(sendCondition) [13:14:18.365] } [13:14:18.365] } [13:14:18.365] frame <- frame + 1L [13:14:18.365] envir <- sys.frame(frame) [13:14:18.365] } [13:14:18.365] } [13:14:18.365] sendCondition <<- function(cond) NULL [13:14:18.365] } [13:14:18.365] }) [13:14:18.365] withCallingHandlers({ [13:14:18.365] { [13:14:18.365] do.call(function(...) { [13:14:18.365] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:18.365] if (!identical(...future.globals.maxSize.org, [13:14:18.365] ...future.globals.maxSize)) { [13:14:18.365] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:18.365] on.exit(options(oopts), add = TRUE) [13:14:18.365] } [13:14:18.365] { [13:14:18.365] lapply(seq_along(...future.elements_ii), [13:14:18.365] FUN = function(jj) { [13:14:18.365] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:18.365] ...future.FUN(...future.X_jj, ...) [13:14:18.365] }) [13:14:18.365] } [13:14:18.365] }, args = future.call.arguments) [13:14:18.365] } [13:14:18.365] }, immediateCondition = function(cond) { [13:14:18.365] sendCondition <- ...future.makeSendCondition() [13:14:18.365] sendCondition(cond) [13:14:18.365] muffleCondition <- function (cond, pattern = "^muffle") [13:14:18.365] { [13:14:18.365] inherits <- base::inherits [13:14:18.365] invokeRestart <- base::invokeRestart [13:14:18.365] is.null <- base::is.null [13:14:18.365] muffled <- FALSE [13:14:18.365] if (inherits(cond, "message")) { [13:14:18.365] muffled <- grepl(pattern, "muffleMessage") [13:14:18.365] if (muffled) [13:14:18.365] invokeRestart("muffleMessage") [13:14:18.365] } [13:14:18.365] else if (inherits(cond, "warning")) { [13:14:18.365] muffled <- grepl(pattern, "muffleWarning") [13:14:18.365] if (muffled) [13:14:18.365] invokeRestart("muffleWarning") [13:14:18.365] } [13:14:18.365] else if (inherits(cond, "condition")) { [13:14:18.365] if (!is.null(pattern)) { [13:14:18.365] computeRestarts <- base::computeRestarts [13:14:18.365] grepl <- base::grepl [13:14:18.365] restarts <- computeRestarts(cond) [13:14:18.365] for (restart in restarts) { [13:14:18.365] name <- restart$name [13:14:18.365] if (is.null(name)) [13:14:18.365] next [13:14:18.365] if (!grepl(pattern, name)) [13:14:18.365] next [13:14:18.365] invokeRestart(restart) [13:14:18.365] muffled <- TRUE [13:14:18.365] break [13:14:18.365] } [13:14:18.365] } [13:14:18.365] } [13:14:18.365] invisible(muffled) [13:14:18.365] } [13:14:18.365] muffleCondition(cond) [13:14:18.365] }) [13:14:18.365] })) [13:14:18.365] future::FutureResult(value = ...future.value$value, [13:14:18.365] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:14:18.365] ...future.rng), globalenv = if (FALSE) [13:14:18.365] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:14:18.365] ...future.globalenv.names)) [13:14:18.365] else NULL, started = ...future.startTime, version = "1.8") [13:14:18.365] }, condition = base::local({ [13:14:18.365] c <- base::c [13:14:18.365] inherits <- base::inherits [13:14:18.365] invokeRestart <- base::invokeRestart [13:14:18.365] length <- base::length [13:14:18.365] list <- base::list [13:14:18.365] seq.int <- base::seq.int [13:14:18.365] signalCondition <- base::signalCondition [13:14:18.365] sys.calls <- base::sys.calls [13:14:18.365] `[[` <- base::`[[` [13:14:18.365] `+` <- base::`+` [13:14:18.365] `<<-` <- base::`<<-` [13:14:18.365] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:14:18.365] calls[seq.int(from = from + 12L, to = length(calls) - [13:14:18.365] 3L)] [13:14:18.365] } [13:14:18.365] function(cond) { [13:14:18.365] is_error <- inherits(cond, "error") [13:14:18.365] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:14:18.365] NULL) [13:14:18.365] if (is_error) { [13:14:18.365] sessionInformation <- function() { [13:14:18.365] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:14:18.365] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:14:18.365] search = base::search(), system = base::Sys.info()) [13:14:18.365] } [13:14:18.365] ...future.conditions[[length(...future.conditions) + [13:14:18.365] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:14:18.365] cond$call), session = sessionInformation(), [13:14:18.365] timestamp = base::Sys.time(), signaled = 0L) [13:14:18.365] signalCondition(cond) [13:14:18.365] } [13:14:18.365] else if (!ignore && TRUE && inherits(cond, c("condition", [13:14:18.365] "immediateCondition"))) { [13:14:18.365] signal <- TRUE && inherits(cond, "immediateCondition") [13:14:18.365] ...future.conditions[[length(...future.conditions) + [13:14:18.365] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:14:18.365] if (TRUE && !signal) { [13:14:18.365] muffleCondition <- function (cond, pattern = "^muffle") [13:14:18.365] { [13:14:18.365] inherits <- base::inherits [13:14:18.365] invokeRestart <- base::invokeRestart [13:14:18.365] is.null <- base::is.null [13:14:18.365] muffled <- FALSE [13:14:18.365] if (inherits(cond, "message")) { [13:14:18.365] muffled <- grepl(pattern, "muffleMessage") [13:14:18.365] if (muffled) [13:14:18.365] invokeRestart("muffleMessage") [13:14:18.365] } [13:14:18.365] else if (inherits(cond, "warning")) { [13:14:18.365] muffled <- grepl(pattern, "muffleWarning") [13:14:18.365] if (muffled) [13:14:18.365] invokeRestart("muffleWarning") [13:14:18.365] } [13:14:18.365] else if (inherits(cond, "condition")) { [13:14:18.365] if (!is.null(pattern)) { [13:14:18.365] computeRestarts <- base::computeRestarts [13:14:18.365] grepl <- base::grepl [13:14:18.365] restarts <- computeRestarts(cond) [13:14:18.365] for (restart in restarts) { [13:14:18.365] name <- restart$name [13:14:18.365] if (is.null(name)) [13:14:18.365] next [13:14:18.365] if (!grepl(pattern, name)) [13:14:18.365] next [13:14:18.365] invokeRestart(restart) [13:14:18.365] muffled <- TRUE [13:14:18.365] break [13:14:18.365] } [13:14:18.365] } [13:14:18.365] } [13:14:18.365] invisible(muffled) [13:14:18.365] } [13:14:18.365] muffleCondition(cond, pattern = "^muffle") [13:14:18.365] } [13:14:18.365] } [13:14:18.365] else { [13:14:18.365] if (TRUE) { [13:14:18.365] muffleCondition <- function (cond, pattern = "^muffle") [13:14:18.365] { [13:14:18.365] inherits <- base::inherits [13:14:18.365] invokeRestart <- base::invokeRestart [13:14:18.365] is.null <- base::is.null [13:14:18.365] muffled <- FALSE [13:14:18.365] if (inherits(cond, "message")) { [13:14:18.365] muffled <- grepl(pattern, "muffleMessage") [13:14:18.365] if (muffled) [13:14:18.365] invokeRestart("muffleMessage") [13:14:18.365] } [13:14:18.365] else if (inherits(cond, "warning")) { [13:14:18.365] muffled <- grepl(pattern, "muffleWarning") [13:14:18.365] if (muffled) [13:14:18.365] invokeRestart("muffleWarning") [13:14:18.365] } [13:14:18.365] else if (inherits(cond, "condition")) { [13:14:18.365] if (!is.null(pattern)) { [13:14:18.365] computeRestarts <- base::computeRestarts [13:14:18.365] grepl <- base::grepl [13:14:18.365] restarts <- computeRestarts(cond) [13:14:18.365] for (restart in restarts) { [13:14:18.365] name <- restart$name [13:14:18.365] if (is.null(name)) [13:14:18.365] next [13:14:18.365] if (!grepl(pattern, name)) [13:14:18.365] next [13:14:18.365] invokeRestart(restart) [13:14:18.365] muffled <- TRUE [13:14:18.365] break [13:14:18.365] } [13:14:18.365] } [13:14:18.365] } [13:14:18.365] invisible(muffled) [13:14:18.365] } [13:14:18.365] muffleCondition(cond, pattern = "^muffle") [13:14:18.365] } [13:14:18.365] } [13:14:18.365] } [13:14:18.365] })) [13:14:18.365] }, error = function(ex) { [13:14:18.365] base::structure(base::list(value = NULL, visible = NULL, [13:14:18.365] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:14:18.365] ...future.rng), started = ...future.startTime, [13:14:18.365] finished = Sys.time(), session_uuid = NA_character_, [13:14:18.365] version = "1.8"), class = "FutureResult") [13:14:18.365] }, finally = { [13:14:18.365] if (!identical(...future.workdir, getwd())) [13:14:18.365] setwd(...future.workdir) [13:14:18.365] { [13:14:18.365] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:14:18.365] ...future.oldOptions$nwarnings <- NULL [13:14:18.365] } [13:14:18.365] base::options(...future.oldOptions) [13:14:18.365] if (.Platform$OS.type == "windows") { [13:14:18.365] old_names <- names(...future.oldEnvVars) [13:14:18.365] envs <- base::Sys.getenv() [13:14:18.365] names <- names(envs) [13:14:18.365] common <- intersect(names, old_names) [13:14:18.365] added <- setdiff(names, old_names) [13:14:18.365] removed <- setdiff(old_names, names) [13:14:18.365] changed <- common[...future.oldEnvVars[common] != [13:14:18.365] envs[common]] [13:14:18.365] NAMES <- toupper(changed) [13:14:18.365] args <- list() [13:14:18.365] for (kk in seq_along(NAMES)) { [13:14:18.365] name <- changed[[kk]] [13:14:18.365] NAME <- NAMES[[kk]] [13:14:18.365] if (name != NAME && is.element(NAME, old_names)) [13:14:18.365] next [13:14:18.365] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:18.365] } [13:14:18.365] NAMES <- toupper(added) [13:14:18.365] for (kk in seq_along(NAMES)) { [13:14:18.365] name <- added[[kk]] [13:14:18.365] NAME <- NAMES[[kk]] [13:14:18.365] if (name != NAME && is.element(NAME, old_names)) [13:14:18.365] next [13:14:18.365] args[[name]] <- "" [13:14:18.365] } [13:14:18.365] NAMES <- toupper(removed) [13:14:18.365] for (kk in seq_along(NAMES)) { [13:14:18.365] name <- removed[[kk]] [13:14:18.365] NAME <- NAMES[[kk]] [13:14:18.365] if (name != NAME && is.element(NAME, old_names)) [13:14:18.365] next [13:14:18.365] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:18.365] } [13:14:18.365] if (length(args) > 0) [13:14:18.365] base::do.call(base::Sys.setenv, args = args) [13:14:18.365] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:14:18.365] } [13:14:18.365] else { [13:14:18.365] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:14:18.365] } [13:14:18.365] { [13:14:18.365] if (base::length(...future.futureOptionsAdded) > [13:14:18.365] 0L) { [13:14:18.365] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:14:18.365] base::names(opts) <- ...future.futureOptionsAdded [13:14:18.365] base::options(opts) [13:14:18.365] } [13:14:18.365] { [13:14:18.365] { [13:14:18.365] base::options(mc.cores = ...future.mc.cores.old) [13:14:18.365] NULL [13:14:18.365] } [13:14:18.365] options(future.plan = NULL) [13:14:18.365] if (is.na(NA_character_)) [13:14:18.365] Sys.unsetenv("R_FUTURE_PLAN") [13:14:18.365] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:14:18.365] future::plan(list(function (..., workers = availableCores(), [13:14:18.365] lazy = FALSE, rscript_libs = .libPaths(), [13:14:18.365] envir = parent.frame()) [13:14:18.365] { [13:14:18.365] if (is.function(workers)) [13:14:18.365] workers <- workers() [13:14:18.365] workers <- structure(as.integer(workers), [13:14:18.365] class = class(workers)) [13:14:18.365] stop_if_not(length(workers) == 1, is.finite(workers), [13:14:18.365] workers >= 1) [13:14:18.365] if (workers == 1L && !inherits(workers, "AsIs")) { [13:14:18.365] return(sequential(..., lazy = TRUE, envir = envir)) [13:14:18.365] } [13:14:18.365] future <- MultisessionFuture(..., workers = workers, [13:14:18.365] lazy = lazy, rscript_libs = rscript_libs, [13:14:18.365] envir = envir) [13:14:18.365] if (!future$lazy) [13:14:18.365] future <- run(future) [13:14:18.365] invisible(future) [13:14:18.365] }), .cleanup = FALSE, .init = FALSE) [13:14:18.365] } [13:14:18.365] } [13:14:18.365] } [13:14:18.365] }) [13:14:18.365] if (TRUE) { [13:14:18.365] base::sink(type = "output", split = FALSE) [13:14:18.365] if (TRUE) { [13:14:18.365] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:14:18.365] } [13:14:18.365] else { [13:14:18.365] ...future.result["stdout"] <- base::list(NULL) [13:14:18.365] } [13:14:18.365] base::close(...future.stdout) [13:14:18.365] ...future.stdout <- NULL [13:14:18.365] } [13:14:18.365] ...future.result$conditions <- ...future.conditions [13:14:18.365] ...future.result$finished <- base::Sys.time() [13:14:18.365] ...future.result [13:14:18.365] } [13:14:18.371] Exporting 11 global objects (94.95 KiB) to cluster node #1 ... [13:14:18.371] Exporting '...future.FUN' (21.22 KiB) to cluster node #1 ... [13:14:18.371] Exporting '...future.FUN' (21.22 KiB) to cluster node #1 ... DONE [13:14:18.372] Exporting 'x_FUN' (2.90 KiB) to cluster node #1 ... [13:14:18.372] Exporting 'x_FUN' (2.90 KiB) to cluster node #1 ... DONE [13:14:18.372] Exporting 'times' (56 bytes) to cluster node #1 ... [13:14:18.373] Exporting 'times' (56 bytes) to cluster node #1 ... DONE [13:14:18.373] Exporting 'stopf' (26.43 KiB) to cluster node #1 ... [13:14:18.373] Exporting 'stopf' (26.43 KiB) to cluster node #1 ... DONE [13:14:18.373] Exporting 'stop_if_not' (44.12 KiB) to cluster node #1 ... [13:14:18.374] Exporting 'stop_if_not' (44.12 KiB) to cluster node #1 ... DONE [13:14:18.374] Exporting 'dim' (56 bytes) to cluster node #1 ... [13:14:18.374] Exporting 'dim' (56 bytes) to cluster node #1 ... DONE [13:14:18.375] Exporting 'valid_types' (176 bytes) to cluster node #1 ... [13:14:18.375] Exporting 'valid_types' (176 bytes) to cluster node #1 ... DONE [13:14:18.375] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... [13:14:18.376] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... DONE [13:14:18.376] Exporting '...future.elements_ii' (280 bytes) to cluster node #1 ... [13:14:18.376] Exporting '...future.elements_ii' (280 bytes) to cluster node #1 ... DONE [13:14:18.376] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:14:18.377] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:14:18.377] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:14:18.377] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:14:18.378] Exporting 11 global objects (94.95 KiB) to cluster node #1 ... DONE [13:14:18.378] MultisessionFuture started [13:14:18.378] - Launch lazy future ... done [13:14:18.379] run() for 'MultisessionFuture' ... done [13:14:18.379] Created future: [13:14:18.397] receiveMessageFromWorker() for ClusterFuture ... [13:14:18.397] - Validating connection of MultisessionFuture [13:14:18.397] - received message: FutureResult [13:14:18.397] - Received FutureResult [13:14:18.398] - Erased future from FutureRegistry [13:14:18.398] result() for ClusterFuture ... [13:14:18.398] - result already collected: FutureResult [13:14:18.398] result() for ClusterFuture ... done [13:14:18.398] receiveMessageFromWorker() for ClusterFuture ... done [13:14:18.379] MultisessionFuture: [13:14:18.379] Label: 'future_vapply-2' [13:14:18.379] Expression: [13:14:18.379] { [13:14:18.379] do.call(function(...) { [13:14:18.379] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:18.379] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:18.379] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:18.379] on.exit(options(oopts), add = TRUE) [13:14:18.379] } [13:14:18.379] { [13:14:18.379] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:18.379] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:18.379] ...future.FUN(...future.X_jj, ...) [13:14:18.379] }) [13:14:18.379] } [13:14:18.379] }, args = future.call.arguments) [13:14:18.379] } [13:14:18.379] Lazy evaluation: FALSE [13:14:18.379] Asynchronous evaluation: TRUE [13:14:18.379] Local evaluation: TRUE [13:14:18.379] Environment: R_GlobalEnv [13:14:18.379] Capture standard output: TRUE [13:14:18.379] Capture condition classes: 'condition' (excluding 'nothing') [13:14:18.379] Globals: 11 objects totaling 95.23 KiB (function '...future.FUN' of 21.22 KiB, function 'x_FUN' of 2.90 KiB, integer 'times' of 56 bytes, function 'stopf' of 26.43 KiB, function 'stop_if_not' of 44.12 KiB, ...) [13:14:18.379] Packages: 1 packages ('future.apply') [13:14:18.379] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:14:18.379] Resolved: TRUE [13:14:18.379] Value: [13:14:18.379] Conditions captured: [13:14:18.379] Early signaling: FALSE [13:14:18.379] Owner process: 1bb7d580-628d-c90d-e38a-66de485868c4 [13:14:18.379] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:14:18.399] Chunk #2 of 2 ... DONE [13:14:18.399] Launching 2 futures (chunks) ... DONE [13:14:18.399] Resolving 2 futures (chunks) ... [13:14:18.399] resolve() on list ... [13:14:18.399] recursive: 0 [13:14:18.399] length: 2 [13:14:18.400] [13:14:18.400] Future #1 [13:14:18.400] result() for ClusterFuture ... [13:14:18.400] - result already collected: FutureResult [13:14:18.400] result() for ClusterFuture ... done [13:14:18.400] result() for ClusterFuture ... [13:14:18.401] - result already collected: FutureResult [13:14:18.401] result() for ClusterFuture ... done [13:14:18.401] signalConditionsASAP(MultisessionFuture, pos=1) ... [13:14:18.401] - nx: 2 [13:14:18.401] - relay: TRUE [13:14:18.401] - stdout: TRUE [13:14:18.402] - signal: TRUE [13:14:18.402] - resignal: FALSE [13:14:18.402] - force: TRUE [13:14:18.402] - relayed: [n=2] FALSE, FALSE [13:14:18.402] - queued futures: [n=2] FALSE, FALSE [13:14:18.402] - until=1 [13:14:18.402] - relaying element #1 [13:14:18.403] result() for ClusterFuture ... [13:14:18.403] - result already collected: FutureResult [13:14:18.403] result() for ClusterFuture ... done [13:14:18.403] result() for ClusterFuture ... [13:14:18.403] - result already collected: FutureResult [13:14:18.403] result() for ClusterFuture ... done [13:14:18.404] result() for ClusterFuture ... [13:14:18.404] - result already collected: FutureResult [13:14:18.404] result() for ClusterFuture ... done [13:14:18.404] result() for ClusterFuture ... [13:14:18.404] - result already collected: FutureResult [13:14:18.404] result() for ClusterFuture ... done [13:14:18.405] - relayed: [n=2] TRUE, FALSE [13:14:18.405] - queued futures: [n=2] TRUE, FALSE [13:14:18.405] signalConditionsASAP(MultisessionFuture, pos=1) ... done [13:14:18.405] length: 1 (resolved future 1) [13:14:18.405] Future #2 [13:14:18.405] result() for ClusterFuture ... [13:14:18.406] - result already collected: FutureResult [13:14:18.406] result() for ClusterFuture ... done [13:14:18.406] result() for ClusterFuture ... [13:14:18.406] - result already collected: FutureResult [13:14:18.406] result() for ClusterFuture ... done [13:14:18.406] signalConditionsASAP(MultisessionFuture, pos=2) ... [13:14:18.407] - nx: 2 [13:14:18.407] - relay: TRUE [13:14:18.407] - stdout: TRUE [13:14:18.407] - signal: TRUE [13:14:18.407] - resignal: FALSE [13:14:18.407] - force: TRUE [13:14:18.407] - relayed: [n=2] TRUE, FALSE [13:14:18.408] - queued futures: [n=2] TRUE, FALSE [13:14:18.408] - until=2 [13:14:18.408] - relaying element #2 [13:14:18.408] result() for ClusterFuture ... [13:14:18.408] - result already collected: FutureResult [13:14:18.408] result() for ClusterFuture ... done [13:14:18.409] result() for ClusterFuture ... [13:14:18.409] - result already collected: FutureResult [13:14:18.409] result() for ClusterFuture ... done [13:14:18.409] result() for ClusterFuture ... [13:14:18.409] - result already collected: FutureResult [13:14:18.409] result() for ClusterFuture ... done [13:14:18.410] result() for ClusterFuture ... [13:14:18.410] - result already collected: FutureResult [13:14:18.410] result() for ClusterFuture ... done [13:14:18.410] - relayed: [n=2] TRUE, TRUE [13:14:18.410] - queued futures: [n=2] TRUE, TRUE [13:14:18.410] signalConditionsASAP(MultisessionFuture, pos=2) ... done [13:14:18.410] length: 0 (resolved future 2) [13:14:18.411] Relaying remaining futures [13:14:18.411] signalConditionsASAP(NULL, pos=0) ... [13:14:18.411] - nx: 2 [13:14:18.411] - relay: TRUE [13:14:18.411] - stdout: TRUE [13:14:18.411] - signal: TRUE [13:14:18.412] - resignal: FALSE [13:14:18.412] - force: TRUE [13:14:18.412] - relayed: [n=2] TRUE, TRUE [13:14:18.412] - queued futures: [n=2] TRUE, TRUE - flush all [13:14:18.412] - relayed: [n=2] TRUE, TRUE [13:14:18.412] - queued futures: [n=2] TRUE, TRUE [13:14:18.413] signalConditionsASAP(NULL, pos=0) ... done [13:14:18.413] resolve() on list ... DONE [13:14:18.413] result() for ClusterFuture ... [13:14:18.413] - result already collected: FutureResult [13:14:18.413] result() for ClusterFuture ... done [13:14:18.413] result() for ClusterFuture ... [13:14:18.414] - result already collected: FutureResult [13:14:18.414] result() for ClusterFuture ... done [13:14:18.414] result() for ClusterFuture ... [13:14:18.414] - result already collected: FutureResult [13:14:18.414] result() for ClusterFuture ... done [13:14:18.414] result() for ClusterFuture ... [13:14:18.414] - result already collected: FutureResult [13:14:18.415] result() for ClusterFuture ... done [13:14:18.415] - Number of value chunks collected: 2 [13:14:18.415] Resolving 2 futures (chunks) ... DONE [13:14:18.415] Reducing values from 2 chunks ... [13:14:18.415] - Number of values collected after concatenation: 10 [13:14:18.415] - Number of values expected: 10 [13:14:18.416] Reducing values from 2 chunks ... DONE [13:14:18.416] future_lapply() ... DONE int [1:2, 1:2, 1:10] 1 1 1 1 2 2 2 2 3 3 ... num [1:2, 1:2, 1:10] 1 1 1 1 2 2 2 2 3 3 ... [13:14:18.417] future_lapply() ... [13:14:18.422] Number of chunks: 2 [13:14:18.422] getGlobalsAndPackagesXApply() ... [13:14:18.422] - future.globals: TRUE [13:14:18.422] getGlobalsAndPackages() ... [13:14:18.422] Searching for globals... [13:14:18.427] - globals found: [17] 'FUN', '{', '<-', 'x_FUN', 'if', '!=', 'length', 'times', 'stopf', 'stop_if_not', 'all', '==', 'dim', '%in%', 'typeof', 'valid_types', 'matrix' [13:14:18.427] Searching for globals ... DONE [13:14:18.427] Resolving globals: FALSE [13:14:18.428] The total size of the 7 globals is 95.02 KiB (97304 bytes) [13:14:18.429] The total size of the 7 globals exported for future expression ('FUN()') is 95.02 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). The three largest globals are 'stop_if_not' (44.12 KiB of class 'function'), 'stopf' (26.43 KiB of class 'function') and 'FUN' (21.22 KiB of class 'function') [13:14:18.429] - globals: [7] 'FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types' [13:14:18.429] - packages: [1] 'future.apply' [13:14:18.430] getGlobalsAndPackages() ... DONE [13:14:18.430] - globals found/used: [n=7] 'FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types' [13:14:18.430] - needed namespaces: [n=1] 'future.apply' [13:14:18.430] Finding globals ... DONE [13:14:18.430] - use_args: TRUE [13:14:18.430] - Getting '...' globals ... [13:14:18.431] resolve() on list ... [13:14:18.431] recursive: 0 [13:14:18.431] length: 1 [13:14:18.431] elements: '...' [13:14:18.431] length: 0 (resolved future 1) [13:14:18.432] resolve() on list ... DONE [13:14:18.432] - '...' content: [n=0] [13:14:18.432] List of 1 [13:14:18.432] $ ...: list() [13:14:18.432] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:14:18.432] - attr(*, "where")=List of 1 [13:14:18.432] ..$ ...: [13:14:18.432] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:14:18.432] - attr(*, "resolved")= logi TRUE [13:14:18.432] - attr(*, "total_size")= num NA [13:14:18.435] - Getting '...' globals ... DONE [13:14:18.435] Globals to be used in all futures (chunks): [n=8] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...' [13:14:18.435] List of 8 [13:14:18.435] $ ...future.FUN:function (x, ...) [13:14:18.435] $ x_FUN :function (x) [13:14:18.435] $ times : int 4 [13:14:18.435] $ stopf :function (fmt, ..., call. = TRUE, domain = NULL) [13:14:18.435] $ stop_if_not :function (...) [13:14:18.435] $ dim : int [1:2] 2 2 [13:14:18.435] $ valid_types : chr [1:3] "logical" "integer" "double" [13:14:18.435] $ ... : list() [13:14:18.435] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:14:18.435] - attr(*, "where")=List of 8 [13:14:18.435] ..$ ...future.FUN: [13:14:18.435] ..$ x_FUN : [13:14:18.435] ..$ times : [13:14:18.435] ..$ stopf : [13:14:18.435] ..$ stop_if_not : [13:14:18.435] ..$ dim : [13:14:18.435] ..$ valid_types : [13:14:18.435] ..$ ... : [13:14:18.435] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:14:18.435] - attr(*, "resolved")= logi FALSE [13:14:18.435] - attr(*, "total_size")= num 97304 [13:14:18.442] Packages to be attached in all futures: [n=1] 'future.apply' [13:14:18.443] getGlobalsAndPackagesXApply() ... DONE [13:14:18.443] Number of futures (= number of chunks): 2 [13:14:18.443] Launching 2 futures (chunks) ... [13:14:18.443] Chunk #1 of 2 ... [13:14:18.443] - Finding globals in 'X' for chunk #1 ... [13:14:18.444] getGlobalsAndPackages() ... [13:14:18.444] Searching for globals... [13:14:18.444] [13:14:18.444] Searching for globals ... DONE [13:14:18.444] - globals: [0] [13:14:18.445] getGlobalsAndPackages() ... DONE [13:14:18.445] + additional globals found: [n=0] [13:14:18.445] + additional namespaces needed: [n=0] [13:14:18.445] - Finding globals in 'X' for chunk #1 ... DONE [13:14:18.445] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:14:18.445] - seeds: [13:14:18.446] - All globals exported: [n=11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:18.446] getGlobalsAndPackages() ... [13:14:18.446] - globals passed as-is: [11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:18.446] Resolving globals: FALSE [13:14:18.446] Tweak future expression to call with '...' arguments ... [13:14:18.446] { [13:14:18.446] do.call(function(...) { [13:14:18.446] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:18.446] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:18.446] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:18.446] on.exit(options(oopts), add = TRUE) [13:14:18.446] } [13:14:18.446] { [13:14:18.446] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:18.446] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:18.446] ...future.FUN(...future.X_jj, ...) [13:14:18.446] }) [13:14:18.446] } [13:14:18.446] }, args = future.call.arguments) [13:14:18.446] } [13:14:18.447] Tweak future expression to call with '...' arguments ... DONE [13:14:18.448] - globals: [11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:18.448] - packages: [1] 'future.apply' [13:14:18.448] getGlobalsAndPackages() ... DONE [13:14:18.448] run() for 'Future' ... [13:14:18.449] - state: 'created' [13:14:18.449] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:14:18.463] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:14:18.463] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:14:18.463] - Field: 'node' [13:14:18.463] - Field: 'label' [13:14:18.464] - Field: 'local' [13:14:18.464] - Field: 'owner' [13:14:18.466] - Field: 'envir' [13:14:18.466] - Field: 'workers' [13:14:18.467] - Field: 'packages' [13:14:18.467] - Field: 'gc' [13:14:18.467] - Field: 'conditions' [13:14:18.467] - Field: 'persistent' [13:14:18.467] - Field: 'expr' [13:14:18.467] - Field: 'uuid' [13:14:18.468] - Field: 'seed' [13:14:18.468] - Field: 'version' [13:14:18.468] - Field: 'result' [13:14:18.468] - Field: 'asynchronous' [13:14:18.468] - Field: 'calls' [13:14:18.468] - Field: 'globals' [13:14:18.469] - Field: 'stdout' [13:14:18.469] - Field: 'earlySignal' [13:14:18.469] - Field: 'lazy' [13:14:18.469] - Field: 'state' [13:14:18.469] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:14:18.469] - Launch lazy future ... [13:14:18.470] Packages needed by the future expression (n = 1): 'future.apply' [13:14:18.470] Packages needed by future strategies (n = 0): [13:14:18.471] { [13:14:18.471] { [13:14:18.471] { [13:14:18.471] ...future.startTime <- base::Sys.time() [13:14:18.471] { [13:14:18.471] { [13:14:18.471] { [13:14:18.471] { [13:14:18.471] { [13:14:18.471] base::local({ [13:14:18.471] has_future <- base::requireNamespace("future", [13:14:18.471] quietly = TRUE) [13:14:18.471] if (has_future) { [13:14:18.471] ns <- base::getNamespace("future") [13:14:18.471] version <- ns[[".package"]][["version"]] [13:14:18.471] if (is.null(version)) [13:14:18.471] version <- utils::packageVersion("future") [13:14:18.471] } [13:14:18.471] else { [13:14:18.471] version <- NULL [13:14:18.471] } [13:14:18.471] if (!has_future || version < "1.8.0") { [13:14:18.471] info <- base::c(r_version = base::gsub("R version ", [13:14:18.471] "", base::R.version$version.string), [13:14:18.471] platform = base::sprintf("%s (%s-bit)", [13:14:18.471] base::R.version$platform, 8 * [13:14:18.471] base::.Machine$sizeof.pointer), [13:14:18.471] os = base::paste(base::Sys.info()[base::c("sysname", [13:14:18.471] "release", "version")], collapse = " "), [13:14:18.471] hostname = base::Sys.info()[["nodename"]]) [13:14:18.471] info <- base::sprintf("%s: %s", base::names(info), [13:14:18.471] info) [13:14:18.471] info <- base::paste(info, collapse = "; ") [13:14:18.471] if (!has_future) { [13:14:18.471] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:14:18.471] info) [13:14:18.471] } [13:14:18.471] else { [13:14:18.471] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:14:18.471] info, version) [13:14:18.471] } [13:14:18.471] base::stop(msg) [13:14:18.471] } [13:14:18.471] }) [13:14:18.471] } [13:14:18.471] ...future.mc.cores.old <- base::getOption("mc.cores") [13:14:18.471] base::options(mc.cores = 1L) [13:14:18.471] } [13:14:18.471] base::local({ [13:14:18.471] for (pkg in "future.apply") { [13:14:18.471] base::loadNamespace(pkg) [13:14:18.471] base::library(pkg, character.only = TRUE) [13:14:18.471] } [13:14:18.471] }) [13:14:18.471] } [13:14:18.471] options(future.plan = NULL) [13:14:18.471] Sys.unsetenv("R_FUTURE_PLAN") [13:14:18.471] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:14:18.471] } [13:14:18.471] ...future.workdir <- getwd() [13:14:18.471] } [13:14:18.471] ...future.oldOptions <- base::as.list(base::.Options) [13:14:18.471] ...future.oldEnvVars <- base::Sys.getenv() [13:14:18.471] } [13:14:18.471] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:14:18.471] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:14:18.471] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:14:18.471] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:14:18.471] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:14:18.471] future.stdout.windows.reencode = NULL, width = 80L) [13:14:18.471] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:14:18.471] base::names(...future.oldOptions)) [13:14:18.471] } [13:14:18.471] if (FALSE) { [13:14:18.471] } [13:14:18.471] else { [13:14:18.471] if (TRUE) { [13:14:18.471] ...future.stdout <- base::rawConnection(base::raw(0L), [13:14:18.471] open = "w") [13:14:18.471] } [13:14:18.471] else { [13:14:18.471] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:14:18.471] windows = "NUL", "/dev/null"), open = "w") [13:14:18.471] } [13:14:18.471] base::sink(...future.stdout, type = "output", split = FALSE) [13:14:18.471] base::on.exit(if (!base::is.null(...future.stdout)) { [13:14:18.471] base::sink(type = "output", split = FALSE) [13:14:18.471] base::close(...future.stdout) [13:14:18.471] }, add = TRUE) [13:14:18.471] } [13:14:18.471] ...future.frame <- base::sys.nframe() [13:14:18.471] ...future.conditions <- base::list() [13:14:18.471] ...future.rng <- base::globalenv()$.Random.seed [13:14:18.471] if (FALSE) { [13:14:18.471] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:14:18.471] "...future.value", "...future.globalenv.names", ".Random.seed") [13:14:18.471] } [13:14:18.471] ...future.result <- base::tryCatch({ [13:14:18.471] base::withCallingHandlers({ [13:14:18.471] ...future.value <- base::withVisible(base::local({ [13:14:18.471] ...future.makeSendCondition <- local({ [13:14:18.471] sendCondition <- NULL [13:14:18.471] function(frame = 1L) { [13:14:18.471] if (is.function(sendCondition)) [13:14:18.471] return(sendCondition) [13:14:18.471] ns <- getNamespace("parallel") [13:14:18.471] if (exists("sendData", mode = "function", [13:14:18.471] envir = ns)) { [13:14:18.471] parallel_sendData <- get("sendData", mode = "function", [13:14:18.471] envir = ns) [13:14:18.471] envir <- sys.frame(frame) [13:14:18.471] master <- NULL [13:14:18.471] while (!identical(envir, .GlobalEnv) && [13:14:18.471] !identical(envir, emptyenv())) { [13:14:18.471] if (exists("master", mode = "list", envir = envir, [13:14:18.471] inherits = FALSE)) { [13:14:18.471] master <- get("master", mode = "list", [13:14:18.471] envir = envir, inherits = FALSE) [13:14:18.471] if (inherits(master, c("SOCKnode", [13:14:18.471] "SOCK0node"))) { [13:14:18.471] sendCondition <<- function(cond) { [13:14:18.471] data <- list(type = "VALUE", value = cond, [13:14:18.471] success = TRUE) [13:14:18.471] parallel_sendData(master, data) [13:14:18.471] } [13:14:18.471] return(sendCondition) [13:14:18.471] } [13:14:18.471] } [13:14:18.471] frame <- frame + 1L [13:14:18.471] envir <- sys.frame(frame) [13:14:18.471] } [13:14:18.471] } [13:14:18.471] sendCondition <<- function(cond) NULL [13:14:18.471] } [13:14:18.471] }) [13:14:18.471] withCallingHandlers({ [13:14:18.471] { [13:14:18.471] do.call(function(...) { [13:14:18.471] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:18.471] if (!identical(...future.globals.maxSize.org, [13:14:18.471] ...future.globals.maxSize)) { [13:14:18.471] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:18.471] on.exit(options(oopts), add = TRUE) [13:14:18.471] } [13:14:18.471] { [13:14:18.471] lapply(seq_along(...future.elements_ii), [13:14:18.471] FUN = function(jj) { [13:14:18.471] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:18.471] ...future.FUN(...future.X_jj, ...) [13:14:18.471] }) [13:14:18.471] } [13:14:18.471] }, args = future.call.arguments) [13:14:18.471] } [13:14:18.471] }, immediateCondition = function(cond) { [13:14:18.471] sendCondition <- ...future.makeSendCondition() [13:14:18.471] sendCondition(cond) [13:14:18.471] muffleCondition <- function (cond, pattern = "^muffle") [13:14:18.471] { [13:14:18.471] inherits <- base::inherits [13:14:18.471] invokeRestart <- base::invokeRestart [13:14:18.471] is.null <- base::is.null [13:14:18.471] muffled <- FALSE [13:14:18.471] if (inherits(cond, "message")) { [13:14:18.471] muffled <- grepl(pattern, "muffleMessage") [13:14:18.471] if (muffled) [13:14:18.471] invokeRestart("muffleMessage") [13:14:18.471] } [13:14:18.471] else if (inherits(cond, "warning")) { [13:14:18.471] muffled <- grepl(pattern, "muffleWarning") [13:14:18.471] if (muffled) [13:14:18.471] invokeRestart("muffleWarning") [13:14:18.471] } [13:14:18.471] else if (inherits(cond, "condition")) { [13:14:18.471] if (!is.null(pattern)) { [13:14:18.471] computeRestarts <- base::computeRestarts [13:14:18.471] grepl <- base::grepl [13:14:18.471] restarts <- computeRestarts(cond) [13:14:18.471] for (restart in restarts) { [13:14:18.471] name <- restart$name [13:14:18.471] if (is.null(name)) [13:14:18.471] next [13:14:18.471] if (!grepl(pattern, name)) [13:14:18.471] next [13:14:18.471] invokeRestart(restart) [13:14:18.471] muffled <- TRUE [13:14:18.471] break [13:14:18.471] } [13:14:18.471] } [13:14:18.471] } [13:14:18.471] invisible(muffled) [13:14:18.471] } [13:14:18.471] muffleCondition(cond) [13:14:18.471] }) [13:14:18.471] })) [13:14:18.471] future::FutureResult(value = ...future.value$value, [13:14:18.471] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:14:18.471] ...future.rng), globalenv = if (FALSE) [13:14:18.471] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:14:18.471] ...future.globalenv.names)) [13:14:18.471] else NULL, started = ...future.startTime, version = "1.8") [13:14:18.471] }, condition = base::local({ [13:14:18.471] c <- base::c [13:14:18.471] inherits <- base::inherits [13:14:18.471] invokeRestart <- base::invokeRestart [13:14:18.471] length <- base::length [13:14:18.471] list <- base::list [13:14:18.471] seq.int <- base::seq.int [13:14:18.471] signalCondition <- base::signalCondition [13:14:18.471] sys.calls <- base::sys.calls [13:14:18.471] `[[` <- base::`[[` [13:14:18.471] `+` <- base::`+` [13:14:18.471] `<<-` <- base::`<<-` [13:14:18.471] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:14:18.471] calls[seq.int(from = from + 12L, to = length(calls) - [13:14:18.471] 3L)] [13:14:18.471] } [13:14:18.471] function(cond) { [13:14:18.471] is_error <- inherits(cond, "error") [13:14:18.471] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:14:18.471] NULL) [13:14:18.471] if (is_error) { [13:14:18.471] sessionInformation <- function() { [13:14:18.471] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:14:18.471] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:14:18.471] search = base::search(), system = base::Sys.info()) [13:14:18.471] } [13:14:18.471] ...future.conditions[[length(...future.conditions) + [13:14:18.471] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:14:18.471] cond$call), session = sessionInformation(), [13:14:18.471] timestamp = base::Sys.time(), signaled = 0L) [13:14:18.471] signalCondition(cond) [13:14:18.471] } [13:14:18.471] else if (!ignore && TRUE && inherits(cond, c("condition", [13:14:18.471] "immediateCondition"))) { [13:14:18.471] signal <- TRUE && inherits(cond, "immediateCondition") [13:14:18.471] ...future.conditions[[length(...future.conditions) + [13:14:18.471] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:14:18.471] if (TRUE && !signal) { [13:14:18.471] muffleCondition <- function (cond, pattern = "^muffle") [13:14:18.471] { [13:14:18.471] inherits <- base::inherits [13:14:18.471] invokeRestart <- base::invokeRestart [13:14:18.471] is.null <- base::is.null [13:14:18.471] muffled <- FALSE [13:14:18.471] if (inherits(cond, "message")) { [13:14:18.471] muffled <- grepl(pattern, "muffleMessage") [13:14:18.471] if (muffled) [13:14:18.471] invokeRestart("muffleMessage") [13:14:18.471] } [13:14:18.471] else if (inherits(cond, "warning")) { [13:14:18.471] muffled <- grepl(pattern, "muffleWarning") [13:14:18.471] if (muffled) [13:14:18.471] invokeRestart("muffleWarning") [13:14:18.471] } [13:14:18.471] else if (inherits(cond, "condition")) { [13:14:18.471] if (!is.null(pattern)) { [13:14:18.471] computeRestarts <- base::computeRestarts [13:14:18.471] grepl <- base::grepl [13:14:18.471] restarts <- computeRestarts(cond) [13:14:18.471] for (restart in restarts) { [13:14:18.471] name <- restart$name [13:14:18.471] if (is.null(name)) [13:14:18.471] next [13:14:18.471] if (!grepl(pattern, name)) [13:14:18.471] next [13:14:18.471] invokeRestart(restart) [13:14:18.471] muffled <- TRUE [13:14:18.471] break [13:14:18.471] } [13:14:18.471] } [13:14:18.471] } [13:14:18.471] invisible(muffled) [13:14:18.471] } [13:14:18.471] muffleCondition(cond, pattern = "^muffle") [13:14:18.471] } [13:14:18.471] } [13:14:18.471] else { [13:14:18.471] if (TRUE) { [13:14:18.471] muffleCondition <- function (cond, pattern = "^muffle") [13:14:18.471] { [13:14:18.471] inherits <- base::inherits [13:14:18.471] invokeRestart <- base::invokeRestart [13:14:18.471] is.null <- base::is.null [13:14:18.471] muffled <- FALSE [13:14:18.471] if (inherits(cond, "message")) { [13:14:18.471] muffled <- grepl(pattern, "muffleMessage") [13:14:18.471] if (muffled) [13:14:18.471] invokeRestart("muffleMessage") [13:14:18.471] } [13:14:18.471] else if (inherits(cond, "warning")) { [13:14:18.471] muffled <- grepl(pattern, "muffleWarning") [13:14:18.471] if (muffled) [13:14:18.471] invokeRestart("muffleWarning") [13:14:18.471] } [13:14:18.471] else if (inherits(cond, "condition")) { [13:14:18.471] if (!is.null(pattern)) { [13:14:18.471] computeRestarts <- base::computeRestarts [13:14:18.471] grepl <- base::grepl [13:14:18.471] restarts <- computeRestarts(cond) [13:14:18.471] for (restart in restarts) { [13:14:18.471] name <- restart$name [13:14:18.471] if (is.null(name)) [13:14:18.471] next [13:14:18.471] if (!grepl(pattern, name)) [13:14:18.471] next [13:14:18.471] invokeRestart(restart) [13:14:18.471] muffled <- TRUE [13:14:18.471] break [13:14:18.471] } [13:14:18.471] } [13:14:18.471] } [13:14:18.471] invisible(muffled) [13:14:18.471] } [13:14:18.471] muffleCondition(cond, pattern = "^muffle") [13:14:18.471] } [13:14:18.471] } [13:14:18.471] } [13:14:18.471] })) [13:14:18.471] }, error = function(ex) { [13:14:18.471] base::structure(base::list(value = NULL, visible = NULL, [13:14:18.471] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:14:18.471] ...future.rng), started = ...future.startTime, [13:14:18.471] finished = Sys.time(), session_uuid = NA_character_, [13:14:18.471] version = "1.8"), class = "FutureResult") [13:14:18.471] }, finally = { [13:14:18.471] if (!identical(...future.workdir, getwd())) [13:14:18.471] setwd(...future.workdir) [13:14:18.471] { [13:14:18.471] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:14:18.471] ...future.oldOptions$nwarnings <- NULL [13:14:18.471] } [13:14:18.471] base::options(...future.oldOptions) [13:14:18.471] if (.Platform$OS.type == "windows") { [13:14:18.471] old_names <- names(...future.oldEnvVars) [13:14:18.471] envs <- base::Sys.getenv() [13:14:18.471] names <- names(envs) [13:14:18.471] common <- intersect(names, old_names) [13:14:18.471] added <- setdiff(names, old_names) [13:14:18.471] removed <- setdiff(old_names, names) [13:14:18.471] changed <- common[...future.oldEnvVars[common] != [13:14:18.471] envs[common]] [13:14:18.471] NAMES <- toupper(changed) [13:14:18.471] args <- list() [13:14:18.471] for (kk in seq_along(NAMES)) { [13:14:18.471] name <- changed[[kk]] [13:14:18.471] NAME <- NAMES[[kk]] [13:14:18.471] if (name != NAME && is.element(NAME, old_names)) [13:14:18.471] next [13:14:18.471] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:18.471] } [13:14:18.471] NAMES <- toupper(added) [13:14:18.471] for (kk in seq_along(NAMES)) { [13:14:18.471] name <- added[[kk]] [13:14:18.471] NAME <- NAMES[[kk]] [13:14:18.471] if (name != NAME && is.element(NAME, old_names)) [13:14:18.471] next [13:14:18.471] args[[name]] <- "" [13:14:18.471] } [13:14:18.471] NAMES <- toupper(removed) [13:14:18.471] for (kk in seq_along(NAMES)) { [13:14:18.471] name <- removed[[kk]] [13:14:18.471] NAME <- NAMES[[kk]] [13:14:18.471] if (name != NAME && is.element(NAME, old_names)) [13:14:18.471] next [13:14:18.471] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:18.471] } [13:14:18.471] if (length(args) > 0) [13:14:18.471] base::do.call(base::Sys.setenv, args = args) [13:14:18.471] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:14:18.471] } [13:14:18.471] else { [13:14:18.471] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:14:18.471] } [13:14:18.471] { [13:14:18.471] if (base::length(...future.futureOptionsAdded) > [13:14:18.471] 0L) { [13:14:18.471] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:14:18.471] base::names(opts) <- ...future.futureOptionsAdded [13:14:18.471] base::options(opts) [13:14:18.471] } [13:14:18.471] { [13:14:18.471] { [13:14:18.471] base::options(mc.cores = ...future.mc.cores.old) [13:14:18.471] NULL [13:14:18.471] } [13:14:18.471] options(future.plan = NULL) [13:14:18.471] if (is.na(NA_character_)) [13:14:18.471] Sys.unsetenv("R_FUTURE_PLAN") [13:14:18.471] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:14:18.471] future::plan(list(function (..., workers = availableCores(), [13:14:18.471] lazy = FALSE, rscript_libs = .libPaths(), [13:14:18.471] envir = parent.frame()) [13:14:18.471] { [13:14:18.471] if (is.function(workers)) [13:14:18.471] workers <- workers() [13:14:18.471] workers <- structure(as.integer(workers), [13:14:18.471] class = class(workers)) [13:14:18.471] stop_if_not(length(workers) == 1, is.finite(workers), [13:14:18.471] workers >= 1) [13:14:18.471] if (workers == 1L && !inherits(workers, "AsIs")) { [13:14:18.471] return(sequential(..., lazy = TRUE, envir = envir)) [13:14:18.471] } [13:14:18.471] future <- MultisessionFuture(..., workers = workers, [13:14:18.471] lazy = lazy, rscript_libs = rscript_libs, [13:14:18.471] envir = envir) [13:14:18.471] if (!future$lazy) [13:14:18.471] future <- run(future) [13:14:18.471] invisible(future) [13:14:18.471] }), .cleanup = FALSE, .init = FALSE) [13:14:18.471] } [13:14:18.471] } [13:14:18.471] } [13:14:18.471] }) [13:14:18.471] if (TRUE) { [13:14:18.471] base::sink(type = "output", split = FALSE) [13:14:18.471] if (TRUE) { [13:14:18.471] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:14:18.471] } [13:14:18.471] else { [13:14:18.471] ...future.result["stdout"] <- base::list(NULL) [13:14:18.471] } [13:14:18.471] base::close(...future.stdout) [13:14:18.471] ...future.stdout <- NULL [13:14:18.471] } [13:14:18.471] ...future.result$conditions <- ...future.conditions [13:14:18.471] ...future.result$finished <- base::Sys.time() [13:14:18.471] ...future.result [13:14:18.471] } [13:14:18.476] Exporting 11 global objects (95.02 KiB) to cluster node #1 ... [13:14:18.476] Exporting '...future.FUN' (21.22 KiB) to cluster node #1 ... [13:14:18.477] Exporting '...future.FUN' (21.22 KiB) to cluster node #1 ... DONE [13:14:18.477] Exporting 'x_FUN' (2.90 KiB) to cluster node #1 ... [13:14:18.477] Exporting 'x_FUN' (2.90 KiB) to cluster node #1 ... DONE [13:14:18.478] Exporting 'times' (56 bytes) to cluster node #1 ... [13:14:18.478] Exporting 'times' (56 bytes) to cluster node #1 ... DONE [13:14:18.478] Exporting 'stopf' (26.43 KiB) to cluster node #1 ... [13:14:18.479] Exporting 'stopf' (26.43 KiB) to cluster node #1 ... DONE [13:14:18.479] Exporting 'stop_if_not' (44.12 KiB) to cluster node #1 ... [13:14:18.479] Exporting 'stop_if_not' (44.12 KiB) to cluster node #1 ... DONE [13:14:18.479] Exporting 'dim' (56 bytes) to cluster node #1 ... [13:14:18.480] Exporting 'dim' (56 bytes) to cluster node #1 ... DONE [13:14:18.480] Exporting 'valid_types' (248 bytes) to cluster node #1 ... [13:14:18.480] Exporting 'valid_types' (248 bytes) to cluster node #1 ... DONE [13:14:18.481] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... [13:14:18.481] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... DONE [13:14:18.481] Exporting '...future.elements_ii' (280 bytes) to cluster node #1 ... [13:14:18.482] Exporting '...future.elements_ii' (280 bytes) to cluster node #1 ... DONE [13:14:18.482] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:14:18.482] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:14:18.482] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:14:18.483] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:14:18.483] Exporting 11 global objects (95.02 KiB) to cluster node #1 ... DONE [13:14:18.483] MultisessionFuture started [13:14:18.484] - Launch lazy future ... done [13:14:18.484] run() for 'MultisessionFuture' ... done [13:14:18.484] Created future: [13:14:18.501] receiveMessageFromWorker() for ClusterFuture ... [13:14:18.501] - Validating connection of MultisessionFuture [13:14:18.501] - received message: FutureResult [13:14:18.502] - Received FutureResult [13:14:18.502] - Erased future from FutureRegistry [13:14:18.502] result() for ClusterFuture ... [13:14:18.502] - result already collected: FutureResult [13:14:18.502] result() for ClusterFuture ... done [13:14:18.503] receiveMessageFromWorker() for ClusterFuture ... done [13:14:18.484] MultisessionFuture: [13:14:18.484] Label: 'future_vapply-1' [13:14:18.484] Expression: [13:14:18.484] { [13:14:18.484] do.call(function(...) { [13:14:18.484] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:18.484] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:18.484] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:18.484] on.exit(options(oopts), add = TRUE) [13:14:18.484] } [13:14:18.484] { [13:14:18.484] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:18.484] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:18.484] ...future.FUN(...future.X_jj, ...) [13:14:18.484] }) [13:14:18.484] } [13:14:18.484] }, args = future.call.arguments) [13:14:18.484] } [13:14:18.484] Lazy evaluation: FALSE [13:14:18.484] Asynchronous evaluation: TRUE [13:14:18.484] Local evaluation: TRUE [13:14:18.484] Environment: R_GlobalEnv [13:14:18.484] Capture standard output: TRUE [13:14:18.484] Capture condition classes: 'condition' (excluding 'nothing') [13:14:18.484] Globals: 11 objects totaling 95.30 KiB (function '...future.FUN' of 21.22 KiB, function 'x_FUN' of 2.90 KiB, integer 'times' of 56 bytes, function 'stopf' of 26.43 KiB, function 'stop_if_not' of 44.12 KiB, ...) [13:14:18.484] Packages: 1 packages ('future.apply') [13:14:18.484] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:14:18.484] Resolved: TRUE [13:14:18.484] Value: [13:14:18.484] Conditions captured: [13:14:18.484] Early signaling: FALSE [13:14:18.484] Owner process: 1bb7d580-628d-c90d-e38a-66de485868c4 [13:14:18.484] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:14:18.503] Chunk #1 of 2 ... DONE [13:14:18.503] Chunk #2 of 2 ... [13:14:18.503] - Finding globals in 'X' for chunk #2 ... [13:14:18.504] getGlobalsAndPackages() ... [13:14:18.504] Searching for globals... [13:14:18.504] [13:14:18.504] Searching for globals ... DONE [13:14:18.504] - globals: [0] [13:14:18.505] getGlobalsAndPackages() ... DONE [13:14:18.505] + additional globals found: [n=0] [13:14:18.505] + additional namespaces needed: [n=0] [13:14:18.505] - Finding globals in 'X' for chunk #2 ... DONE [13:14:18.505] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:14:18.505] - seeds: [13:14:18.506] - All globals exported: [n=11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:18.506] getGlobalsAndPackages() ... [13:14:18.506] - globals passed as-is: [11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:18.506] Resolving globals: FALSE [13:14:18.506] Tweak future expression to call with '...' arguments ... [13:14:18.507] { [13:14:18.507] do.call(function(...) { [13:14:18.507] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:18.507] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:18.507] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:18.507] on.exit(options(oopts), add = TRUE) [13:14:18.507] } [13:14:18.507] { [13:14:18.507] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:18.507] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:18.507] ...future.FUN(...future.X_jj, ...) [13:14:18.507] }) [13:14:18.507] } [13:14:18.507] }, args = future.call.arguments) [13:14:18.507] } [13:14:18.507] Tweak future expression to call with '...' arguments ... DONE [13:14:18.508] - globals: [11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:18.508] - packages: [1] 'future.apply' [13:14:18.508] getGlobalsAndPackages() ... DONE [13:14:18.508] run() for 'Future' ... [13:14:18.509] - state: 'created' [13:14:18.509] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:14:18.523] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:14:18.523] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:14:18.523] - Field: 'node' [13:14:18.523] - Field: 'label' [13:14:18.524] - Field: 'local' [13:14:18.524] - Field: 'owner' [13:14:18.524] - Field: 'envir' [13:14:18.524] - Field: 'workers' [13:14:18.524] - Field: 'packages' [13:14:18.525] - Field: 'gc' [13:14:18.525] - Field: 'conditions' [13:14:18.525] - Field: 'persistent' [13:14:18.525] - Field: 'expr' [13:14:18.525] - Field: 'uuid' [13:14:18.525] - Field: 'seed' [13:14:18.526] - Field: 'version' [13:14:18.526] - Field: 'result' [13:14:18.526] - Field: 'asynchronous' [13:14:18.526] - Field: 'calls' [13:14:18.526] - Field: 'globals' [13:14:18.527] - Field: 'stdout' [13:14:18.527] - Field: 'earlySignal' [13:14:18.527] - Field: 'lazy' [13:14:18.527] - Field: 'state' [13:14:18.527] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:14:18.527] - Launch lazy future ... [13:14:18.528] Packages needed by the future expression (n = 1): 'future.apply' [13:14:18.528] Packages needed by future strategies (n = 0): [13:14:18.529] { [13:14:18.529] { [13:14:18.529] { [13:14:18.529] ...future.startTime <- base::Sys.time() [13:14:18.529] { [13:14:18.529] { [13:14:18.529] { [13:14:18.529] { [13:14:18.529] { [13:14:18.529] base::local({ [13:14:18.529] has_future <- base::requireNamespace("future", [13:14:18.529] quietly = TRUE) [13:14:18.529] if (has_future) { [13:14:18.529] ns <- base::getNamespace("future") [13:14:18.529] version <- ns[[".package"]][["version"]] [13:14:18.529] if (is.null(version)) [13:14:18.529] version <- utils::packageVersion("future") [13:14:18.529] } [13:14:18.529] else { [13:14:18.529] version <- NULL [13:14:18.529] } [13:14:18.529] if (!has_future || version < "1.8.0") { [13:14:18.529] info <- base::c(r_version = base::gsub("R version ", [13:14:18.529] "", base::R.version$version.string), [13:14:18.529] platform = base::sprintf("%s (%s-bit)", [13:14:18.529] base::R.version$platform, 8 * [13:14:18.529] base::.Machine$sizeof.pointer), [13:14:18.529] os = base::paste(base::Sys.info()[base::c("sysname", [13:14:18.529] "release", "version")], collapse = " "), [13:14:18.529] hostname = base::Sys.info()[["nodename"]]) [13:14:18.529] info <- base::sprintf("%s: %s", base::names(info), [13:14:18.529] info) [13:14:18.529] info <- base::paste(info, collapse = "; ") [13:14:18.529] if (!has_future) { [13:14:18.529] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:14:18.529] info) [13:14:18.529] } [13:14:18.529] else { [13:14:18.529] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:14:18.529] info, version) [13:14:18.529] } [13:14:18.529] base::stop(msg) [13:14:18.529] } [13:14:18.529] }) [13:14:18.529] } [13:14:18.529] ...future.mc.cores.old <- base::getOption("mc.cores") [13:14:18.529] base::options(mc.cores = 1L) [13:14:18.529] } [13:14:18.529] base::local({ [13:14:18.529] for (pkg in "future.apply") { [13:14:18.529] base::loadNamespace(pkg) [13:14:18.529] base::library(pkg, character.only = TRUE) [13:14:18.529] } [13:14:18.529] }) [13:14:18.529] } [13:14:18.529] options(future.plan = NULL) [13:14:18.529] Sys.unsetenv("R_FUTURE_PLAN") [13:14:18.529] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:14:18.529] } [13:14:18.529] ...future.workdir <- getwd() [13:14:18.529] } [13:14:18.529] ...future.oldOptions <- base::as.list(base::.Options) [13:14:18.529] ...future.oldEnvVars <- base::Sys.getenv() [13:14:18.529] } [13:14:18.529] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:14:18.529] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:14:18.529] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:14:18.529] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:14:18.529] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:14:18.529] future.stdout.windows.reencode = NULL, width = 80L) [13:14:18.529] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:14:18.529] base::names(...future.oldOptions)) [13:14:18.529] } [13:14:18.529] if (FALSE) { [13:14:18.529] } [13:14:18.529] else { [13:14:18.529] if (TRUE) { [13:14:18.529] ...future.stdout <- base::rawConnection(base::raw(0L), [13:14:18.529] open = "w") [13:14:18.529] } [13:14:18.529] else { [13:14:18.529] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:14:18.529] windows = "NUL", "/dev/null"), open = "w") [13:14:18.529] } [13:14:18.529] base::sink(...future.stdout, type = "output", split = FALSE) [13:14:18.529] base::on.exit(if (!base::is.null(...future.stdout)) { [13:14:18.529] base::sink(type = "output", split = FALSE) [13:14:18.529] base::close(...future.stdout) [13:14:18.529] }, add = TRUE) [13:14:18.529] } [13:14:18.529] ...future.frame <- base::sys.nframe() [13:14:18.529] ...future.conditions <- base::list() [13:14:18.529] ...future.rng <- base::globalenv()$.Random.seed [13:14:18.529] if (FALSE) { [13:14:18.529] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:14:18.529] "...future.value", "...future.globalenv.names", ".Random.seed") [13:14:18.529] } [13:14:18.529] ...future.result <- base::tryCatch({ [13:14:18.529] base::withCallingHandlers({ [13:14:18.529] ...future.value <- base::withVisible(base::local({ [13:14:18.529] ...future.makeSendCondition <- local({ [13:14:18.529] sendCondition <- NULL [13:14:18.529] function(frame = 1L) { [13:14:18.529] if (is.function(sendCondition)) [13:14:18.529] return(sendCondition) [13:14:18.529] ns <- getNamespace("parallel") [13:14:18.529] if (exists("sendData", mode = "function", [13:14:18.529] envir = ns)) { [13:14:18.529] parallel_sendData <- get("sendData", mode = "function", [13:14:18.529] envir = ns) [13:14:18.529] envir <- sys.frame(frame) [13:14:18.529] master <- NULL [13:14:18.529] while (!identical(envir, .GlobalEnv) && [13:14:18.529] !identical(envir, emptyenv())) { [13:14:18.529] if (exists("master", mode = "list", envir = envir, [13:14:18.529] inherits = FALSE)) { [13:14:18.529] master <- get("master", mode = "list", [13:14:18.529] envir = envir, inherits = FALSE) [13:14:18.529] if (inherits(master, c("SOCKnode", [13:14:18.529] "SOCK0node"))) { [13:14:18.529] sendCondition <<- function(cond) { [13:14:18.529] data <- list(type = "VALUE", value = cond, [13:14:18.529] success = TRUE) [13:14:18.529] parallel_sendData(master, data) [13:14:18.529] } [13:14:18.529] return(sendCondition) [13:14:18.529] } [13:14:18.529] } [13:14:18.529] frame <- frame + 1L [13:14:18.529] envir <- sys.frame(frame) [13:14:18.529] } [13:14:18.529] } [13:14:18.529] sendCondition <<- function(cond) NULL [13:14:18.529] } [13:14:18.529] }) [13:14:18.529] withCallingHandlers({ [13:14:18.529] { [13:14:18.529] do.call(function(...) { [13:14:18.529] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:18.529] if (!identical(...future.globals.maxSize.org, [13:14:18.529] ...future.globals.maxSize)) { [13:14:18.529] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:18.529] on.exit(options(oopts), add = TRUE) [13:14:18.529] } [13:14:18.529] { [13:14:18.529] lapply(seq_along(...future.elements_ii), [13:14:18.529] FUN = function(jj) { [13:14:18.529] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:18.529] ...future.FUN(...future.X_jj, ...) [13:14:18.529] }) [13:14:18.529] } [13:14:18.529] }, args = future.call.arguments) [13:14:18.529] } [13:14:18.529] }, immediateCondition = function(cond) { [13:14:18.529] sendCondition <- ...future.makeSendCondition() [13:14:18.529] sendCondition(cond) [13:14:18.529] muffleCondition <- function (cond, pattern = "^muffle") [13:14:18.529] { [13:14:18.529] inherits <- base::inherits [13:14:18.529] invokeRestart <- base::invokeRestart [13:14:18.529] is.null <- base::is.null [13:14:18.529] muffled <- FALSE [13:14:18.529] if (inherits(cond, "message")) { [13:14:18.529] muffled <- grepl(pattern, "muffleMessage") [13:14:18.529] if (muffled) [13:14:18.529] invokeRestart("muffleMessage") [13:14:18.529] } [13:14:18.529] else if (inherits(cond, "warning")) { [13:14:18.529] muffled <- grepl(pattern, "muffleWarning") [13:14:18.529] if (muffled) [13:14:18.529] invokeRestart("muffleWarning") [13:14:18.529] } [13:14:18.529] else if (inherits(cond, "condition")) { [13:14:18.529] if (!is.null(pattern)) { [13:14:18.529] computeRestarts <- base::computeRestarts [13:14:18.529] grepl <- base::grepl [13:14:18.529] restarts <- computeRestarts(cond) [13:14:18.529] for (restart in restarts) { [13:14:18.529] name <- restart$name [13:14:18.529] if (is.null(name)) [13:14:18.529] next [13:14:18.529] if (!grepl(pattern, name)) [13:14:18.529] next [13:14:18.529] invokeRestart(restart) [13:14:18.529] muffled <- TRUE [13:14:18.529] break [13:14:18.529] } [13:14:18.529] } [13:14:18.529] } [13:14:18.529] invisible(muffled) [13:14:18.529] } [13:14:18.529] muffleCondition(cond) [13:14:18.529] }) [13:14:18.529] })) [13:14:18.529] future::FutureResult(value = ...future.value$value, [13:14:18.529] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:14:18.529] ...future.rng), globalenv = if (FALSE) [13:14:18.529] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:14:18.529] ...future.globalenv.names)) [13:14:18.529] else NULL, started = ...future.startTime, version = "1.8") [13:14:18.529] }, condition = base::local({ [13:14:18.529] c <- base::c [13:14:18.529] inherits <- base::inherits [13:14:18.529] invokeRestart <- base::invokeRestart [13:14:18.529] length <- base::length [13:14:18.529] list <- base::list [13:14:18.529] seq.int <- base::seq.int [13:14:18.529] signalCondition <- base::signalCondition [13:14:18.529] sys.calls <- base::sys.calls [13:14:18.529] `[[` <- base::`[[` [13:14:18.529] `+` <- base::`+` [13:14:18.529] `<<-` <- base::`<<-` [13:14:18.529] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:14:18.529] calls[seq.int(from = from + 12L, to = length(calls) - [13:14:18.529] 3L)] [13:14:18.529] } [13:14:18.529] function(cond) { [13:14:18.529] is_error <- inherits(cond, "error") [13:14:18.529] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:14:18.529] NULL) [13:14:18.529] if (is_error) { [13:14:18.529] sessionInformation <- function() { [13:14:18.529] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:14:18.529] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:14:18.529] search = base::search(), system = base::Sys.info()) [13:14:18.529] } [13:14:18.529] ...future.conditions[[length(...future.conditions) + [13:14:18.529] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:14:18.529] cond$call), session = sessionInformation(), [13:14:18.529] timestamp = base::Sys.time(), signaled = 0L) [13:14:18.529] signalCondition(cond) [13:14:18.529] } [13:14:18.529] else if (!ignore && TRUE && inherits(cond, c("condition", [13:14:18.529] "immediateCondition"))) { [13:14:18.529] signal <- TRUE && inherits(cond, "immediateCondition") [13:14:18.529] ...future.conditions[[length(...future.conditions) + [13:14:18.529] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:14:18.529] if (TRUE && !signal) { [13:14:18.529] muffleCondition <- function (cond, pattern = "^muffle") [13:14:18.529] { [13:14:18.529] inherits <- base::inherits [13:14:18.529] invokeRestart <- base::invokeRestart [13:14:18.529] is.null <- base::is.null [13:14:18.529] muffled <- FALSE [13:14:18.529] if (inherits(cond, "message")) { [13:14:18.529] muffled <- grepl(pattern, "muffleMessage") [13:14:18.529] if (muffled) [13:14:18.529] invokeRestart("muffleMessage") [13:14:18.529] } [13:14:18.529] else if (inherits(cond, "warning")) { [13:14:18.529] muffled <- grepl(pattern, "muffleWarning") [13:14:18.529] if (muffled) [13:14:18.529] invokeRestart("muffleWarning") [13:14:18.529] } [13:14:18.529] else if (inherits(cond, "condition")) { [13:14:18.529] if (!is.null(pattern)) { [13:14:18.529] computeRestarts <- base::computeRestarts [13:14:18.529] grepl <- base::grepl [13:14:18.529] restarts <- computeRestarts(cond) [13:14:18.529] for (restart in restarts) { [13:14:18.529] name <- restart$name [13:14:18.529] if (is.null(name)) [13:14:18.529] next [13:14:18.529] if (!grepl(pattern, name)) [13:14:18.529] next [13:14:18.529] invokeRestart(restart) [13:14:18.529] muffled <- TRUE [13:14:18.529] break [13:14:18.529] } [13:14:18.529] } [13:14:18.529] } [13:14:18.529] invisible(muffled) [13:14:18.529] } [13:14:18.529] muffleCondition(cond, pattern = "^muffle") [13:14:18.529] } [13:14:18.529] } [13:14:18.529] else { [13:14:18.529] if (TRUE) { [13:14:18.529] muffleCondition <- function (cond, pattern = "^muffle") [13:14:18.529] { [13:14:18.529] inherits <- base::inherits [13:14:18.529] invokeRestart <- base::invokeRestart [13:14:18.529] is.null <- base::is.null [13:14:18.529] muffled <- FALSE [13:14:18.529] if (inherits(cond, "message")) { [13:14:18.529] muffled <- grepl(pattern, "muffleMessage") [13:14:18.529] if (muffled) [13:14:18.529] invokeRestart("muffleMessage") [13:14:18.529] } [13:14:18.529] else if (inherits(cond, "warning")) { [13:14:18.529] muffled <- grepl(pattern, "muffleWarning") [13:14:18.529] if (muffled) [13:14:18.529] invokeRestart("muffleWarning") [13:14:18.529] } [13:14:18.529] else if (inherits(cond, "condition")) { [13:14:18.529] if (!is.null(pattern)) { [13:14:18.529] computeRestarts <- base::computeRestarts [13:14:18.529] grepl <- base::grepl [13:14:18.529] restarts <- computeRestarts(cond) [13:14:18.529] for (restart in restarts) { [13:14:18.529] name <- restart$name [13:14:18.529] if (is.null(name)) [13:14:18.529] next [13:14:18.529] if (!grepl(pattern, name)) [13:14:18.529] next [13:14:18.529] invokeRestart(restart) [13:14:18.529] muffled <- TRUE [13:14:18.529] break [13:14:18.529] } [13:14:18.529] } [13:14:18.529] } [13:14:18.529] invisible(muffled) [13:14:18.529] } [13:14:18.529] muffleCondition(cond, pattern = "^muffle") [13:14:18.529] } [13:14:18.529] } [13:14:18.529] } [13:14:18.529] })) [13:14:18.529] }, error = function(ex) { [13:14:18.529] base::structure(base::list(value = NULL, visible = NULL, [13:14:18.529] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:14:18.529] ...future.rng), started = ...future.startTime, [13:14:18.529] finished = Sys.time(), session_uuid = NA_character_, [13:14:18.529] version = "1.8"), class = "FutureResult") [13:14:18.529] }, finally = { [13:14:18.529] if (!identical(...future.workdir, getwd())) [13:14:18.529] setwd(...future.workdir) [13:14:18.529] { [13:14:18.529] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:14:18.529] ...future.oldOptions$nwarnings <- NULL [13:14:18.529] } [13:14:18.529] base::options(...future.oldOptions) [13:14:18.529] if (.Platform$OS.type == "windows") { [13:14:18.529] old_names <- names(...future.oldEnvVars) [13:14:18.529] envs <- base::Sys.getenv() [13:14:18.529] names <- names(envs) [13:14:18.529] common <- intersect(names, old_names) [13:14:18.529] added <- setdiff(names, old_names) [13:14:18.529] removed <- setdiff(old_names, names) [13:14:18.529] changed <- common[...future.oldEnvVars[common] != [13:14:18.529] envs[common]] [13:14:18.529] NAMES <- toupper(changed) [13:14:18.529] args <- list() [13:14:18.529] for (kk in seq_along(NAMES)) { [13:14:18.529] name <- changed[[kk]] [13:14:18.529] NAME <- NAMES[[kk]] [13:14:18.529] if (name != NAME && is.element(NAME, old_names)) [13:14:18.529] next [13:14:18.529] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:18.529] } [13:14:18.529] NAMES <- toupper(added) [13:14:18.529] for (kk in seq_along(NAMES)) { [13:14:18.529] name <- added[[kk]] [13:14:18.529] NAME <- NAMES[[kk]] [13:14:18.529] if (name != NAME && is.element(NAME, old_names)) [13:14:18.529] next [13:14:18.529] args[[name]] <- "" [13:14:18.529] } [13:14:18.529] NAMES <- toupper(removed) [13:14:18.529] for (kk in seq_along(NAMES)) { [13:14:18.529] name <- removed[[kk]] [13:14:18.529] NAME <- NAMES[[kk]] [13:14:18.529] if (name != NAME && is.element(NAME, old_names)) [13:14:18.529] next [13:14:18.529] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:18.529] } [13:14:18.529] if (length(args) > 0) [13:14:18.529] base::do.call(base::Sys.setenv, args = args) [13:14:18.529] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:14:18.529] } [13:14:18.529] else { [13:14:18.529] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:14:18.529] } [13:14:18.529] { [13:14:18.529] if (base::length(...future.futureOptionsAdded) > [13:14:18.529] 0L) { [13:14:18.529] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:14:18.529] base::names(opts) <- ...future.futureOptionsAdded [13:14:18.529] base::options(opts) [13:14:18.529] } [13:14:18.529] { [13:14:18.529] { [13:14:18.529] base::options(mc.cores = ...future.mc.cores.old) [13:14:18.529] NULL [13:14:18.529] } [13:14:18.529] options(future.plan = NULL) [13:14:18.529] if (is.na(NA_character_)) [13:14:18.529] Sys.unsetenv("R_FUTURE_PLAN") [13:14:18.529] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:14:18.529] future::plan(list(function (..., workers = availableCores(), [13:14:18.529] lazy = FALSE, rscript_libs = .libPaths(), [13:14:18.529] envir = parent.frame()) [13:14:18.529] { [13:14:18.529] if (is.function(workers)) [13:14:18.529] workers <- workers() [13:14:18.529] workers <- structure(as.integer(workers), [13:14:18.529] class = class(workers)) [13:14:18.529] stop_if_not(length(workers) == 1, is.finite(workers), [13:14:18.529] workers >= 1) [13:14:18.529] if (workers == 1L && !inherits(workers, "AsIs")) { [13:14:18.529] return(sequential(..., lazy = TRUE, envir = envir)) [13:14:18.529] } [13:14:18.529] future <- MultisessionFuture(..., workers = workers, [13:14:18.529] lazy = lazy, rscript_libs = rscript_libs, [13:14:18.529] envir = envir) [13:14:18.529] if (!future$lazy) [13:14:18.529] future <- run(future) [13:14:18.529] invisible(future) [13:14:18.529] }), .cleanup = FALSE, .init = FALSE) [13:14:18.529] } [13:14:18.529] } [13:14:18.529] } [13:14:18.529] }) [13:14:18.529] if (TRUE) { [13:14:18.529] base::sink(type = "output", split = FALSE) [13:14:18.529] if (TRUE) { [13:14:18.529] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:14:18.529] } [13:14:18.529] else { [13:14:18.529] ...future.result["stdout"] <- base::list(NULL) [13:14:18.529] } [13:14:18.529] base::close(...future.stdout) [13:14:18.529] ...future.stdout <- NULL [13:14:18.529] } [13:14:18.529] ...future.result$conditions <- ...future.conditions [13:14:18.529] ...future.result$finished <- base::Sys.time() [13:14:18.529] ...future.result [13:14:18.529] } [13:14:18.534] Exporting 11 global objects (95.02 KiB) to cluster node #1 ... [13:14:18.534] Exporting '...future.FUN' (21.22 KiB) to cluster node #1 ... [13:14:18.535] Exporting '...future.FUN' (21.22 KiB) to cluster node #1 ... DONE [13:14:18.535] Exporting 'x_FUN' (2.90 KiB) to cluster node #1 ... [13:14:18.535] Exporting 'x_FUN' (2.90 KiB) to cluster node #1 ... DONE [13:14:18.536] Exporting 'times' (56 bytes) to cluster node #1 ... [13:14:18.536] Exporting 'times' (56 bytes) to cluster node #1 ... DONE [13:14:18.536] Exporting 'stopf' (26.43 KiB) to cluster node #1 ... [13:14:18.537] Exporting 'stopf' (26.43 KiB) to cluster node #1 ... DONE [13:14:18.537] Exporting 'stop_if_not' (44.12 KiB) to cluster node #1 ... [13:14:18.537] Exporting 'stop_if_not' (44.12 KiB) to cluster node #1 ... DONE [13:14:18.537] Exporting 'dim' (56 bytes) to cluster node #1 ... [13:14:18.538] Exporting 'dim' (56 bytes) to cluster node #1 ... DONE [13:14:18.538] Exporting 'valid_types' (248 bytes) to cluster node #1 ... [13:14:18.538] Exporting 'valid_types' (248 bytes) to cluster node #1 ... DONE [13:14:18.539] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... [13:14:18.539] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... DONE [13:14:18.539] Exporting '...future.elements_ii' (280 bytes) to cluster node #1 ... [13:14:18.540] Exporting '...future.elements_ii' (280 bytes) to cluster node #1 ... DONE [13:14:18.540] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:14:18.540] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:14:18.540] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:14:18.541] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:14:18.541] Exporting 11 global objects (95.02 KiB) to cluster node #1 ... DONE [13:14:18.542] MultisessionFuture started [13:14:18.542] - Launch lazy future ... done [13:14:18.542] run() for 'MultisessionFuture' ... done [13:14:18.542] Created future: [13:14:18.560] receiveMessageFromWorker() for ClusterFuture ... [13:14:18.561] - Validating connection of MultisessionFuture [13:14:18.561] - received message: FutureResult [13:14:18.561] - Received FutureResult [13:14:18.561] - Erased future from FutureRegistry [13:14:18.561] result() for ClusterFuture ... [13:14:18.561] - result already collected: FutureResult [13:14:18.562] result() for ClusterFuture ... done [13:14:18.562] receiveMessageFromWorker() for ClusterFuture ... done [13:14:18.542] MultisessionFuture: [13:14:18.542] Label: 'future_vapply-2' [13:14:18.542] Expression: [13:14:18.542] { [13:14:18.542] do.call(function(...) { [13:14:18.542] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:18.542] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:18.542] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:18.542] on.exit(options(oopts), add = TRUE) [13:14:18.542] } [13:14:18.542] { [13:14:18.542] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:18.542] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:18.542] ...future.FUN(...future.X_jj, ...) [13:14:18.542] }) [13:14:18.542] } [13:14:18.542] }, args = future.call.arguments) [13:14:18.542] } [13:14:18.542] Lazy evaluation: FALSE [13:14:18.542] Asynchronous evaluation: TRUE [13:14:18.542] Local evaluation: TRUE [13:14:18.542] Environment: R_GlobalEnv [13:14:18.542] Capture standard output: TRUE [13:14:18.542] Capture condition classes: 'condition' (excluding 'nothing') [13:14:18.542] Globals: 11 objects totaling 95.30 KiB (function '...future.FUN' of 21.22 KiB, function 'x_FUN' of 2.90 KiB, integer 'times' of 56 bytes, function 'stopf' of 26.43 KiB, function 'stop_if_not' of 44.12 KiB, ...) [13:14:18.542] Packages: 1 packages ('future.apply') [13:14:18.542] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:14:18.542] Resolved: TRUE [13:14:18.542] Value: [13:14:18.542] Conditions captured: [13:14:18.542] Early signaling: FALSE [13:14:18.542] Owner process: 1bb7d580-628d-c90d-e38a-66de485868c4 [13:14:18.542] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:14:18.562] Chunk #2 of 2 ... DONE [13:14:18.562] Launching 2 futures (chunks) ... DONE [13:14:18.563] Resolving 2 futures (chunks) ... [13:14:18.563] resolve() on list ... [13:14:18.563] recursive: 0 [13:14:18.563] length: 2 [13:14:18.563] [13:14:18.563] Future #1 [13:14:18.564] result() for ClusterFuture ... [13:14:18.564] - result already collected: FutureResult [13:14:18.564] result() for ClusterFuture ... done [13:14:18.564] result() for ClusterFuture ... [13:14:18.564] - result already collected: FutureResult [13:14:18.564] result() for ClusterFuture ... done [13:14:18.565] signalConditionsASAP(MultisessionFuture, pos=1) ... [13:14:18.565] - nx: 2 [13:14:18.565] - relay: TRUE [13:14:18.565] - stdout: TRUE [13:14:18.565] - signal: TRUE [13:14:18.565] - resignal: FALSE [13:14:18.565] - force: TRUE [13:14:18.566] - relayed: [n=2] FALSE, FALSE [13:14:18.566] - queued futures: [n=2] FALSE, FALSE [13:14:18.566] - until=1 [13:14:18.566] - relaying element #1 [13:14:18.566] result() for ClusterFuture ... [13:14:18.566] - result already collected: FutureResult [13:14:18.567] result() for ClusterFuture ... done [13:14:18.567] result() for ClusterFuture ... [13:14:18.567] - result already collected: FutureResult [13:14:18.567] result() for ClusterFuture ... done [13:14:18.567] result() for ClusterFuture ... [13:14:18.567] - result already collected: FutureResult [13:14:18.568] result() for ClusterFuture ... done [13:14:18.568] result() for ClusterFuture ... [13:14:18.568] - result already collected: FutureResult [13:14:18.568] result() for ClusterFuture ... done [13:14:18.568] - relayed: [n=2] TRUE, FALSE [13:14:18.568] - queued futures: [n=2] TRUE, FALSE [13:14:18.568] signalConditionsASAP(MultisessionFuture, pos=1) ... done [13:14:18.569] length: 1 (resolved future 1) [13:14:18.569] Future #2 [13:14:18.569] result() for ClusterFuture ... [13:14:18.569] - result already collected: FutureResult [13:14:18.569] result() for ClusterFuture ... done [13:14:18.569] result() for ClusterFuture ... [13:14:18.570] - result already collected: FutureResult [13:14:18.570] result() for ClusterFuture ... done [13:14:18.570] signalConditionsASAP(MultisessionFuture, pos=2) ... [13:14:18.570] - nx: 2 [13:14:18.570] - relay: TRUE [13:14:18.570] - stdout: TRUE [13:14:18.571] - signal: TRUE [13:14:18.571] - resignal: FALSE [13:14:18.571] - force: TRUE [13:14:18.571] - relayed: [n=2] TRUE, FALSE [13:14:18.571] - queued futures: [n=2] TRUE, FALSE [13:14:18.571] - until=2 [13:14:18.572] - relaying element #2 [13:14:18.572] result() for ClusterFuture ... [13:14:18.572] - result already collected: FutureResult [13:14:18.572] result() for ClusterFuture ... done [13:14:18.572] result() for ClusterFuture ... [13:14:18.572] - result already collected: FutureResult [13:14:18.572] result() for ClusterFuture ... done [13:14:18.573] result() for ClusterFuture ... [13:14:18.573] - result already collected: FutureResult [13:14:18.573] result() for ClusterFuture ... done [13:14:18.573] result() for ClusterFuture ... [13:14:18.573] - result already collected: FutureResult [13:14:18.573] result() for ClusterFuture ... done [13:14:18.574] - relayed: [n=2] TRUE, TRUE [13:14:18.574] - queued futures: [n=2] TRUE, TRUE [13:14:18.574] signalConditionsASAP(MultisessionFuture, pos=2) ... done [13:14:18.574] length: 0 (resolved future 2) [13:14:18.574] Relaying remaining futures [13:14:18.574] signalConditionsASAP(NULL, pos=0) ... [13:14:18.575] - nx: 2 [13:14:18.575] - relay: TRUE [13:14:18.575] - stdout: TRUE [13:14:18.575] - signal: TRUE [13:14:18.575] - resignal: FALSE [13:14:18.575] - force: TRUE [13:14:18.575] - relayed: [n=2] TRUE, TRUE [13:14:18.576] - queued futures: [n=2] TRUE, TRUE - flush all [13:14:18.576] - relayed: [n=2] TRUE, TRUE [13:14:18.576] - queued futures: [n=2] TRUE, TRUE [13:14:18.576] signalConditionsASAP(NULL, pos=0) ... done [13:14:18.576] resolve() on list ... DONE [13:14:18.576] result() for ClusterFuture ... [13:14:18.577] - result already collected: FutureResult [13:14:18.577] result() for ClusterFuture ... done [13:14:18.577] result() for ClusterFuture ... [13:14:18.577] - result already collected: FutureResult [13:14:18.577] result() for ClusterFuture ... done [13:14:18.577] result() for ClusterFuture ... [13:14:18.578] - result already collected: FutureResult [13:14:18.578] result() for ClusterFuture ... done [13:14:18.578] result() for ClusterFuture ... [13:14:18.578] - result already collected: FutureResult [13:14:18.578] result() for ClusterFuture ... done [13:14:18.578] - Number of value chunks collected: 2 [13:14:18.579] Resolving 2 futures (chunks) ... DONE [13:14:18.579] Reducing values from 2 chunks ... [13:14:18.579] - Number of values collected after concatenation: 10 [13:14:18.579] - Number of values expected: 10 [13:14:18.579] Reducing values from 2 chunks ... DONE [13:14:18.579] future_lapply() ... DONE int [1:2, 1:2, 1:10] 1 1 1 1 2 2 2 2 3 3 ... num [1:2, 1:2, 1:10] 1 1 1 1 2 2 2 2 3 3 ... - attr(*, "dimnames")=List of 3 ..$ : chr [1:2] "a" "b" ..$ : chr [1:2] "A" "B" ..$ : NULL [13:14:18.582] future_lapply() ... [13:14:18.586] Number of chunks: 2 [13:14:18.587] getGlobalsAndPackagesXApply() ... [13:14:18.587] - future.globals: TRUE [13:14:18.587] getGlobalsAndPackages() ... [13:14:18.587] Searching for globals... [13:14:18.592] - globals found: [19] 'FUN', '{', '<-', 'x_FUN', 'if', '!=', 'length', 'times', 'stopf', 'stop_if_not', 'all', '==', 'dim', '%in%', 'typeof', 'valid_types', 'matrix', 'list', 'c' [13:14:18.592] Searching for globals ... DONE [13:14:18.593] Resolving globals: FALSE [13:14:18.594] The total size of the 7 globals is 103.08 KiB (105552 bytes) [13:14:18.594] The total size of the 7 globals exported for future expression ('FUN()') is 103.08 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). The three largest globals are 'stop_if_not' (44.12 KiB of class 'function'), 'stopf' (26.43 KiB of class 'function') and 'FUN' (21.22 KiB of class 'function') [13:14:18.594] - globals: [7] 'FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types' [13:14:18.595] - packages: [1] 'future.apply' [13:14:18.595] getGlobalsAndPackages() ... DONE [13:14:18.595] - globals found/used: [n=7] 'FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types' [13:14:18.595] - needed namespaces: [n=1] 'future.apply' [13:14:18.595] Finding globals ... DONE [13:14:18.596] - use_args: TRUE [13:14:18.596] - Getting '...' globals ... [13:14:18.596] resolve() on list ... [13:14:18.596] recursive: 0 [13:14:18.596] length: 1 [13:14:18.597] elements: '...' [13:14:18.597] length: 0 (resolved future 1) [13:14:18.597] resolve() on list ... DONE [13:14:18.597] - '...' content: [n=0] [13:14:18.597] List of 1 [13:14:18.597] $ ...: list() [13:14:18.597] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:14:18.597] - attr(*, "where")=List of 1 [13:14:18.597] ..$ ...: [13:14:18.597] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:14:18.597] - attr(*, "resolved")= logi TRUE [13:14:18.597] - attr(*, "total_size")= num NA [13:14:18.600] - Getting '...' globals ... DONE [13:14:18.601] Globals to be used in all futures (chunks): [n=8] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...' [13:14:18.601] List of 8 [13:14:18.601] $ ...future.FUN:function (x, ...) [13:14:18.601] $ x_FUN :function (x) [13:14:18.601] $ times : int 4 [13:14:18.601] $ stopf :function (fmt, ..., call. = TRUE, domain = NULL) [13:14:18.601] $ stop_if_not :function (...) [13:14:18.601] $ dim : int [1:2] 2 2 [13:14:18.601] $ valid_types : chr [1:3] "logical" "integer" "double" [13:14:18.601] $ ... : list() [13:14:18.601] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:14:18.601] - attr(*, "where")=List of 8 [13:14:18.601] ..$ ...future.FUN: [13:14:18.601] ..$ x_FUN : [13:14:18.601] ..$ times : [13:14:18.601] ..$ stopf : [13:14:18.601] ..$ stop_if_not : [13:14:18.601] ..$ dim : [13:14:18.601] ..$ valid_types : [13:14:18.601] ..$ ... : [13:14:18.601] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:14:18.601] - attr(*, "resolved")= logi FALSE [13:14:18.601] - attr(*, "total_size")= num 105552 [13:14:18.608] Packages to be attached in all futures: [n=1] 'future.apply' [13:14:18.608] getGlobalsAndPackagesXApply() ... DONE [13:14:18.608] Number of futures (= number of chunks): 2 [13:14:18.608] Launching 2 futures (chunks) ... [13:14:18.608] Chunk #1 of 2 ... [13:14:18.609] - Finding globals in 'X' for chunk #1 ... [13:14:18.609] getGlobalsAndPackages() ... [13:14:18.609] Searching for globals... [13:14:18.609] [13:14:18.609] Searching for globals ... DONE [13:14:18.610] - globals: [0] [13:14:18.610] getGlobalsAndPackages() ... DONE [13:14:18.610] + additional globals found: [n=0] [13:14:18.610] + additional namespaces needed: [n=0] [13:14:18.610] - Finding globals in 'X' for chunk #1 ... DONE [13:14:18.610] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:14:18.611] - seeds: [13:14:18.611] - All globals exported: [n=11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:18.611] getGlobalsAndPackages() ... [13:14:18.611] - globals passed as-is: [11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:18.611] Resolving globals: FALSE [13:14:18.611] Tweak future expression to call with '...' arguments ... [13:14:18.612] { [13:14:18.612] do.call(function(...) { [13:14:18.612] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:18.612] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:18.612] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:18.612] on.exit(options(oopts), add = TRUE) [13:14:18.612] } [13:14:18.612] { [13:14:18.612] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:18.612] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:18.612] ...future.FUN(...future.X_jj, ...) [13:14:18.612] }) [13:14:18.612] } [13:14:18.612] }, args = future.call.arguments) [13:14:18.612] } [13:14:18.612] Tweak future expression to call with '...' arguments ... DONE [13:14:18.613] - globals: [11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:18.613] - packages: [1] 'future.apply' [13:14:18.613] getGlobalsAndPackages() ... DONE [13:14:18.614] run() for 'Future' ... [13:14:18.614] - state: 'created' [13:14:18.614] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:14:18.628] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:14:18.628] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:14:18.628] - Field: 'node' [13:14:18.629] - Field: 'label' [13:14:18.629] - Field: 'local' [13:14:18.629] - Field: 'owner' [13:14:18.629] - Field: 'envir' [13:14:18.629] - Field: 'workers' [13:14:18.629] - Field: 'packages' [13:14:18.630] - Field: 'gc' [13:14:18.630] - Field: 'conditions' [13:14:18.630] - Field: 'persistent' [13:14:18.630] - Field: 'expr' [13:14:18.630] - Field: 'uuid' [13:14:18.631] - Field: 'seed' [13:14:18.631] - Field: 'version' [13:14:18.631] - Field: 'result' [13:14:18.631] - Field: 'asynchronous' [13:14:18.631] - Field: 'calls' [13:14:18.631] - Field: 'globals' [13:14:18.632] - Field: 'stdout' [13:14:18.632] - Field: 'earlySignal' [13:14:18.632] - Field: 'lazy' [13:14:18.632] - Field: 'state' [13:14:18.632] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:14:18.632] - Launch lazy future ... [13:14:18.633] Packages needed by the future expression (n = 1): 'future.apply' [13:14:18.633] Packages needed by future strategies (n = 0): [13:14:18.634] { [13:14:18.634] { [13:14:18.634] { [13:14:18.634] ...future.startTime <- base::Sys.time() [13:14:18.634] { [13:14:18.634] { [13:14:18.634] { [13:14:18.634] { [13:14:18.634] { [13:14:18.634] base::local({ [13:14:18.634] has_future <- base::requireNamespace("future", [13:14:18.634] quietly = TRUE) [13:14:18.634] if (has_future) { [13:14:18.634] ns <- base::getNamespace("future") [13:14:18.634] version <- ns[[".package"]][["version"]] [13:14:18.634] if (is.null(version)) [13:14:18.634] version <- utils::packageVersion("future") [13:14:18.634] } [13:14:18.634] else { [13:14:18.634] version <- NULL [13:14:18.634] } [13:14:18.634] if (!has_future || version < "1.8.0") { [13:14:18.634] info <- base::c(r_version = base::gsub("R version ", [13:14:18.634] "", base::R.version$version.string), [13:14:18.634] platform = base::sprintf("%s (%s-bit)", [13:14:18.634] base::R.version$platform, 8 * [13:14:18.634] base::.Machine$sizeof.pointer), [13:14:18.634] os = base::paste(base::Sys.info()[base::c("sysname", [13:14:18.634] "release", "version")], collapse = " "), [13:14:18.634] hostname = base::Sys.info()[["nodename"]]) [13:14:18.634] info <- base::sprintf("%s: %s", base::names(info), [13:14:18.634] info) [13:14:18.634] info <- base::paste(info, collapse = "; ") [13:14:18.634] if (!has_future) { [13:14:18.634] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:14:18.634] info) [13:14:18.634] } [13:14:18.634] else { [13:14:18.634] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:14:18.634] info, version) [13:14:18.634] } [13:14:18.634] base::stop(msg) [13:14:18.634] } [13:14:18.634] }) [13:14:18.634] } [13:14:18.634] ...future.mc.cores.old <- base::getOption("mc.cores") [13:14:18.634] base::options(mc.cores = 1L) [13:14:18.634] } [13:14:18.634] base::local({ [13:14:18.634] for (pkg in "future.apply") { [13:14:18.634] base::loadNamespace(pkg) [13:14:18.634] base::library(pkg, character.only = TRUE) [13:14:18.634] } [13:14:18.634] }) [13:14:18.634] } [13:14:18.634] options(future.plan = NULL) [13:14:18.634] Sys.unsetenv("R_FUTURE_PLAN") [13:14:18.634] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:14:18.634] } [13:14:18.634] ...future.workdir <- getwd() [13:14:18.634] } [13:14:18.634] ...future.oldOptions <- base::as.list(base::.Options) [13:14:18.634] ...future.oldEnvVars <- base::Sys.getenv() [13:14:18.634] } [13:14:18.634] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:14:18.634] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:14:18.634] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:14:18.634] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:14:18.634] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:14:18.634] future.stdout.windows.reencode = NULL, width = 80L) [13:14:18.634] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:14:18.634] base::names(...future.oldOptions)) [13:14:18.634] } [13:14:18.634] if (FALSE) { [13:14:18.634] } [13:14:18.634] else { [13:14:18.634] if (TRUE) { [13:14:18.634] ...future.stdout <- base::rawConnection(base::raw(0L), [13:14:18.634] open = "w") [13:14:18.634] } [13:14:18.634] else { [13:14:18.634] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:14:18.634] windows = "NUL", "/dev/null"), open = "w") [13:14:18.634] } [13:14:18.634] base::sink(...future.stdout, type = "output", split = FALSE) [13:14:18.634] base::on.exit(if (!base::is.null(...future.stdout)) { [13:14:18.634] base::sink(type = "output", split = FALSE) [13:14:18.634] base::close(...future.stdout) [13:14:18.634] }, add = TRUE) [13:14:18.634] } [13:14:18.634] ...future.frame <- base::sys.nframe() [13:14:18.634] ...future.conditions <- base::list() [13:14:18.634] ...future.rng <- base::globalenv()$.Random.seed [13:14:18.634] if (FALSE) { [13:14:18.634] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:14:18.634] "...future.value", "...future.globalenv.names", ".Random.seed") [13:14:18.634] } [13:14:18.634] ...future.result <- base::tryCatch({ [13:14:18.634] base::withCallingHandlers({ [13:14:18.634] ...future.value <- base::withVisible(base::local({ [13:14:18.634] ...future.makeSendCondition <- local({ [13:14:18.634] sendCondition <- NULL [13:14:18.634] function(frame = 1L) { [13:14:18.634] if (is.function(sendCondition)) [13:14:18.634] return(sendCondition) [13:14:18.634] ns <- getNamespace("parallel") [13:14:18.634] if (exists("sendData", mode = "function", [13:14:18.634] envir = ns)) { [13:14:18.634] parallel_sendData <- get("sendData", mode = "function", [13:14:18.634] envir = ns) [13:14:18.634] envir <- sys.frame(frame) [13:14:18.634] master <- NULL [13:14:18.634] while (!identical(envir, .GlobalEnv) && [13:14:18.634] !identical(envir, emptyenv())) { [13:14:18.634] if (exists("master", mode = "list", envir = envir, [13:14:18.634] inherits = FALSE)) { [13:14:18.634] master <- get("master", mode = "list", [13:14:18.634] envir = envir, inherits = FALSE) [13:14:18.634] if (inherits(master, c("SOCKnode", [13:14:18.634] "SOCK0node"))) { [13:14:18.634] sendCondition <<- function(cond) { [13:14:18.634] data <- list(type = "VALUE", value = cond, [13:14:18.634] success = TRUE) [13:14:18.634] parallel_sendData(master, data) [13:14:18.634] } [13:14:18.634] return(sendCondition) [13:14:18.634] } [13:14:18.634] } [13:14:18.634] frame <- frame + 1L [13:14:18.634] envir <- sys.frame(frame) [13:14:18.634] } [13:14:18.634] } [13:14:18.634] sendCondition <<- function(cond) NULL [13:14:18.634] } [13:14:18.634] }) [13:14:18.634] withCallingHandlers({ [13:14:18.634] { [13:14:18.634] do.call(function(...) { [13:14:18.634] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:18.634] if (!identical(...future.globals.maxSize.org, [13:14:18.634] ...future.globals.maxSize)) { [13:14:18.634] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:18.634] on.exit(options(oopts), add = TRUE) [13:14:18.634] } [13:14:18.634] { [13:14:18.634] lapply(seq_along(...future.elements_ii), [13:14:18.634] FUN = function(jj) { [13:14:18.634] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:18.634] ...future.FUN(...future.X_jj, ...) [13:14:18.634] }) [13:14:18.634] } [13:14:18.634] }, args = future.call.arguments) [13:14:18.634] } [13:14:18.634] }, immediateCondition = function(cond) { [13:14:18.634] sendCondition <- ...future.makeSendCondition() [13:14:18.634] sendCondition(cond) [13:14:18.634] muffleCondition <- function (cond, pattern = "^muffle") [13:14:18.634] { [13:14:18.634] inherits <- base::inherits [13:14:18.634] invokeRestart <- base::invokeRestart [13:14:18.634] is.null <- base::is.null [13:14:18.634] muffled <- FALSE [13:14:18.634] if (inherits(cond, "message")) { [13:14:18.634] muffled <- grepl(pattern, "muffleMessage") [13:14:18.634] if (muffled) [13:14:18.634] invokeRestart("muffleMessage") [13:14:18.634] } [13:14:18.634] else if (inherits(cond, "warning")) { [13:14:18.634] muffled <- grepl(pattern, "muffleWarning") [13:14:18.634] if (muffled) [13:14:18.634] invokeRestart("muffleWarning") [13:14:18.634] } [13:14:18.634] else if (inherits(cond, "condition")) { [13:14:18.634] if (!is.null(pattern)) { [13:14:18.634] computeRestarts <- base::computeRestarts [13:14:18.634] grepl <- base::grepl [13:14:18.634] restarts <- computeRestarts(cond) [13:14:18.634] for (restart in restarts) { [13:14:18.634] name <- restart$name [13:14:18.634] if (is.null(name)) [13:14:18.634] next [13:14:18.634] if (!grepl(pattern, name)) [13:14:18.634] next [13:14:18.634] invokeRestart(restart) [13:14:18.634] muffled <- TRUE [13:14:18.634] break [13:14:18.634] } [13:14:18.634] } [13:14:18.634] } [13:14:18.634] invisible(muffled) [13:14:18.634] } [13:14:18.634] muffleCondition(cond) [13:14:18.634] }) [13:14:18.634] })) [13:14:18.634] future::FutureResult(value = ...future.value$value, [13:14:18.634] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:14:18.634] ...future.rng), globalenv = if (FALSE) [13:14:18.634] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:14:18.634] ...future.globalenv.names)) [13:14:18.634] else NULL, started = ...future.startTime, version = "1.8") [13:14:18.634] }, condition = base::local({ [13:14:18.634] c <- base::c [13:14:18.634] inherits <- base::inherits [13:14:18.634] invokeRestart <- base::invokeRestart [13:14:18.634] length <- base::length [13:14:18.634] list <- base::list [13:14:18.634] seq.int <- base::seq.int [13:14:18.634] signalCondition <- base::signalCondition [13:14:18.634] sys.calls <- base::sys.calls [13:14:18.634] `[[` <- base::`[[` [13:14:18.634] `+` <- base::`+` [13:14:18.634] `<<-` <- base::`<<-` [13:14:18.634] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:14:18.634] calls[seq.int(from = from + 12L, to = length(calls) - [13:14:18.634] 3L)] [13:14:18.634] } [13:14:18.634] function(cond) { [13:14:18.634] is_error <- inherits(cond, "error") [13:14:18.634] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:14:18.634] NULL) [13:14:18.634] if (is_error) { [13:14:18.634] sessionInformation <- function() { [13:14:18.634] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:14:18.634] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:14:18.634] search = base::search(), system = base::Sys.info()) [13:14:18.634] } [13:14:18.634] ...future.conditions[[length(...future.conditions) + [13:14:18.634] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:14:18.634] cond$call), session = sessionInformation(), [13:14:18.634] timestamp = base::Sys.time(), signaled = 0L) [13:14:18.634] signalCondition(cond) [13:14:18.634] } [13:14:18.634] else if (!ignore && TRUE && inherits(cond, c("condition", [13:14:18.634] "immediateCondition"))) { [13:14:18.634] signal <- TRUE && inherits(cond, "immediateCondition") [13:14:18.634] ...future.conditions[[length(...future.conditions) + [13:14:18.634] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:14:18.634] if (TRUE && !signal) { [13:14:18.634] muffleCondition <- function (cond, pattern = "^muffle") [13:14:18.634] { [13:14:18.634] inherits <- base::inherits [13:14:18.634] invokeRestart <- base::invokeRestart [13:14:18.634] is.null <- base::is.null [13:14:18.634] muffled <- FALSE [13:14:18.634] if (inherits(cond, "message")) { [13:14:18.634] muffled <- grepl(pattern, "muffleMessage") [13:14:18.634] if (muffled) [13:14:18.634] invokeRestart("muffleMessage") [13:14:18.634] } [13:14:18.634] else if (inherits(cond, "warning")) { [13:14:18.634] muffled <- grepl(pattern, "muffleWarning") [13:14:18.634] if (muffled) [13:14:18.634] invokeRestart("muffleWarning") [13:14:18.634] } [13:14:18.634] else if (inherits(cond, "condition")) { [13:14:18.634] if (!is.null(pattern)) { [13:14:18.634] computeRestarts <- base::computeRestarts [13:14:18.634] grepl <- base::grepl [13:14:18.634] restarts <- computeRestarts(cond) [13:14:18.634] for (restart in restarts) { [13:14:18.634] name <- restart$name [13:14:18.634] if (is.null(name)) [13:14:18.634] next [13:14:18.634] if (!grepl(pattern, name)) [13:14:18.634] next [13:14:18.634] invokeRestart(restart) [13:14:18.634] muffled <- TRUE [13:14:18.634] break [13:14:18.634] } [13:14:18.634] } [13:14:18.634] } [13:14:18.634] invisible(muffled) [13:14:18.634] } [13:14:18.634] muffleCondition(cond, pattern = "^muffle") [13:14:18.634] } [13:14:18.634] } [13:14:18.634] else { [13:14:18.634] if (TRUE) { [13:14:18.634] muffleCondition <- function (cond, pattern = "^muffle") [13:14:18.634] { [13:14:18.634] inherits <- base::inherits [13:14:18.634] invokeRestart <- base::invokeRestart [13:14:18.634] is.null <- base::is.null [13:14:18.634] muffled <- FALSE [13:14:18.634] if (inherits(cond, "message")) { [13:14:18.634] muffled <- grepl(pattern, "muffleMessage") [13:14:18.634] if (muffled) [13:14:18.634] invokeRestart("muffleMessage") [13:14:18.634] } [13:14:18.634] else if (inherits(cond, "warning")) { [13:14:18.634] muffled <- grepl(pattern, "muffleWarning") [13:14:18.634] if (muffled) [13:14:18.634] invokeRestart("muffleWarning") [13:14:18.634] } [13:14:18.634] else if (inherits(cond, "condition")) { [13:14:18.634] if (!is.null(pattern)) { [13:14:18.634] computeRestarts <- base::computeRestarts [13:14:18.634] grepl <- base::grepl [13:14:18.634] restarts <- computeRestarts(cond) [13:14:18.634] for (restart in restarts) { [13:14:18.634] name <- restart$name [13:14:18.634] if (is.null(name)) [13:14:18.634] next [13:14:18.634] if (!grepl(pattern, name)) [13:14:18.634] next [13:14:18.634] invokeRestart(restart) [13:14:18.634] muffled <- TRUE [13:14:18.634] break [13:14:18.634] } [13:14:18.634] } [13:14:18.634] } [13:14:18.634] invisible(muffled) [13:14:18.634] } [13:14:18.634] muffleCondition(cond, pattern = "^muffle") [13:14:18.634] } [13:14:18.634] } [13:14:18.634] } [13:14:18.634] })) [13:14:18.634] }, error = function(ex) { [13:14:18.634] base::structure(base::list(value = NULL, visible = NULL, [13:14:18.634] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:14:18.634] ...future.rng), started = ...future.startTime, [13:14:18.634] finished = Sys.time(), session_uuid = NA_character_, [13:14:18.634] version = "1.8"), class = "FutureResult") [13:14:18.634] }, finally = { [13:14:18.634] if (!identical(...future.workdir, getwd())) [13:14:18.634] setwd(...future.workdir) [13:14:18.634] { [13:14:18.634] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:14:18.634] ...future.oldOptions$nwarnings <- NULL [13:14:18.634] } [13:14:18.634] base::options(...future.oldOptions) [13:14:18.634] if (.Platform$OS.type == "windows") { [13:14:18.634] old_names <- names(...future.oldEnvVars) [13:14:18.634] envs <- base::Sys.getenv() [13:14:18.634] names <- names(envs) [13:14:18.634] common <- intersect(names, old_names) [13:14:18.634] added <- setdiff(names, old_names) [13:14:18.634] removed <- setdiff(old_names, names) [13:14:18.634] changed <- common[...future.oldEnvVars[common] != [13:14:18.634] envs[common]] [13:14:18.634] NAMES <- toupper(changed) [13:14:18.634] args <- list() [13:14:18.634] for (kk in seq_along(NAMES)) { [13:14:18.634] name <- changed[[kk]] [13:14:18.634] NAME <- NAMES[[kk]] [13:14:18.634] if (name != NAME && is.element(NAME, old_names)) [13:14:18.634] next [13:14:18.634] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:18.634] } [13:14:18.634] NAMES <- toupper(added) [13:14:18.634] for (kk in seq_along(NAMES)) { [13:14:18.634] name <- added[[kk]] [13:14:18.634] NAME <- NAMES[[kk]] [13:14:18.634] if (name != NAME && is.element(NAME, old_names)) [13:14:18.634] next [13:14:18.634] args[[name]] <- "" [13:14:18.634] } [13:14:18.634] NAMES <- toupper(removed) [13:14:18.634] for (kk in seq_along(NAMES)) { [13:14:18.634] name <- removed[[kk]] [13:14:18.634] NAME <- NAMES[[kk]] [13:14:18.634] if (name != NAME && is.element(NAME, old_names)) [13:14:18.634] next [13:14:18.634] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:18.634] } [13:14:18.634] if (length(args) > 0) [13:14:18.634] base::do.call(base::Sys.setenv, args = args) [13:14:18.634] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:14:18.634] } [13:14:18.634] else { [13:14:18.634] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:14:18.634] } [13:14:18.634] { [13:14:18.634] if (base::length(...future.futureOptionsAdded) > [13:14:18.634] 0L) { [13:14:18.634] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:14:18.634] base::names(opts) <- ...future.futureOptionsAdded [13:14:18.634] base::options(opts) [13:14:18.634] } [13:14:18.634] { [13:14:18.634] { [13:14:18.634] base::options(mc.cores = ...future.mc.cores.old) [13:14:18.634] NULL [13:14:18.634] } [13:14:18.634] options(future.plan = NULL) [13:14:18.634] if (is.na(NA_character_)) [13:14:18.634] Sys.unsetenv("R_FUTURE_PLAN") [13:14:18.634] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:14:18.634] future::plan(list(function (..., workers = availableCores(), [13:14:18.634] lazy = FALSE, rscript_libs = .libPaths(), [13:14:18.634] envir = parent.frame()) [13:14:18.634] { [13:14:18.634] if (is.function(workers)) [13:14:18.634] workers <- workers() [13:14:18.634] workers <- structure(as.integer(workers), [13:14:18.634] class = class(workers)) [13:14:18.634] stop_if_not(length(workers) == 1, is.finite(workers), [13:14:18.634] workers >= 1) [13:14:18.634] if (workers == 1L && !inherits(workers, "AsIs")) { [13:14:18.634] return(sequential(..., lazy = TRUE, envir = envir)) [13:14:18.634] } [13:14:18.634] future <- MultisessionFuture(..., workers = workers, [13:14:18.634] lazy = lazy, rscript_libs = rscript_libs, [13:14:18.634] envir = envir) [13:14:18.634] if (!future$lazy) [13:14:18.634] future <- run(future) [13:14:18.634] invisible(future) [13:14:18.634] }), .cleanup = FALSE, .init = FALSE) [13:14:18.634] } [13:14:18.634] } [13:14:18.634] } [13:14:18.634] }) [13:14:18.634] if (TRUE) { [13:14:18.634] base::sink(type = "output", split = FALSE) [13:14:18.634] if (TRUE) { [13:14:18.634] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:14:18.634] } [13:14:18.634] else { [13:14:18.634] ...future.result["stdout"] <- base::list(NULL) [13:14:18.634] } [13:14:18.634] base::close(...future.stdout) [13:14:18.634] ...future.stdout <- NULL [13:14:18.634] } [13:14:18.634] ...future.result$conditions <- ...future.conditions [13:14:18.634] ...future.result$finished <- base::Sys.time() [13:14:18.634] ...future.result [13:14:18.634] } [13:14:18.639] Exporting 11 global objects (103.08 KiB) to cluster node #1 ... [13:14:18.639] Exporting '...future.FUN' (21.22 KiB) to cluster node #1 ... [13:14:18.640] Exporting '...future.FUN' (21.22 KiB) to cluster node #1 ... DONE [13:14:18.640] Exporting 'x_FUN' (10.95 KiB) to cluster node #1 ... [13:14:18.641] Exporting 'x_FUN' (10.95 KiB) to cluster node #1 ... DONE [13:14:18.641] Exporting 'times' (56 bytes) to cluster node #1 ... [13:14:18.641] Exporting 'times' (56 bytes) to cluster node #1 ... DONE [13:14:18.641] Exporting 'stopf' (26.43 KiB) to cluster node #1 ... [13:14:18.642] Exporting 'stopf' (26.43 KiB) to cluster node #1 ... DONE [13:14:18.642] Exporting 'stop_if_not' (44.12 KiB) to cluster node #1 ... [13:14:18.642] Exporting 'stop_if_not' (44.12 KiB) to cluster node #1 ... DONE [13:14:18.643] Exporting 'dim' (56 bytes) to cluster node #1 ... [13:14:18.643] Exporting 'dim' (56 bytes) to cluster node #1 ... DONE [13:14:18.643] Exporting 'valid_types' (248 bytes) to cluster node #1 ... [13:14:18.644] Exporting 'valid_types' (248 bytes) to cluster node #1 ... DONE [13:14:18.644] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... [13:14:18.644] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... DONE [13:14:18.645] Exporting '...future.elements_ii' (280 bytes) to cluster node #1 ... [13:14:18.645] Exporting '...future.elements_ii' (280 bytes) to cluster node #1 ... DONE [13:14:18.645] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:14:18.645] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:14:18.646] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:14:18.646] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:14:18.646] Exporting 11 global objects (103.08 KiB) to cluster node #1 ... DONE [13:14:18.647] MultisessionFuture started [13:14:18.647] - Launch lazy future ... done [13:14:18.647] run() for 'MultisessionFuture' ... done [13:14:18.650] Created future: [13:14:18.666] receiveMessageFromWorker() for ClusterFuture ... [13:14:18.666] - Validating connection of MultisessionFuture [13:14:18.666] - received message: FutureResult [13:14:18.667] - Received FutureResult [13:14:18.667] - Erased future from FutureRegistry [13:14:18.667] result() for ClusterFuture ... [13:14:18.667] - result already collected: FutureResult [13:14:18.667] result() for ClusterFuture ... done [13:14:18.667] receiveMessageFromWorker() for ClusterFuture ... done [13:14:18.650] MultisessionFuture: [13:14:18.650] Label: 'future_vapply-1' [13:14:18.650] Expression: [13:14:18.650] { [13:14:18.650] do.call(function(...) { [13:14:18.650] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:18.650] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:18.650] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:18.650] on.exit(options(oopts), add = TRUE) [13:14:18.650] } [13:14:18.650] { [13:14:18.650] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:18.650] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:18.650] ...future.FUN(...future.X_jj, ...) [13:14:18.650] }) [13:14:18.650] } [13:14:18.650] }, args = future.call.arguments) [13:14:18.650] } [13:14:18.650] Lazy evaluation: FALSE [13:14:18.650] Asynchronous evaluation: TRUE [13:14:18.650] Local evaluation: TRUE [13:14:18.650] Environment: R_GlobalEnv [13:14:18.650] Capture standard output: TRUE [13:14:18.650] Capture condition classes: 'condition' (excluding 'nothing') [13:14:18.650] Globals: 11 objects totaling 103.35 KiB (function '...future.FUN' of 21.22 KiB, function 'x_FUN' of 10.95 KiB, integer 'times' of 56 bytes, function 'stopf' of 26.43 KiB, function 'stop_if_not' of 44.12 KiB, ...) [13:14:18.650] Packages: 1 packages ('future.apply') [13:14:18.650] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:14:18.650] Resolved: TRUE [13:14:18.650] Value: [13:14:18.650] Conditions captured: [13:14:18.650] Early signaling: FALSE [13:14:18.650] Owner process: 1bb7d580-628d-c90d-e38a-66de485868c4 [13:14:18.650] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:14:18.668] Chunk #1 of 2 ... DONE [13:14:18.668] Chunk #2 of 2 ... [13:14:18.668] - Finding globals in 'X' for chunk #2 ... [13:14:18.668] getGlobalsAndPackages() ... [13:14:18.669] Searching for globals... [13:14:18.669] [13:14:18.669] Searching for globals ... DONE [13:14:18.669] - globals: [0] [13:14:18.669] getGlobalsAndPackages() ... DONE [13:14:18.670] + additional globals found: [n=0] [13:14:18.670] + additional namespaces needed: [n=0] [13:14:18.670] - Finding globals in 'X' for chunk #2 ... DONE [13:14:18.670] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:14:18.670] - seeds: [13:14:18.670] - All globals exported: [n=11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:18.671] getGlobalsAndPackages() ... [13:14:18.671] - globals passed as-is: [11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:18.671] Resolving globals: FALSE [13:14:18.671] Tweak future expression to call with '...' arguments ... [13:14:18.671] { [13:14:18.671] do.call(function(...) { [13:14:18.671] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:18.671] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:18.671] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:18.671] on.exit(options(oopts), add = TRUE) [13:14:18.671] } [13:14:18.671] { [13:14:18.671] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:18.671] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:18.671] ...future.FUN(...future.X_jj, ...) [13:14:18.671] }) [13:14:18.671] } [13:14:18.671] }, args = future.call.arguments) [13:14:18.671] } [13:14:18.672] Tweak future expression to call with '...' arguments ... DONE [13:14:18.672] - globals: [11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:18.673] - packages: [1] 'future.apply' [13:14:18.673] getGlobalsAndPackages() ... DONE [13:14:18.673] run() for 'Future' ... [13:14:18.673] - state: 'created' [13:14:18.673] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:14:18.687] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:14:18.688] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:14:18.688] - Field: 'node' [13:14:18.688] - Field: 'label' [13:14:18.688] - Field: 'local' [13:14:18.688] - Field: 'owner' [13:14:18.689] - Field: 'envir' [13:14:18.689] - Field: 'workers' [13:14:18.689] - Field: 'packages' [13:14:18.689] - Field: 'gc' [13:14:18.689] - Field: 'conditions' [13:14:18.689] - Field: 'persistent' [13:14:18.690] - Field: 'expr' [13:14:18.690] - Field: 'uuid' [13:14:18.690] - Field: 'seed' [13:14:18.690] - Field: 'version' [13:14:18.690] - Field: 'result' [13:14:18.691] - Field: 'asynchronous' [13:14:18.691] - Field: 'calls' [13:14:18.691] - Field: 'globals' [13:14:18.691] - Field: 'stdout' [13:14:18.691] - Field: 'earlySignal' [13:14:18.691] - Field: 'lazy' [13:14:18.692] - Field: 'state' [13:14:18.692] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:14:18.692] - Launch lazy future ... [13:14:18.692] Packages needed by the future expression (n = 1): 'future.apply' [13:14:18.693] Packages needed by future strategies (n = 0): [13:14:18.693] { [13:14:18.693] { [13:14:18.693] { [13:14:18.693] ...future.startTime <- base::Sys.time() [13:14:18.693] { [13:14:18.693] { [13:14:18.693] { [13:14:18.693] { [13:14:18.693] { [13:14:18.693] base::local({ [13:14:18.693] has_future <- base::requireNamespace("future", [13:14:18.693] quietly = TRUE) [13:14:18.693] if (has_future) { [13:14:18.693] ns <- base::getNamespace("future") [13:14:18.693] version <- ns[[".package"]][["version"]] [13:14:18.693] if (is.null(version)) [13:14:18.693] version <- utils::packageVersion("future") [13:14:18.693] } [13:14:18.693] else { [13:14:18.693] version <- NULL [13:14:18.693] } [13:14:18.693] if (!has_future || version < "1.8.0") { [13:14:18.693] info <- base::c(r_version = base::gsub("R version ", [13:14:18.693] "", base::R.version$version.string), [13:14:18.693] platform = base::sprintf("%s (%s-bit)", [13:14:18.693] base::R.version$platform, 8 * [13:14:18.693] base::.Machine$sizeof.pointer), [13:14:18.693] os = base::paste(base::Sys.info()[base::c("sysname", [13:14:18.693] "release", "version")], collapse = " "), [13:14:18.693] hostname = base::Sys.info()[["nodename"]]) [13:14:18.693] info <- base::sprintf("%s: %s", base::names(info), [13:14:18.693] info) [13:14:18.693] info <- base::paste(info, collapse = "; ") [13:14:18.693] if (!has_future) { [13:14:18.693] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:14:18.693] info) [13:14:18.693] } [13:14:18.693] else { [13:14:18.693] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:14:18.693] info, version) [13:14:18.693] } [13:14:18.693] base::stop(msg) [13:14:18.693] } [13:14:18.693] }) [13:14:18.693] } [13:14:18.693] ...future.mc.cores.old <- base::getOption("mc.cores") [13:14:18.693] base::options(mc.cores = 1L) [13:14:18.693] } [13:14:18.693] base::local({ [13:14:18.693] for (pkg in "future.apply") { [13:14:18.693] base::loadNamespace(pkg) [13:14:18.693] base::library(pkg, character.only = TRUE) [13:14:18.693] } [13:14:18.693] }) [13:14:18.693] } [13:14:18.693] options(future.plan = NULL) [13:14:18.693] Sys.unsetenv("R_FUTURE_PLAN") [13:14:18.693] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:14:18.693] } [13:14:18.693] ...future.workdir <- getwd() [13:14:18.693] } [13:14:18.693] ...future.oldOptions <- base::as.list(base::.Options) [13:14:18.693] ...future.oldEnvVars <- base::Sys.getenv() [13:14:18.693] } [13:14:18.693] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:14:18.693] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:14:18.693] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:14:18.693] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:14:18.693] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:14:18.693] future.stdout.windows.reencode = NULL, width = 80L) [13:14:18.693] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:14:18.693] base::names(...future.oldOptions)) [13:14:18.693] } [13:14:18.693] if (FALSE) { [13:14:18.693] } [13:14:18.693] else { [13:14:18.693] if (TRUE) { [13:14:18.693] ...future.stdout <- base::rawConnection(base::raw(0L), [13:14:18.693] open = "w") [13:14:18.693] } [13:14:18.693] else { [13:14:18.693] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:14:18.693] windows = "NUL", "/dev/null"), open = "w") [13:14:18.693] } [13:14:18.693] base::sink(...future.stdout, type = "output", split = FALSE) [13:14:18.693] base::on.exit(if (!base::is.null(...future.stdout)) { [13:14:18.693] base::sink(type = "output", split = FALSE) [13:14:18.693] base::close(...future.stdout) [13:14:18.693] }, add = TRUE) [13:14:18.693] } [13:14:18.693] ...future.frame <- base::sys.nframe() [13:14:18.693] ...future.conditions <- base::list() [13:14:18.693] ...future.rng <- base::globalenv()$.Random.seed [13:14:18.693] if (FALSE) { [13:14:18.693] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:14:18.693] "...future.value", "...future.globalenv.names", ".Random.seed") [13:14:18.693] } [13:14:18.693] ...future.result <- base::tryCatch({ [13:14:18.693] base::withCallingHandlers({ [13:14:18.693] ...future.value <- base::withVisible(base::local({ [13:14:18.693] ...future.makeSendCondition <- local({ [13:14:18.693] sendCondition <- NULL [13:14:18.693] function(frame = 1L) { [13:14:18.693] if (is.function(sendCondition)) [13:14:18.693] return(sendCondition) [13:14:18.693] ns <- getNamespace("parallel") [13:14:18.693] if (exists("sendData", mode = "function", [13:14:18.693] envir = ns)) { [13:14:18.693] parallel_sendData <- get("sendData", mode = "function", [13:14:18.693] envir = ns) [13:14:18.693] envir <- sys.frame(frame) [13:14:18.693] master <- NULL [13:14:18.693] while (!identical(envir, .GlobalEnv) && [13:14:18.693] !identical(envir, emptyenv())) { [13:14:18.693] if (exists("master", mode = "list", envir = envir, [13:14:18.693] inherits = FALSE)) { [13:14:18.693] master <- get("master", mode = "list", [13:14:18.693] envir = envir, inherits = FALSE) [13:14:18.693] if (inherits(master, c("SOCKnode", [13:14:18.693] "SOCK0node"))) { [13:14:18.693] sendCondition <<- function(cond) { [13:14:18.693] data <- list(type = "VALUE", value = cond, [13:14:18.693] success = TRUE) [13:14:18.693] parallel_sendData(master, data) [13:14:18.693] } [13:14:18.693] return(sendCondition) [13:14:18.693] } [13:14:18.693] } [13:14:18.693] frame <- frame + 1L [13:14:18.693] envir <- sys.frame(frame) [13:14:18.693] } [13:14:18.693] } [13:14:18.693] sendCondition <<- function(cond) NULL [13:14:18.693] } [13:14:18.693] }) [13:14:18.693] withCallingHandlers({ [13:14:18.693] { [13:14:18.693] do.call(function(...) { [13:14:18.693] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:18.693] if (!identical(...future.globals.maxSize.org, [13:14:18.693] ...future.globals.maxSize)) { [13:14:18.693] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:18.693] on.exit(options(oopts), add = TRUE) [13:14:18.693] } [13:14:18.693] { [13:14:18.693] lapply(seq_along(...future.elements_ii), [13:14:18.693] FUN = function(jj) { [13:14:18.693] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:18.693] ...future.FUN(...future.X_jj, ...) [13:14:18.693] }) [13:14:18.693] } [13:14:18.693] }, args = future.call.arguments) [13:14:18.693] } [13:14:18.693] }, immediateCondition = function(cond) { [13:14:18.693] sendCondition <- ...future.makeSendCondition() [13:14:18.693] sendCondition(cond) [13:14:18.693] muffleCondition <- function (cond, pattern = "^muffle") [13:14:18.693] { [13:14:18.693] inherits <- base::inherits [13:14:18.693] invokeRestart <- base::invokeRestart [13:14:18.693] is.null <- base::is.null [13:14:18.693] muffled <- FALSE [13:14:18.693] if (inherits(cond, "message")) { [13:14:18.693] muffled <- grepl(pattern, "muffleMessage") [13:14:18.693] if (muffled) [13:14:18.693] invokeRestart("muffleMessage") [13:14:18.693] } [13:14:18.693] else if (inherits(cond, "warning")) { [13:14:18.693] muffled <- grepl(pattern, "muffleWarning") [13:14:18.693] if (muffled) [13:14:18.693] invokeRestart("muffleWarning") [13:14:18.693] } [13:14:18.693] else if (inherits(cond, "condition")) { [13:14:18.693] if (!is.null(pattern)) { [13:14:18.693] computeRestarts <- base::computeRestarts [13:14:18.693] grepl <- base::grepl [13:14:18.693] restarts <- computeRestarts(cond) [13:14:18.693] for (restart in restarts) { [13:14:18.693] name <- restart$name [13:14:18.693] if (is.null(name)) [13:14:18.693] next [13:14:18.693] if (!grepl(pattern, name)) [13:14:18.693] next [13:14:18.693] invokeRestart(restart) [13:14:18.693] muffled <- TRUE [13:14:18.693] break [13:14:18.693] } [13:14:18.693] } [13:14:18.693] } [13:14:18.693] invisible(muffled) [13:14:18.693] } [13:14:18.693] muffleCondition(cond) [13:14:18.693] }) [13:14:18.693] })) [13:14:18.693] future::FutureResult(value = ...future.value$value, [13:14:18.693] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:14:18.693] ...future.rng), globalenv = if (FALSE) [13:14:18.693] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:14:18.693] ...future.globalenv.names)) [13:14:18.693] else NULL, started = ...future.startTime, version = "1.8") [13:14:18.693] }, condition = base::local({ [13:14:18.693] c <- base::c [13:14:18.693] inherits <- base::inherits [13:14:18.693] invokeRestart <- base::invokeRestart [13:14:18.693] length <- base::length [13:14:18.693] list <- base::list [13:14:18.693] seq.int <- base::seq.int [13:14:18.693] signalCondition <- base::signalCondition [13:14:18.693] sys.calls <- base::sys.calls [13:14:18.693] `[[` <- base::`[[` [13:14:18.693] `+` <- base::`+` [13:14:18.693] `<<-` <- base::`<<-` [13:14:18.693] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:14:18.693] calls[seq.int(from = from + 12L, to = length(calls) - [13:14:18.693] 3L)] [13:14:18.693] } [13:14:18.693] function(cond) { [13:14:18.693] is_error <- inherits(cond, "error") [13:14:18.693] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:14:18.693] NULL) [13:14:18.693] if (is_error) { [13:14:18.693] sessionInformation <- function() { [13:14:18.693] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:14:18.693] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:14:18.693] search = base::search(), system = base::Sys.info()) [13:14:18.693] } [13:14:18.693] ...future.conditions[[length(...future.conditions) + [13:14:18.693] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:14:18.693] cond$call), session = sessionInformation(), [13:14:18.693] timestamp = base::Sys.time(), signaled = 0L) [13:14:18.693] signalCondition(cond) [13:14:18.693] } [13:14:18.693] else if (!ignore && TRUE && inherits(cond, c("condition", [13:14:18.693] "immediateCondition"))) { [13:14:18.693] signal <- TRUE && inherits(cond, "immediateCondition") [13:14:18.693] ...future.conditions[[length(...future.conditions) + [13:14:18.693] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:14:18.693] if (TRUE && !signal) { [13:14:18.693] muffleCondition <- function (cond, pattern = "^muffle") [13:14:18.693] { [13:14:18.693] inherits <- base::inherits [13:14:18.693] invokeRestart <- base::invokeRestart [13:14:18.693] is.null <- base::is.null [13:14:18.693] muffled <- FALSE [13:14:18.693] if (inherits(cond, "message")) { [13:14:18.693] muffled <- grepl(pattern, "muffleMessage") [13:14:18.693] if (muffled) [13:14:18.693] invokeRestart("muffleMessage") [13:14:18.693] } [13:14:18.693] else if (inherits(cond, "warning")) { [13:14:18.693] muffled <- grepl(pattern, "muffleWarning") [13:14:18.693] if (muffled) [13:14:18.693] invokeRestart("muffleWarning") [13:14:18.693] } [13:14:18.693] else if (inherits(cond, "condition")) { [13:14:18.693] if (!is.null(pattern)) { [13:14:18.693] computeRestarts <- base::computeRestarts [13:14:18.693] grepl <- base::grepl [13:14:18.693] restarts <- computeRestarts(cond) [13:14:18.693] for (restart in restarts) { [13:14:18.693] name <- restart$name [13:14:18.693] if (is.null(name)) [13:14:18.693] next [13:14:18.693] if (!grepl(pattern, name)) [13:14:18.693] next [13:14:18.693] invokeRestart(restart) [13:14:18.693] muffled <- TRUE [13:14:18.693] break [13:14:18.693] } [13:14:18.693] } [13:14:18.693] } [13:14:18.693] invisible(muffled) [13:14:18.693] } [13:14:18.693] muffleCondition(cond, pattern = "^muffle") [13:14:18.693] } [13:14:18.693] } [13:14:18.693] else { [13:14:18.693] if (TRUE) { [13:14:18.693] muffleCondition <- function (cond, pattern = "^muffle") [13:14:18.693] { [13:14:18.693] inherits <- base::inherits [13:14:18.693] invokeRestart <- base::invokeRestart [13:14:18.693] is.null <- base::is.null [13:14:18.693] muffled <- FALSE [13:14:18.693] if (inherits(cond, "message")) { [13:14:18.693] muffled <- grepl(pattern, "muffleMessage") [13:14:18.693] if (muffled) [13:14:18.693] invokeRestart("muffleMessage") [13:14:18.693] } [13:14:18.693] else if (inherits(cond, "warning")) { [13:14:18.693] muffled <- grepl(pattern, "muffleWarning") [13:14:18.693] if (muffled) [13:14:18.693] invokeRestart("muffleWarning") [13:14:18.693] } [13:14:18.693] else if (inherits(cond, "condition")) { [13:14:18.693] if (!is.null(pattern)) { [13:14:18.693] computeRestarts <- base::computeRestarts [13:14:18.693] grepl <- base::grepl [13:14:18.693] restarts <- computeRestarts(cond) [13:14:18.693] for (restart in restarts) { [13:14:18.693] name <- restart$name [13:14:18.693] if (is.null(name)) [13:14:18.693] next [13:14:18.693] if (!grepl(pattern, name)) [13:14:18.693] next [13:14:18.693] invokeRestart(restart) [13:14:18.693] muffled <- TRUE [13:14:18.693] break [13:14:18.693] } [13:14:18.693] } [13:14:18.693] } [13:14:18.693] invisible(muffled) [13:14:18.693] } [13:14:18.693] muffleCondition(cond, pattern = "^muffle") [13:14:18.693] } [13:14:18.693] } [13:14:18.693] } [13:14:18.693] })) [13:14:18.693] }, error = function(ex) { [13:14:18.693] base::structure(base::list(value = NULL, visible = NULL, [13:14:18.693] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:14:18.693] ...future.rng), started = ...future.startTime, [13:14:18.693] finished = Sys.time(), session_uuid = NA_character_, [13:14:18.693] version = "1.8"), class = "FutureResult") [13:14:18.693] }, finally = { [13:14:18.693] if (!identical(...future.workdir, getwd())) [13:14:18.693] setwd(...future.workdir) [13:14:18.693] { [13:14:18.693] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:14:18.693] ...future.oldOptions$nwarnings <- NULL [13:14:18.693] } [13:14:18.693] base::options(...future.oldOptions) [13:14:18.693] if (.Platform$OS.type == "windows") { [13:14:18.693] old_names <- names(...future.oldEnvVars) [13:14:18.693] envs <- base::Sys.getenv() [13:14:18.693] names <- names(envs) [13:14:18.693] common <- intersect(names, old_names) [13:14:18.693] added <- setdiff(names, old_names) [13:14:18.693] removed <- setdiff(old_names, names) [13:14:18.693] changed <- common[...future.oldEnvVars[common] != [13:14:18.693] envs[common]] [13:14:18.693] NAMES <- toupper(changed) [13:14:18.693] args <- list() [13:14:18.693] for (kk in seq_along(NAMES)) { [13:14:18.693] name <- changed[[kk]] [13:14:18.693] NAME <- NAMES[[kk]] [13:14:18.693] if (name != NAME && is.element(NAME, old_names)) [13:14:18.693] next [13:14:18.693] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:18.693] } [13:14:18.693] NAMES <- toupper(added) [13:14:18.693] for (kk in seq_along(NAMES)) { [13:14:18.693] name <- added[[kk]] [13:14:18.693] NAME <- NAMES[[kk]] [13:14:18.693] if (name != NAME && is.element(NAME, old_names)) [13:14:18.693] next [13:14:18.693] args[[name]] <- "" [13:14:18.693] } [13:14:18.693] NAMES <- toupper(removed) [13:14:18.693] for (kk in seq_along(NAMES)) { [13:14:18.693] name <- removed[[kk]] [13:14:18.693] NAME <- NAMES[[kk]] [13:14:18.693] if (name != NAME && is.element(NAME, old_names)) [13:14:18.693] next [13:14:18.693] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:18.693] } [13:14:18.693] if (length(args) > 0) [13:14:18.693] base::do.call(base::Sys.setenv, args = args) [13:14:18.693] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:14:18.693] } [13:14:18.693] else { [13:14:18.693] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:14:18.693] } [13:14:18.693] { [13:14:18.693] if (base::length(...future.futureOptionsAdded) > [13:14:18.693] 0L) { [13:14:18.693] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:14:18.693] base::names(opts) <- ...future.futureOptionsAdded [13:14:18.693] base::options(opts) [13:14:18.693] } [13:14:18.693] { [13:14:18.693] { [13:14:18.693] base::options(mc.cores = ...future.mc.cores.old) [13:14:18.693] NULL [13:14:18.693] } [13:14:18.693] options(future.plan = NULL) [13:14:18.693] if (is.na(NA_character_)) [13:14:18.693] Sys.unsetenv("R_FUTURE_PLAN") [13:14:18.693] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:14:18.693] future::plan(list(function (..., workers = availableCores(), [13:14:18.693] lazy = FALSE, rscript_libs = .libPaths(), [13:14:18.693] envir = parent.frame()) [13:14:18.693] { [13:14:18.693] if (is.function(workers)) [13:14:18.693] workers <- workers() [13:14:18.693] workers <- structure(as.integer(workers), [13:14:18.693] class = class(workers)) [13:14:18.693] stop_if_not(length(workers) == 1, is.finite(workers), [13:14:18.693] workers >= 1) [13:14:18.693] if (workers == 1L && !inherits(workers, "AsIs")) { [13:14:18.693] return(sequential(..., lazy = TRUE, envir = envir)) [13:14:18.693] } [13:14:18.693] future <- MultisessionFuture(..., workers = workers, [13:14:18.693] lazy = lazy, rscript_libs = rscript_libs, [13:14:18.693] envir = envir) [13:14:18.693] if (!future$lazy) [13:14:18.693] future <- run(future) [13:14:18.693] invisible(future) [13:14:18.693] }), .cleanup = FALSE, .init = FALSE) [13:14:18.693] } [13:14:18.693] } [13:14:18.693] } [13:14:18.693] }) [13:14:18.693] if (TRUE) { [13:14:18.693] base::sink(type = "output", split = FALSE) [13:14:18.693] if (TRUE) { [13:14:18.693] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:14:18.693] } [13:14:18.693] else { [13:14:18.693] ...future.result["stdout"] <- base::list(NULL) [13:14:18.693] } [13:14:18.693] base::close(...future.stdout) [13:14:18.693] ...future.stdout <- NULL [13:14:18.693] } [13:14:18.693] ...future.result$conditions <- ...future.conditions [13:14:18.693] ...future.result$finished <- base::Sys.time() [13:14:18.693] ...future.result [13:14:18.693] } [13:14:18.699] Exporting 11 global objects (103.08 KiB) to cluster node #1 ... [13:14:18.699] Exporting '...future.FUN' (21.22 KiB) to cluster node #1 ... [13:14:18.699] Exporting '...future.FUN' (21.22 KiB) to cluster node #1 ... DONE [13:14:18.700] Exporting 'x_FUN' (10.95 KiB) to cluster node #1 ... [13:14:18.700] Exporting 'x_FUN' (10.95 KiB) to cluster node #1 ... DONE [13:14:18.700] Exporting 'times' (56 bytes) to cluster node #1 ... [13:14:18.701] Exporting 'times' (56 bytes) to cluster node #1 ... DONE [13:14:18.701] Exporting 'stopf' (26.43 KiB) to cluster node #1 ... [13:14:18.701] Exporting 'stopf' (26.43 KiB) to cluster node #1 ... DONE [13:14:18.701] Exporting 'stop_if_not' (44.12 KiB) to cluster node #1 ... [13:14:18.702] Exporting 'stop_if_not' (44.12 KiB) to cluster node #1 ... DONE [13:14:18.702] Exporting 'dim' (56 bytes) to cluster node #1 ... [13:14:18.702] Exporting 'dim' (56 bytes) to cluster node #1 ... DONE [13:14:18.703] Exporting 'valid_types' (248 bytes) to cluster node #1 ... [13:14:18.703] Exporting 'valid_types' (248 bytes) to cluster node #1 ... DONE [13:14:18.703] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... [13:14:18.704] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... DONE [13:14:18.704] Exporting '...future.elements_ii' (280 bytes) to cluster node #1 ... [13:14:18.704] Exporting '...future.elements_ii' (280 bytes) to cluster node #1 ... DONE [13:14:18.704] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:14:18.705] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:14:18.705] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:14:18.705] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:14:18.706] Exporting 11 global objects (103.08 KiB) to cluster node #1 ... DONE [13:14:18.706] MultisessionFuture started [13:14:18.706] - Launch lazy future ... done [13:14:18.707] run() for 'MultisessionFuture' ... done [13:14:18.707] Created future: [13:14:18.725] receiveMessageFromWorker() for ClusterFuture ... [13:14:18.725] - Validating connection of MultisessionFuture [13:14:18.725] - received message: FutureResult [13:14:18.725] - Received FutureResult [13:14:18.725] - Erased future from FutureRegistry [13:14:18.726] result() for ClusterFuture ... [13:14:18.726] - result already collected: FutureResult [13:14:18.726] result() for ClusterFuture ... done [13:14:18.726] receiveMessageFromWorker() for ClusterFuture ... done [13:14:18.707] MultisessionFuture: [13:14:18.707] Label: 'future_vapply-2' [13:14:18.707] Expression: [13:14:18.707] { [13:14:18.707] do.call(function(...) { [13:14:18.707] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:18.707] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:18.707] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:18.707] on.exit(options(oopts), add = TRUE) [13:14:18.707] } [13:14:18.707] { [13:14:18.707] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:18.707] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:18.707] ...future.FUN(...future.X_jj, ...) [13:14:18.707] }) [13:14:18.707] } [13:14:18.707] }, args = future.call.arguments) [13:14:18.707] } [13:14:18.707] Lazy evaluation: FALSE [13:14:18.707] Asynchronous evaluation: TRUE [13:14:18.707] Local evaluation: TRUE [13:14:18.707] Environment: R_GlobalEnv [13:14:18.707] Capture standard output: TRUE [13:14:18.707] Capture condition classes: 'condition' (excluding 'nothing') [13:14:18.707] Globals: 11 objects totaling 103.35 KiB (function '...future.FUN' of 21.22 KiB, function 'x_FUN' of 10.95 KiB, integer 'times' of 56 bytes, function 'stopf' of 26.43 KiB, function 'stop_if_not' of 44.12 KiB, ...) [13:14:18.707] Packages: 1 packages ('future.apply') [13:14:18.707] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:14:18.707] Resolved: TRUE [13:14:18.707] Value: [13:14:18.707] Conditions captured: [13:14:18.707] Early signaling: FALSE [13:14:18.707] Owner process: 1bb7d580-628d-c90d-e38a-66de485868c4 [13:14:18.707] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:14:18.727] Chunk #2 of 2 ... DONE [13:14:18.727] Launching 2 futures (chunks) ... DONE [13:14:18.727] Resolving 2 futures (chunks) ... [13:14:18.727] resolve() on list ... [13:14:18.727] recursive: 0 [13:14:18.727] length: 2 [13:14:18.728] [13:14:18.728] Future #1 [13:14:18.728] result() for ClusterFuture ... [13:14:18.728] - result already collected: FutureResult [13:14:18.728] result() for ClusterFuture ... done [13:14:18.728] result() for ClusterFuture ... [13:14:18.728] - result already collected: FutureResult [13:14:18.729] result() for ClusterFuture ... done [13:14:18.729] signalConditionsASAP(MultisessionFuture, pos=1) ... [13:14:18.729] - nx: 2 [13:14:18.729] - relay: TRUE [13:14:18.729] - stdout: TRUE [13:14:18.729] - signal: TRUE [13:14:18.730] - resignal: FALSE [13:14:18.730] - force: TRUE [13:14:18.730] - relayed: [n=2] FALSE, FALSE [13:14:18.730] - queued futures: [n=2] FALSE, FALSE [13:14:18.730] - until=1 [13:14:18.730] - relaying element #1 [13:14:18.731] result() for ClusterFuture ... [13:14:18.731] - result already collected: FutureResult [13:14:18.731] result() for ClusterFuture ... done [13:14:18.731] result() for ClusterFuture ... [13:14:18.731] - result already collected: FutureResult [13:14:18.731] result() for ClusterFuture ... done [13:14:18.732] result() for ClusterFuture ... [13:14:18.732] - result already collected: FutureResult [13:14:18.732] result() for ClusterFuture ... done [13:14:18.732] result() for ClusterFuture ... [13:14:18.732] - result already collected: FutureResult [13:14:18.732] result() for ClusterFuture ... done [13:14:18.732] - relayed: [n=2] TRUE, FALSE [13:14:18.733] - queued futures: [n=2] TRUE, FALSE [13:14:18.733] signalConditionsASAP(MultisessionFuture, pos=1) ... done [13:14:18.733] length: 1 (resolved future 1) [13:14:18.733] Future #2 [13:14:18.733] result() for ClusterFuture ... [13:14:18.733] - result already collected: FutureResult [13:14:18.734] result() for ClusterFuture ... done [13:14:18.734] result() for ClusterFuture ... [13:14:18.734] - result already collected: FutureResult [13:14:18.734] result() for ClusterFuture ... done [13:14:18.734] signalConditionsASAP(MultisessionFuture, pos=2) ... [13:14:18.734] - nx: 2 [13:14:18.735] - relay: TRUE [13:14:18.735] - stdout: TRUE [13:14:18.735] - signal: TRUE [13:14:18.735] - resignal: FALSE [13:14:18.735] - force: TRUE [13:14:18.735] - relayed: [n=2] TRUE, FALSE [13:14:18.735] - queued futures: [n=2] TRUE, FALSE [13:14:18.736] - until=2 [13:14:18.736] - relaying element #2 [13:14:18.736] result() for ClusterFuture ... [13:14:18.736] - result already collected: FutureResult [13:14:18.736] result() for ClusterFuture ... done [13:14:18.736] result() for ClusterFuture ... [13:14:18.737] - result already collected: FutureResult [13:14:18.737] result() for ClusterFuture ... done [13:14:18.737] result() for ClusterFuture ... [13:14:18.737] - result already collected: FutureResult [13:14:18.737] result() for ClusterFuture ... done [13:14:18.737] result() for ClusterFuture ... [13:14:18.738] - result already collected: FutureResult [13:14:18.738] result() for ClusterFuture ... done [13:14:18.738] - relayed: [n=2] TRUE, TRUE [13:14:18.738] - queued futures: [n=2] TRUE, TRUE [13:14:18.738] signalConditionsASAP(MultisessionFuture, pos=2) ... done [13:14:18.738] length: 0 (resolved future 2) [13:14:18.739] Relaying remaining futures [13:14:18.739] signalConditionsASAP(NULL, pos=0) ... [13:14:18.739] - nx: 2 [13:14:18.739] - relay: TRUE [13:14:18.739] - stdout: TRUE [13:14:18.739] - signal: TRUE [13:14:18.739] - resignal: FALSE [13:14:18.740] - force: TRUE [13:14:18.740] - relayed: [n=2] TRUE, TRUE [13:14:18.740] - queued futures: [n=2] TRUE, TRUE - flush all [13:14:18.740] - relayed: [n=2] TRUE, TRUE [13:14:18.740] - queued futures: [n=2] TRUE, TRUE [13:14:18.740] signalConditionsASAP(NULL, pos=0) ... done [13:14:18.741] resolve() on list ... DONE [13:14:18.741] result() for ClusterFuture ... [13:14:18.741] - result already collected: FutureResult [13:14:18.741] result() for ClusterFuture ... done [13:14:18.741] result() for ClusterFuture ... [13:14:18.741] - result already collected: FutureResult [13:14:18.742] result() for ClusterFuture ... done [13:14:18.742] result() for ClusterFuture ... [13:14:18.742] - result already collected: FutureResult [13:14:18.742] result() for ClusterFuture ... done [13:14:18.742] result() for ClusterFuture ... [13:14:18.742] - result already collected: FutureResult [13:14:18.743] result() for ClusterFuture ... done [13:14:18.743] - Number of value chunks collected: 2 [13:14:18.743] Resolving 2 futures (chunks) ... DONE [13:14:18.743] Reducing values from 2 chunks ... [13:14:18.743] - Number of values collected after concatenation: 10 [13:14:18.743] - Number of values expected: 10 [13:14:18.744] Reducing values from 2 chunks ... DONE [13:14:18.744] future_lapply() ... DONE int [1:2, 1:2, 1:10] 1 1 1 1 2 2 2 2 3 3 ... - attr(*, "dimnames")=List of 3 ..$ : chr [1:2] "a" "b" ..$ : chr [1:2] "A" "B" ..$ : NULL - From example(vapply) ... [13:14:18.746] future_lapply() ... [13:14:18.751] Number of chunks: 2 [13:14:18.751] getGlobalsAndPackagesXApply() ... [13:14:18.751] - future.globals: TRUE [13:14:18.752] getGlobalsAndPackages() ... [13:14:18.752] Searching for globals... [13:14:18.756] - globals found: [17] 'FUN', '{', '<-', 'x_FUN', 'if', '!=', 'length', 'times', 'stopf', 'stop_if_not', 'all', '==', 'dim', '%in%', 'typeof', 'valid_types', 'UseMethod' [13:14:18.757] Searching for globals ... DONE [13:14:18.757] Resolving globals: FALSE [13:14:18.758] The total size of the 7 globals is 93.29 KiB (95528 bytes) [13:14:18.758] The total size of the 7 globals exported for future expression ('FUN()') is 93.29 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). The three largest globals are 'stop_if_not' (44.12 KiB of class 'function'), 'stopf' (26.43 KiB of class 'function') and 'FUN' (21.22 KiB of class 'function') [13:14:18.759] - globals: [7] 'FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types' [13:14:18.759] - packages: [2] 'stats', 'future.apply' [13:14:18.759] getGlobalsAndPackages() ... DONE [13:14:18.759] - globals found/used: [n=7] 'FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types' [13:14:18.759] - needed namespaces: [n=2] 'stats', 'future.apply' [13:14:18.760] Finding globals ... DONE [13:14:18.760] - use_args: TRUE [13:14:18.760] - Getting '...' globals ... [13:14:18.760] resolve() on list ... [13:14:18.760] recursive: 0 [13:14:18.761] length: 1 [13:14:18.761] elements: '...' [13:14:18.761] length: 0 (resolved future 1) [13:14:18.761] resolve() on list ... DONE [13:14:18.761] - '...' content: [n=0] [13:14:18.761] List of 1 [13:14:18.761] $ ...: list() [13:14:18.761] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:14:18.761] - attr(*, "where")=List of 1 [13:14:18.761] ..$ ...: [13:14:18.761] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:14:18.761] - attr(*, "resolved")= logi TRUE [13:14:18.761] - attr(*, "total_size")= num NA [13:14:18.764] - Getting '...' globals ... DONE [13:14:18.765] Globals to be used in all futures (chunks): [n=8] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...' [13:14:18.765] List of 8 [13:14:18.765] $ ...future.FUN:function (x, ...) [13:14:18.765] $ x_FUN :function (x, ...) [13:14:18.765] $ times : int 5 [13:14:18.765] $ stopf :function (fmt, ..., call. = TRUE, domain = NULL) [13:14:18.765] $ stop_if_not :function (...) [13:14:18.765] $ dim : NULL [13:14:18.765] $ valid_types : chr [1:3] "logical" "integer" "double" [13:14:18.765] $ ... : list() [13:14:18.765] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:14:18.765] - attr(*, "where")=List of 8 [13:14:18.765] ..$ ...future.FUN: [13:14:18.765] ..$ x_FUN : [13:14:18.765] ..$ times : [13:14:18.765] ..$ stopf : [13:14:18.765] ..$ stop_if_not : [13:14:18.765] ..$ dim : [13:14:18.765] ..$ valid_types : [13:14:18.765] ..$ ... : [13:14:18.765] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:14:18.765] - attr(*, "resolved")= logi FALSE [13:14:18.765] - attr(*, "total_size")= num 95528 [13:14:18.772] Packages to be attached in all futures: [n=2] 'stats', 'future.apply' [13:14:18.772] getGlobalsAndPackagesXApply() ... DONE [13:14:18.772] Number of futures (= number of chunks): 2 [13:14:18.772] Launching 2 futures (chunks) ... [13:14:18.772] Chunk #1 of 2 ... [13:14:18.773] - Finding globals in 'X' for chunk #1 ... [13:14:18.773] getGlobalsAndPackages() ... [13:14:18.773] Searching for globals... [13:14:18.773] [13:14:18.773] Searching for globals ... DONE [13:14:18.774] - globals: [0] [13:14:18.774] getGlobalsAndPackages() ... DONE [13:14:18.774] + additional globals found: [n=0] [13:14:18.774] + additional namespaces needed: [n=0] [13:14:18.774] - Finding globals in 'X' for chunk #1 ... DONE [13:14:18.774] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:14:18.775] - seeds: [13:14:18.775] - All globals exported: [n=11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:18.775] getGlobalsAndPackages() ... [13:14:18.775] - globals passed as-is: [11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:18.775] Resolving globals: FALSE [13:14:18.775] Tweak future expression to call with '...' arguments ... [13:14:18.776] { [13:14:18.776] do.call(function(...) { [13:14:18.776] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:18.776] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:18.776] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:18.776] on.exit(options(oopts), add = TRUE) [13:14:18.776] } [13:14:18.776] { [13:14:18.776] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:18.776] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:18.776] ...future.FUN(...future.X_jj, ...) [13:14:18.776] }) [13:14:18.776] } [13:14:18.776] }, args = future.call.arguments) [13:14:18.776] } [13:14:18.776] Tweak future expression to call with '...' arguments ... DONE [13:14:18.777] - globals: [11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:18.777] - packages: [2] 'stats', 'future.apply' [13:14:18.777] getGlobalsAndPackages() ... DONE [13:14:18.777] run() for 'Future' ... [13:14:18.778] - state: 'created' [13:14:18.778] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:14:18.792] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:14:18.792] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:14:18.793] - Field: 'node' [13:14:18.793] - Field: 'label' [13:14:18.793] - Field: 'local' [13:14:18.793] - Field: 'owner' [13:14:18.793] - Field: 'envir' [13:14:18.794] - Field: 'workers' [13:14:18.794] - Field: 'packages' [13:14:18.794] - Field: 'gc' [13:14:18.794] - Field: 'conditions' [13:14:18.794] - Field: 'persistent' [13:14:18.794] - Field: 'expr' [13:14:18.795] - Field: 'uuid' [13:14:18.795] - Field: 'seed' [13:14:18.795] - Field: 'version' [13:14:18.795] - Field: 'result' [13:14:18.795] - Field: 'asynchronous' [13:14:18.796] - Field: 'calls' [13:14:18.796] - Field: 'globals' [13:14:18.796] - Field: 'stdout' [13:14:18.796] - Field: 'earlySignal' [13:14:18.796] - Field: 'lazy' [13:14:18.796] - Field: 'state' [13:14:18.797] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:14:18.797] - Launch lazy future ... [13:14:18.797] Packages needed by the future expression (n = 2): 'stats', 'future.apply' [13:14:18.797] Packages needed by future strategies (n = 0): [13:14:18.798] { [13:14:18.798] { [13:14:18.798] { [13:14:18.798] ...future.startTime <- base::Sys.time() [13:14:18.798] { [13:14:18.798] { [13:14:18.798] { [13:14:18.798] { [13:14:18.798] { [13:14:18.798] base::local({ [13:14:18.798] has_future <- base::requireNamespace("future", [13:14:18.798] quietly = TRUE) [13:14:18.798] if (has_future) { [13:14:18.798] ns <- base::getNamespace("future") [13:14:18.798] version <- ns[[".package"]][["version"]] [13:14:18.798] if (is.null(version)) [13:14:18.798] version <- utils::packageVersion("future") [13:14:18.798] } [13:14:18.798] else { [13:14:18.798] version <- NULL [13:14:18.798] } [13:14:18.798] if (!has_future || version < "1.8.0") { [13:14:18.798] info <- base::c(r_version = base::gsub("R version ", [13:14:18.798] "", base::R.version$version.string), [13:14:18.798] platform = base::sprintf("%s (%s-bit)", [13:14:18.798] base::R.version$platform, 8 * [13:14:18.798] base::.Machine$sizeof.pointer), [13:14:18.798] os = base::paste(base::Sys.info()[base::c("sysname", [13:14:18.798] "release", "version")], collapse = " "), [13:14:18.798] hostname = base::Sys.info()[["nodename"]]) [13:14:18.798] info <- base::sprintf("%s: %s", base::names(info), [13:14:18.798] info) [13:14:18.798] info <- base::paste(info, collapse = "; ") [13:14:18.798] if (!has_future) { [13:14:18.798] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:14:18.798] info) [13:14:18.798] } [13:14:18.798] else { [13:14:18.798] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:14:18.798] info, version) [13:14:18.798] } [13:14:18.798] base::stop(msg) [13:14:18.798] } [13:14:18.798] }) [13:14:18.798] } [13:14:18.798] ...future.mc.cores.old <- base::getOption("mc.cores") [13:14:18.798] base::options(mc.cores = 1L) [13:14:18.798] } [13:14:18.798] base::local({ [13:14:18.798] for (pkg in c("stats", "future.apply")) { [13:14:18.798] base::loadNamespace(pkg) [13:14:18.798] base::library(pkg, character.only = TRUE) [13:14:18.798] } [13:14:18.798] }) [13:14:18.798] } [13:14:18.798] options(future.plan = NULL) [13:14:18.798] Sys.unsetenv("R_FUTURE_PLAN") [13:14:18.798] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:14:18.798] } [13:14:18.798] ...future.workdir <- getwd() [13:14:18.798] } [13:14:18.798] ...future.oldOptions <- base::as.list(base::.Options) [13:14:18.798] ...future.oldEnvVars <- base::Sys.getenv() [13:14:18.798] } [13:14:18.798] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:14:18.798] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:14:18.798] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:14:18.798] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:14:18.798] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:14:18.798] future.stdout.windows.reencode = NULL, width = 80L) [13:14:18.798] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:14:18.798] base::names(...future.oldOptions)) [13:14:18.798] } [13:14:18.798] if (FALSE) { [13:14:18.798] } [13:14:18.798] else { [13:14:18.798] if (TRUE) { [13:14:18.798] ...future.stdout <- base::rawConnection(base::raw(0L), [13:14:18.798] open = "w") [13:14:18.798] } [13:14:18.798] else { [13:14:18.798] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:14:18.798] windows = "NUL", "/dev/null"), open = "w") [13:14:18.798] } [13:14:18.798] base::sink(...future.stdout, type = "output", split = FALSE) [13:14:18.798] base::on.exit(if (!base::is.null(...future.stdout)) { [13:14:18.798] base::sink(type = "output", split = FALSE) [13:14:18.798] base::close(...future.stdout) [13:14:18.798] }, add = TRUE) [13:14:18.798] } [13:14:18.798] ...future.frame <- base::sys.nframe() [13:14:18.798] ...future.conditions <- base::list() [13:14:18.798] ...future.rng <- base::globalenv()$.Random.seed [13:14:18.798] if (FALSE) { [13:14:18.798] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:14:18.798] "...future.value", "...future.globalenv.names", ".Random.seed") [13:14:18.798] } [13:14:18.798] ...future.result <- base::tryCatch({ [13:14:18.798] base::withCallingHandlers({ [13:14:18.798] ...future.value <- base::withVisible(base::local({ [13:14:18.798] ...future.makeSendCondition <- local({ [13:14:18.798] sendCondition <- NULL [13:14:18.798] function(frame = 1L) { [13:14:18.798] if (is.function(sendCondition)) [13:14:18.798] return(sendCondition) [13:14:18.798] ns <- getNamespace("parallel") [13:14:18.798] if (exists("sendData", mode = "function", [13:14:18.798] envir = ns)) { [13:14:18.798] parallel_sendData <- get("sendData", mode = "function", [13:14:18.798] envir = ns) [13:14:18.798] envir <- sys.frame(frame) [13:14:18.798] master <- NULL [13:14:18.798] while (!identical(envir, .GlobalEnv) && [13:14:18.798] !identical(envir, emptyenv())) { [13:14:18.798] if (exists("master", mode = "list", envir = envir, [13:14:18.798] inherits = FALSE)) { [13:14:18.798] master <- get("master", mode = "list", [13:14:18.798] envir = envir, inherits = FALSE) [13:14:18.798] if (inherits(master, c("SOCKnode", [13:14:18.798] "SOCK0node"))) { [13:14:18.798] sendCondition <<- function(cond) { [13:14:18.798] data <- list(type = "VALUE", value = cond, [13:14:18.798] success = TRUE) [13:14:18.798] parallel_sendData(master, data) [13:14:18.798] } [13:14:18.798] return(sendCondition) [13:14:18.798] } [13:14:18.798] } [13:14:18.798] frame <- frame + 1L [13:14:18.798] envir <- sys.frame(frame) [13:14:18.798] } [13:14:18.798] } [13:14:18.798] sendCondition <<- function(cond) NULL [13:14:18.798] } [13:14:18.798] }) [13:14:18.798] withCallingHandlers({ [13:14:18.798] { [13:14:18.798] do.call(function(...) { [13:14:18.798] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:18.798] if (!identical(...future.globals.maxSize.org, [13:14:18.798] ...future.globals.maxSize)) { [13:14:18.798] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:18.798] on.exit(options(oopts), add = TRUE) [13:14:18.798] } [13:14:18.798] { [13:14:18.798] lapply(seq_along(...future.elements_ii), [13:14:18.798] FUN = function(jj) { [13:14:18.798] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:18.798] ...future.FUN(...future.X_jj, ...) [13:14:18.798] }) [13:14:18.798] } [13:14:18.798] }, args = future.call.arguments) [13:14:18.798] } [13:14:18.798] }, immediateCondition = function(cond) { [13:14:18.798] sendCondition <- ...future.makeSendCondition() [13:14:18.798] sendCondition(cond) [13:14:18.798] muffleCondition <- function (cond, pattern = "^muffle") [13:14:18.798] { [13:14:18.798] inherits <- base::inherits [13:14:18.798] invokeRestart <- base::invokeRestart [13:14:18.798] is.null <- base::is.null [13:14:18.798] muffled <- FALSE [13:14:18.798] if (inherits(cond, "message")) { [13:14:18.798] muffled <- grepl(pattern, "muffleMessage") [13:14:18.798] if (muffled) [13:14:18.798] invokeRestart("muffleMessage") [13:14:18.798] } [13:14:18.798] else if (inherits(cond, "warning")) { [13:14:18.798] muffled <- grepl(pattern, "muffleWarning") [13:14:18.798] if (muffled) [13:14:18.798] invokeRestart("muffleWarning") [13:14:18.798] } [13:14:18.798] else if (inherits(cond, "condition")) { [13:14:18.798] if (!is.null(pattern)) { [13:14:18.798] computeRestarts <- base::computeRestarts [13:14:18.798] grepl <- base::grepl [13:14:18.798] restarts <- computeRestarts(cond) [13:14:18.798] for (restart in restarts) { [13:14:18.798] name <- restart$name [13:14:18.798] if (is.null(name)) [13:14:18.798] next [13:14:18.798] if (!grepl(pattern, name)) [13:14:18.798] next [13:14:18.798] invokeRestart(restart) [13:14:18.798] muffled <- TRUE [13:14:18.798] break [13:14:18.798] } [13:14:18.798] } [13:14:18.798] } [13:14:18.798] invisible(muffled) [13:14:18.798] } [13:14:18.798] muffleCondition(cond) [13:14:18.798] }) [13:14:18.798] })) [13:14:18.798] future::FutureResult(value = ...future.value$value, [13:14:18.798] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:14:18.798] ...future.rng), globalenv = if (FALSE) [13:14:18.798] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:14:18.798] ...future.globalenv.names)) [13:14:18.798] else NULL, started = ...future.startTime, version = "1.8") [13:14:18.798] }, condition = base::local({ [13:14:18.798] c <- base::c [13:14:18.798] inherits <- base::inherits [13:14:18.798] invokeRestart <- base::invokeRestart [13:14:18.798] length <- base::length [13:14:18.798] list <- base::list [13:14:18.798] seq.int <- base::seq.int [13:14:18.798] signalCondition <- base::signalCondition [13:14:18.798] sys.calls <- base::sys.calls [13:14:18.798] `[[` <- base::`[[` [13:14:18.798] `+` <- base::`+` [13:14:18.798] `<<-` <- base::`<<-` [13:14:18.798] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:14:18.798] calls[seq.int(from = from + 12L, to = length(calls) - [13:14:18.798] 3L)] [13:14:18.798] } [13:14:18.798] function(cond) { [13:14:18.798] is_error <- inherits(cond, "error") [13:14:18.798] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:14:18.798] NULL) [13:14:18.798] if (is_error) { [13:14:18.798] sessionInformation <- function() { [13:14:18.798] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:14:18.798] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:14:18.798] search = base::search(), system = base::Sys.info()) [13:14:18.798] } [13:14:18.798] ...future.conditions[[length(...future.conditions) + [13:14:18.798] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:14:18.798] cond$call), session = sessionInformation(), [13:14:18.798] timestamp = base::Sys.time(), signaled = 0L) [13:14:18.798] signalCondition(cond) [13:14:18.798] } [13:14:18.798] else if (!ignore && TRUE && inherits(cond, c("condition", [13:14:18.798] "immediateCondition"))) { [13:14:18.798] signal <- TRUE && inherits(cond, "immediateCondition") [13:14:18.798] ...future.conditions[[length(...future.conditions) + [13:14:18.798] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:14:18.798] if (TRUE && !signal) { [13:14:18.798] muffleCondition <- function (cond, pattern = "^muffle") [13:14:18.798] { [13:14:18.798] inherits <- base::inherits [13:14:18.798] invokeRestart <- base::invokeRestart [13:14:18.798] is.null <- base::is.null [13:14:18.798] muffled <- FALSE [13:14:18.798] if (inherits(cond, "message")) { [13:14:18.798] muffled <- grepl(pattern, "muffleMessage") [13:14:18.798] if (muffled) [13:14:18.798] invokeRestart("muffleMessage") [13:14:18.798] } [13:14:18.798] else if (inherits(cond, "warning")) { [13:14:18.798] muffled <- grepl(pattern, "muffleWarning") [13:14:18.798] if (muffled) [13:14:18.798] invokeRestart("muffleWarning") [13:14:18.798] } [13:14:18.798] else if (inherits(cond, "condition")) { [13:14:18.798] if (!is.null(pattern)) { [13:14:18.798] computeRestarts <- base::computeRestarts [13:14:18.798] grepl <- base::grepl [13:14:18.798] restarts <- computeRestarts(cond) [13:14:18.798] for (restart in restarts) { [13:14:18.798] name <- restart$name [13:14:18.798] if (is.null(name)) [13:14:18.798] next [13:14:18.798] if (!grepl(pattern, name)) [13:14:18.798] next [13:14:18.798] invokeRestart(restart) [13:14:18.798] muffled <- TRUE [13:14:18.798] break [13:14:18.798] } [13:14:18.798] } [13:14:18.798] } [13:14:18.798] invisible(muffled) [13:14:18.798] } [13:14:18.798] muffleCondition(cond, pattern = "^muffle") [13:14:18.798] } [13:14:18.798] } [13:14:18.798] else { [13:14:18.798] if (TRUE) { [13:14:18.798] muffleCondition <- function (cond, pattern = "^muffle") [13:14:18.798] { [13:14:18.798] inherits <- base::inherits [13:14:18.798] invokeRestart <- base::invokeRestart [13:14:18.798] is.null <- base::is.null [13:14:18.798] muffled <- FALSE [13:14:18.798] if (inherits(cond, "message")) { [13:14:18.798] muffled <- grepl(pattern, "muffleMessage") [13:14:18.798] if (muffled) [13:14:18.798] invokeRestart("muffleMessage") [13:14:18.798] } [13:14:18.798] else if (inherits(cond, "warning")) { [13:14:18.798] muffled <- grepl(pattern, "muffleWarning") [13:14:18.798] if (muffled) [13:14:18.798] invokeRestart("muffleWarning") [13:14:18.798] } [13:14:18.798] else if (inherits(cond, "condition")) { [13:14:18.798] if (!is.null(pattern)) { [13:14:18.798] computeRestarts <- base::computeRestarts [13:14:18.798] grepl <- base::grepl [13:14:18.798] restarts <- computeRestarts(cond) [13:14:18.798] for (restart in restarts) { [13:14:18.798] name <- restart$name [13:14:18.798] if (is.null(name)) [13:14:18.798] next [13:14:18.798] if (!grepl(pattern, name)) [13:14:18.798] next [13:14:18.798] invokeRestart(restart) [13:14:18.798] muffled <- TRUE [13:14:18.798] break [13:14:18.798] } [13:14:18.798] } [13:14:18.798] } [13:14:18.798] invisible(muffled) [13:14:18.798] } [13:14:18.798] muffleCondition(cond, pattern = "^muffle") [13:14:18.798] } [13:14:18.798] } [13:14:18.798] } [13:14:18.798] })) [13:14:18.798] }, error = function(ex) { [13:14:18.798] base::structure(base::list(value = NULL, visible = NULL, [13:14:18.798] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:14:18.798] ...future.rng), started = ...future.startTime, [13:14:18.798] finished = Sys.time(), session_uuid = NA_character_, [13:14:18.798] version = "1.8"), class = "FutureResult") [13:14:18.798] }, finally = { [13:14:18.798] if (!identical(...future.workdir, getwd())) [13:14:18.798] setwd(...future.workdir) [13:14:18.798] { [13:14:18.798] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:14:18.798] ...future.oldOptions$nwarnings <- NULL [13:14:18.798] } [13:14:18.798] base::options(...future.oldOptions) [13:14:18.798] if (.Platform$OS.type == "windows") { [13:14:18.798] old_names <- names(...future.oldEnvVars) [13:14:18.798] envs <- base::Sys.getenv() [13:14:18.798] names <- names(envs) [13:14:18.798] common <- intersect(names, old_names) [13:14:18.798] added <- setdiff(names, old_names) [13:14:18.798] removed <- setdiff(old_names, names) [13:14:18.798] changed <- common[...future.oldEnvVars[common] != [13:14:18.798] envs[common]] [13:14:18.798] NAMES <- toupper(changed) [13:14:18.798] args <- list() [13:14:18.798] for (kk in seq_along(NAMES)) { [13:14:18.798] name <- changed[[kk]] [13:14:18.798] NAME <- NAMES[[kk]] [13:14:18.798] if (name != NAME && is.element(NAME, old_names)) [13:14:18.798] next [13:14:18.798] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:18.798] } [13:14:18.798] NAMES <- toupper(added) [13:14:18.798] for (kk in seq_along(NAMES)) { [13:14:18.798] name <- added[[kk]] [13:14:18.798] NAME <- NAMES[[kk]] [13:14:18.798] if (name != NAME && is.element(NAME, old_names)) [13:14:18.798] next [13:14:18.798] args[[name]] <- "" [13:14:18.798] } [13:14:18.798] NAMES <- toupper(removed) [13:14:18.798] for (kk in seq_along(NAMES)) { [13:14:18.798] name <- removed[[kk]] [13:14:18.798] NAME <- NAMES[[kk]] [13:14:18.798] if (name != NAME && is.element(NAME, old_names)) [13:14:18.798] next [13:14:18.798] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:18.798] } [13:14:18.798] if (length(args) > 0) [13:14:18.798] base::do.call(base::Sys.setenv, args = args) [13:14:18.798] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:14:18.798] } [13:14:18.798] else { [13:14:18.798] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:14:18.798] } [13:14:18.798] { [13:14:18.798] if (base::length(...future.futureOptionsAdded) > [13:14:18.798] 0L) { [13:14:18.798] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:14:18.798] base::names(opts) <- ...future.futureOptionsAdded [13:14:18.798] base::options(opts) [13:14:18.798] } [13:14:18.798] { [13:14:18.798] { [13:14:18.798] base::options(mc.cores = ...future.mc.cores.old) [13:14:18.798] NULL [13:14:18.798] } [13:14:18.798] options(future.plan = NULL) [13:14:18.798] if (is.na(NA_character_)) [13:14:18.798] Sys.unsetenv("R_FUTURE_PLAN") [13:14:18.798] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:14:18.798] future::plan(list(function (..., workers = availableCores(), [13:14:18.798] lazy = FALSE, rscript_libs = .libPaths(), [13:14:18.798] envir = parent.frame()) [13:14:18.798] { [13:14:18.798] if (is.function(workers)) [13:14:18.798] workers <- workers() [13:14:18.798] workers <- structure(as.integer(workers), [13:14:18.798] class = class(workers)) [13:14:18.798] stop_if_not(length(workers) == 1, is.finite(workers), [13:14:18.798] workers >= 1) [13:14:18.798] if (workers == 1L && !inherits(workers, "AsIs")) { [13:14:18.798] return(sequential(..., lazy = TRUE, envir = envir)) [13:14:18.798] } [13:14:18.798] future <- MultisessionFuture(..., workers = workers, [13:14:18.798] lazy = lazy, rscript_libs = rscript_libs, [13:14:18.798] envir = envir) [13:14:18.798] if (!future$lazy) [13:14:18.798] future <- run(future) [13:14:18.798] invisible(future) [13:14:18.798] }), .cleanup = FALSE, .init = FALSE) [13:14:18.798] } [13:14:18.798] } [13:14:18.798] } [13:14:18.798] }) [13:14:18.798] if (TRUE) { [13:14:18.798] base::sink(type = "output", split = FALSE) [13:14:18.798] if (TRUE) { [13:14:18.798] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:14:18.798] } [13:14:18.798] else { [13:14:18.798] ...future.result["stdout"] <- base::list(NULL) [13:14:18.798] } [13:14:18.798] base::close(...future.stdout) [13:14:18.798] ...future.stdout <- NULL [13:14:18.798] } [13:14:18.798] ...future.result$conditions <- ...future.conditions [13:14:18.798] ...future.result$finished <- base::Sys.time() [13:14:18.798] ...future.result [13:14:18.798] } [13:14:18.804] Exporting 11 global objects (93.29 KiB) to cluster node #1 ... [13:14:18.804] Exporting '...future.FUN' (21.22 KiB) to cluster node #1 ... [13:14:18.804] Exporting '...future.FUN' (21.22 KiB) to cluster node #1 ... DONE [13:14:18.805] Exporting 'x_FUN' (1.22 KiB) to cluster node #1 ... [13:14:18.805] Exporting 'x_FUN' (1.22 KiB) to cluster node #1 ... DONE [13:14:18.805] Exporting 'times' (56 bytes) to cluster node #1 ... [13:14:18.806] Exporting 'times' (56 bytes) to cluster node #1 ... DONE [13:14:18.806] Exporting 'stopf' (26.43 KiB) to cluster node #1 ... [13:14:18.806] Exporting 'stopf' (26.43 KiB) to cluster node #1 ... DONE [13:14:18.807] Exporting 'stop_if_not' (44.12 KiB) to cluster node #1 ... [13:14:18.807] Exporting 'stop_if_not' (44.12 KiB) to cluster node #1 ... DONE [13:14:18.807] Exporting 'dim' (0 bytes) to cluster node #1 ... [13:14:18.807] Exporting 'dim' (0 bytes) to cluster node #1 ... DONE [13:14:18.808] Exporting 'valid_types' (248 bytes) to cluster node #1 ... [13:14:18.808] Exporting 'valid_types' (248 bytes) to cluster node #1 ... DONE [13:14:18.808] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... [13:14:18.809] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... DONE [13:14:18.809] Exporting '...future.elements_ii' (96 bytes) to cluster node #1 ... [13:14:18.809] Exporting '...future.elements_ii' (96 bytes) to cluster node #1 ... DONE [13:14:18.810] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:14:18.810] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:14:18.810] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:14:18.810] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:14:18.811] Exporting 11 global objects (93.29 KiB) to cluster node #1 ... DONE [13:14:18.811] MultisessionFuture started [13:14:18.811] - Launch lazy future ... done [13:14:18.812] run() for 'MultisessionFuture' ... done [13:14:18.812] Created future: [13:14:18.833] receiveMessageFromWorker() for ClusterFuture ... [13:14:18.833] - Validating connection of MultisessionFuture [13:14:18.833] - received message: FutureResult [13:14:18.833] - Received FutureResult [13:14:18.833] - Erased future from FutureRegistry [13:14:18.834] result() for ClusterFuture ... [13:14:18.834] - result already collected: FutureResult [13:14:18.834] result() for ClusterFuture ... done [13:14:18.834] receiveMessageFromWorker() for ClusterFuture ... done [13:14:18.812] MultisessionFuture: [13:14:18.812] Label: 'future_vapply-1' [13:14:18.812] Expression: [13:14:18.812] { [13:14:18.812] do.call(function(...) { [13:14:18.812] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:18.812] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:18.812] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:18.812] on.exit(options(oopts), add = TRUE) [13:14:18.812] } [13:14:18.812] { [13:14:18.812] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:18.812] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:18.812] ...future.FUN(...future.X_jj, ...) [13:14:18.812] }) [13:14:18.812] } [13:14:18.812] }, args = future.call.arguments) [13:14:18.812] } [13:14:18.812] Lazy evaluation: FALSE [13:14:18.812] Asynchronous evaluation: TRUE [13:14:18.812] Local evaluation: TRUE [13:14:18.812] Environment: R_GlobalEnv [13:14:18.812] Capture standard output: TRUE [13:14:18.812] Capture condition classes: 'condition' (excluding 'nothing') [13:14:18.812] Globals: 11 objects totaling 93.38 KiB (function '...future.FUN' of 21.22 KiB, function 'x_FUN' of 1.22 KiB, integer 'times' of 56 bytes, function 'stopf' of 26.43 KiB, function 'stop_if_not' of 44.12 KiB, ...) [13:14:18.812] Packages: 2 packages ('stats', 'future.apply') [13:14:18.812] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:14:18.812] Resolved: TRUE [13:14:18.812] Value: [13:14:18.812] Conditions captured: [13:14:18.812] Early signaling: FALSE [13:14:18.812] Owner process: 1bb7d580-628d-c90d-e38a-66de485868c4 [13:14:18.812] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:14:18.835] Chunk #1 of 2 ... DONE [13:14:18.835] Chunk #2 of 2 ... [13:14:18.835] - Finding globals in 'X' for chunk #2 ... [13:14:18.835] getGlobalsAndPackages() ... [13:14:18.835] Searching for globals... [13:14:18.836] [13:14:18.836] Searching for globals ... DONE [13:14:18.836] - globals: [0] [13:14:18.836] getGlobalsAndPackages() ... DONE [13:14:18.836] + additional globals found: [n=0] [13:14:18.836] + additional namespaces needed: [n=0] [13:14:18.836] - Finding globals in 'X' for chunk #2 ... DONE [13:14:18.837] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:14:18.837] - seeds: [13:14:18.837] - All globals exported: [n=11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:18.837] getGlobalsAndPackages() ... [13:14:18.837] - globals passed as-is: [11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:18.838] Resolving globals: FALSE [13:14:18.838] Tweak future expression to call with '...' arguments ... [13:14:18.838] { [13:14:18.838] do.call(function(...) { [13:14:18.838] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:18.838] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:18.838] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:18.838] on.exit(options(oopts), add = TRUE) [13:14:18.838] } [13:14:18.838] { [13:14:18.838] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:18.838] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:18.838] ...future.FUN(...future.X_jj, ...) [13:14:18.838] }) [13:14:18.838] } [13:14:18.838] }, args = future.call.arguments) [13:14:18.838] } [13:14:18.838] Tweak future expression to call with '...' arguments ... DONE [13:14:18.839] - globals: [11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:18.839] - packages: [2] 'stats', 'future.apply' [13:14:18.839] getGlobalsAndPackages() ... DONE [13:14:18.840] run() for 'Future' ... [13:14:18.840] - state: 'created' [13:14:18.840] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:14:18.856] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:14:18.856] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:14:18.857] - Field: 'node' [13:14:18.857] - Field: 'label' [13:14:18.857] - Field: 'local' [13:14:18.857] - Field: 'owner' [13:14:18.857] - Field: 'envir' [13:14:18.857] - Field: 'workers' [13:14:18.858] - Field: 'packages' [13:14:18.858] - Field: 'gc' [13:14:18.858] - Field: 'conditions' [13:14:18.858] - Field: 'persistent' [13:14:18.858] - Field: 'expr' [13:14:18.859] - Field: 'uuid' [13:14:18.859] - Field: 'seed' [13:14:18.859] - Field: 'version' [13:14:18.859] - Field: 'result' [13:14:18.859] - Field: 'asynchronous' [13:14:18.859] - Field: 'calls' [13:14:18.860] - Field: 'globals' [13:14:18.860] - Field: 'stdout' [13:14:18.860] - Field: 'earlySignal' [13:14:18.860] - Field: 'lazy' [13:14:18.860] - Field: 'state' [13:14:18.860] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:14:18.861] - Launch lazy future ... [13:14:18.861] Packages needed by the future expression (n = 2): 'stats', 'future.apply' [13:14:18.861] Packages needed by future strategies (n = 0): [13:14:18.862] { [13:14:18.862] { [13:14:18.862] { [13:14:18.862] ...future.startTime <- base::Sys.time() [13:14:18.862] { [13:14:18.862] { [13:14:18.862] { [13:14:18.862] { [13:14:18.862] { [13:14:18.862] base::local({ [13:14:18.862] has_future <- base::requireNamespace("future", [13:14:18.862] quietly = TRUE) [13:14:18.862] if (has_future) { [13:14:18.862] ns <- base::getNamespace("future") [13:14:18.862] version <- ns[[".package"]][["version"]] [13:14:18.862] if (is.null(version)) [13:14:18.862] version <- utils::packageVersion("future") [13:14:18.862] } [13:14:18.862] else { [13:14:18.862] version <- NULL [13:14:18.862] } [13:14:18.862] if (!has_future || version < "1.8.0") { [13:14:18.862] info <- base::c(r_version = base::gsub("R version ", [13:14:18.862] "", base::R.version$version.string), [13:14:18.862] platform = base::sprintf("%s (%s-bit)", [13:14:18.862] base::R.version$platform, 8 * [13:14:18.862] base::.Machine$sizeof.pointer), [13:14:18.862] os = base::paste(base::Sys.info()[base::c("sysname", [13:14:18.862] "release", "version")], collapse = " "), [13:14:18.862] hostname = base::Sys.info()[["nodename"]]) [13:14:18.862] info <- base::sprintf("%s: %s", base::names(info), [13:14:18.862] info) [13:14:18.862] info <- base::paste(info, collapse = "; ") [13:14:18.862] if (!has_future) { [13:14:18.862] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:14:18.862] info) [13:14:18.862] } [13:14:18.862] else { [13:14:18.862] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:14:18.862] info, version) [13:14:18.862] } [13:14:18.862] base::stop(msg) [13:14:18.862] } [13:14:18.862] }) [13:14:18.862] } [13:14:18.862] ...future.mc.cores.old <- base::getOption("mc.cores") [13:14:18.862] base::options(mc.cores = 1L) [13:14:18.862] } [13:14:18.862] base::local({ [13:14:18.862] for (pkg in c("stats", "future.apply")) { [13:14:18.862] base::loadNamespace(pkg) [13:14:18.862] base::library(pkg, character.only = TRUE) [13:14:18.862] } [13:14:18.862] }) [13:14:18.862] } [13:14:18.862] options(future.plan = NULL) [13:14:18.862] Sys.unsetenv("R_FUTURE_PLAN") [13:14:18.862] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:14:18.862] } [13:14:18.862] ...future.workdir <- getwd() [13:14:18.862] } [13:14:18.862] ...future.oldOptions <- base::as.list(base::.Options) [13:14:18.862] ...future.oldEnvVars <- base::Sys.getenv() [13:14:18.862] } [13:14:18.862] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:14:18.862] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:14:18.862] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:14:18.862] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:14:18.862] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:14:18.862] future.stdout.windows.reencode = NULL, width = 80L) [13:14:18.862] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:14:18.862] base::names(...future.oldOptions)) [13:14:18.862] } [13:14:18.862] if (FALSE) { [13:14:18.862] } [13:14:18.862] else { [13:14:18.862] if (TRUE) { [13:14:18.862] ...future.stdout <- base::rawConnection(base::raw(0L), [13:14:18.862] open = "w") [13:14:18.862] } [13:14:18.862] else { [13:14:18.862] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:14:18.862] windows = "NUL", "/dev/null"), open = "w") [13:14:18.862] } [13:14:18.862] base::sink(...future.stdout, type = "output", split = FALSE) [13:14:18.862] base::on.exit(if (!base::is.null(...future.stdout)) { [13:14:18.862] base::sink(type = "output", split = FALSE) [13:14:18.862] base::close(...future.stdout) [13:14:18.862] }, add = TRUE) [13:14:18.862] } [13:14:18.862] ...future.frame <- base::sys.nframe() [13:14:18.862] ...future.conditions <- base::list() [13:14:18.862] ...future.rng <- base::globalenv()$.Random.seed [13:14:18.862] if (FALSE) { [13:14:18.862] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:14:18.862] "...future.value", "...future.globalenv.names", ".Random.seed") [13:14:18.862] } [13:14:18.862] ...future.result <- base::tryCatch({ [13:14:18.862] base::withCallingHandlers({ [13:14:18.862] ...future.value <- base::withVisible(base::local({ [13:14:18.862] ...future.makeSendCondition <- local({ [13:14:18.862] sendCondition <- NULL [13:14:18.862] function(frame = 1L) { [13:14:18.862] if (is.function(sendCondition)) [13:14:18.862] return(sendCondition) [13:14:18.862] ns <- getNamespace("parallel") [13:14:18.862] if (exists("sendData", mode = "function", [13:14:18.862] envir = ns)) { [13:14:18.862] parallel_sendData <- get("sendData", mode = "function", [13:14:18.862] envir = ns) [13:14:18.862] envir <- sys.frame(frame) [13:14:18.862] master <- NULL [13:14:18.862] while (!identical(envir, .GlobalEnv) && [13:14:18.862] !identical(envir, emptyenv())) { [13:14:18.862] if (exists("master", mode = "list", envir = envir, [13:14:18.862] inherits = FALSE)) { [13:14:18.862] master <- get("master", mode = "list", [13:14:18.862] envir = envir, inherits = FALSE) [13:14:18.862] if (inherits(master, c("SOCKnode", [13:14:18.862] "SOCK0node"))) { [13:14:18.862] sendCondition <<- function(cond) { [13:14:18.862] data <- list(type = "VALUE", value = cond, [13:14:18.862] success = TRUE) [13:14:18.862] parallel_sendData(master, data) [13:14:18.862] } [13:14:18.862] return(sendCondition) [13:14:18.862] } [13:14:18.862] } [13:14:18.862] frame <- frame + 1L [13:14:18.862] envir <- sys.frame(frame) [13:14:18.862] } [13:14:18.862] } [13:14:18.862] sendCondition <<- function(cond) NULL [13:14:18.862] } [13:14:18.862] }) [13:14:18.862] withCallingHandlers({ [13:14:18.862] { [13:14:18.862] do.call(function(...) { [13:14:18.862] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:18.862] if (!identical(...future.globals.maxSize.org, [13:14:18.862] ...future.globals.maxSize)) { [13:14:18.862] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:18.862] on.exit(options(oopts), add = TRUE) [13:14:18.862] } [13:14:18.862] { [13:14:18.862] lapply(seq_along(...future.elements_ii), [13:14:18.862] FUN = function(jj) { [13:14:18.862] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:18.862] ...future.FUN(...future.X_jj, ...) [13:14:18.862] }) [13:14:18.862] } [13:14:18.862] }, args = future.call.arguments) [13:14:18.862] } [13:14:18.862] }, immediateCondition = function(cond) { [13:14:18.862] sendCondition <- ...future.makeSendCondition() [13:14:18.862] sendCondition(cond) [13:14:18.862] muffleCondition <- function (cond, pattern = "^muffle") [13:14:18.862] { [13:14:18.862] inherits <- base::inherits [13:14:18.862] invokeRestart <- base::invokeRestart [13:14:18.862] is.null <- base::is.null [13:14:18.862] muffled <- FALSE [13:14:18.862] if (inherits(cond, "message")) { [13:14:18.862] muffled <- grepl(pattern, "muffleMessage") [13:14:18.862] if (muffled) [13:14:18.862] invokeRestart("muffleMessage") [13:14:18.862] } [13:14:18.862] else if (inherits(cond, "warning")) { [13:14:18.862] muffled <- grepl(pattern, "muffleWarning") [13:14:18.862] if (muffled) [13:14:18.862] invokeRestart("muffleWarning") [13:14:18.862] } [13:14:18.862] else if (inherits(cond, "condition")) { [13:14:18.862] if (!is.null(pattern)) { [13:14:18.862] computeRestarts <- base::computeRestarts [13:14:18.862] grepl <- base::grepl [13:14:18.862] restarts <- computeRestarts(cond) [13:14:18.862] for (restart in restarts) { [13:14:18.862] name <- restart$name [13:14:18.862] if (is.null(name)) [13:14:18.862] next [13:14:18.862] if (!grepl(pattern, name)) [13:14:18.862] next [13:14:18.862] invokeRestart(restart) [13:14:18.862] muffled <- TRUE [13:14:18.862] break [13:14:18.862] } [13:14:18.862] } [13:14:18.862] } [13:14:18.862] invisible(muffled) [13:14:18.862] } [13:14:18.862] muffleCondition(cond) [13:14:18.862] }) [13:14:18.862] })) [13:14:18.862] future::FutureResult(value = ...future.value$value, [13:14:18.862] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:14:18.862] ...future.rng), globalenv = if (FALSE) [13:14:18.862] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:14:18.862] ...future.globalenv.names)) [13:14:18.862] else NULL, started = ...future.startTime, version = "1.8") [13:14:18.862] }, condition = base::local({ [13:14:18.862] c <- base::c [13:14:18.862] inherits <- base::inherits [13:14:18.862] invokeRestart <- base::invokeRestart [13:14:18.862] length <- base::length [13:14:18.862] list <- base::list [13:14:18.862] seq.int <- base::seq.int [13:14:18.862] signalCondition <- base::signalCondition [13:14:18.862] sys.calls <- base::sys.calls [13:14:18.862] `[[` <- base::`[[` [13:14:18.862] `+` <- base::`+` [13:14:18.862] `<<-` <- base::`<<-` [13:14:18.862] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:14:18.862] calls[seq.int(from = from + 12L, to = length(calls) - [13:14:18.862] 3L)] [13:14:18.862] } [13:14:18.862] function(cond) { [13:14:18.862] is_error <- inherits(cond, "error") [13:14:18.862] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:14:18.862] NULL) [13:14:18.862] if (is_error) { [13:14:18.862] sessionInformation <- function() { [13:14:18.862] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:14:18.862] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:14:18.862] search = base::search(), system = base::Sys.info()) [13:14:18.862] } [13:14:18.862] ...future.conditions[[length(...future.conditions) + [13:14:18.862] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:14:18.862] cond$call), session = sessionInformation(), [13:14:18.862] timestamp = base::Sys.time(), signaled = 0L) [13:14:18.862] signalCondition(cond) [13:14:18.862] } [13:14:18.862] else if (!ignore && TRUE && inherits(cond, c("condition", [13:14:18.862] "immediateCondition"))) { [13:14:18.862] signal <- TRUE && inherits(cond, "immediateCondition") [13:14:18.862] ...future.conditions[[length(...future.conditions) + [13:14:18.862] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:14:18.862] if (TRUE && !signal) { [13:14:18.862] muffleCondition <- function (cond, pattern = "^muffle") [13:14:18.862] { [13:14:18.862] inherits <- base::inherits [13:14:18.862] invokeRestart <- base::invokeRestart [13:14:18.862] is.null <- base::is.null [13:14:18.862] muffled <- FALSE [13:14:18.862] if (inherits(cond, "message")) { [13:14:18.862] muffled <- grepl(pattern, "muffleMessage") [13:14:18.862] if (muffled) [13:14:18.862] invokeRestart("muffleMessage") [13:14:18.862] } [13:14:18.862] else if (inherits(cond, "warning")) { [13:14:18.862] muffled <- grepl(pattern, "muffleWarning") [13:14:18.862] if (muffled) [13:14:18.862] invokeRestart("muffleWarning") [13:14:18.862] } [13:14:18.862] else if (inherits(cond, "condition")) { [13:14:18.862] if (!is.null(pattern)) { [13:14:18.862] computeRestarts <- base::computeRestarts [13:14:18.862] grepl <- base::grepl [13:14:18.862] restarts <- computeRestarts(cond) [13:14:18.862] for (restart in restarts) { [13:14:18.862] name <- restart$name [13:14:18.862] if (is.null(name)) [13:14:18.862] next [13:14:18.862] if (!grepl(pattern, name)) [13:14:18.862] next [13:14:18.862] invokeRestart(restart) [13:14:18.862] muffled <- TRUE [13:14:18.862] break [13:14:18.862] } [13:14:18.862] } [13:14:18.862] } [13:14:18.862] invisible(muffled) [13:14:18.862] } [13:14:18.862] muffleCondition(cond, pattern = "^muffle") [13:14:18.862] } [13:14:18.862] } [13:14:18.862] else { [13:14:18.862] if (TRUE) { [13:14:18.862] muffleCondition <- function (cond, pattern = "^muffle") [13:14:18.862] { [13:14:18.862] inherits <- base::inherits [13:14:18.862] invokeRestart <- base::invokeRestart [13:14:18.862] is.null <- base::is.null [13:14:18.862] muffled <- FALSE [13:14:18.862] if (inherits(cond, "message")) { [13:14:18.862] muffled <- grepl(pattern, "muffleMessage") [13:14:18.862] if (muffled) [13:14:18.862] invokeRestart("muffleMessage") [13:14:18.862] } [13:14:18.862] else if (inherits(cond, "warning")) { [13:14:18.862] muffled <- grepl(pattern, "muffleWarning") [13:14:18.862] if (muffled) [13:14:18.862] invokeRestart("muffleWarning") [13:14:18.862] } [13:14:18.862] else if (inherits(cond, "condition")) { [13:14:18.862] if (!is.null(pattern)) { [13:14:18.862] computeRestarts <- base::computeRestarts [13:14:18.862] grepl <- base::grepl [13:14:18.862] restarts <- computeRestarts(cond) [13:14:18.862] for (restart in restarts) { [13:14:18.862] name <- restart$name [13:14:18.862] if (is.null(name)) [13:14:18.862] next [13:14:18.862] if (!grepl(pattern, name)) [13:14:18.862] next [13:14:18.862] invokeRestart(restart) [13:14:18.862] muffled <- TRUE [13:14:18.862] break [13:14:18.862] } [13:14:18.862] } [13:14:18.862] } [13:14:18.862] invisible(muffled) [13:14:18.862] } [13:14:18.862] muffleCondition(cond, pattern = "^muffle") [13:14:18.862] } [13:14:18.862] } [13:14:18.862] } [13:14:18.862] })) [13:14:18.862] }, error = function(ex) { [13:14:18.862] base::structure(base::list(value = NULL, visible = NULL, [13:14:18.862] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:14:18.862] ...future.rng), started = ...future.startTime, [13:14:18.862] finished = Sys.time(), session_uuid = NA_character_, [13:14:18.862] version = "1.8"), class = "FutureResult") [13:14:18.862] }, finally = { [13:14:18.862] if (!identical(...future.workdir, getwd())) [13:14:18.862] setwd(...future.workdir) [13:14:18.862] { [13:14:18.862] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:14:18.862] ...future.oldOptions$nwarnings <- NULL [13:14:18.862] } [13:14:18.862] base::options(...future.oldOptions) [13:14:18.862] if (.Platform$OS.type == "windows") { [13:14:18.862] old_names <- names(...future.oldEnvVars) [13:14:18.862] envs <- base::Sys.getenv() [13:14:18.862] names <- names(envs) [13:14:18.862] common <- intersect(names, old_names) [13:14:18.862] added <- setdiff(names, old_names) [13:14:18.862] removed <- setdiff(old_names, names) [13:14:18.862] changed <- common[...future.oldEnvVars[common] != [13:14:18.862] envs[common]] [13:14:18.862] NAMES <- toupper(changed) [13:14:18.862] args <- list() [13:14:18.862] for (kk in seq_along(NAMES)) { [13:14:18.862] name <- changed[[kk]] [13:14:18.862] NAME <- NAMES[[kk]] [13:14:18.862] if (name != NAME && is.element(NAME, old_names)) [13:14:18.862] next [13:14:18.862] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:18.862] } [13:14:18.862] NAMES <- toupper(added) [13:14:18.862] for (kk in seq_along(NAMES)) { [13:14:18.862] name <- added[[kk]] [13:14:18.862] NAME <- NAMES[[kk]] [13:14:18.862] if (name != NAME && is.element(NAME, old_names)) [13:14:18.862] next [13:14:18.862] args[[name]] <- "" [13:14:18.862] } [13:14:18.862] NAMES <- toupper(removed) [13:14:18.862] for (kk in seq_along(NAMES)) { [13:14:18.862] name <- removed[[kk]] [13:14:18.862] NAME <- NAMES[[kk]] [13:14:18.862] if (name != NAME && is.element(NAME, old_names)) [13:14:18.862] next [13:14:18.862] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:18.862] } [13:14:18.862] if (length(args) > 0) [13:14:18.862] base::do.call(base::Sys.setenv, args = args) [13:14:18.862] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:14:18.862] } [13:14:18.862] else { [13:14:18.862] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:14:18.862] } [13:14:18.862] { [13:14:18.862] if (base::length(...future.futureOptionsAdded) > [13:14:18.862] 0L) { [13:14:18.862] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:14:18.862] base::names(opts) <- ...future.futureOptionsAdded [13:14:18.862] base::options(opts) [13:14:18.862] } [13:14:18.862] { [13:14:18.862] { [13:14:18.862] base::options(mc.cores = ...future.mc.cores.old) [13:14:18.862] NULL [13:14:18.862] } [13:14:18.862] options(future.plan = NULL) [13:14:18.862] if (is.na(NA_character_)) [13:14:18.862] Sys.unsetenv("R_FUTURE_PLAN") [13:14:18.862] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:14:18.862] future::plan(list(function (..., workers = availableCores(), [13:14:18.862] lazy = FALSE, rscript_libs = .libPaths(), [13:14:18.862] envir = parent.frame()) [13:14:18.862] { [13:14:18.862] if (is.function(workers)) [13:14:18.862] workers <- workers() [13:14:18.862] workers <- structure(as.integer(workers), [13:14:18.862] class = class(workers)) [13:14:18.862] stop_if_not(length(workers) == 1, is.finite(workers), [13:14:18.862] workers >= 1) [13:14:18.862] if (workers == 1L && !inherits(workers, "AsIs")) { [13:14:18.862] return(sequential(..., lazy = TRUE, envir = envir)) [13:14:18.862] } [13:14:18.862] future <- MultisessionFuture(..., workers = workers, [13:14:18.862] lazy = lazy, rscript_libs = rscript_libs, [13:14:18.862] envir = envir) [13:14:18.862] if (!future$lazy) [13:14:18.862] future <- run(future) [13:14:18.862] invisible(future) [13:14:18.862] }), .cleanup = FALSE, .init = FALSE) [13:14:18.862] } [13:14:18.862] } [13:14:18.862] } [13:14:18.862] }) [13:14:18.862] if (TRUE) { [13:14:18.862] base::sink(type = "output", split = FALSE) [13:14:18.862] if (TRUE) { [13:14:18.862] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:14:18.862] } [13:14:18.862] else { [13:14:18.862] ...future.result["stdout"] <- base::list(NULL) [13:14:18.862] } [13:14:18.862] base::close(...future.stdout) [13:14:18.862] ...future.stdout <- NULL [13:14:18.862] } [13:14:18.862] ...future.result$conditions <- ...future.conditions [13:14:18.862] ...future.result$finished <- base::Sys.time() [13:14:18.862] ...future.result [13:14:18.862] } [13:14:18.867] Exporting 11 global objects (93.29 KiB) to cluster node #1 ... [13:14:18.867] Exporting '...future.FUN' (21.22 KiB) to cluster node #1 ... [13:14:18.868] Exporting '...future.FUN' (21.22 KiB) to cluster node #1 ... DONE [13:14:18.868] Exporting 'x_FUN' (1.22 KiB) to cluster node #1 ... [13:14:18.868] Exporting 'x_FUN' (1.22 KiB) to cluster node #1 ... DONE [13:14:18.869] Exporting 'times' (56 bytes) to cluster node #1 ... [13:14:18.869] Exporting 'times' (56 bytes) to cluster node #1 ... DONE [13:14:18.869] Exporting 'stopf' (26.43 KiB) to cluster node #1 ... [13:14:18.870] Exporting 'stopf' (26.43 KiB) to cluster node #1 ... DONE [13:14:18.870] Exporting 'stop_if_not' (44.12 KiB) to cluster node #1 ... [13:14:18.870] Exporting 'stop_if_not' (44.12 KiB) to cluster node #1 ... DONE [13:14:18.870] Exporting 'dim' (0 bytes) to cluster node #1 ... [13:14:18.871] Exporting 'dim' (0 bytes) to cluster node #1 ... DONE [13:14:18.871] Exporting 'valid_types' (248 bytes) to cluster node #1 ... [13:14:18.871] Exporting 'valid_types' (248 bytes) to cluster node #1 ... DONE [13:14:18.872] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... [13:14:18.872] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... DONE [13:14:18.872] Exporting '...future.elements_ii' (176 bytes) to cluster node #1 ... [13:14:18.873] Exporting '...future.elements_ii' (176 bytes) to cluster node #1 ... DONE [13:14:18.873] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:14:18.873] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:14:18.873] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:14:18.874] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:14:18.874] Exporting 11 global objects (93.29 KiB) to cluster node #1 ... DONE [13:14:18.874] MultisessionFuture started [13:14:18.875] - Launch lazy future ... done [13:14:18.875] run() for 'MultisessionFuture' ... done [13:14:18.875] Created future: [13:14:18.894] receiveMessageFromWorker() for ClusterFuture ... [13:14:18.894] - Validating connection of MultisessionFuture [13:14:18.894] - received message: FutureResult [13:14:18.894] - Received FutureResult [13:14:18.895] - Erased future from FutureRegistry [13:14:18.895] result() for ClusterFuture ... [13:14:18.895] - result already collected: FutureResult [13:14:18.895] result() for ClusterFuture ... done [13:14:18.895] receiveMessageFromWorker() for ClusterFuture ... done [13:14:18.875] MultisessionFuture: [13:14:18.875] Label: 'future_vapply-2' [13:14:18.875] Expression: [13:14:18.875] { [13:14:18.875] do.call(function(...) { [13:14:18.875] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:18.875] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:18.875] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:18.875] on.exit(options(oopts), add = TRUE) [13:14:18.875] } [13:14:18.875] { [13:14:18.875] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:18.875] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:18.875] ...future.FUN(...future.X_jj, ...) [13:14:18.875] }) [13:14:18.875] } [13:14:18.875] }, args = future.call.arguments) [13:14:18.875] } [13:14:18.875] Lazy evaluation: FALSE [13:14:18.875] Asynchronous evaluation: TRUE [13:14:18.875] Local evaluation: TRUE [13:14:18.875] Environment: R_GlobalEnv [13:14:18.875] Capture standard output: TRUE [13:14:18.875] Capture condition classes: 'condition' (excluding 'nothing') [13:14:18.875] Globals: 11 objects totaling 93.46 KiB (function '...future.FUN' of 21.22 KiB, function 'x_FUN' of 1.22 KiB, integer 'times' of 56 bytes, function 'stopf' of 26.43 KiB, function 'stop_if_not' of 44.12 KiB, ...) [13:14:18.875] Packages: 2 packages ('stats', 'future.apply') [13:14:18.875] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:14:18.875] Resolved: TRUE [13:14:18.875] Value: [13:14:18.875] Conditions captured: [13:14:18.875] Early signaling: FALSE [13:14:18.875] Owner process: 1bb7d580-628d-c90d-e38a-66de485868c4 [13:14:18.875] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:14:18.896] Chunk #2 of 2 ... DONE [13:14:18.896] Launching 2 futures (chunks) ... DONE [13:14:18.896] Resolving 2 futures (chunks) ... [13:14:18.896] resolve() on list ... [13:14:18.896] recursive: 0 [13:14:18.897] length: 2 [13:14:18.897] [13:14:18.897] Future #1 [13:14:18.897] result() for ClusterFuture ... [13:14:18.897] - result already collected: FutureResult [13:14:18.897] result() for ClusterFuture ... done [13:14:18.897] result() for ClusterFuture ... [13:14:18.898] - result already collected: FutureResult [13:14:18.898] result() for ClusterFuture ... done [13:14:18.898] signalConditionsASAP(MultisessionFuture, pos=1) ... [13:14:18.898] - nx: 2 [13:14:18.898] - relay: TRUE [13:14:18.898] - stdout: TRUE [13:14:18.899] - signal: TRUE [13:14:18.899] - resignal: FALSE [13:14:18.899] - force: TRUE [13:14:18.899] - relayed: [n=2] FALSE, FALSE [13:14:18.899] - queued futures: [n=2] FALSE, FALSE [13:14:18.899] - until=1 [13:14:18.900] - relaying element #1 [13:14:18.900] result() for ClusterFuture ... [13:14:18.900] - result already collected: FutureResult [13:14:18.900] result() for ClusterFuture ... done [13:14:18.900] result() for ClusterFuture ... [13:14:18.900] - result already collected: FutureResult [13:14:18.900] result() for ClusterFuture ... done [13:14:18.901] result() for ClusterFuture ... [13:14:18.901] - result already collected: FutureResult [13:14:18.901] result() for ClusterFuture ... done [13:14:18.901] result() for ClusterFuture ... [13:14:18.901] - result already collected: FutureResult [13:14:18.901] result() for ClusterFuture ... done [13:14:18.902] - relayed: [n=2] TRUE, FALSE [13:14:18.902] - queued futures: [n=2] TRUE, FALSE [13:14:18.902] signalConditionsASAP(MultisessionFuture, pos=1) ... done [13:14:18.902] length: 1 (resolved future 1) [13:14:18.902] Future #2 [13:14:18.903] result() for ClusterFuture ... [13:14:18.903] - result already collected: FutureResult [13:14:18.903] result() for ClusterFuture ... done [13:14:18.903] result() for ClusterFuture ... [13:14:18.903] - result already collected: FutureResult [13:14:18.903] result() for ClusterFuture ... done [13:14:18.903] signalConditionsASAP(MultisessionFuture, pos=2) ... [13:14:18.904] - nx: 2 [13:14:18.904] - relay: TRUE [13:14:18.904] - stdout: TRUE [13:14:18.904] - signal: TRUE [13:14:18.904] - resignal: FALSE [13:14:18.905] - force: TRUE [13:14:18.905] - relayed: [n=2] TRUE, FALSE [13:14:18.905] - queued futures: [n=2] TRUE, FALSE [13:14:18.905] - until=2 [13:14:18.905] - relaying element #2 [13:14:18.905] result() for ClusterFuture ... [13:14:18.906] - result already collected: FutureResult [13:14:18.906] result() for ClusterFuture ... done [13:14:18.906] result() for ClusterFuture ... [13:14:18.906] - result already collected: FutureResult [13:14:18.906] result() for ClusterFuture ... done [13:14:18.906] result() for ClusterFuture ... [13:14:18.907] - result already collected: FutureResult [13:14:18.907] result() for ClusterFuture ... done [13:14:18.907] result() for ClusterFuture ... [13:14:18.907] - result already collected: FutureResult [13:14:18.907] result() for ClusterFuture ... done [13:14:18.907] - relayed: [n=2] TRUE, TRUE [13:14:18.907] - queued futures: [n=2] TRUE, TRUE [13:14:18.908] signalConditionsASAP(MultisessionFuture, pos=2) ... done [13:14:18.908] length: 0 (resolved future 2) [13:14:18.908] Relaying remaining futures [13:14:18.908] signalConditionsASAP(NULL, pos=0) ... [13:14:18.908] - nx: 2 [13:14:18.908] - relay: TRUE [13:14:18.909] - stdout: TRUE [13:14:18.909] - signal: TRUE [13:14:18.909] - resignal: FALSE [13:14:18.909] - force: TRUE [13:14:18.909] - relayed: [n=2] TRUE, TRUE [13:14:18.909] - queued futures: [n=2] TRUE, TRUE - flush all [13:14:18.910] - relayed: [n=2] TRUE, TRUE [13:14:18.910] - queued futures: [n=2] TRUE, TRUE [13:14:18.910] signalConditionsASAP(NULL, pos=0) ... done [13:14:18.910] resolve() on list ... DONE [13:14:18.910] result() for ClusterFuture ... [13:14:18.910] - result already collected: FutureResult [13:14:18.911] result() for ClusterFuture ... done [13:14:18.911] result() for ClusterFuture ... [13:14:18.911] - result already collected: FutureResult [13:14:18.911] result() for ClusterFuture ... done [13:14:18.911] result() for ClusterFuture ... [13:14:18.911] - result already collected: FutureResult [13:14:18.912] result() for ClusterFuture ... done [13:14:18.912] result() for ClusterFuture ... [13:14:18.912] - result already collected: FutureResult [13:14:18.912] result() for ClusterFuture ... done [13:14:18.912] - Number of value chunks collected: 2 [13:14:18.912] Resolving 2 futures (chunks) ... DONE [13:14:18.912] Reducing values from 2 chunks ... [13:14:18.913] - Number of values collected after concatenation: 3 [13:14:18.913] - Number of values expected: 3 [13:14:18.913] Reducing values from 2 chunks ... DONE [13:14:18.913] future_lapply() ... DONE num [1:5, 1:3] 1 3.25 5.5 7.75 10 ... - attr(*, "dimnames")=List of 2 ..$ : chr [1:5] "0%" "25%" "50%" "75%" ... ..$ : chr [1:3] "a" "beta" "logic" [13:14:18.915] future_lapply() ... [13:14:18.923] Number of chunks: 2 [13:14:18.923] getGlobalsAndPackagesXApply() ... [13:14:18.923] - future.globals: TRUE [13:14:18.923] getGlobalsAndPackages() ... [13:14:18.924] Searching for globals... [13:14:18.930] - globals found: [21] 'FUN', '{', '<-', 'is.na', 'if', 'any', '[', '!', 'return', 'rep.int', 'sort', 'length', '==', '/', 'floor', '(', '+', 'c', '-', '*', 'ceiling' [13:14:18.931] Searching for globals ... DONE [13:14:18.931] Resolving globals: FALSE [13:14:18.932] The total size of the 1 globals is 45.86 KiB (46960 bytes) [13:14:18.932] The total size of the 1 globals exported for future expression ('FUN()') is 45.86 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (45.86 KiB of class 'function') [13:14:18.932] - globals: [1] 'FUN' [13:14:18.933] - packages: [1] 'stats' [13:14:18.933] getGlobalsAndPackages() ... DONE [13:14:18.933] - globals found/used: [n=1] 'FUN' [13:14:18.933] - needed namespaces: [n=1] 'stats' [13:14:18.933] Finding globals ... DONE [13:14:18.933] - use_args: TRUE [13:14:18.934] - Getting '...' globals ... [13:14:18.934] resolve() on list ... [13:14:18.934] recursive: 0 [13:14:18.934] length: 1 [13:14:18.935] elements: '...' [13:14:18.935] length: 0 (resolved future 1) [13:14:18.935] resolve() on list ... DONE [13:14:18.935] - '...' content: [n=0] [13:14:18.935] List of 1 [13:14:18.935] $ ...: list() [13:14:18.935] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:14:18.935] - attr(*, "where")=List of 1 [13:14:18.935] ..$ ...: [13:14:18.935] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:14:18.935] - attr(*, "resolved")= logi TRUE [13:14:18.935] - attr(*, "total_size")= num NA [13:14:18.938] - Getting '...' globals ... DONE [13:14:18.939] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:14:18.939] List of 2 [13:14:18.939] $ ...future.FUN:function (x, na.rm = TRUE) [13:14:18.939] $ ... : list() [13:14:18.939] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:14:18.939] - attr(*, "where")=List of 2 [13:14:18.939] ..$ ...future.FUN: [13:14:18.939] ..$ ... : [13:14:18.939] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:14:18.939] - attr(*, "resolved")= logi FALSE [13:14:18.939] - attr(*, "total_size")= num 46960 [13:14:18.942] Packages to be attached in all futures: [n=1] 'stats' [13:14:18.942] getGlobalsAndPackagesXApply() ... DONE [13:14:18.943] Number of futures (= number of chunks): 2 [13:14:18.943] Launching 2 futures (chunks) ... [13:14:18.943] Chunk #1 of 2 ... [13:14:18.943] - Finding globals in 'X' for chunk #1 ... [13:14:18.943] getGlobalsAndPackages() ... [13:14:18.944] Searching for globals... [13:14:18.944] [13:14:18.944] Searching for globals ... DONE [13:14:18.944] - globals: [0] [13:14:18.944] getGlobalsAndPackages() ... DONE [13:14:18.945] + additional globals found: [n=0] [13:14:18.945] + additional namespaces needed: [n=0] [13:14:18.945] - Finding globals in 'X' for chunk #1 ... DONE [13:14:18.945] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:14:18.945] - seeds: [13:14:18.945] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:18.946] getGlobalsAndPackages() ... [13:14:18.946] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:18.946] Resolving globals: FALSE [13:14:18.946] Tweak future expression to call with '...' arguments ... [13:14:18.946] { [13:14:18.946] do.call(function(...) { [13:14:18.946] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:18.946] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:18.946] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:18.946] on.exit(options(oopts), add = TRUE) [13:14:18.946] } [13:14:18.946] { [13:14:18.946] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:18.946] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:18.946] ...future.FUN(...future.X_jj, ...) [13:14:18.946] }) [13:14:18.946] } [13:14:18.946] }, args = future.call.arguments) [13:14:18.946] } [13:14:18.947] Tweak future expression to call with '...' arguments ... DONE [13:14:18.947] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:18.947] - packages: [1] 'stats' [13:14:18.948] getGlobalsAndPackages() ... DONE [13:14:18.948] run() for 'Future' ... [13:14:18.948] - state: 'created' [13:14:18.948] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:14:18.962] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:14:18.963] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:14:18.963] - Field: 'node' [13:14:18.963] - Field: 'label' [13:14:18.963] - Field: 'local' [13:14:18.963] - Field: 'owner' [13:14:18.963] - Field: 'envir' [13:14:18.964] - Field: 'workers' [13:14:18.964] - Field: 'packages' [13:14:18.964] - Field: 'gc' [13:14:18.964] - Field: 'conditions' [13:14:18.964] - Field: 'persistent' [13:14:18.964] - Field: 'expr' [13:14:18.965] - Field: 'uuid' [13:14:18.965] - Field: 'seed' [13:14:18.965] - Field: 'version' [13:14:18.965] - Field: 'result' [13:14:18.965] - Field: 'asynchronous' [13:14:18.966] - Field: 'calls' [13:14:18.966] - Field: 'globals' [13:14:18.966] - Field: 'stdout' [13:14:18.966] - Field: 'earlySignal' [13:14:18.966] - Field: 'lazy' [13:14:18.966] - Field: 'state' [13:14:18.967] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:14:18.967] - Launch lazy future ... [13:14:18.967] Packages needed by the future expression (n = 1): 'stats' [13:14:18.967] Packages needed by future strategies (n = 0): [13:14:18.968] { [13:14:18.968] { [13:14:18.968] { [13:14:18.968] ...future.startTime <- base::Sys.time() [13:14:18.968] { [13:14:18.968] { [13:14:18.968] { [13:14:18.968] { [13:14:18.968] { [13:14:18.968] base::local({ [13:14:18.968] has_future <- base::requireNamespace("future", [13:14:18.968] quietly = TRUE) [13:14:18.968] if (has_future) { [13:14:18.968] ns <- base::getNamespace("future") [13:14:18.968] version <- ns[[".package"]][["version"]] [13:14:18.968] if (is.null(version)) [13:14:18.968] version <- utils::packageVersion("future") [13:14:18.968] } [13:14:18.968] else { [13:14:18.968] version <- NULL [13:14:18.968] } [13:14:18.968] if (!has_future || version < "1.8.0") { [13:14:18.968] info <- base::c(r_version = base::gsub("R version ", [13:14:18.968] "", base::R.version$version.string), [13:14:18.968] platform = base::sprintf("%s (%s-bit)", [13:14:18.968] base::R.version$platform, 8 * [13:14:18.968] base::.Machine$sizeof.pointer), [13:14:18.968] os = base::paste(base::Sys.info()[base::c("sysname", [13:14:18.968] "release", "version")], collapse = " "), [13:14:18.968] hostname = base::Sys.info()[["nodename"]]) [13:14:18.968] info <- base::sprintf("%s: %s", base::names(info), [13:14:18.968] info) [13:14:18.968] info <- base::paste(info, collapse = "; ") [13:14:18.968] if (!has_future) { [13:14:18.968] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:14:18.968] info) [13:14:18.968] } [13:14:18.968] else { [13:14:18.968] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:14:18.968] info, version) [13:14:18.968] } [13:14:18.968] base::stop(msg) [13:14:18.968] } [13:14:18.968] }) [13:14:18.968] } [13:14:18.968] ...future.mc.cores.old <- base::getOption("mc.cores") [13:14:18.968] base::options(mc.cores = 1L) [13:14:18.968] } [13:14:18.968] base::local({ [13:14:18.968] for (pkg in "stats") { [13:14:18.968] base::loadNamespace(pkg) [13:14:18.968] base::library(pkg, character.only = TRUE) [13:14:18.968] } [13:14:18.968] }) [13:14:18.968] } [13:14:18.968] options(future.plan = NULL) [13:14:18.968] Sys.unsetenv("R_FUTURE_PLAN") [13:14:18.968] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:14:18.968] } [13:14:18.968] ...future.workdir <- getwd() [13:14:18.968] } [13:14:18.968] ...future.oldOptions <- base::as.list(base::.Options) [13:14:18.968] ...future.oldEnvVars <- base::Sys.getenv() [13:14:18.968] } [13:14:18.968] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:14:18.968] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:14:18.968] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:14:18.968] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:14:18.968] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:14:18.968] future.stdout.windows.reencode = NULL, width = 80L) [13:14:18.968] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:14:18.968] base::names(...future.oldOptions)) [13:14:18.968] } [13:14:18.968] if (FALSE) { [13:14:18.968] } [13:14:18.968] else { [13:14:18.968] if (TRUE) { [13:14:18.968] ...future.stdout <- base::rawConnection(base::raw(0L), [13:14:18.968] open = "w") [13:14:18.968] } [13:14:18.968] else { [13:14:18.968] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:14:18.968] windows = "NUL", "/dev/null"), open = "w") [13:14:18.968] } [13:14:18.968] base::sink(...future.stdout, type = "output", split = FALSE) [13:14:18.968] base::on.exit(if (!base::is.null(...future.stdout)) { [13:14:18.968] base::sink(type = "output", split = FALSE) [13:14:18.968] base::close(...future.stdout) [13:14:18.968] }, add = TRUE) [13:14:18.968] } [13:14:18.968] ...future.frame <- base::sys.nframe() [13:14:18.968] ...future.conditions <- base::list() [13:14:18.968] ...future.rng <- base::globalenv()$.Random.seed [13:14:18.968] if (FALSE) { [13:14:18.968] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:14:18.968] "...future.value", "...future.globalenv.names", ".Random.seed") [13:14:18.968] } [13:14:18.968] ...future.result <- base::tryCatch({ [13:14:18.968] base::withCallingHandlers({ [13:14:18.968] ...future.value <- base::withVisible(base::local({ [13:14:18.968] ...future.makeSendCondition <- local({ [13:14:18.968] sendCondition <- NULL [13:14:18.968] function(frame = 1L) { [13:14:18.968] if (is.function(sendCondition)) [13:14:18.968] return(sendCondition) [13:14:18.968] ns <- getNamespace("parallel") [13:14:18.968] if (exists("sendData", mode = "function", [13:14:18.968] envir = ns)) { [13:14:18.968] parallel_sendData <- get("sendData", mode = "function", [13:14:18.968] envir = ns) [13:14:18.968] envir <- sys.frame(frame) [13:14:18.968] master <- NULL [13:14:18.968] while (!identical(envir, .GlobalEnv) && [13:14:18.968] !identical(envir, emptyenv())) { [13:14:18.968] if (exists("master", mode = "list", envir = envir, [13:14:18.968] inherits = FALSE)) { [13:14:18.968] master <- get("master", mode = "list", [13:14:18.968] envir = envir, inherits = FALSE) [13:14:18.968] if (inherits(master, c("SOCKnode", [13:14:18.968] "SOCK0node"))) { [13:14:18.968] sendCondition <<- function(cond) { [13:14:18.968] data <- list(type = "VALUE", value = cond, [13:14:18.968] success = TRUE) [13:14:18.968] parallel_sendData(master, data) [13:14:18.968] } [13:14:18.968] return(sendCondition) [13:14:18.968] } [13:14:18.968] } [13:14:18.968] frame <- frame + 1L [13:14:18.968] envir <- sys.frame(frame) [13:14:18.968] } [13:14:18.968] } [13:14:18.968] sendCondition <<- function(cond) NULL [13:14:18.968] } [13:14:18.968] }) [13:14:18.968] withCallingHandlers({ [13:14:18.968] { [13:14:18.968] do.call(function(...) { [13:14:18.968] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:18.968] if (!identical(...future.globals.maxSize.org, [13:14:18.968] ...future.globals.maxSize)) { [13:14:18.968] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:18.968] on.exit(options(oopts), add = TRUE) [13:14:18.968] } [13:14:18.968] { [13:14:18.968] lapply(seq_along(...future.elements_ii), [13:14:18.968] FUN = function(jj) { [13:14:18.968] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:18.968] ...future.FUN(...future.X_jj, ...) [13:14:18.968] }) [13:14:18.968] } [13:14:18.968] }, args = future.call.arguments) [13:14:18.968] } [13:14:18.968] }, immediateCondition = function(cond) { [13:14:18.968] sendCondition <- ...future.makeSendCondition() [13:14:18.968] sendCondition(cond) [13:14:18.968] muffleCondition <- function (cond, pattern = "^muffle") [13:14:18.968] { [13:14:18.968] inherits <- base::inherits [13:14:18.968] invokeRestart <- base::invokeRestart [13:14:18.968] is.null <- base::is.null [13:14:18.968] muffled <- FALSE [13:14:18.968] if (inherits(cond, "message")) { [13:14:18.968] muffled <- grepl(pattern, "muffleMessage") [13:14:18.968] if (muffled) [13:14:18.968] invokeRestart("muffleMessage") [13:14:18.968] } [13:14:18.968] else if (inherits(cond, "warning")) { [13:14:18.968] muffled <- grepl(pattern, "muffleWarning") [13:14:18.968] if (muffled) [13:14:18.968] invokeRestart("muffleWarning") [13:14:18.968] } [13:14:18.968] else if (inherits(cond, "condition")) { [13:14:18.968] if (!is.null(pattern)) { [13:14:18.968] computeRestarts <- base::computeRestarts [13:14:18.968] grepl <- base::grepl [13:14:18.968] restarts <- computeRestarts(cond) [13:14:18.968] for (restart in restarts) { [13:14:18.968] name <- restart$name [13:14:18.968] if (is.null(name)) [13:14:18.968] next [13:14:18.968] if (!grepl(pattern, name)) [13:14:18.968] next [13:14:18.968] invokeRestart(restart) [13:14:18.968] muffled <- TRUE [13:14:18.968] break [13:14:18.968] } [13:14:18.968] } [13:14:18.968] } [13:14:18.968] invisible(muffled) [13:14:18.968] } [13:14:18.968] muffleCondition(cond) [13:14:18.968] }) [13:14:18.968] })) [13:14:18.968] future::FutureResult(value = ...future.value$value, [13:14:18.968] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:14:18.968] ...future.rng), globalenv = if (FALSE) [13:14:18.968] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:14:18.968] ...future.globalenv.names)) [13:14:18.968] else NULL, started = ...future.startTime, version = "1.8") [13:14:18.968] }, condition = base::local({ [13:14:18.968] c <- base::c [13:14:18.968] inherits <- base::inherits [13:14:18.968] invokeRestart <- base::invokeRestart [13:14:18.968] length <- base::length [13:14:18.968] list <- base::list [13:14:18.968] seq.int <- base::seq.int [13:14:18.968] signalCondition <- base::signalCondition [13:14:18.968] sys.calls <- base::sys.calls [13:14:18.968] `[[` <- base::`[[` [13:14:18.968] `+` <- base::`+` [13:14:18.968] `<<-` <- base::`<<-` [13:14:18.968] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:14:18.968] calls[seq.int(from = from + 12L, to = length(calls) - [13:14:18.968] 3L)] [13:14:18.968] } [13:14:18.968] function(cond) { [13:14:18.968] is_error <- inherits(cond, "error") [13:14:18.968] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:14:18.968] NULL) [13:14:18.968] if (is_error) { [13:14:18.968] sessionInformation <- function() { [13:14:18.968] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:14:18.968] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:14:18.968] search = base::search(), system = base::Sys.info()) [13:14:18.968] } [13:14:18.968] ...future.conditions[[length(...future.conditions) + [13:14:18.968] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:14:18.968] cond$call), session = sessionInformation(), [13:14:18.968] timestamp = base::Sys.time(), signaled = 0L) [13:14:18.968] signalCondition(cond) [13:14:18.968] } [13:14:18.968] else if (!ignore && TRUE && inherits(cond, c("condition", [13:14:18.968] "immediateCondition"))) { [13:14:18.968] signal <- TRUE && inherits(cond, "immediateCondition") [13:14:18.968] ...future.conditions[[length(...future.conditions) + [13:14:18.968] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:14:18.968] if (TRUE && !signal) { [13:14:18.968] muffleCondition <- function (cond, pattern = "^muffle") [13:14:18.968] { [13:14:18.968] inherits <- base::inherits [13:14:18.968] invokeRestart <- base::invokeRestart [13:14:18.968] is.null <- base::is.null [13:14:18.968] muffled <- FALSE [13:14:18.968] if (inherits(cond, "message")) { [13:14:18.968] muffled <- grepl(pattern, "muffleMessage") [13:14:18.968] if (muffled) [13:14:18.968] invokeRestart("muffleMessage") [13:14:18.968] } [13:14:18.968] else if (inherits(cond, "warning")) { [13:14:18.968] muffled <- grepl(pattern, "muffleWarning") [13:14:18.968] if (muffled) [13:14:18.968] invokeRestart("muffleWarning") [13:14:18.968] } [13:14:18.968] else if (inherits(cond, "condition")) { [13:14:18.968] if (!is.null(pattern)) { [13:14:18.968] computeRestarts <- base::computeRestarts [13:14:18.968] grepl <- base::grepl [13:14:18.968] restarts <- computeRestarts(cond) [13:14:18.968] for (restart in restarts) { [13:14:18.968] name <- restart$name [13:14:18.968] if (is.null(name)) [13:14:18.968] next [13:14:18.968] if (!grepl(pattern, name)) [13:14:18.968] next [13:14:18.968] invokeRestart(restart) [13:14:18.968] muffled <- TRUE [13:14:18.968] break [13:14:18.968] } [13:14:18.968] } [13:14:18.968] } [13:14:18.968] invisible(muffled) [13:14:18.968] } [13:14:18.968] muffleCondition(cond, pattern = "^muffle") [13:14:18.968] } [13:14:18.968] } [13:14:18.968] else { [13:14:18.968] if (TRUE) { [13:14:18.968] muffleCondition <- function (cond, pattern = "^muffle") [13:14:18.968] { [13:14:18.968] inherits <- base::inherits [13:14:18.968] invokeRestart <- base::invokeRestart [13:14:18.968] is.null <- base::is.null [13:14:18.968] muffled <- FALSE [13:14:18.968] if (inherits(cond, "message")) { [13:14:18.968] muffled <- grepl(pattern, "muffleMessage") [13:14:18.968] if (muffled) [13:14:18.968] invokeRestart("muffleMessage") [13:14:18.968] } [13:14:18.968] else if (inherits(cond, "warning")) { [13:14:18.968] muffled <- grepl(pattern, "muffleWarning") [13:14:18.968] if (muffled) [13:14:18.968] invokeRestart("muffleWarning") [13:14:18.968] } [13:14:18.968] else if (inherits(cond, "condition")) { [13:14:18.968] if (!is.null(pattern)) { [13:14:18.968] computeRestarts <- base::computeRestarts [13:14:18.968] grepl <- base::grepl [13:14:18.968] restarts <- computeRestarts(cond) [13:14:18.968] for (restart in restarts) { [13:14:18.968] name <- restart$name [13:14:18.968] if (is.null(name)) [13:14:18.968] next [13:14:18.968] if (!grepl(pattern, name)) [13:14:18.968] next [13:14:18.968] invokeRestart(restart) [13:14:18.968] muffled <- TRUE [13:14:18.968] break [13:14:18.968] } [13:14:18.968] } [13:14:18.968] } [13:14:18.968] invisible(muffled) [13:14:18.968] } [13:14:18.968] muffleCondition(cond, pattern = "^muffle") [13:14:18.968] } [13:14:18.968] } [13:14:18.968] } [13:14:18.968] })) [13:14:18.968] }, error = function(ex) { [13:14:18.968] base::structure(base::list(value = NULL, visible = NULL, [13:14:18.968] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:14:18.968] ...future.rng), started = ...future.startTime, [13:14:18.968] finished = Sys.time(), session_uuid = NA_character_, [13:14:18.968] version = "1.8"), class = "FutureResult") [13:14:18.968] }, finally = { [13:14:18.968] if (!identical(...future.workdir, getwd())) [13:14:18.968] setwd(...future.workdir) [13:14:18.968] { [13:14:18.968] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:14:18.968] ...future.oldOptions$nwarnings <- NULL [13:14:18.968] } [13:14:18.968] base::options(...future.oldOptions) [13:14:18.968] if (.Platform$OS.type == "windows") { [13:14:18.968] old_names <- names(...future.oldEnvVars) [13:14:18.968] envs <- base::Sys.getenv() [13:14:18.968] names <- names(envs) [13:14:18.968] common <- intersect(names, old_names) [13:14:18.968] added <- setdiff(names, old_names) [13:14:18.968] removed <- setdiff(old_names, names) [13:14:18.968] changed <- common[...future.oldEnvVars[common] != [13:14:18.968] envs[common]] [13:14:18.968] NAMES <- toupper(changed) [13:14:18.968] args <- list() [13:14:18.968] for (kk in seq_along(NAMES)) { [13:14:18.968] name <- changed[[kk]] [13:14:18.968] NAME <- NAMES[[kk]] [13:14:18.968] if (name != NAME && is.element(NAME, old_names)) [13:14:18.968] next [13:14:18.968] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:18.968] } [13:14:18.968] NAMES <- toupper(added) [13:14:18.968] for (kk in seq_along(NAMES)) { [13:14:18.968] name <- added[[kk]] [13:14:18.968] NAME <- NAMES[[kk]] [13:14:18.968] if (name != NAME && is.element(NAME, old_names)) [13:14:18.968] next [13:14:18.968] args[[name]] <- "" [13:14:18.968] } [13:14:18.968] NAMES <- toupper(removed) [13:14:18.968] for (kk in seq_along(NAMES)) { [13:14:18.968] name <- removed[[kk]] [13:14:18.968] NAME <- NAMES[[kk]] [13:14:18.968] if (name != NAME && is.element(NAME, old_names)) [13:14:18.968] next [13:14:18.968] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:18.968] } [13:14:18.968] if (length(args) > 0) [13:14:18.968] base::do.call(base::Sys.setenv, args = args) [13:14:18.968] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:14:18.968] } [13:14:18.968] else { [13:14:18.968] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:14:18.968] } [13:14:18.968] { [13:14:18.968] if (base::length(...future.futureOptionsAdded) > [13:14:18.968] 0L) { [13:14:18.968] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:14:18.968] base::names(opts) <- ...future.futureOptionsAdded [13:14:18.968] base::options(opts) [13:14:18.968] } [13:14:18.968] { [13:14:18.968] { [13:14:18.968] base::options(mc.cores = ...future.mc.cores.old) [13:14:18.968] NULL [13:14:18.968] } [13:14:18.968] options(future.plan = NULL) [13:14:18.968] if (is.na(NA_character_)) [13:14:18.968] Sys.unsetenv("R_FUTURE_PLAN") [13:14:18.968] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:14:18.968] future::plan(list(function (..., workers = availableCores(), [13:14:18.968] lazy = FALSE, rscript_libs = .libPaths(), [13:14:18.968] envir = parent.frame()) [13:14:18.968] { [13:14:18.968] if (is.function(workers)) [13:14:18.968] workers <- workers() [13:14:18.968] workers <- structure(as.integer(workers), [13:14:18.968] class = class(workers)) [13:14:18.968] stop_if_not(length(workers) == 1, is.finite(workers), [13:14:18.968] workers >= 1) [13:14:18.968] if (workers == 1L && !inherits(workers, "AsIs")) { [13:14:18.968] return(sequential(..., lazy = TRUE, envir = envir)) [13:14:18.968] } [13:14:18.968] future <- MultisessionFuture(..., workers = workers, [13:14:18.968] lazy = lazy, rscript_libs = rscript_libs, [13:14:18.968] envir = envir) [13:14:18.968] if (!future$lazy) [13:14:18.968] future <- run(future) [13:14:18.968] invisible(future) [13:14:18.968] }), .cleanup = FALSE, .init = FALSE) [13:14:18.968] } [13:14:18.968] } [13:14:18.968] } [13:14:18.968] }) [13:14:18.968] if (TRUE) { [13:14:18.968] base::sink(type = "output", split = FALSE) [13:14:18.968] if (TRUE) { [13:14:18.968] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:14:18.968] } [13:14:18.968] else { [13:14:18.968] ...future.result["stdout"] <- base::list(NULL) [13:14:18.968] } [13:14:18.968] base::close(...future.stdout) [13:14:18.968] ...future.stdout <- NULL [13:14:18.968] } [13:14:18.968] ...future.result$conditions <- ...future.conditions [13:14:18.968] ...future.result$finished <- base::Sys.time() [13:14:18.968] ...future.result [13:14:18.968] } [13:14:18.973] Exporting 5 global objects (45.86 KiB) to cluster node #1 ... [13:14:18.974] Exporting '...future.FUN' (45.86 KiB) to cluster node #1 ... [13:14:18.974] Exporting '...future.FUN' (45.86 KiB) to cluster node #1 ... DONE [13:14:18.975] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... [13:14:18.975] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... DONE [13:14:18.975] Exporting '...future.elements_ii' (288 bytes) to cluster node #1 ... [13:14:18.976] Exporting '...future.elements_ii' (288 bytes) to cluster node #1 ... DONE [13:14:18.976] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:14:18.976] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:14:18.976] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:14:18.977] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:14:18.977] Exporting 5 global objects (45.86 KiB) to cluster node #1 ... DONE [13:14:18.977] MultisessionFuture started [13:14:18.978] - Launch lazy future ... done [13:14:18.978] run() for 'MultisessionFuture' ... done [13:14:18.978] Created future: [13:14:18.996] receiveMessageFromWorker() for ClusterFuture ... [13:14:18.997] - Validating connection of MultisessionFuture [13:14:18.997] - received message: FutureResult [13:14:18.997] - Received FutureResult [13:14:18.997] - Erased future from FutureRegistry [13:14:18.997] result() for ClusterFuture ... [13:14:18.998] - result already collected: FutureResult [13:14:18.998] result() for ClusterFuture ... done [13:14:18.998] receiveMessageFromWorker() for ClusterFuture ... done [13:14:18.978] MultisessionFuture: [13:14:18.978] Label: 'future_sapply-1' [13:14:18.978] Expression: [13:14:18.978] { [13:14:18.978] do.call(function(...) { [13:14:18.978] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:18.978] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:18.978] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:18.978] on.exit(options(oopts), add = TRUE) [13:14:18.978] } [13:14:18.978] { [13:14:18.978] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:18.978] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:18.978] ...future.FUN(...future.X_jj, ...) [13:14:18.978] }) [13:14:18.978] } [13:14:18.978] }, args = future.call.arguments) [13:14:18.978] } [13:14:18.978] Lazy evaluation: FALSE [13:14:18.978] Asynchronous evaluation: TRUE [13:14:18.978] Local evaluation: TRUE [13:14:18.978] Environment: R_GlobalEnv [13:14:18.978] Capture standard output: TRUE [13:14:18.978] Capture condition classes: 'condition' (excluding 'nothing') [13:14:18.978] Globals: 5 objects totaling 46.14 KiB (function '...future.FUN' of 45.86 KiB, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 288 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:14:18.978] Packages: 1 packages ('stats') [13:14:18.978] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:14:18.978] Resolved: TRUE [13:14:18.978] Value: [13:14:18.978] Conditions captured: [13:14:18.978] Early signaling: FALSE [13:14:18.978] Owner process: 1bb7d580-628d-c90d-e38a-66de485868c4 [13:14:18.978] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:14:18.998] Chunk #1 of 2 ... DONE [13:14:18.999] Chunk #2 of 2 ... [13:14:18.999] - Finding globals in 'X' for chunk #2 ... [13:14:18.999] getGlobalsAndPackages() ... [13:14:18.999] Searching for globals... [13:14:18.999] [13:14:19.000] Searching for globals ... DONE [13:14:19.000] - globals: [0] [13:14:19.000] getGlobalsAndPackages() ... DONE [13:14:19.000] + additional globals found: [n=0] [13:14:19.000] + additional namespaces needed: [n=0] [13:14:19.000] - Finding globals in 'X' for chunk #2 ... DONE [13:14:19.001] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:14:19.001] - seeds: [13:14:19.001] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:19.001] getGlobalsAndPackages() ... [13:14:19.001] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:19.001] Resolving globals: FALSE [13:14:19.002] Tweak future expression to call with '...' arguments ... [13:14:19.002] { [13:14:19.002] do.call(function(...) { [13:14:19.002] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:19.002] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:19.002] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:19.002] on.exit(options(oopts), add = TRUE) [13:14:19.002] } [13:14:19.002] { [13:14:19.002] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:19.002] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:19.002] ...future.FUN(...future.X_jj, ...) [13:14:19.002] }) [13:14:19.002] } [13:14:19.002] }, args = future.call.arguments) [13:14:19.002] } [13:14:19.002] Tweak future expression to call with '...' arguments ... DONE [13:14:19.003] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:19.003] - packages: [1] 'stats' [13:14:19.003] getGlobalsAndPackages() ... DONE [13:14:19.004] run() for 'Future' ... [13:14:19.004] - state: 'created' [13:14:19.004] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:14:19.018] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:14:19.018] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:14:19.018] - Field: 'node' [13:14:19.019] - Field: 'label' [13:14:19.019] - Field: 'local' [13:14:19.019] - Field: 'owner' [13:14:19.019] - Field: 'envir' [13:14:19.019] - Field: 'workers' [13:14:19.020] - Field: 'packages' [13:14:19.020] - Field: 'gc' [13:14:19.020] - Field: 'conditions' [13:14:19.020] - Field: 'persistent' [13:14:19.020] - Field: 'expr' [13:14:19.020] - Field: 'uuid' [13:14:19.021] - Field: 'seed' [13:14:19.021] - Field: 'version' [13:14:19.021] - Field: 'result' [13:14:19.021] - Field: 'asynchronous' [13:14:19.021] - Field: 'calls' [13:14:19.021] - Field: 'globals' [13:14:19.022] - Field: 'stdout' [13:14:19.022] - Field: 'earlySignal' [13:14:19.022] - Field: 'lazy' [13:14:19.022] - Field: 'state' [13:14:19.022] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:14:19.023] - Launch lazy future ... [13:14:19.023] Packages needed by the future expression (n = 1): 'stats' [13:14:19.023] Packages needed by future strategies (n = 0): [13:14:19.024] { [13:14:19.024] { [13:14:19.024] { [13:14:19.024] ...future.startTime <- base::Sys.time() [13:14:19.024] { [13:14:19.024] { [13:14:19.024] { [13:14:19.024] { [13:14:19.024] { [13:14:19.024] base::local({ [13:14:19.024] has_future <- base::requireNamespace("future", [13:14:19.024] quietly = TRUE) [13:14:19.024] if (has_future) { [13:14:19.024] ns <- base::getNamespace("future") [13:14:19.024] version <- ns[[".package"]][["version"]] [13:14:19.024] if (is.null(version)) [13:14:19.024] version <- utils::packageVersion("future") [13:14:19.024] } [13:14:19.024] else { [13:14:19.024] version <- NULL [13:14:19.024] } [13:14:19.024] if (!has_future || version < "1.8.0") { [13:14:19.024] info <- base::c(r_version = base::gsub("R version ", [13:14:19.024] "", base::R.version$version.string), [13:14:19.024] platform = base::sprintf("%s (%s-bit)", [13:14:19.024] base::R.version$platform, 8 * [13:14:19.024] base::.Machine$sizeof.pointer), [13:14:19.024] os = base::paste(base::Sys.info()[base::c("sysname", [13:14:19.024] "release", "version")], collapse = " "), [13:14:19.024] hostname = base::Sys.info()[["nodename"]]) [13:14:19.024] info <- base::sprintf("%s: %s", base::names(info), [13:14:19.024] info) [13:14:19.024] info <- base::paste(info, collapse = "; ") [13:14:19.024] if (!has_future) { [13:14:19.024] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:14:19.024] info) [13:14:19.024] } [13:14:19.024] else { [13:14:19.024] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:14:19.024] info, version) [13:14:19.024] } [13:14:19.024] base::stop(msg) [13:14:19.024] } [13:14:19.024] }) [13:14:19.024] } [13:14:19.024] ...future.mc.cores.old <- base::getOption("mc.cores") [13:14:19.024] base::options(mc.cores = 1L) [13:14:19.024] } [13:14:19.024] base::local({ [13:14:19.024] for (pkg in "stats") { [13:14:19.024] base::loadNamespace(pkg) [13:14:19.024] base::library(pkg, character.only = TRUE) [13:14:19.024] } [13:14:19.024] }) [13:14:19.024] } [13:14:19.024] options(future.plan = NULL) [13:14:19.024] Sys.unsetenv("R_FUTURE_PLAN") [13:14:19.024] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:14:19.024] } [13:14:19.024] ...future.workdir <- getwd() [13:14:19.024] } [13:14:19.024] ...future.oldOptions <- base::as.list(base::.Options) [13:14:19.024] ...future.oldEnvVars <- base::Sys.getenv() [13:14:19.024] } [13:14:19.024] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:14:19.024] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:14:19.024] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:14:19.024] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:14:19.024] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:14:19.024] future.stdout.windows.reencode = NULL, width = 80L) [13:14:19.024] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:14:19.024] base::names(...future.oldOptions)) [13:14:19.024] } [13:14:19.024] if (FALSE) { [13:14:19.024] } [13:14:19.024] else { [13:14:19.024] if (TRUE) { [13:14:19.024] ...future.stdout <- base::rawConnection(base::raw(0L), [13:14:19.024] open = "w") [13:14:19.024] } [13:14:19.024] else { [13:14:19.024] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:14:19.024] windows = "NUL", "/dev/null"), open = "w") [13:14:19.024] } [13:14:19.024] base::sink(...future.stdout, type = "output", split = FALSE) [13:14:19.024] base::on.exit(if (!base::is.null(...future.stdout)) { [13:14:19.024] base::sink(type = "output", split = FALSE) [13:14:19.024] base::close(...future.stdout) [13:14:19.024] }, add = TRUE) [13:14:19.024] } [13:14:19.024] ...future.frame <- base::sys.nframe() [13:14:19.024] ...future.conditions <- base::list() [13:14:19.024] ...future.rng <- base::globalenv()$.Random.seed [13:14:19.024] if (FALSE) { [13:14:19.024] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:14:19.024] "...future.value", "...future.globalenv.names", ".Random.seed") [13:14:19.024] } [13:14:19.024] ...future.result <- base::tryCatch({ [13:14:19.024] base::withCallingHandlers({ [13:14:19.024] ...future.value <- base::withVisible(base::local({ [13:14:19.024] ...future.makeSendCondition <- local({ [13:14:19.024] sendCondition <- NULL [13:14:19.024] function(frame = 1L) { [13:14:19.024] if (is.function(sendCondition)) [13:14:19.024] return(sendCondition) [13:14:19.024] ns <- getNamespace("parallel") [13:14:19.024] if (exists("sendData", mode = "function", [13:14:19.024] envir = ns)) { [13:14:19.024] parallel_sendData <- get("sendData", mode = "function", [13:14:19.024] envir = ns) [13:14:19.024] envir <- sys.frame(frame) [13:14:19.024] master <- NULL [13:14:19.024] while (!identical(envir, .GlobalEnv) && [13:14:19.024] !identical(envir, emptyenv())) { [13:14:19.024] if (exists("master", mode = "list", envir = envir, [13:14:19.024] inherits = FALSE)) { [13:14:19.024] master <- get("master", mode = "list", [13:14:19.024] envir = envir, inherits = FALSE) [13:14:19.024] if (inherits(master, c("SOCKnode", [13:14:19.024] "SOCK0node"))) { [13:14:19.024] sendCondition <<- function(cond) { [13:14:19.024] data <- list(type = "VALUE", value = cond, [13:14:19.024] success = TRUE) [13:14:19.024] parallel_sendData(master, data) [13:14:19.024] } [13:14:19.024] return(sendCondition) [13:14:19.024] } [13:14:19.024] } [13:14:19.024] frame <- frame + 1L [13:14:19.024] envir <- sys.frame(frame) [13:14:19.024] } [13:14:19.024] } [13:14:19.024] sendCondition <<- function(cond) NULL [13:14:19.024] } [13:14:19.024] }) [13:14:19.024] withCallingHandlers({ [13:14:19.024] { [13:14:19.024] do.call(function(...) { [13:14:19.024] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:19.024] if (!identical(...future.globals.maxSize.org, [13:14:19.024] ...future.globals.maxSize)) { [13:14:19.024] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:19.024] on.exit(options(oopts), add = TRUE) [13:14:19.024] } [13:14:19.024] { [13:14:19.024] lapply(seq_along(...future.elements_ii), [13:14:19.024] FUN = function(jj) { [13:14:19.024] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:19.024] ...future.FUN(...future.X_jj, ...) [13:14:19.024] }) [13:14:19.024] } [13:14:19.024] }, args = future.call.arguments) [13:14:19.024] } [13:14:19.024] }, immediateCondition = function(cond) { [13:14:19.024] sendCondition <- ...future.makeSendCondition() [13:14:19.024] sendCondition(cond) [13:14:19.024] muffleCondition <- function (cond, pattern = "^muffle") [13:14:19.024] { [13:14:19.024] inherits <- base::inherits [13:14:19.024] invokeRestart <- base::invokeRestart [13:14:19.024] is.null <- base::is.null [13:14:19.024] muffled <- FALSE [13:14:19.024] if (inherits(cond, "message")) { [13:14:19.024] muffled <- grepl(pattern, "muffleMessage") [13:14:19.024] if (muffled) [13:14:19.024] invokeRestart("muffleMessage") [13:14:19.024] } [13:14:19.024] else if (inherits(cond, "warning")) { [13:14:19.024] muffled <- grepl(pattern, "muffleWarning") [13:14:19.024] if (muffled) [13:14:19.024] invokeRestart("muffleWarning") [13:14:19.024] } [13:14:19.024] else if (inherits(cond, "condition")) { [13:14:19.024] if (!is.null(pattern)) { [13:14:19.024] computeRestarts <- base::computeRestarts [13:14:19.024] grepl <- base::grepl [13:14:19.024] restarts <- computeRestarts(cond) [13:14:19.024] for (restart in restarts) { [13:14:19.024] name <- restart$name [13:14:19.024] if (is.null(name)) [13:14:19.024] next [13:14:19.024] if (!grepl(pattern, name)) [13:14:19.024] next [13:14:19.024] invokeRestart(restart) [13:14:19.024] muffled <- TRUE [13:14:19.024] break [13:14:19.024] } [13:14:19.024] } [13:14:19.024] } [13:14:19.024] invisible(muffled) [13:14:19.024] } [13:14:19.024] muffleCondition(cond) [13:14:19.024] }) [13:14:19.024] })) [13:14:19.024] future::FutureResult(value = ...future.value$value, [13:14:19.024] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:14:19.024] ...future.rng), globalenv = if (FALSE) [13:14:19.024] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:14:19.024] ...future.globalenv.names)) [13:14:19.024] else NULL, started = ...future.startTime, version = "1.8") [13:14:19.024] }, condition = base::local({ [13:14:19.024] c <- base::c [13:14:19.024] inherits <- base::inherits [13:14:19.024] invokeRestart <- base::invokeRestart [13:14:19.024] length <- base::length [13:14:19.024] list <- base::list [13:14:19.024] seq.int <- base::seq.int [13:14:19.024] signalCondition <- base::signalCondition [13:14:19.024] sys.calls <- base::sys.calls [13:14:19.024] `[[` <- base::`[[` [13:14:19.024] `+` <- base::`+` [13:14:19.024] `<<-` <- base::`<<-` [13:14:19.024] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:14:19.024] calls[seq.int(from = from + 12L, to = length(calls) - [13:14:19.024] 3L)] [13:14:19.024] } [13:14:19.024] function(cond) { [13:14:19.024] is_error <- inherits(cond, "error") [13:14:19.024] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:14:19.024] NULL) [13:14:19.024] if (is_error) { [13:14:19.024] sessionInformation <- function() { [13:14:19.024] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:14:19.024] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:14:19.024] search = base::search(), system = base::Sys.info()) [13:14:19.024] } [13:14:19.024] ...future.conditions[[length(...future.conditions) + [13:14:19.024] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:14:19.024] cond$call), session = sessionInformation(), [13:14:19.024] timestamp = base::Sys.time(), signaled = 0L) [13:14:19.024] signalCondition(cond) [13:14:19.024] } [13:14:19.024] else if (!ignore && TRUE && inherits(cond, c("condition", [13:14:19.024] "immediateCondition"))) { [13:14:19.024] signal <- TRUE && inherits(cond, "immediateCondition") [13:14:19.024] ...future.conditions[[length(...future.conditions) + [13:14:19.024] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:14:19.024] if (TRUE && !signal) { [13:14:19.024] muffleCondition <- function (cond, pattern = "^muffle") [13:14:19.024] { [13:14:19.024] inherits <- base::inherits [13:14:19.024] invokeRestart <- base::invokeRestart [13:14:19.024] is.null <- base::is.null [13:14:19.024] muffled <- FALSE [13:14:19.024] if (inherits(cond, "message")) { [13:14:19.024] muffled <- grepl(pattern, "muffleMessage") [13:14:19.024] if (muffled) [13:14:19.024] invokeRestart("muffleMessage") [13:14:19.024] } [13:14:19.024] else if (inherits(cond, "warning")) { [13:14:19.024] muffled <- grepl(pattern, "muffleWarning") [13:14:19.024] if (muffled) [13:14:19.024] invokeRestart("muffleWarning") [13:14:19.024] } [13:14:19.024] else if (inherits(cond, "condition")) { [13:14:19.024] if (!is.null(pattern)) { [13:14:19.024] computeRestarts <- base::computeRestarts [13:14:19.024] grepl <- base::grepl [13:14:19.024] restarts <- computeRestarts(cond) [13:14:19.024] for (restart in restarts) { [13:14:19.024] name <- restart$name [13:14:19.024] if (is.null(name)) [13:14:19.024] next [13:14:19.024] if (!grepl(pattern, name)) [13:14:19.024] next [13:14:19.024] invokeRestart(restart) [13:14:19.024] muffled <- TRUE [13:14:19.024] break [13:14:19.024] } [13:14:19.024] } [13:14:19.024] } [13:14:19.024] invisible(muffled) [13:14:19.024] } [13:14:19.024] muffleCondition(cond, pattern = "^muffle") [13:14:19.024] } [13:14:19.024] } [13:14:19.024] else { [13:14:19.024] if (TRUE) { [13:14:19.024] muffleCondition <- function (cond, pattern = "^muffle") [13:14:19.024] { [13:14:19.024] inherits <- base::inherits [13:14:19.024] invokeRestart <- base::invokeRestart [13:14:19.024] is.null <- base::is.null [13:14:19.024] muffled <- FALSE [13:14:19.024] if (inherits(cond, "message")) { [13:14:19.024] muffled <- grepl(pattern, "muffleMessage") [13:14:19.024] if (muffled) [13:14:19.024] invokeRestart("muffleMessage") [13:14:19.024] } [13:14:19.024] else if (inherits(cond, "warning")) { [13:14:19.024] muffled <- grepl(pattern, "muffleWarning") [13:14:19.024] if (muffled) [13:14:19.024] invokeRestart("muffleWarning") [13:14:19.024] } [13:14:19.024] else if (inherits(cond, "condition")) { [13:14:19.024] if (!is.null(pattern)) { [13:14:19.024] computeRestarts <- base::computeRestarts [13:14:19.024] grepl <- base::grepl [13:14:19.024] restarts <- computeRestarts(cond) [13:14:19.024] for (restart in restarts) { [13:14:19.024] name <- restart$name [13:14:19.024] if (is.null(name)) [13:14:19.024] next [13:14:19.024] if (!grepl(pattern, name)) [13:14:19.024] next [13:14:19.024] invokeRestart(restart) [13:14:19.024] muffled <- TRUE [13:14:19.024] break [13:14:19.024] } [13:14:19.024] } [13:14:19.024] } [13:14:19.024] invisible(muffled) [13:14:19.024] } [13:14:19.024] muffleCondition(cond, pattern = "^muffle") [13:14:19.024] } [13:14:19.024] } [13:14:19.024] } [13:14:19.024] })) [13:14:19.024] }, error = function(ex) { [13:14:19.024] base::structure(base::list(value = NULL, visible = NULL, [13:14:19.024] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:14:19.024] ...future.rng), started = ...future.startTime, [13:14:19.024] finished = Sys.time(), session_uuid = NA_character_, [13:14:19.024] version = "1.8"), class = "FutureResult") [13:14:19.024] }, finally = { [13:14:19.024] if (!identical(...future.workdir, getwd())) [13:14:19.024] setwd(...future.workdir) [13:14:19.024] { [13:14:19.024] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:14:19.024] ...future.oldOptions$nwarnings <- NULL [13:14:19.024] } [13:14:19.024] base::options(...future.oldOptions) [13:14:19.024] if (.Platform$OS.type == "windows") { [13:14:19.024] old_names <- names(...future.oldEnvVars) [13:14:19.024] envs <- base::Sys.getenv() [13:14:19.024] names <- names(envs) [13:14:19.024] common <- intersect(names, old_names) [13:14:19.024] added <- setdiff(names, old_names) [13:14:19.024] removed <- setdiff(old_names, names) [13:14:19.024] changed <- common[...future.oldEnvVars[common] != [13:14:19.024] envs[common]] [13:14:19.024] NAMES <- toupper(changed) [13:14:19.024] args <- list() [13:14:19.024] for (kk in seq_along(NAMES)) { [13:14:19.024] name <- changed[[kk]] [13:14:19.024] NAME <- NAMES[[kk]] [13:14:19.024] if (name != NAME && is.element(NAME, old_names)) [13:14:19.024] next [13:14:19.024] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:19.024] } [13:14:19.024] NAMES <- toupper(added) [13:14:19.024] for (kk in seq_along(NAMES)) { [13:14:19.024] name <- added[[kk]] [13:14:19.024] NAME <- NAMES[[kk]] [13:14:19.024] if (name != NAME && is.element(NAME, old_names)) [13:14:19.024] next [13:14:19.024] args[[name]] <- "" [13:14:19.024] } [13:14:19.024] NAMES <- toupper(removed) [13:14:19.024] for (kk in seq_along(NAMES)) { [13:14:19.024] name <- removed[[kk]] [13:14:19.024] NAME <- NAMES[[kk]] [13:14:19.024] if (name != NAME && is.element(NAME, old_names)) [13:14:19.024] next [13:14:19.024] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:19.024] } [13:14:19.024] if (length(args) > 0) [13:14:19.024] base::do.call(base::Sys.setenv, args = args) [13:14:19.024] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:14:19.024] } [13:14:19.024] else { [13:14:19.024] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:14:19.024] } [13:14:19.024] { [13:14:19.024] if (base::length(...future.futureOptionsAdded) > [13:14:19.024] 0L) { [13:14:19.024] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:14:19.024] base::names(opts) <- ...future.futureOptionsAdded [13:14:19.024] base::options(opts) [13:14:19.024] } [13:14:19.024] { [13:14:19.024] { [13:14:19.024] base::options(mc.cores = ...future.mc.cores.old) [13:14:19.024] NULL [13:14:19.024] } [13:14:19.024] options(future.plan = NULL) [13:14:19.024] if (is.na(NA_character_)) [13:14:19.024] Sys.unsetenv("R_FUTURE_PLAN") [13:14:19.024] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:14:19.024] future::plan(list(function (..., workers = availableCores(), [13:14:19.024] lazy = FALSE, rscript_libs = .libPaths(), [13:14:19.024] envir = parent.frame()) [13:14:19.024] { [13:14:19.024] if (is.function(workers)) [13:14:19.024] workers <- workers() [13:14:19.024] workers <- structure(as.integer(workers), [13:14:19.024] class = class(workers)) [13:14:19.024] stop_if_not(length(workers) == 1, is.finite(workers), [13:14:19.024] workers >= 1) [13:14:19.024] if (workers == 1L && !inherits(workers, "AsIs")) { [13:14:19.024] return(sequential(..., lazy = TRUE, envir = envir)) [13:14:19.024] } [13:14:19.024] future <- MultisessionFuture(..., workers = workers, [13:14:19.024] lazy = lazy, rscript_libs = rscript_libs, [13:14:19.024] envir = envir) [13:14:19.024] if (!future$lazy) [13:14:19.024] future <- run(future) [13:14:19.024] invisible(future) [13:14:19.024] }), .cleanup = FALSE, .init = FALSE) [13:14:19.024] } [13:14:19.024] } [13:14:19.024] } [13:14:19.024] }) [13:14:19.024] if (TRUE) { [13:14:19.024] base::sink(type = "output", split = FALSE) [13:14:19.024] if (TRUE) { [13:14:19.024] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:14:19.024] } [13:14:19.024] else { [13:14:19.024] ...future.result["stdout"] <- base::list(NULL) [13:14:19.024] } [13:14:19.024] base::close(...future.stdout) [13:14:19.024] ...future.stdout <- NULL [13:14:19.024] } [13:14:19.024] ...future.result$conditions <- ...future.conditions [13:14:19.024] ...future.result$finished <- base::Sys.time() [13:14:19.024] ...future.result [13:14:19.024] } [13:14:19.029] Exporting 5 global objects (45.86 KiB) to cluster node #1 ... [13:14:19.029] Exporting '...future.FUN' (45.86 KiB) to cluster node #1 ... [13:14:19.030] Exporting '...future.FUN' (45.86 KiB) to cluster node #1 ... DONE [13:14:19.030] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... [13:14:19.031] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... DONE [13:14:19.031] Exporting '...future.elements_ii' (256 bytes) to cluster node #1 ... [13:14:19.031] Exporting '...future.elements_ii' (256 bytes) to cluster node #1 ... DONE [13:14:19.031] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:14:19.032] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:14:19.032] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:14:19.032] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:14:19.032] Exporting 5 global objects (45.86 KiB) to cluster node #1 ... DONE [13:14:19.033] MultisessionFuture started [13:14:19.033] - Launch lazy future ... done [13:14:19.033] run() for 'MultisessionFuture' ... done [13:14:19.034] Created future: [13:14:19.051] receiveMessageFromWorker() for ClusterFuture ... [13:14:19.052] - Validating connection of MultisessionFuture [13:14:19.052] - received message: FutureResult [13:14:19.052] - Received FutureResult [13:14:19.052] - Erased future from FutureRegistry [13:14:19.052] result() for ClusterFuture ... [13:14:19.053] - result already collected: FutureResult [13:14:19.055] result() for ClusterFuture ... done [13:14:19.055] receiveMessageFromWorker() for ClusterFuture ... done [13:14:19.034] MultisessionFuture: [13:14:19.034] Label: 'future_sapply-2' [13:14:19.034] Expression: [13:14:19.034] { [13:14:19.034] do.call(function(...) { [13:14:19.034] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:19.034] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:19.034] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:19.034] on.exit(options(oopts), add = TRUE) [13:14:19.034] } [13:14:19.034] { [13:14:19.034] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:19.034] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:19.034] ...future.FUN(...future.X_jj, ...) [13:14:19.034] }) [13:14:19.034] } [13:14:19.034] }, args = future.call.arguments) [13:14:19.034] } [13:14:19.034] Lazy evaluation: FALSE [13:14:19.034] Asynchronous evaluation: TRUE [13:14:19.034] Local evaluation: TRUE [13:14:19.034] Environment: R_GlobalEnv [13:14:19.034] Capture standard output: TRUE [13:14:19.034] Capture condition classes: 'condition' (excluding 'nothing') [13:14:19.034] Globals: 5 objects totaling 46.11 KiB (function '...future.FUN' of 45.86 KiB, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 256 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:14:19.034] Packages: 1 packages ('stats') [13:14:19.034] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:14:19.034] Resolved: TRUE [13:14:19.034] Value: [13:14:19.034] Conditions captured: [13:14:19.034] Early signaling: FALSE [13:14:19.034] Owner process: 1bb7d580-628d-c90d-e38a-66de485868c4 [13:14:19.034] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:14:19.056] Chunk #2 of 2 ... DONE [13:14:19.056] Launching 2 futures (chunks) ... DONE [13:14:19.056] Resolving 2 futures (chunks) ... [13:14:19.056] resolve() on list ... [13:14:19.056] recursive: 0 [13:14:19.057] length: 2 [13:14:19.057] [13:14:19.057] Future #1 [13:14:19.057] result() for ClusterFuture ... [13:14:19.057] - result already collected: FutureResult [13:14:19.057] result() for ClusterFuture ... done [13:14:19.058] result() for ClusterFuture ... [13:14:19.058] - result already collected: FutureResult [13:14:19.058] result() for ClusterFuture ... done [13:14:19.058] signalConditionsASAP(MultisessionFuture, pos=1) ... [13:14:19.058] - nx: 2 [13:14:19.058] - relay: TRUE [13:14:19.058] - stdout: TRUE [13:14:19.059] - signal: TRUE [13:14:19.059] - resignal: FALSE [13:14:19.059] - force: TRUE [13:14:19.059] - relayed: [n=2] FALSE, FALSE [13:14:19.059] - queued futures: [n=2] FALSE, FALSE [13:14:19.059] - until=1 [13:14:19.060] - relaying element #1 [13:14:19.060] result() for ClusterFuture ... [13:14:19.060] - result already collected: FutureResult [13:14:19.060] result() for ClusterFuture ... done [13:14:19.060] result() for ClusterFuture ... [13:14:19.060] - result already collected: FutureResult [13:14:19.060] result() for ClusterFuture ... done [13:14:19.061] result() for ClusterFuture ... [13:14:19.061] - result already collected: FutureResult [13:14:19.061] result() for ClusterFuture ... done [13:14:19.061] result() for ClusterFuture ... [13:14:19.061] - result already collected: FutureResult [13:14:19.061] result() for ClusterFuture ... done [13:14:19.062] - relayed: [n=2] TRUE, FALSE [13:14:19.062] - queued futures: [n=2] TRUE, FALSE [13:14:19.062] signalConditionsASAP(MultisessionFuture, pos=1) ... done [13:14:19.062] length: 1 (resolved future 1) [13:14:19.062] Future #2 [13:14:19.062] result() for ClusterFuture ... [13:14:19.063] - result already collected: FutureResult [13:14:19.063] result() for ClusterFuture ... done [13:14:19.063] result() for ClusterFuture ... [13:14:19.063] - result already collected: FutureResult [13:14:19.063] result() for ClusterFuture ... done [13:14:19.063] signalConditionsASAP(MultisessionFuture, pos=2) ... [13:14:19.064] - nx: 2 [13:14:19.064] - relay: TRUE [13:14:19.064] - stdout: TRUE [13:14:19.064] - signal: TRUE [13:14:19.064] - resignal: FALSE [13:14:19.064] - force: TRUE [13:14:19.064] - relayed: [n=2] TRUE, FALSE [13:14:19.065] - queued futures: [n=2] TRUE, FALSE [13:14:19.065] - until=2 [13:14:19.065] - relaying element #2 [13:14:19.065] result() for ClusterFuture ... [13:14:19.065] - result already collected: FutureResult [13:14:19.065] result() for ClusterFuture ... done [13:14:19.066] result() for ClusterFuture ... [13:14:19.066] - result already collected: FutureResult [13:14:19.066] result() for ClusterFuture ... done [13:14:19.066] result() for ClusterFuture ... [13:14:19.066] - result already collected: FutureResult [13:14:19.066] result() for ClusterFuture ... done [13:14:19.067] result() for ClusterFuture ... [13:14:19.067] - result already collected: FutureResult [13:14:19.067] result() for ClusterFuture ... done [13:14:19.067] - relayed: [n=2] TRUE, TRUE [13:14:19.067] - queued futures: [n=2] TRUE, TRUE [13:14:19.067] signalConditionsASAP(MultisessionFuture, pos=2) ... done [13:14:19.068] length: 0 (resolved future 2) [13:14:19.068] Relaying remaining futures [13:14:19.068] signalConditionsASAP(NULL, pos=0) ... [13:14:19.068] - nx: 2 [13:14:19.068] - relay: TRUE [13:14:19.068] - stdout: TRUE [13:14:19.068] - signal: TRUE [13:14:19.069] - resignal: FALSE [13:14:19.069] - force: TRUE [13:14:19.069] - relayed: [n=2] TRUE, TRUE [13:14:19.069] - queued futures: [n=2] TRUE, TRUE - flush all [13:14:19.069] - relayed: [n=2] TRUE, TRUE [13:14:19.069] - queued futures: [n=2] TRUE, TRUE [13:14:19.070] signalConditionsASAP(NULL, pos=0) ... done [13:14:19.070] resolve() on list ... DONE [13:14:19.070] result() for ClusterFuture ... [13:14:19.070] - result already collected: FutureResult [13:14:19.070] result() for ClusterFuture ... done [13:14:19.070] result() for ClusterFuture ... [13:14:19.071] - result already collected: FutureResult [13:14:19.071] result() for ClusterFuture ... done [13:14:19.071] result() for ClusterFuture ... [13:14:19.071] - result already collected: FutureResult [13:14:19.071] result() for ClusterFuture ... done [13:14:19.071] result() for ClusterFuture ... [13:14:19.072] - result already collected: FutureResult [13:14:19.072] result() for ClusterFuture ... done [13:14:19.072] - Number of value chunks collected: 2 [13:14:19.072] Resolving 2 futures (chunks) ... DONE [13:14:19.072] Reducing values from 2 chunks ... [13:14:19.072] - Number of values collected after concatenation: 7 [13:14:19.073] - Number of values expected: 7 [13:14:19.073] Reducing values from 2 chunks ... DONE [13:14:19.073] future_lapply() ... DONE [13:14:19.073] future_lapply() ... [13:14:19.078] Number of chunks: 2 [13:14:19.078] getGlobalsAndPackagesXApply() ... [13:14:19.078] - future.globals: TRUE [13:14:19.079] getGlobalsAndPackages() ... [13:14:19.079] Searching for globals... [13:14:19.089] - globals found: [31] 'FUN', '{', '<-', 'x_FUN', 'if', '!=', 'length', 'times', 'stopf', 'stop_if_not', 'all', '==', 'dim', '%in%', 'typeof', 'valid_types', 'is.na', 'any', '[', '!', 'return', 'rep.int', 'sort', '/', 'floor', '(', '+', 'c', '-', '*', 'ceiling' [13:14:19.089] Searching for globals ... DONE [13:14:19.089] Resolving globals: FALSE [13:14:19.091] The total size of the 7 globals is 137.93 KiB (141240 bytes) [13:14:19.091] The total size of the 7 globals exported for future expression ('FUN()') is 137.93 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). The three largest globals are 'x_FUN' (45.86 KiB of class 'function'), 'stop_if_not' (44.12 KiB of class 'function') and 'stopf' (26.43 KiB of class 'function') [13:14:19.091] - globals: [7] 'FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types' [13:14:19.092] - packages: [2] 'stats', 'future.apply' [13:14:19.092] getGlobalsAndPackages() ... DONE [13:14:19.092] - globals found/used: [n=7] 'FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types' [13:14:19.092] - needed namespaces: [n=2] 'stats', 'future.apply' [13:14:19.092] Finding globals ... DONE [13:14:19.093] - use_args: TRUE [13:14:19.093] - Getting '...' globals ... [13:14:19.093] resolve() on list ... [13:14:19.093] recursive: 0 [13:14:19.093] length: 1 [13:14:19.094] elements: '...' [13:14:19.094] length: 0 (resolved future 1) [13:14:19.094] resolve() on list ... DONE [13:14:19.094] - '...' content: [n=0] [13:14:19.094] List of 1 [13:14:19.094] $ ...: list() [13:14:19.094] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:14:19.094] - attr(*, "where")=List of 1 [13:14:19.094] ..$ ...: [13:14:19.094] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:14:19.094] - attr(*, "resolved")= logi TRUE [13:14:19.094] - attr(*, "total_size")= num NA [13:14:19.097] - Getting '...' globals ... DONE [13:14:19.098] Globals to be used in all futures (chunks): [n=8] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...' [13:14:19.098] List of 8 [13:14:19.098] $ ...future.FUN:function (x, ...) [13:14:19.098] $ x_FUN :function (x, na.rm = TRUE) [13:14:19.098] $ times : int 5 [13:14:19.098] $ stopf :function (fmt, ..., call. = TRUE, domain = NULL) [13:14:19.098] $ stop_if_not :function (...) [13:14:19.098] $ dim : NULL [13:14:19.098] $ valid_types : chr [1:3] "logical" "integer" "double" [13:14:19.098] $ ... : list() [13:14:19.098] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:14:19.098] - attr(*, "where")=List of 8 [13:14:19.098] ..$ ...future.FUN: [13:14:19.098] ..$ x_FUN : [13:14:19.098] ..$ times : [13:14:19.098] ..$ stopf : [13:14:19.098] ..$ stop_if_not : [13:14:19.098] ..$ dim : [13:14:19.098] ..$ valid_types : [13:14:19.098] ..$ ... : [13:14:19.098] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:14:19.098] - attr(*, "resolved")= logi FALSE [13:14:19.098] - attr(*, "total_size")= num 141240 [13:14:19.104] Packages to be attached in all futures: [n=2] 'stats', 'future.apply' [13:14:19.105] getGlobalsAndPackagesXApply() ... DONE [13:14:19.105] Number of futures (= number of chunks): 2 [13:14:19.105] Launching 2 futures (chunks) ... [13:14:19.105] Chunk #1 of 2 ... [13:14:19.106] - Finding globals in 'X' for chunk #1 ... [13:14:19.106] getGlobalsAndPackages() ... [13:14:19.106] Searching for globals... [13:14:19.106] [13:14:19.106] Searching for globals ... DONE [13:14:19.107] - globals: [0] [13:14:19.107] getGlobalsAndPackages() ... DONE [13:14:19.107] + additional globals found: [n=0] [13:14:19.107] + additional namespaces needed: [n=0] [13:14:19.107] - Finding globals in 'X' for chunk #1 ... DONE [13:14:19.107] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:14:19.107] - seeds: [13:14:19.108] - All globals exported: [n=11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:19.108] getGlobalsAndPackages() ... [13:14:19.108] - globals passed as-is: [11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:19.108] Resolving globals: FALSE [13:14:19.108] Tweak future expression to call with '...' arguments ... [13:14:19.109] { [13:14:19.109] do.call(function(...) { [13:14:19.109] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:19.109] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:19.109] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:19.109] on.exit(options(oopts), add = TRUE) [13:14:19.109] } [13:14:19.109] { [13:14:19.109] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:19.109] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:19.109] ...future.FUN(...future.X_jj, ...) [13:14:19.109] }) [13:14:19.109] } [13:14:19.109] }, args = future.call.arguments) [13:14:19.109] } [13:14:19.109] Tweak future expression to call with '...' arguments ... DONE [13:14:19.110] - globals: [11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:19.110] - packages: [2] 'stats', 'future.apply' [13:14:19.110] getGlobalsAndPackages() ... DONE [13:14:19.110] run() for 'Future' ... [13:14:19.111] - state: 'created' [13:14:19.111] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:14:19.125] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:14:19.125] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:14:19.125] - Field: 'node' [13:14:19.125] - Field: 'label' [13:14:19.125] - Field: 'local' [13:14:19.126] - Field: 'owner' [13:14:19.126] - Field: 'envir' [13:14:19.126] - Field: 'workers' [13:14:19.126] - Field: 'packages' [13:14:19.126] - Field: 'gc' [13:14:19.126] - Field: 'conditions' [13:14:19.127] - Field: 'persistent' [13:14:19.127] - Field: 'expr' [13:14:19.127] - Field: 'uuid' [13:14:19.127] - Field: 'seed' [13:14:19.127] - Field: 'version' [13:14:19.128] - Field: 'result' [13:14:19.128] - Field: 'asynchronous' [13:14:19.128] - Field: 'calls' [13:14:19.128] - Field: 'globals' [13:14:19.128] - Field: 'stdout' [13:14:19.128] - Field: 'earlySignal' [13:14:19.129] - Field: 'lazy' [13:14:19.129] - Field: 'state' [13:14:19.129] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:14:19.129] - Launch lazy future ... [13:14:19.129] Packages needed by the future expression (n = 2): 'stats', 'future.apply' [13:14:19.130] Packages needed by future strategies (n = 0): [13:14:19.130] { [13:14:19.130] { [13:14:19.130] { [13:14:19.130] ...future.startTime <- base::Sys.time() [13:14:19.130] { [13:14:19.130] { [13:14:19.130] { [13:14:19.130] { [13:14:19.130] { [13:14:19.130] base::local({ [13:14:19.130] has_future <- base::requireNamespace("future", [13:14:19.130] quietly = TRUE) [13:14:19.130] if (has_future) { [13:14:19.130] ns <- base::getNamespace("future") [13:14:19.130] version <- ns[[".package"]][["version"]] [13:14:19.130] if (is.null(version)) [13:14:19.130] version <- utils::packageVersion("future") [13:14:19.130] } [13:14:19.130] else { [13:14:19.130] version <- NULL [13:14:19.130] } [13:14:19.130] if (!has_future || version < "1.8.0") { [13:14:19.130] info <- base::c(r_version = base::gsub("R version ", [13:14:19.130] "", base::R.version$version.string), [13:14:19.130] platform = base::sprintf("%s (%s-bit)", [13:14:19.130] base::R.version$platform, 8 * [13:14:19.130] base::.Machine$sizeof.pointer), [13:14:19.130] os = base::paste(base::Sys.info()[base::c("sysname", [13:14:19.130] "release", "version")], collapse = " "), [13:14:19.130] hostname = base::Sys.info()[["nodename"]]) [13:14:19.130] info <- base::sprintf("%s: %s", base::names(info), [13:14:19.130] info) [13:14:19.130] info <- base::paste(info, collapse = "; ") [13:14:19.130] if (!has_future) { [13:14:19.130] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:14:19.130] info) [13:14:19.130] } [13:14:19.130] else { [13:14:19.130] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:14:19.130] info, version) [13:14:19.130] } [13:14:19.130] base::stop(msg) [13:14:19.130] } [13:14:19.130] }) [13:14:19.130] } [13:14:19.130] ...future.mc.cores.old <- base::getOption("mc.cores") [13:14:19.130] base::options(mc.cores = 1L) [13:14:19.130] } [13:14:19.130] base::local({ [13:14:19.130] for (pkg in c("stats", "future.apply")) { [13:14:19.130] base::loadNamespace(pkg) [13:14:19.130] base::library(pkg, character.only = TRUE) [13:14:19.130] } [13:14:19.130] }) [13:14:19.130] } [13:14:19.130] options(future.plan = NULL) [13:14:19.130] Sys.unsetenv("R_FUTURE_PLAN") [13:14:19.130] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:14:19.130] } [13:14:19.130] ...future.workdir <- getwd() [13:14:19.130] } [13:14:19.130] ...future.oldOptions <- base::as.list(base::.Options) [13:14:19.130] ...future.oldEnvVars <- base::Sys.getenv() [13:14:19.130] } [13:14:19.130] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:14:19.130] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:14:19.130] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:14:19.130] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:14:19.130] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:14:19.130] future.stdout.windows.reencode = NULL, width = 80L) [13:14:19.130] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:14:19.130] base::names(...future.oldOptions)) [13:14:19.130] } [13:14:19.130] if (FALSE) { [13:14:19.130] } [13:14:19.130] else { [13:14:19.130] if (TRUE) { [13:14:19.130] ...future.stdout <- base::rawConnection(base::raw(0L), [13:14:19.130] open = "w") [13:14:19.130] } [13:14:19.130] else { [13:14:19.130] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:14:19.130] windows = "NUL", "/dev/null"), open = "w") [13:14:19.130] } [13:14:19.130] base::sink(...future.stdout, type = "output", split = FALSE) [13:14:19.130] base::on.exit(if (!base::is.null(...future.stdout)) { [13:14:19.130] base::sink(type = "output", split = FALSE) [13:14:19.130] base::close(...future.stdout) [13:14:19.130] }, add = TRUE) [13:14:19.130] } [13:14:19.130] ...future.frame <- base::sys.nframe() [13:14:19.130] ...future.conditions <- base::list() [13:14:19.130] ...future.rng <- base::globalenv()$.Random.seed [13:14:19.130] if (FALSE) { [13:14:19.130] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:14:19.130] "...future.value", "...future.globalenv.names", ".Random.seed") [13:14:19.130] } [13:14:19.130] ...future.result <- base::tryCatch({ [13:14:19.130] base::withCallingHandlers({ [13:14:19.130] ...future.value <- base::withVisible(base::local({ [13:14:19.130] ...future.makeSendCondition <- local({ [13:14:19.130] sendCondition <- NULL [13:14:19.130] function(frame = 1L) { [13:14:19.130] if (is.function(sendCondition)) [13:14:19.130] return(sendCondition) [13:14:19.130] ns <- getNamespace("parallel") [13:14:19.130] if (exists("sendData", mode = "function", [13:14:19.130] envir = ns)) { [13:14:19.130] parallel_sendData <- get("sendData", mode = "function", [13:14:19.130] envir = ns) [13:14:19.130] envir <- sys.frame(frame) [13:14:19.130] master <- NULL [13:14:19.130] while (!identical(envir, .GlobalEnv) && [13:14:19.130] !identical(envir, emptyenv())) { [13:14:19.130] if (exists("master", mode = "list", envir = envir, [13:14:19.130] inherits = FALSE)) { [13:14:19.130] master <- get("master", mode = "list", [13:14:19.130] envir = envir, inherits = FALSE) [13:14:19.130] if (inherits(master, c("SOCKnode", [13:14:19.130] "SOCK0node"))) { [13:14:19.130] sendCondition <<- function(cond) { [13:14:19.130] data <- list(type = "VALUE", value = cond, [13:14:19.130] success = TRUE) [13:14:19.130] parallel_sendData(master, data) [13:14:19.130] } [13:14:19.130] return(sendCondition) [13:14:19.130] } [13:14:19.130] } [13:14:19.130] frame <- frame + 1L [13:14:19.130] envir <- sys.frame(frame) [13:14:19.130] } [13:14:19.130] } [13:14:19.130] sendCondition <<- function(cond) NULL [13:14:19.130] } [13:14:19.130] }) [13:14:19.130] withCallingHandlers({ [13:14:19.130] { [13:14:19.130] do.call(function(...) { [13:14:19.130] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:19.130] if (!identical(...future.globals.maxSize.org, [13:14:19.130] ...future.globals.maxSize)) { [13:14:19.130] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:19.130] on.exit(options(oopts), add = TRUE) [13:14:19.130] } [13:14:19.130] { [13:14:19.130] lapply(seq_along(...future.elements_ii), [13:14:19.130] FUN = function(jj) { [13:14:19.130] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:19.130] ...future.FUN(...future.X_jj, ...) [13:14:19.130] }) [13:14:19.130] } [13:14:19.130] }, args = future.call.arguments) [13:14:19.130] } [13:14:19.130] }, immediateCondition = function(cond) { [13:14:19.130] sendCondition <- ...future.makeSendCondition() [13:14:19.130] sendCondition(cond) [13:14:19.130] muffleCondition <- function (cond, pattern = "^muffle") [13:14:19.130] { [13:14:19.130] inherits <- base::inherits [13:14:19.130] invokeRestart <- base::invokeRestart [13:14:19.130] is.null <- base::is.null [13:14:19.130] muffled <- FALSE [13:14:19.130] if (inherits(cond, "message")) { [13:14:19.130] muffled <- grepl(pattern, "muffleMessage") [13:14:19.130] if (muffled) [13:14:19.130] invokeRestart("muffleMessage") [13:14:19.130] } [13:14:19.130] else if (inherits(cond, "warning")) { [13:14:19.130] muffled <- grepl(pattern, "muffleWarning") [13:14:19.130] if (muffled) [13:14:19.130] invokeRestart("muffleWarning") [13:14:19.130] } [13:14:19.130] else if (inherits(cond, "condition")) { [13:14:19.130] if (!is.null(pattern)) { [13:14:19.130] computeRestarts <- base::computeRestarts [13:14:19.130] grepl <- base::grepl [13:14:19.130] restarts <- computeRestarts(cond) [13:14:19.130] for (restart in restarts) { [13:14:19.130] name <- restart$name [13:14:19.130] if (is.null(name)) [13:14:19.130] next [13:14:19.130] if (!grepl(pattern, name)) [13:14:19.130] next [13:14:19.130] invokeRestart(restart) [13:14:19.130] muffled <- TRUE [13:14:19.130] break [13:14:19.130] } [13:14:19.130] } [13:14:19.130] } [13:14:19.130] invisible(muffled) [13:14:19.130] } [13:14:19.130] muffleCondition(cond) [13:14:19.130] }) [13:14:19.130] })) [13:14:19.130] future::FutureResult(value = ...future.value$value, [13:14:19.130] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:14:19.130] ...future.rng), globalenv = if (FALSE) [13:14:19.130] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:14:19.130] ...future.globalenv.names)) [13:14:19.130] else NULL, started = ...future.startTime, version = "1.8") [13:14:19.130] }, condition = base::local({ [13:14:19.130] c <- base::c [13:14:19.130] inherits <- base::inherits [13:14:19.130] invokeRestart <- base::invokeRestart [13:14:19.130] length <- base::length [13:14:19.130] list <- base::list [13:14:19.130] seq.int <- base::seq.int [13:14:19.130] signalCondition <- base::signalCondition [13:14:19.130] sys.calls <- base::sys.calls [13:14:19.130] `[[` <- base::`[[` [13:14:19.130] `+` <- base::`+` [13:14:19.130] `<<-` <- base::`<<-` [13:14:19.130] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:14:19.130] calls[seq.int(from = from + 12L, to = length(calls) - [13:14:19.130] 3L)] [13:14:19.130] } [13:14:19.130] function(cond) { [13:14:19.130] is_error <- inherits(cond, "error") [13:14:19.130] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:14:19.130] NULL) [13:14:19.130] if (is_error) { [13:14:19.130] sessionInformation <- function() { [13:14:19.130] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:14:19.130] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:14:19.130] search = base::search(), system = base::Sys.info()) [13:14:19.130] } [13:14:19.130] ...future.conditions[[length(...future.conditions) + [13:14:19.130] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:14:19.130] cond$call), session = sessionInformation(), [13:14:19.130] timestamp = base::Sys.time(), signaled = 0L) [13:14:19.130] signalCondition(cond) [13:14:19.130] } [13:14:19.130] else if (!ignore && TRUE && inherits(cond, c("condition", [13:14:19.130] "immediateCondition"))) { [13:14:19.130] signal <- TRUE && inherits(cond, "immediateCondition") [13:14:19.130] ...future.conditions[[length(...future.conditions) + [13:14:19.130] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:14:19.130] if (TRUE && !signal) { [13:14:19.130] muffleCondition <- function (cond, pattern = "^muffle") [13:14:19.130] { [13:14:19.130] inherits <- base::inherits [13:14:19.130] invokeRestart <- base::invokeRestart [13:14:19.130] is.null <- base::is.null [13:14:19.130] muffled <- FALSE [13:14:19.130] if (inherits(cond, "message")) { [13:14:19.130] muffled <- grepl(pattern, "muffleMessage") [13:14:19.130] if (muffled) [13:14:19.130] invokeRestart("muffleMessage") [13:14:19.130] } [13:14:19.130] else if (inherits(cond, "warning")) { [13:14:19.130] muffled <- grepl(pattern, "muffleWarning") [13:14:19.130] if (muffled) [13:14:19.130] invokeRestart("muffleWarning") [13:14:19.130] } [13:14:19.130] else if (inherits(cond, "condition")) { [13:14:19.130] if (!is.null(pattern)) { [13:14:19.130] computeRestarts <- base::computeRestarts [13:14:19.130] grepl <- base::grepl [13:14:19.130] restarts <- computeRestarts(cond) [13:14:19.130] for (restart in restarts) { [13:14:19.130] name <- restart$name [13:14:19.130] if (is.null(name)) [13:14:19.130] next [13:14:19.130] if (!grepl(pattern, name)) [13:14:19.130] next [13:14:19.130] invokeRestart(restart) [13:14:19.130] muffled <- TRUE [13:14:19.130] break [13:14:19.130] } [13:14:19.130] } [13:14:19.130] } [13:14:19.130] invisible(muffled) [13:14:19.130] } [13:14:19.130] muffleCondition(cond, pattern = "^muffle") [13:14:19.130] } [13:14:19.130] } [13:14:19.130] else { [13:14:19.130] if (TRUE) { [13:14:19.130] muffleCondition <- function (cond, pattern = "^muffle") [13:14:19.130] { [13:14:19.130] inherits <- base::inherits [13:14:19.130] invokeRestart <- base::invokeRestart [13:14:19.130] is.null <- base::is.null [13:14:19.130] muffled <- FALSE [13:14:19.130] if (inherits(cond, "message")) { [13:14:19.130] muffled <- grepl(pattern, "muffleMessage") [13:14:19.130] if (muffled) [13:14:19.130] invokeRestart("muffleMessage") [13:14:19.130] } [13:14:19.130] else if (inherits(cond, "warning")) { [13:14:19.130] muffled <- grepl(pattern, "muffleWarning") [13:14:19.130] if (muffled) [13:14:19.130] invokeRestart("muffleWarning") [13:14:19.130] } [13:14:19.130] else if (inherits(cond, "condition")) { [13:14:19.130] if (!is.null(pattern)) { [13:14:19.130] computeRestarts <- base::computeRestarts [13:14:19.130] grepl <- base::grepl [13:14:19.130] restarts <- computeRestarts(cond) [13:14:19.130] for (restart in restarts) { [13:14:19.130] name <- restart$name [13:14:19.130] if (is.null(name)) [13:14:19.130] next [13:14:19.130] if (!grepl(pattern, name)) [13:14:19.130] next [13:14:19.130] invokeRestart(restart) [13:14:19.130] muffled <- TRUE [13:14:19.130] break [13:14:19.130] } [13:14:19.130] } [13:14:19.130] } [13:14:19.130] invisible(muffled) [13:14:19.130] } [13:14:19.130] muffleCondition(cond, pattern = "^muffle") [13:14:19.130] } [13:14:19.130] } [13:14:19.130] } [13:14:19.130] })) [13:14:19.130] }, error = function(ex) { [13:14:19.130] base::structure(base::list(value = NULL, visible = NULL, [13:14:19.130] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:14:19.130] ...future.rng), started = ...future.startTime, [13:14:19.130] finished = Sys.time(), session_uuid = NA_character_, [13:14:19.130] version = "1.8"), class = "FutureResult") [13:14:19.130] }, finally = { [13:14:19.130] if (!identical(...future.workdir, getwd())) [13:14:19.130] setwd(...future.workdir) [13:14:19.130] { [13:14:19.130] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:14:19.130] ...future.oldOptions$nwarnings <- NULL [13:14:19.130] } [13:14:19.130] base::options(...future.oldOptions) [13:14:19.130] if (.Platform$OS.type == "windows") { [13:14:19.130] old_names <- names(...future.oldEnvVars) [13:14:19.130] envs <- base::Sys.getenv() [13:14:19.130] names <- names(envs) [13:14:19.130] common <- intersect(names, old_names) [13:14:19.130] added <- setdiff(names, old_names) [13:14:19.130] removed <- setdiff(old_names, names) [13:14:19.130] changed <- common[...future.oldEnvVars[common] != [13:14:19.130] envs[common]] [13:14:19.130] NAMES <- toupper(changed) [13:14:19.130] args <- list() [13:14:19.130] for (kk in seq_along(NAMES)) { [13:14:19.130] name <- changed[[kk]] [13:14:19.130] NAME <- NAMES[[kk]] [13:14:19.130] if (name != NAME && is.element(NAME, old_names)) [13:14:19.130] next [13:14:19.130] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:19.130] } [13:14:19.130] NAMES <- toupper(added) [13:14:19.130] for (kk in seq_along(NAMES)) { [13:14:19.130] name <- added[[kk]] [13:14:19.130] NAME <- NAMES[[kk]] [13:14:19.130] if (name != NAME && is.element(NAME, old_names)) [13:14:19.130] next [13:14:19.130] args[[name]] <- "" [13:14:19.130] } [13:14:19.130] NAMES <- toupper(removed) [13:14:19.130] for (kk in seq_along(NAMES)) { [13:14:19.130] name <- removed[[kk]] [13:14:19.130] NAME <- NAMES[[kk]] [13:14:19.130] if (name != NAME && is.element(NAME, old_names)) [13:14:19.130] next [13:14:19.130] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:19.130] } [13:14:19.130] if (length(args) > 0) [13:14:19.130] base::do.call(base::Sys.setenv, args = args) [13:14:19.130] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:14:19.130] } [13:14:19.130] else { [13:14:19.130] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:14:19.130] } [13:14:19.130] { [13:14:19.130] if (base::length(...future.futureOptionsAdded) > [13:14:19.130] 0L) { [13:14:19.130] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:14:19.130] base::names(opts) <- ...future.futureOptionsAdded [13:14:19.130] base::options(opts) [13:14:19.130] } [13:14:19.130] { [13:14:19.130] { [13:14:19.130] base::options(mc.cores = ...future.mc.cores.old) [13:14:19.130] NULL [13:14:19.130] } [13:14:19.130] options(future.plan = NULL) [13:14:19.130] if (is.na(NA_character_)) [13:14:19.130] Sys.unsetenv("R_FUTURE_PLAN") [13:14:19.130] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:14:19.130] future::plan(list(function (..., workers = availableCores(), [13:14:19.130] lazy = FALSE, rscript_libs = .libPaths(), [13:14:19.130] envir = parent.frame()) [13:14:19.130] { [13:14:19.130] if (is.function(workers)) [13:14:19.130] workers <- workers() [13:14:19.130] workers <- structure(as.integer(workers), [13:14:19.130] class = class(workers)) [13:14:19.130] stop_if_not(length(workers) == 1, is.finite(workers), [13:14:19.130] workers >= 1) [13:14:19.130] if (workers == 1L && !inherits(workers, "AsIs")) { [13:14:19.130] return(sequential(..., lazy = TRUE, envir = envir)) [13:14:19.130] } [13:14:19.130] future <- MultisessionFuture(..., workers = workers, [13:14:19.130] lazy = lazy, rscript_libs = rscript_libs, [13:14:19.130] envir = envir) [13:14:19.130] if (!future$lazy) [13:14:19.130] future <- run(future) [13:14:19.130] invisible(future) [13:14:19.130] }), .cleanup = FALSE, .init = FALSE) [13:14:19.130] } [13:14:19.130] } [13:14:19.130] } [13:14:19.130] }) [13:14:19.130] if (TRUE) { [13:14:19.130] base::sink(type = "output", split = FALSE) [13:14:19.130] if (TRUE) { [13:14:19.130] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:14:19.130] } [13:14:19.130] else { [13:14:19.130] ...future.result["stdout"] <- base::list(NULL) [13:14:19.130] } [13:14:19.130] base::close(...future.stdout) [13:14:19.130] ...future.stdout <- NULL [13:14:19.130] } [13:14:19.130] ...future.result$conditions <- ...future.conditions [13:14:19.130] ...future.result$finished <- base::Sys.time() [13:14:19.130] ...future.result [13:14:19.130] } [13:14:19.136] Exporting 11 global objects (137.93 KiB) to cluster node #1 ... [13:14:19.136] Exporting '...future.FUN' (21.22 KiB) to cluster node #1 ... [13:14:19.137] Exporting '...future.FUN' (21.22 KiB) to cluster node #1 ... DONE [13:14:19.137] Exporting 'x_FUN' (45.86 KiB) to cluster node #1 ... [13:14:19.137] Exporting 'x_FUN' (45.86 KiB) to cluster node #1 ... DONE [13:14:19.138] Exporting 'times' (56 bytes) to cluster node #1 ... [13:14:19.138] Exporting 'times' (56 bytes) to cluster node #1 ... DONE [13:14:19.138] Exporting 'stopf' (26.43 KiB) to cluster node #1 ... [13:14:19.139] Exporting 'stopf' (26.43 KiB) to cluster node #1 ... DONE [13:14:19.139] Exporting 'stop_if_not' (44.12 KiB) to cluster node #1 ... [13:14:19.139] Exporting 'stop_if_not' (44.12 KiB) to cluster node #1 ... DONE [13:14:19.139] Exporting 'dim' (0 bytes) to cluster node #1 ... [13:14:19.140] Exporting 'dim' (0 bytes) to cluster node #1 ... DONE [13:14:19.140] Exporting 'valid_types' (248 bytes) to cluster node #1 ... [13:14:19.140] Exporting 'valid_types' (248 bytes) to cluster node #1 ... DONE [13:14:19.141] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... [13:14:19.141] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... DONE [13:14:19.141] Exporting '...future.elements_ii' (288 bytes) to cluster node #1 ... [13:14:19.142] Exporting '...future.elements_ii' (288 bytes) to cluster node #1 ... DONE [13:14:19.142] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:14:19.142] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:14:19.142] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:14:19.143] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:14:19.143] Exporting 11 global objects (137.93 KiB) to cluster node #1 ... DONE [13:14:19.144] MultisessionFuture started [13:14:19.144] - Launch lazy future ... done [13:14:19.144] run() for 'MultisessionFuture' ... done [13:14:19.144] Created future: [13:14:19.164] receiveMessageFromWorker() for ClusterFuture ... [13:14:19.164] - Validating connection of MultisessionFuture [13:14:19.165] - received message: FutureResult [13:14:19.165] - Received FutureResult [13:14:19.165] - Erased future from FutureRegistry [13:14:19.165] result() for ClusterFuture ... [13:14:19.165] - result already collected: FutureResult [13:14:19.165] result() for ClusterFuture ... done [13:14:19.166] receiveMessageFromWorker() for ClusterFuture ... done [13:14:19.144] MultisessionFuture: [13:14:19.144] Label: 'future_vapply-1' [13:14:19.144] Expression: [13:14:19.144] { [13:14:19.144] do.call(function(...) { [13:14:19.144] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:19.144] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:19.144] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:19.144] on.exit(options(oopts), add = TRUE) [13:14:19.144] } [13:14:19.144] { [13:14:19.144] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:19.144] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:19.144] ...future.FUN(...future.X_jj, ...) [13:14:19.144] }) [13:14:19.144] } [13:14:19.144] }, args = future.call.arguments) [13:14:19.144] } [13:14:19.144] Lazy evaluation: FALSE [13:14:19.144] Asynchronous evaluation: TRUE [13:14:19.144] Local evaluation: TRUE [13:14:19.144] Environment: R_GlobalEnv [13:14:19.144] Capture standard output: TRUE [13:14:19.144] Capture condition classes: 'condition' (excluding 'nothing') [13:14:19.144] Globals: 11 objects totaling 138.21 KiB (function '...future.FUN' of 21.22 KiB, function 'x_FUN' of 45.86 KiB, integer 'times' of 56 bytes, function 'stopf' of 26.43 KiB, function 'stop_if_not' of 44.12 KiB, ...) [13:14:19.144] Packages: 2 packages ('stats', 'future.apply') [13:14:19.144] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:14:19.144] Resolved: TRUE [13:14:19.144] Value: [13:14:19.144] Conditions captured: [13:14:19.144] Early signaling: FALSE [13:14:19.144] Owner process: 1bb7d580-628d-c90d-e38a-66de485868c4 [13:14:19.144] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:14:19.166] Chunk #1 of 2 ... DONE [13:14:19.166] Chunk #2 of 2 ... [13:14:19.166] - Finding globals in 'X' for chunk #2 ... [13:14:19.167] getGlobalsAndPackages() ... [13:14:19.167] Searching for globals... [13:14:19.167] [13:14:19.167] Searching for globals ... DONE [13:14:19.167] - globals: [0] [13:14:19.167] getGlobalsAndPackages() ... DONE [13:14:19.168] + additional globals found: [n=0] [13:14:19.168] + additional namespaces needed: [n=0] [13:14:19.168] - Finding globals in 'X' for chunk #2 ... DONE [13:14:19.168] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:14:19.168] - seeds: [13:14:19.168] - All globals exported: [n=11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:19.169] getGlobalsAndPackages() ... [13:14:19.169] - globals passed as-is: [11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:19.169] Resolving globals: FALSE [13:14:19.169] Tweak future expression to call with '...' arguments ... [13:14:19.169] { [13:14:19.169] do.call(function(...) { [13:14:19.169] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:19.169] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:19.169] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:19.169] on.exit(options(oopts), add = TRUE) [13:14:19.169] } [13:14:19.169] { [13:14:19.169] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:19.169] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:19.169] ...future.FUN(...future.X_jj, ...) [13:14:19.169] }) [13:14:19.169] } [13:14:19.169] }, args = future.call.arguments) [13:14:19.169] } [13:14:19.170] Tweak future expression to call with '...' arguments ... DONE [13:14:19.170] - globals: [11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:19.170] - packages: [2] 'stats', 'future.apply' [13:14:19.171] getGlobalsAndPackages() ... DONE [13:14:19.171] run() for 'Future' ... [13:14:19.171] - state: 'created' [13:14:19.171] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:14:19.184] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:14:19.185] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:14:19.185] - Field: 'node' [13:14:19.185] - Field: 'label' [13:14:19.185] - Field: 'local' [13:14:19.185] - Field: 'owner' [13:14:19.186] - Field: 'envir' [13:14:19.186] - Field: 'workers' [13:14:19.186] - Field: 'packages' [13:14:19.186] - Field: 'gc' [13:14:19.186] - Field: 'conditions' [13:14:19.186] - Field: 'persistent' [13:14:19.187] - Field: 'expr' [13:14:19.187] - Field: 'uuid' [13:14:19.187] - Field: 'seed' [13:14:19.187] - Field: 'version' [13:14:19.187] - Field: 'result' [13:14:19.187] - Field: 'asynchronous' [13:14:19.188] - Field: 'calls' [13:14:19.188] - Field: 'globals' [13:14:19.188] - Field: 'stdout' [13:14:19.188] - Field: 'earlySignal' [13:14:19.188] - Field: 'lazy' [13:14:19.188] - Field: 'state' [13:14:19.189] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:14:19.189] - Launch lazy future ... [13:14:19.189] Packages needed by the future expression (n = 2): 'stats', 'future.apply' [13:14:19.189] Packages needed by future strategies (n = 0): [13:14:19.190] { [13:14:19.190] { [13:14:19.190] { [13:14:19.190] ...future.startTime <- base::Sys.time() [13:14:19.190] { [13:14:19.190] { [13:14:19.190] { [13:14:19.190] { [13:14:19.190] { [13:14:19.190] base::local({ [13:14:19.190] has_future <- base::requireNamespace("future", [13:14:19.190] quietly = TRUE) [13:14:19.190] if (has_future) { [13:14:19.190] ns <- base::getNamespace("future") [13:14:19.190] version <- ns[[".package"]][["version"]] [13:14:19.190] if (is.null(version)) [13:14:19.190] version <- utils::packageVersion("future") [13:14:19.190] } [13:14:19.190] else { [13:14:19.190] version <- NULL [13:14:19.190] } [13:14:19.190] if (!has_future || version < "1.8.0") { [13:14:19.190] info <- base::c(r_version = base::gsub("R version ", [13:14:19.190] "", base::R.version$version.string), [13:14:19.190] platform = base::sprintf("%s (%s-bit)", [13:14:19.190] base::R.version$platform, 8 * [13:14:19.190] base::.Machine$sizeof.pointer), [13:14:19.190] os = base::paste(base::Sys.info()[base::c("sysname", [13:14:19.190] "release", "version")], collapse = " "), [13:14:19.190] hostname = base::Sys.info()[["nodename"]]) [13:14:19.190] info <- base::sprintf("%s: %s", base::names(info), [13:14:19.190] info) [13:14:19.190] info <- base::paste(info, collapse = "; ") [13:14:19.190] if (!has_future) { [13:14:19.190] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:14:19.190] info) [13:14:19.190] } [13:14:19.190] else { [13:14:19.190] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:14:19.190] info, version) [13:14:19.190] } [13:14:19.190] base::stop(msg) [13:14:19.190] } [13:14:19.190] }) [13:14:19.190] } [13:14:19.190] ...future.mc.cores.old <- base::getOption("mc.cores") [13:14:19.190] base::options(mc.cores = 1L) [13:14:19.190] } [13:14:19.190] base::local({ [13:14:19.190] for (pkg in c("stats", "future.apply")) { [13:14:19.190] base::loadNamespace(pkg) [13:14:19.190] base::library(pkg, character.only = TRUE) [13:14:19.190] } [13:14:19.190] }) [13:14:19.190] } [13:14:19.190] options(future.plan = NULL) [13:14:19.190] Sys.unsetenv("R_FUTURE_PLAN") [13:14:19.190] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:14:19.190] } [13:14:19.190] ...future.workdir <- getwd() [13:14:19.190] } [13:14:19.190] ...future.oldOptions <- base::as.list(base::.Options) [13:14:19.190] ...future.oldEnvVars <- base::Sys.getenv() [13:14:19.190] } [13:14:19.190] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:14:19.190] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:14:19.190] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:14:19.190] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:14:19.190] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:14:19.190] future.stdout.windows.reencode = NULL, width = 80L) [13:14:19.190] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:14:19.190] base::names(...future.oldOptions)) [13:14:19.190] } [13:14:19.190] if (FALSE) { [13:14:19.190] } [13:14:19.190] else { [13:14:19.190] if (TRUE) { [13:14:19.190] ...future.stdout <- base::rawConnection(base::raw(0L), [13:14:19.190] open = "w") [13:14:19.190] } [13:14:19.190] else { [13:14:19.190] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:14:19.190] windows = "NUL", "/dev/null"), open = "w") [13:14:19.190] } [13:14:19.190] base::sink(...future.stdout, type = "output", split = FALSE) [13:14:19.190] base::on.exit(if (!base::is.null(...future.stdout)) { [13:14:19.190] base::sink(type = "output", split = FALSE) [13:14:19.190] base::close(...future.stdout) [13:14:19.190] }, add = TRUE) [13:14:19.190] } [13:14:19.190] ...future.frame <- base::sys.nframe() [13:14:19.190] ...future.conditions <- base::list() [13:14:19.190] ...future.rng <- base::globalenv()$.Random.seed [13:14:19.190] if (FALSE) { [13:14:19.190] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:14:19.190] "...future.value", "...future.globalenv.names", ".Random.seed") [13:14:19.190] } [13:14:19.190] ...future.result <- base::tryCatch({ [13:14:19.190] base::withCallingHandlers({ [13:14:19.190] ...future.value <- base::withVisible(base::local({ [13:14:19.190] ...future.makeSendCondition <- local({ [13:14:19.190] sendCondition <- NULL [13:14:19.190] function(frame = 1L) { [13:14:19.190] if (is.function(sendCondition)) [13:14:19.190] return(sendCondition) [13:14:19.190] ns <- getNamespace("parallel") [13:14:19.190] if (exists("sendData", mode = "function", [13:14:19.190] envir = ns)) { [13:14:19.190] parallel_sendData <- get("sendData", mode = "function", [13:14:19.190] envir = ns) [13:14:19.190] envir <- sys.frame(frame) [13:14:19.190] master <- NULL [13:14:19.190] while (!identical(envir, .GlobalEnv) && [13:14:19.190] !identical(envir, emptyenv())) { [13:14:19.190] if (exists("master", mode = "list", envir = envir, [13:14:19.190] inherits = FALSE)) { [13:14:19.190] master <- get("master", mode = "list", [13:14:19.190] envir = envir, inherits = FALSE) [13:14:19.190] if (inherits(master, c("SOCKnode", [13:14:19.190] "SOCK0node"))) { [13:14:19.190] sendCondition <<- function(cond) { [13:14:19.190] data <- list(type = "VALUE", value = cond, [13:14:19.190] success = TRUE) [13:14:19.190] parallel_sendData(master, data) [13:14:19.190] } [13:14:19.190] return(sendCondition) [13:14:19.190] } [13:14:19.190] } [13:14:19.190] frame <- frame + 1L [13:14:19.190] envir <- sys.frame(frame) [13:14:19.190] } [13:14:19.190] } [13:14:19.190] sendCondition <<- function(cond) NULL [13:14:19.190] } [13:14:19.190] }) [13:14:19.190] withCallingHandlers({ [13:14:19.190] { [13:14:19.190] do.call(function(...) { [13:14:19.190] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:19.190] if (!identical(...future.globals.maxSize.org, [13:14:19.190] ...future.globals.maxSize)) { [13:14:19.190] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:19.190] on.exit(options(oopts), add = TRUE) [13:14:19.190] } [13:14:19.190] { [13:14:19.190] lapply(seq_along(...future.elements_ii), [13:14:19.190] FUN = function(jj) { [13:14:19.190] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:19.190] ...future.FUN(...future.X_jj, ...) [13:14:19.190] }) [13:14:19.190] } [13:14:19.190] }, args = future.call.arguments) [13:14:19.190] } [13:14:19.190] }, immediateCondition = function(cond) { [13:14:19.190] sendCondition <- ...future.makeSendCondition() [13:14:19.190] sendCondition(cond) [13:14:19.190] muffleCondition <- function (cond, pattern = "^muffle") [13:14:19.190] { [13:14:19.190] inherits <- base::inherits [13:14:19.190] invokeRestart <- base::invokeRestart [13:14:19.190] is.null <- base::is.null [13:14:19.190] muffled <- FALSE [13:14:19.190] if (inherits(cond, "message")) { [13:14:19.190] muffled <- grepl(pattern, "muffleMessage") [13:14:19.190] if (muffled) [13:14:19.190] invokeRestart("muffleMessage") [13:14:19.190] } [13:14:19.190] else if (inherits(cond, "warning")) { [13:14:19.190] muffled <- grepl(pattern, "muffleWarning") [13:14:19.190] if (muffled) [13:14:19.190] invokeRestart("muffleWarning") [13:14:19.190] } [13:14:19.190] else if (inherits(cond, "condition")) { [13:14:19.190] if (!is.null(pattern)) { [13:14:19.190] computeRestarts <- base::computeRestarts [13:14:19.190] grepl <- base::grepl [13:14:19.190] restarts <- computeRestarts(cond) [13:14:19.190] for (restart in restarts) { [13:14:19.190] name <- restart$name [13:14:19.190] if (is.null(name)) [13:14:19.190] next [13:14:19.190] if (!grepl(pattern, name)) [13:14:19.190] next [13:14:19.190] invokeRestart(restart) [13:14:19.190] muffled <- TRUE [13:14:19.190] break [13:14:19.190] } [13:14:19.190] } [13:14:19.190] } [13:14:19.190] invisible(muffled) [13:14:19.190] } [13:14:19.190] muffleCondition(cond) [13:14:19.190] }) [13:14:19.190] })) [13:14:19.190] future::FutureResult(value = ...future.value$value, [13:14:19.190] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:14:19.190] ...future.rng), globalenv = if (FALSE) [13:14:19.190] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:14:19.190] ...future.globalenv.names)) [13:14:19.190] else NULL, started = ...future.startTime, version = "1.8") [13:14:19.190] }, condition = base::local({ [13:14:19.190] c <- base::c [13:14:19.190] inherits <- base::inherits [13:14:19.190] invokeRestart <- base::invokeRestart [13:14:19.190] length <- base::length [13:14:19.190] list <- base::list [13:14:19.190] seq.int <- base::seq.int [13:14:19.190] signalCondition <- base::signalCondition [13:14:19.190] sys.calls <- base::sys.calls [13:14:19.190] `[[` <- base::`[[` [13:14:19.190] `+` <- base::`+` [13:14:19.190] `<<-` <- base::`<<-` [13:14:19.190] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:14:19.190] calls[seq.int(from = from + 12L, to = length(calls) - [13:14:19.190] 3L)] [13:14:19.190] } [13:14:19.190] function(cond) { [13:14:19.190] is_error <- inherits(cond, "error") [13:14:19.190] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:14:19.190] NULL) [13:14:19.190] if (is_error) { [13:14:19.190] sessionInformation <- function() { [13:14:19.190] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:14:19.190] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:14:19.190] search = base::search(), system = base::Sys.info()) [13:14:19.190] } [13:14:19.190] ...future.conditions[[length(...future.conditions) + [13:14:19.190] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:14:19.190] cond$call), session = sessionInformation(), [13:14:19.190] timestamp = base::Sys.time(), signaled = 0L) [13:14:19.190] signalCondition(cond) [13:14:19.190] } [13:14:19.190] else if (!ignore && TRUE && inherits(cond, c("condition", [13:14:19.190] "immediateCondition"))) { [13:14:19.190] signal <- TRUE && inherits(cond, "immediateCondition") [13:14:19.190] ...future.conditions[[length(...future.conditions) + [13:14:19.190] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:14:19.190] if (TRUE && !signal) { [13:14:19.190] muffleCondition <- function (cond, pattern = "^muffle") [13:14:19.190] { [13:14:19.190] inherits <- base::inherits [13:14:19.190] invokeRestart <- base::invokeRestart [13:14:19.190] is.null <- base::is.null [13:14:19.190] muffled <- FALSE [13:14:19.190] if (inherits(cond, "message")) { [13:14:19.190] muffled <- grepl(pattern, "muffleMessage") [13:14:19.190] if (muffled) [13:14:19.190] invokeRestart("muffleMessage") [13:14:19.190] } [13:14:19.190] else if (inherits(cond, "warning")) { [13:14:19.190] muffled <- grepl(pattern, "muffleWarning") [13:14:19.190] if (muffled) [13:14:19.190] invokeRestart("muffleWarning") [13:14:19.190] } [13:14:19.190] else if (inherits(cond, "condition")) { [13:14:19.190] if (!is.null(pattern)) { [13:14:19.190] computeRestarts <- base::computeRestarts [13:14:19.190] grepl <- base::grepl [13:14:19.190] restarts <- computeRestarts(cond) [13:14:19.190] for (restart in restarts) { [13:14:19.190] name <- restart$name [13:14:19.190] if (is.null(name)) [13:14:19.190] next [13:14:19.190] if (!grepl(pattern, name)) [13:14:19.190] next [13:14:19.190] invokeRestart(restart) [13:14:19.190] muffled <- TRUE [13:14:19.190] break [13:14:19.190] } [13:14:19.190] } [13:14:19.190] } [13:14:19.190] invisible(muffled) [13:14:19.190] } [13:14:19.190] muffleCondition(cond, pattern = "^muffle") [13:14:19.190] } [13:14:19.190] } [13:14:19.190] else { [13:14:19.190] if (TRUE) { [13:14:19.190] muffleCondition <- function (cond, pattern = "^muffle") [13:14:19.190] { [13:14:19.190] inherits <- base::inherits [13:14:19.190] invokeRestart <- base::invokeRestart [13:14:19.190] is.null <- base::is.null [13:14:19.190] muffled <- FALSE [13:14:19.190] if (inherits(cond, "message")) { [13:14:19.190] muffled <- grepl(pattern, "muffleMessage") [13:14:19.190] if (muffled) [13:14:19.190] invokeRestart("muffleMessage") [13:14:19.190] } [13:14:19.190] else if (inherits(cond, "warning")) { [13:14:19.190] muffled <- grepl(pattern, "muffleWarning") [13:14:19.190] if (muffled) [13:14:19.190] invokeRestart("muffleWarning") [13:14:19.190] } [13:14:19.190] else if (inherits(cond, "condition")) { [13:14:19.190] if (!is.null(pattern)) { [13:14:19.190] computeRestarts <- base::computeRestarts [13:14:19.190] grepl <- base::grepl [13:14:19.190] restarts <- computeRestarts(cond) [13:14:19.190] for (restart in restarts) { [13:14:19.190] name <- restart$name [13:14:19.190] if (is.null(name)) [13:14:19.190] next [13:14:19.190] if (!grepl(pattern, name)) [13:14:19.190] next [13:14:19.190] invokeRestart(restart) [13:14:19.190] muffled <- TRUE [13:14:19.190] break [13:14:19.190] } [13:14:19.190] } [13:14:19.190] } [13:14:19.190] invisible(muffled) [13:14:19.190] } [13:14:19.190] muffleCondition(cond, pattern = "^muffle") [13:14:19.190] } [13:14:19.190] } [13:14:19.190] } [13:14:19.190] })) [13:14:19.190] }, error = function(ex) { [13:14:19.190] base::structure(base::list(value = NULL, visible = NULL, [13:14:19.190] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:14:19.190] ...future.rng), started = ...future.startTime, [13:14:19.190] finished = Sys.time(), session_uuid = NA_character_, [13:14:19.190] version = "1.8"), class = "FutureResult") [13:14:19.190] }, finally = { [13:14:19.190] if (!identical(...future.workdir, getwd())) [13:14:19.190] setwd(...future.workdir) [13:14:19.190] { [13:14:19.190] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:14:19.190] ...future.oldOptions$nwarnings <- NULL [13:14:19.190] } [13:14:19.190] base::options(...future.oldOptions) [13:14:19.190] if (.Platform$OS.type == "windows") { [13:14:19.190] old_names <- names(...future.oldEnvVars) [13:14:19.190] envs <- base::Sys.getenv() [13:14:19.190] names <- names(envs) [13:14:19.190] common <- intersect(names, old_names) [13:14:19.190] added <- setdiff(names, old_names) [13:14:19.190] removed <- setdiff(old_names, names) [13:14:19.190] changed <- common[...future.oldEnvVars[common] != [13:14:19.190] envs[common]] [13:14:19.190] NAMES <- toupper(changed) [13:14:19.190] args <- list() [13:14:19.190] for (kk in seq_along(NAMES)) { [13:14:19.190] name <- changed[[kk]] [13:14:19.190] NAME <- NAMES[[kk]] [13:14:19.190] if (name != NAME && is.element(NAME, old_names)) [13:14:19.190] next [13:14:19.190] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:19.190] } [13:14:19.190] NAMES <- toupper(added) [13:14:19.190] for (kk in seq_along(NAMES)) { [13:14:19.190] name <- added[[kk]] [13:14:19.190] NAME <- NAMES[[kk]] [13:14:19.190] if (name != NAME && is.element(NAME, old_names)) [13:14:19.190] next [13:14:19.190] args[[name]] <- "" [13:14:19.190] } [13:14:19.190] NAMES <- toupper(removed) [13:14:19.190] for (kk in seq_along(NAMES)) { [13:14:19.190] name <- removed[[kk]] [13:14:19.190] NAME <- NAMES[[kk]] [13:14:19.190] if (name != NAME && is.element(NAME, old_names)) [13:14:19.190] next [13:14:19.190] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:19.190] } [13:14:19.190] if (length(args) > 0) [13:14:19.190] base::do.call(base::Sys.setenv, args = args) [13:14:19.190] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:14:19.190] } [13:14:19.190] else { [13:14:19.190] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:14:19.190] } [13:14:19.190] { [13:14:19.190] if (base::length(...future.futureOptionsAdded) > [13:14:19.190] 0L) { [13:14:19.190] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:14:19.190] base::names(opts) <- ...future.futureOptionsAdded [13:14:19.190] base::options(opts) [13:14:19.190] } [13:14:19.190] { [13:14:19.190] { [13:14:19.190] base::options(mc.cores = ...future.mc.cores.old) [13:14:19.190] NULL [13:14:19.190] } [13:14:19.190] options(future.plan = NULL) [13:14:19.190] if (is.na(NA_character_)) [13:14:19.190] Sys.unsetenv("R_FUTURE_PLAN") [13:14:19.190] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:14:19.190] future::plan(list(function (..., workers = availableCores(), [13:14:19.190] lazy = FALSE, rscript_libs = .libPaths(), [13:14:19.190] envir = parent.frame()) [13:14:19.190] { [13:14:19.190] if (is.function(workers)) [13:14:19.190] workers <- workers() [13:14:19.190] workers <- structure(as.integer(workers), [13:14:19.190] class = class(workers)) [13:14:19.190] stop_if_not(length(workers) == 1, is.finite(workers), [13:14:19.190] workers >= 1) [13:14:19.190] if (workers == 1L && !inherits(workers, "AsIs")) { [13:14:19.190] return(sequential(..., lazy = TRUE, envir = envir)) [13:14:19.190] } [13:14:19.190] future <- MultisessionFuture(..., workers = workers, [13:14:19.190] lazy = lazy, rscript_libs = rscript_libs, [13:14:19.190] envir = envir) [13:14:19.190] if (!future$lazy) [13:14:19.190] future <- run(future) [13:14:19.190] invisible(future) [13:14:19.190] }), .cleanup = FALSE, .init = FALSE) [13:14:19.190] } [13:14:19.190] } [13:14:19.190] } [13:14:19.190] }) [13:14:19.190] if (TRUE) { [13:14:19.190] base::sink(type = "output", split = FALSE) [13:14:19.190] if (TRUE) { [13:14:19.190] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:14:19.190] } [13:14:19.190] else { [13:14:19.190] ...future.result["stdout"] <- base::list(NULL) [13:14:19.190] } [13:14:19.190] base::close(...future.stdout) [13:14:19.190] ...future.stdout <- NULL [13:14:19.190] } [13:14:19.190] ...future.result$conditions <- ...future.conditions [13:14:19.190] ...future.result$finished <- base::Sys.time() [13:14:19.190] ...future.result [13:14:19.190] } [13:14:19.195] Exporting 11 global objects (137.93 KiB) to cluster node #1 ... [13:14:19.195] Exporting '...future.FUN' (21.22 KiB) to cluster node #1 ... [13:14:19.196] Exporting '...future.FUN' (21.22 KiB) to cluster node #1 ... DONE [13:14:19.196] Exporting 'x_FUN' (45.86 KiB) to cluster node #1 ... [13:14:19.196] Exporting 'x_FUN' (45.86 KiB) to cluster node #1 ... DONE [13:14:19.197] Exporting 'times' (56 bytes) to cluster node #1 ... [13:14:19.197] Exporting 'times' (56 bytes) to cluster node #1 ... DONE [13:14:19.197] Exporting 'stopf' (26.43 KiB) to cluster node #1 ... [13:14:19.197] Exporting 'stopf' (26.43 KiB) to cluster node #1 ... DONE [13:14:19.198] Exporting 'stop_if_not' (44.12 KiB) to cluster node #1 ... [13:14:19.198] Exporting 'stop_if_not' (44.12 KiB) to cluster node #1 ... DONE [13:14:19.198] Exporting 'dim' (0 bytes) to cluster node #1 ... [13:14:19.199] Exporting 'dim' (0 bytes) to cluster node #1 ... DONE [13:14:19.199] Exporting 'valid_types' (248 bytes) to cluster node #1 ... [13:14:19.199] Exporting 'valid_types' (248 bytes) to cluster node #1 ... DONE [13:14:19.199] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... [13:14:19.200] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... DONE [13:14:19.200] Exporting '...future.elements_ii' (256 bytes) to cluster node #1 ... [13:14:19.200] Exporting '...future.elements_ii' (256 bytes) to cluster node #1 ... DONE [13:14:19.200] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:14:19.201] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:14:19.201] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:14:19.201] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:14:19.202] Exporting 11 global objects (137.93 KiB) to cluster node #1 ... DONE [13:14:19.202] MultisessionFuture started [13:14:19.202] - Launch lazy future ... done [13:14:19.202] run() for 'MultisessionFuture' ... done [13:14:19.203] Created future: [13:14:19.246] receiveMessageFromWorker() for ClusterFuture ... [13:14:19.246] - Validating connection of MultisessionFuture [13:14:19.246] - received message: FutureResult [13:14:19.247] - Received FutureResult [13:14:19.247] - Erased future from FutureRegistry [13:14:19.247] result() for ClusterFuture ... [13:14:19.247] - result already collected: FutureResult [13:14:19.247] result() for ClusterFuture ... done [13:14:19.247] receiveMessageFromWorker() for ClusterFuture ... done [13:14:19.203] MultisessionFuture: [13:14:19.203] Label: 'future_vapply-2' [13:14:19.203] Expression: [13:14:19.203] { [13:14:19.203] do.call(function(...) { [13:14:19.203] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:19.203] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:19.203] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:19.203] on.exit(options(oopts), add = TRUE) [13:14:19.203] } [13:14:19.203] { [13:14:19.203] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:19.203] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:19.203] ...future.FUN(...future.X_jj, ...) [13:14:19.203] }) [13:14:19.203] } [13:14:19.203] }, args = future.call.arguments) [13:14:19.203] } [13:14:19.203] Lazy evaluation: FALSE [13:14:19.203] Asynchronous evaluation: TRUE [13:14:19.203] Local evaluation: TRUE [13:14:19.203] Environment: R_GlobalEnv [13:14:19.203] Capture standard output: TRUE [13:14:19.203] Capture condition classes: 'condition' (excluding 'nothing') [13:14:19.203] Globals: 11 objects totaling 138.18 KiB (function '...future.FUN' of 21.22 KiB, function 'x_FUN' of 45.86 KiB, integer 'times' of 56 bytes, function 'stopf' of 26.43 KiB, function 'stop_if_not' of 44.12 KiB, ...) [13:14:19.203] Packages: 2 packages ('stats', 'future.apply') [13:14:19.203] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:14:19.203] Resolved: TRUE [13:14:19.203] Value: [13:14:19.203] Conditions captured: [13:14:19.203] Early signaling: FALSE [13:14:19.203] Owner process: 1bb7d580-628d-c90d-e38a-66de485868c4 [13:14:19.203] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:14:19.248] Chunk #2 of 2 ... DONE [13:14:19.248] Launching 2 futures (chunks) ... DONE [13:14:19.248] Resolving 2 futures (chunks) ... [13:14:19.248] resolve() on list ... [13:14:19.248] recursive: 0 [13:14:19.249] length: 2 [13:14:19.249] [13:14:19.249] Future #1 [13:14:19.249] result() for ClusterFuture ... [13:14:19.249] - result already collected: FutureResult [13:14:19.249] result() for ClusterFuture ... done [13:14:19.250] result() for ClusterFuture ... [13:14:19.250] - result already collected: FutureResult [13:14:19.250] result() for ClusterFuture ... done [13:14:19.250] signalConditionsASAP(MultisessionFuture, pos=1) ... [13:14:19.250] - nx: 2 [13:14:19.250] - relay: TRUE [13:14:19.250] - stdout: TRUE [13:14:19.250] - signal: TRUE [13:14:19.251] - resignal: FALSE [13:14:19.251] - force: TRUE [13:14:19.251] - relayed: [n=2] FALSE, FALSE [13:14:19.253] - queued futures: [n=2] FALSE, FALSE [13:14:19.254] - until=1 [13:14:19.254] - relaying element #1 [13:14:19.254] result() for ClusterFuture ... [13:14:19.254] - result already collected: FutureResult [13:14:19.254] result() for ClusterFuture ... done [13:14:19.254] result() for ClusterFuture ... [13:14:19.254] - result already collected: FutureResult [13:14:19.255] result() for ClusterFuture ... done [13:14:19.255] result() for ClusterFuture ... [13:14:19.255] - result already collected: FutureResult [13:14:19.255] result() for ClusterFuture ... done [13:14:19.255] result() for ClusterFuture ... [13:14:19.255] - result already collected: FutureResult [13:14:19.255] result() for ClusterFuture ... done [13:14:19.256] - relayed: [n=2] TRUE, FALSE [13:14:19.256] - queued futures: [n=2] TRUE, FALSE [13:14:19.256] signalConditionsASAP(MultisessionFuture, pos=1) ... done [13:14:19.256] length: 1 (resolved future 1) [13:14:19.256] Future #2 [13:14:19.256] result() for ClusterFuture ... [13:14:19.256] - result already collected: FutureResult [13:14:19.257] result() for ClusterFuture ... done [13:14:19.257] result() for ClusterFuture ... [13:14:19.257] - result already collected: FutureResult [13:14:19.257] result() for ClusterFuture ... done [13:14:19.257] signalConditionsASAP(MultisessionFuture, pos=2) ... [13:14:19.257] - nx: 2 [13:14:19.257] - relay: TRUE [13:14:19.257] - stdout: TRUE [13:14:19.258] - signal: TRUE [13:14:19.258] - resignal: FALSE [13:14:19.258] - force: TRUE [13:14:19.258] - relayed: [n=2] TRUE, FALSE [13:14:19.258] - queued futures: [n=2] TRUE, FALSE [13:14:19.258] - until=2 [13:14:19.258] - relaying element #2 [13:14:19.259] result() for ClusterFuture ... [13:14:19.259] - result already collected: FutureResult [13:14:19.259] result() for ClusterFuture ... done [13:14:19.259] result() for ClusterFuture ... [13:14:19.259] - result already collected: FutureResult [13:14:19.259] result() for ClusterFuture ... done [13:14:19.259] result() for ClusterFuture ... [13:14:19.260] - result already collected: FutureResult [13:14:19.260] result() for ClusterFuture ... done [13:14:19.260] result() for ClusterFuture ... [13:14:19.260] - result already collected: FutureResult [13:14:19.260] result() for ClusterFuture ... done [13:14:19.260] - relayed: [n=2] TRUE, TRUE [13:14:19.260] - queued futures: [n=2] TRUE, TRUE [13:14:19.260] signalConditionsASAP(MultisessionFuture, pos=2) ... done [13:14:19.261] length: 0 (resolved future 2) [13:14:19.261] Relaying remaining futures [13:14:19.261] signalConditionsASAP(NULL, pos=0) ... [13:14:19.261] - nx: 2 [13:14:19.261] - relay: TRUE [13:14:19.261] - stdout: TRUE [13:14:19.261] - signal: TRUE [13:14:19.262] - resignal: FALSE [13:14:19.262] - force: TRUE [13:14:19.262] - relayed: [n=2] TRUE, TRUE [13:14:19.262] - queued futures: [n=2] TRUE, TRUE - flush all [13:14:19.262] - relayed: [n=2] TRUE, TRUE [13:14:19.262] - queued futures: [n=2] TRUE, TRUE [13:14:19.262] signalConditionsASAP(NULL, pos=0) ... done [13:14:19.263] resolve() on list ... DONE [13:14:19.263] result() for ClusterFuture ... [13:14:19.263] - result already collected: FutureResult [13:14:19.263] result() for ClusterFuture ... done [13:14:19.263] result() for ClusterFuture ... [13:14:19.263] - result already collected: FutureResult [13:14:19.263] result() for ClusterFuture ... done [13:14:19.263] result() for ClusterFuture ... [13:14:19.264] - result already collected: FutureResult [13:14:19.264] result() for ClusterFuture ... done [13:14:19.264] result() for ClusterFuture ... [13:14:19.264] - result already collected: FutureResult [13:14:19.264] result() for ClusterFuture ... done [13:14:19.264] - Number of value chunks collected: 2 [13:14:19.264] Resolving 2 futures (chunks) ... DONE [13:14:19.265] Reducing values from 2 chunks ... [13:14:19.265] - Number of values collected after concatenation: 7 [13:14:19.265] - Number of values expected: 7 [13:14:19.265] Reducing values from 2 chunks ... DONE [13:14:19.265] future_lapply() ... DONE num [1:5, 1:7] 1 1.5 2 2.5 3 1 1.5 2.5 3.5 4 ... - attr(*, "dimnames")=List of 2 ..$ : chr [1:5] "Min." "1st Qu." "Median" "3rd Qu." ... ..$ : NULL [13:14:19.267] future_lapply() ... [13:14:19.270] Number of chunks: 2 [13:14:19.270] getGlobalsAndPackagesXApply() ... [13:14:19.270] - future.globals: TRUE [13:14:19.270] getGlobalsAndPackages() ... [13:14:19.270] Searching for globals... [13:14:19.272] - globals found: [3] 'FUN', 'outer', 'rep' [13:14:19.272] Searching for globals ... DONE [13:14:19.272] Resolving globals: FALSE [13:14:19.272] The total size of the 1 globals is 4.07 KiB (4168 bytes) [13:14:19.273] The total size of the 1 globals exported for future expression ('FUN(y = c(2, 4, 6, 8, 10))') is 4.07 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (4.07 KiB of class 'function') [13:14:19.273] - globals: [1] 'FUN' [13:14:19.273] [13:14:19.273] getGlobalsAndPackages() ... DONE [13:14:19.273] - globals found/used: [n=1] 'FUN' [13:14:19.274] - needed namespaces: [n=0] [13:14:19.274] Finding globals ... DONE [13:14:19.274] - use_args: TRUE [13:14:19.274] - Getting '...' globals ... [13:14:19.274] resolve() on list ... [13:14:19.274] recursive: 0 [13:14:19.275] length: 1 [13:14:19.275] elements: '...' [13:14:19.275] length: 0 (resolved future 1) [13:14:19.275] resolve() on list ... DONE [13:14:19.275] - '...' content: [n=1] 'y' [13:14:19.275] List of 1 [13:14:19.275] $ ...:List of 1 [13:14:19.275] ..$ y: num [1:5] 2 4 6 8 10 [13:14:19.275] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:14:19.275] - attr(*, "where")=List of 1 [13:14:19.275] ..$ ...: [13:14:19.275] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:14:19.275] - attr(*, "resolved")= logi TRUE [13:14:19.275] - attr(*, "total_size")= num NA [13:14:19.278] - Getting '...' globals ... DONE [13:14:19.279] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:14:19.279] List of 2 [13:14:19.279] $ ...future.FUN:function (x, y) [13:14:19.279] $ ... :List of 1 [13:14:19.279] ..$ y: num [1:5] 2 4 6 8 10 [13:14:19.279] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:14:19.279] - attr(*, "where")=List of 2 [13:14:19.279] ..$ ...future.FUN: [13:14:19.279] ..$ ... : [13:14:19.279] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:14:19.279] - attr(*, "resolved")= logi FALSE [13:14:19.279] - attr(*, "total_size")= num 4264 [13:14:19.282] Packages to be attached in all futures: [n=0] [13:14:19.282] getGlobalsAndPackagesXApply() ... DONE [13:14:19.283] Number of futures (= number of chunks): 2 [13:14:19.283] Launching 2 futures (chunks) ... [13:14:19.283] Chunk #1 of 2 ... [13:14:19.283] - Finding globals in 'X' for chunk #1 ... [13:14:19.283] getGlobalsAndPackages() ... [13:14:19.283] Searching for globals... [13:14:19.284] [13:14:19.284] Searching for globals ... DONE [13:14:19.284] - globals: [0] [13:14:19.284] getGlobalsAndPackages() ... DONE [13:14:19.284] + additional globals found: [n=0] [13:14:19.284] + additional namespaces needed: [n=0] [13:14:19.285] - Finding globals in 'X' for chunk #1 ... DONE [13:14:19.285] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:14:19.285] - seeds: [13:14:19.285] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:19.285] getGlobalsAndPackages() ... [13:14:19.285] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:19.285] Resolving globals: FALSE [13:14:19.286] Tweak future expression to call with '...' arguments ... [13:14:19.286] { [13:14:19.286] do.call(function(...) { [13:14:19.286] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:19.286] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:19.286] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:19.286] on.exit(options(oopts), add = TRUE) [13:14:19.286] } [13:14:19.286] { [13:14:19.286] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:19.286] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:19.286] ...future.FUN(...future.X_jj, ...) [13:14:19.286] }) [13:14:19.286] } [13:14:19.286] }, args = future.call.arguments) [13:14:19.286] } [13:14:19.286] Tweak future expression to call with '...' arguments ... DONE [13:14:19.287] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:19.287] [13:14:19.287] getGlobalsAndPackages() ... DONE [13:14:19.287] run() for 'Future' ... [13:14:19.287] - state: 'created' [13:14:19.288] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:14:19.299] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:14:19.300] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:14:19.300] - Field: 'node' [13:14:19.300] - Field: 'label' [13:14:19.300] - Field: 'local' [13:14:19.300] - Field: 'owner' [13:14:19.301] - Field: 'envir' [13:14:19.301] - Field: 'workers' [13:14:19.301] - Field: 'packages' [13:14:19.301] - Field: 'gc' [13:14:19.301] - Field: 'conditions' [13:14:19.301] - Field: 'persistent' [13:14:19.301] - Field: 'expr' [13:14:19.302] - Field: 'uuid' [13:14:19.302] - Field: 'seed' [13:14:19.302] - Field: 'version' [13:14:19.302] - Field: 'result' [13:14:19.302] - Field: 'asynchronous' [13:14:19.302] - Field: 'calls' [13:14:19.302] - Field: 'globals' [13:14:19.303] - Field: 'stdout' [13:14:19.303] - Field: 'earlySignal' [13:14:19.303] - Field: 'lazy' [13:14:19.303] - Field: 'state' [13:14:19.303] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:14:19.303] - Launch lazy future ... [13:14:19.304] Packages needed by the future expression (n = 0): [13:14:19.304] Packages needed by future strategies (n = 0): [13:14:19.304] { [13:14:19.304] { [13:14:19.304] { [13:14:19.304] ...future.startTime <- base::Sys.time() [13:14:19.304] { [13:14:19.304] { [13:14:19.304] { [13:14:19.304] { [13:14:19.304] base::local({ [13:14:19.304] has_future <- base::requireNamespace("future", [13:14:19.304] quietly = TRUE) [13:14:19.304] if (has_future) { [13:14:19.304] ns <- base::getNamespace("future") [13:14:19.304] version <- ns[[".package"]][["version"]] [13:14:19.304] if (is.null(version)) [13:14:19.304] version <- utils::packageVersion("future") [13:14:19.304] } [13:14:19.304] else { [13:14:19.304] version <- NULL [13:14:19.304] } [13:14:19.304] if (!has_future || version < "1.8.0") { [13:14:19.304] info <- base::c(r_version = base::gsub("R version ", [13:14:19.304] "", base::R.version$version.string), [13:14:19.304] platform = base::sprintf("%s (%s-bit)", [13:14:19.304] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:14:19.304] os = base::paste(base::Sys.info()[base::c("sysname", [13:14:19.304] "release", "version")], collapse = " "), [13:14:19.304] hostname = base::Sys.info()[["nodename"]]) [13:14:19.304] info <- base::sprintf("%s: %s", base::names(info), [13:14:19.304] info) [13:14:19.304] info <- base::paste(info, collapse = "; ") [13:14:19.304] if (!has_future) { [13:14:19.304] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:14:19.304] info) [13:14:19.304] } [13:14:19.304] else { [13:14:19.304] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:14:19.304] info, version) [13:14:19.304] } [13:14:19.304] base::stop(msg) [13:14:19.304] } [13:14:19.304] }) [13:14:19.304] } [13:14:19.304] ...future.mc.cores.old <- base::getOption("mc.cores") [13:14:19.304] base::options(mc.cores = 1L) [13:14:19.304] } [13:14:19.304] options(future.plan = NULL) [13:14:19.304] Sys.unsetenv("R_FUTURE_PLAN") [13:14:19.304] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:14:19.304] } [13:14:19.304] ...future.workdir <- getwd() [13:14:19.304] } [13:14:19.304] ...future.oldOptions <- base::as.list(base::.Options) [13:14:19.304] ...future.oldEnvVars <- base::Sys.getenv() [13:14:19.304] } [13:14:19.304] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:14:19.304] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:14:19.304] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:14:19.304] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:14:19.304] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:14:19.304] future.stdout.windows.reencode = NULL, width = 80L) [13:14:19.304] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:14:19.304] base::names(...future.oldOptions)) [13:14:19.304] } [13:14:19.304] if (FALSE) { [13:14:19.304] } [13:14:19.304] else { [13:14:19.304] if (TRUE) { [13:14:19.304] ...future.stdout <- base::rawConnection(base::raw(0L), [13:14:19.304] open = "w") [13:14:19.304] } [13:14:19.304] else { [13:14:19.304] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:14:19.304] windows = "NUL", "/dev/null"), open = "w") [13:14:19.304] } [13:14:19.304] base::sink(...future.stdout, type = "output", split = FALSE) [13:14:19.304] base::on.exit(if (!base::is.null(...future.stdout)) { [13:14:19.304] base::sink(type = "output", split = FALSE) [13:14:19.304] base::close(...future.stdout) [13:14:19.304] }, add = TRUE) [13:14:19.304] } [13:14:19.304] ...future.frame <- base::sys.nframe() [13:14:19.304] ...future.conditions <- base::list() [13:14:19.304] ...future.rng <- base::globalenv()$.Random.seed [13:14:19.304] if (FALSE) { [13:14:19.304] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:14:19.304] "...future.value", "...future.globalenv.names", ".Random.seed") [13:14:19.304] } [13:14:19.304] ...future.result <- base::tryCatch({ [13:14:19.304] base::withCallingHandlers({ [13:14:19.304] ...future.value <- base::withVisible(base::local({ [13:14:19.304] ...future.makeSendCondition <- local({ [13:14:19.304] sendCondition <- NULL [13:14:19.304] function(frame = 1L) { [13:14:19.304] if (is.function(sendCondition)) [13:14:19.304] return(sendCondition) [13:14:19.304] ns <- getNamespace("parallel") [13:14:19.304] if (exists("sendData", mode = "function", [13:14:19.304] envir = ns)) { [13:14:19.304] parallel_sendData <- get("sendData", mode = "function", [13:14:19.304] envir = ns) [13:14:19.304] envir <- sys.frame(frame) [13:14:19.304] master <- NULL [13:14:19.304] while (!identical(envir, .GlobalEnv) && [13:14:19.304] !identical(envir, emptyenv())) { [13:14:19.304] if (exists("master", mode = "list", envir = envir, [13:14:19.304] inherits = FALSE)) { [13:14:19.304] master <- get("master", mode = "list", [13:14:19.304] envir = envir, inherits = FALSE) [13:14:19.304] if (inherits(master, c("SOCKnode", [13:14:19.304] "SOCK0node"))) { [13:14:19.304] sendCondition <<- function(cond) { [13:14:19.304] data <- list(type = "VALUE", value = cond, [13:14:19.304] success = TRUE) [13:14:19.304] parallel_sendData(master, data) [13:14:19.304] } [13:14:19.304] return(sendCondition) [13:14:19.304] } [13:14:19.304] } [13:14:19.304] frame <- frame + 1L [13:14:19.304] envir <- sys.frame(frame) [13:14:19.304] } [13:14:19.304] } [13:14:19.304] sendCondition <<- function(cond) NULL [13:14:19.304] } [13:14:19.304] }) [13:14:19.304] withCallingHandlers({ [13:14:19.304] { [13:14:19.304] do.call(function(...) { [13:14:19.304] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:19.304] if (!identical(...future.globals.maxSize.org, [13:14:19.304] ...future.globals.maxSize)) { [13:14:19.304] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:19.304] on.exit(options(oopts), add = TRUE) [13:14:19.304] } [13:14:19.304] { [13:14:19.304] lapply(seq_along(...future.elements_ii), [13:14:19.304] FUN = function(jj) { [13:14:19.304] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:19.304] ...future.FUN(...future.X_jj, ...) [13:14:19.304] }) [13:14:19.304] } [13:14:19.304] }, args = future.call.arguments) [13:14:19.304] } [13:14:19.304] }, immediateCondition = function(cond) { [13:14:19.304] sendCondition <- ...future.makeSendCondition() [13:14:19.304] sendCondition(cond) [13:14:19.304] muffleCondition <- function (cond, pattern = "^muffle") [13:14:19.304] { [13:14:19.304] inherits <- base::inherits [13:14:19.304] invokeRestart <- base::invokeRestart [13:14:19.304] is.null <- base::is.null [13:14:19.304] muffled <- FALSE [13:14:19.304] if (inherits(cond, "message")) { [13:14:19.304] muffled <- grepl(pattern, "muffleMessage") [13:14:19.304] if (muffled) [13:14:19.304] invokeRestart("muffleMessage") [13:14:19.304] } [13:14:19.304] else if (inherits(cond, "warning")) { [13:14:19.304] muffled <- grepl(pattern, "muffleWarning") [13:14:19.304] if (muffled) [13:14:19.304] invokeRestart("muffleWarning") [13:14:19.304] } [13:14:19.304] else if (inherits(cond, "condition")) { [13:14:19.304] if (!is.null(pattern)) { [13:14:19.304] computeRestarts <- base::computeRestarts [13:14:19.304] grepl <- base::grepl [13:14:19.304] restarts <- computeRestarts(cond) [13:14:19.304] for (restart in restarts) { [13:14:19.304] name <- restart$name [13:14:19.304] if (is.null(name)) [13:14:19.304] next [13:14:19.304] if (!grepl(pattern, name)) [13:14:19.304] next [13:14:19.304] invokeRestart(restart) [13:14:19.304] muffled <- TRUE [13:14:19.304] break [13:14:19.304] } [13:14:19.304] } [13:14:19.304] } [13:14:19.304] invisible(muffled) [13:14:19.304] } [13:14:19.304] muffleCondition(cond) [13:14:19.304] }) [13:14:19.304] })) [13:14:19.304] future::FutureResult(value = ...future.value$value, [13:14:19.304] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:14:19.304] ...future.rng), globalenv = if (FALSE) [13:14:19.304] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:14:19.304] ...future.globalenv.names)) [13:14:19.304] else NULL, started = ...future.startTime, version = "1.8") [13:14:19.304] }, condition = base::local({ [13:14:19.304] c <- base::c [13:14:19.304] inherits <- base::inherits [13:14:19.304] invokeRestart <- base::invokeRestart [13:14:19.304] length <- base::length [13:14:19.304] list <- base::list [13:14:19.304] seq.int <- base::seq.int [13:14:19.304] signalCondition <- base::signalCondition [13:14:19.304] sys.calls <- base::sys.calls [13:14:19.304] `[[` <- base::`[[` [13:14:19.304] `+` <- base::`+` [13:14:19.304] `<<-` <- base::`<<-` [13:14:19.304] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:14:19.304] calls[seq.int(from = from + 12L, to = length(calls) - [13:14:19.304] 3L)] [13:14:19.304] } [13:14:19.304] function(cond) { [13:14:19.304] is_error <- inherits(cond, "error") [13:14:19.304] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:14:19.304] NULL) [13:14:19.304] if (is_error) { [13:14:19.304] sessionInformation <- function() { [13:14:19.304] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:14:19.304] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:14:19.304] search = base::search(), system = base::Sys.info()) [13:14:19.304] } [13:14:19.304] ...future.conditions[[length(...future.conditions) + [13:14:19.304] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:14:19.304] cond$call), session = sessionInformation(), [13:14:19.304] timestamp = base::Sys.time(), signaled = 0L) [13:14:19.304] signalCondition(cond) [13:14:19.304] } [13:14:19.304] else if (!ignore && TRUE && inherits(cond, c("condition", [13:14:19.304] "immediateCondition"))) { [13:14:19.304] signal <- TRUE && inherits(cond, "immediateCondition") [13:14:19.304] ...future.conditions[[length(...future.conditions) + [13:14:19.304] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:14:19.304] if (TRUE && !signal) { [13:14:19.304] muffleCondition <- function (cond, pattern = "^muffle") [13:14:19.304] { [13:14:19.304] inherits <- base::inherits [13:14:19.304] invokeRestart <- base::invokeRestart [13:14:19.304] is.null <- base::is.null [13:14:19.304] muffled <- FALSE [13:14:19.304] if (inherits(cond, "message")) { [13:14:19.304] muffled <- grepl(pattern, "muffleMessage") [13:14:19.304] if (muffled) [13:14:19.304] invokeRestart("muffleMessage") [13:14:19.304] } [13:14:19.304] else if (inherits(cond, "warning")) { [13:14:19.304] muffled <- grepl(pattern, "muffleWarning") [13:14:19.304] if (muffled) [13:14:19.304] invokeRestart("muffleWarning") [13:14:19.304] } [13:14:19.304] else if (inherits(cond, "condition")) { [13:14:19.304] if (!is.null(pattern)) { [13:14:19.304] computeRestarts <- base::computeRestarts [13:14:19.304] grepl <- base::grepl [13:14:19.304] restarts <- computeRestarts(cond) [13:14:19.304] for (restart in restarts) { [13:14:19.304] name <- restart$name [13:14:19.304] if (is.null(name)) [13:14:19.304] next [13:14:19.304] if (!grepl(pattern, name)) [13:14:19.304] next [13:14:19.304] invokeRestart(restart) [13:14:19.304] muffled <- TRUE [13:14:19.304] break [13:14:19.304] } [13:14:19.304] } [13:14:19.304] } [13:14:19.304] invisible(muffled) [13:14:19.304] } [13:14:19.304] muffleCondition(cond, pattern = "^muffle") [13:14:19.304] } [13:14:19.304] } [13:14:19.304] else { [13:14:19.304] if (TRUE) { [13:14:19.304] muffleCondition <- function (cond, pattern = "^muffle") [13:14:19.304] { [13:14:19.304] inherits <- base::inherits [13:14:19.304] invokeRestart <- base::invokeRestart [13:14:19.304] is.null <- base::is.null [13:14:19.304] muffled <- FALSE [13:14:19.304] if (inherits(cond, "message")) { [13:14:19.304] muffled <- grepl(pattern, "muffleMessage") [13:14:19.304] if (muffled) [13:14:19.304] invokeRestart("muffleMessage") [13:14:19.304] } [13:14:19.304] else if (inherits(cond, "warning")) { [13:14:19.304] muffled <- grepl(pattern, "muffleWarning") [13:14:19.304] if (muffled) [13:14:19.304] invokeRestart("muffleWarning") [13:14:19.304] } [13:14:19.304] else if (inherits(cond, "condition")) { [13:14:19.304] if (!is.null(pattern)) { [13:14:19.304] computeRestarts <- base::computeRestarts [13:14:19.304] grepl <- base::grepl [13:14:19.304] restarts <- computeRestarts(cond) [13:14:19.304] for (restart in restarts) { [13:14:19.304] name <- restart$name [13:14:19.304] if (is.null(name)) [13:14:19.304] next [13:14:19.304] if (!grepl(pattern, name)) [13:14:19.304] next [13:14:19.304] invokeRestart(restart) [13:14:19.304] muffled <- TRUE [13:14:19.304] break [13:14:19.304] } [13:14:19.304] } [13:14:19.304] } [13:14:19.304] invisible(muffled) [13:14:19.304] } [13:14:19.304] muffleCondition(cond, pattern = "^muffle") [13:14:19.304] } [13:14:19.304] } [13:14:19.304] } [13:14:19.304] })) [13:14:19.304] }, error = function(ex) { [13:14:19.304] base::structure(base::list(value = NULL, visible = NULL, [13:14:19.304] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:14:19.304] ...future.rng), started = ...future.startTime, [13:14:19.304] finished = Sys.time(), session_uuid = NA_character_, [13:14:19.304] version = "1.8"), class = "FutureResult") [13:14:19.304] }, finally = { [13:14:19.304] if (!identical(...future.workdir, getwd())) [13:14:19.304] setwd(...future.workdir) [13:14:19.304] { [13:14:19.304] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:14:19.304] ...future.oldOptions$nwarnings <- NULL [13:14:19.304] } [13:14:19.304] base::options(...future.oldOptions) [13:14:19.304] if (.Platform$OS.type == "windows") { [13:14:19.304] old_names <- names(...future.oldEnvVars) [13:14:19.304] envs <- base::Sys.getenv() [13:14:19.304] names <- names(envs) [13:14:19.304] common <- intersect(names, old_names) [13:14:19.304] added <- setdiff(names, old_names) [13:14:19.304] removed <- setdiff(old_names, names) [13:14:19.304] changed <- common[...future.oldEnvVars[common] != [13:14:19.304] envs[common]] [13:14:19.304] NAMES <- toupper(changed) [13:14:19.304] args <- list() [13:14:19.304] for (kk in seq_along(NAMES)) { [13:14:19.304] name <- changed[[kk]] [13:14:19.304] NAME <- NAMES[[kk]] [13:14:19.304] if (name != NAME && is.element(NAME, old_names)) [13:14:19.304] next [13:14:19.304] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:19.304] } [13:14:19.304] NAMES <- toupper(added) [13:14:19.304] for (kk in seq_along(NAMES)) { [13:14:19.304] name <- added[[kk]] [13:14:19.304] NAME <- NAMES[[kk]] [13:14:19.304] if (name != NAME && is.element(NAME, old_names)) [13:14:19.304] next [13:14:19.304] args[[name]] <- "" [13:14:19.304] } [13:14:19.304] NAMES <- toupper(removed) [13:14:19.304] for (kk in seq_along(NAMES)) { [13:14:19.304] name <- removed[[kk]] [13:14:19.304] NAME <- NAMES[[kk]] [13:14:19.304] if (name != NAME && is.element(NAME, old_names)) [13:14:19.304] next [13:14:19.304] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:19.304] } [13:14:19.304] if (length(args) > 0) [13:14:19.304] base::do.call(base::Sys.setenv, args = args) [13:14:19.304] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:14:19.304] } [13:14:19.304] else { [13:14:19.304] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:14:19.304] } [13:14:19.304] { [13:14:19.304] if (base::length(...future.futureOptionsAdded) > [13:14:19.304] 0L) { [13:14:19.304] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:14:19.304] base::names(opts) <- ...future.futureOptionsAdded [13:14:19.304] base::options(opts) [13:14:19.304] } [13:14:19.304] { [13:14:19.304] { [13:14:19.304] base::options(mc.cores = ...future.mc.cores.old) [13:14:19.304] NULL [13:14:19.304] } [13:14:19.304] options(future.plan = NULL) [13:14:19.304] if (is.na(NA_character_)) [13:14:19.304] Sys.unsetenv("R_FUTURE_PLAN") [13:14:19.304] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:14:19.304] future::plan(list(function (..., workers = availableCores(), [13:14:19.304] lazy = FALSE, rscript_libs = .libPaths(), [13:14:19.304] envir = parent.frame()) [13:14:19.304] { [13:14:19.304] if (is.function(workers)) [13:14:19.304] workers <- workers() [13:14:19.304] workers <- structure(as.integer(workers), [13:14:19.304] class = class(workers)) [13:14:19.304] stop_if_not(length(workers) == 1, is.finite(workers), [13:14:19.304] workers >= 1) [13:14:19.304] if (workers == 1L && !inherits(workers, "AsIs")) { [13:14:19.304] return(sequential(..., lazy = TRUE, envir = envir)) [13:14:19.304] } [13:14:19.304] future <- MultisessionFuture(..., workers = workers, [13:14:19.304] lazy = lazy, rscript_libs = rscript_libs, [13:14:19.304] envir = envir) [13:14:19.304] if (!future$lazy) [13:14:19.304] future <- run(future) [13:14:19.304] invisible(future) [13:14:19.304] }), .cleanup = FALSE, .init = FALSE) [13:14:19.304] } [13:14:19.304] } [13:14:19.304] } [13:14:19.304] }) [13:14:19.304] if (TRUE) { [13:14:19.304] base::sink(type = "output", split = FALSE) [13:14:19.304] if (TRUE) { [13:14:19.304] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:14:19.304] } [13:14:19.304] else { [13:14:19.304] ...future.result["stdout"] <- base::list(NULL) [13:14:19.304] } [13:14:19.304] base::close(...future.stdout) [13:14:19.304] ...future.stdout <- NULL [13:14:19.304] } [13:14:19.304] ...future.result$conditions <- ...future.conditions [13:14:19.304] ...future.result$finished <- base::Sys.time() [13:14:19.304] ...future.result [13:14:19.304] } [13:14:19.309] Exporting 5 global objects (4.16 KiB) to cluster node #1 ... [13:14:19.309] Exporting '...future.FUN' (4.07 KiB) to cluster node #1 ... [13:14:19.309] Exporting '...future.FUN' (4.07 KiB) to cluster node #1 ... DONE [13:14:19.310] Exporting 'future.call.arguments' (96 bytes) to cluster node #1 ... [13:14:19.310] Exporting 'future.call.arguments' (96 bytes) to cluster node #1 ... DONE [13:14:19.310] Exporting '...future.elements_ii' (112 bytes) to cluster node #1 ... [13:14:19.310] Exporting '...future.elements_ii' (112 bytes) to cluster node #1 ... DONE [13:14:19.311] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:14:19.311] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:14:19.311] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:14:19.311] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:14:19.312] Exporting 5 global objects (4.16 KiB) to cluster node #1 ... DONE [13:14:19.312] MultisessionFuture started [13:14:19.312] - Launch lazy future ... done [13:14:19.312] run() for 'MultisessionFuture' ... done [13:14:19.312] Created future: [13:14:19.331] receiveMessageFromWorker() for ClusterFuture ... [13:14:19.331] - Validating connection of MultisessionFuture [13:14:19.332] - received message: FutureResult [13:14:19.332] - Received FutureResult [13:14:19.332] - Erased future from FutureRegistry [13:14:19.332] result() for ClusterFuture ... [13:14:19.332] - result already collected: FutureResult [13:14:19.332] result() for ClusterFuture ... done [13:14:19.333] receiveMessageFromWorker() for ClusterFuture ... done [13:14:19.313] MultisessionFuture: [13:14:19.313] Label: 'future_sapply-1' [13:14:19.313] Expression: [13:14:19.313] { [13:14:19.313] do.call(function(...) { [13:14:19.313] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:19.313] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:19.313] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:19.313] on.exit(options(oopts), add = TRUE) [13:14:19.313] } [13:14:19.313] { [13:14:19.313] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:19.313] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:19.313] ...future.FUN(...future.X_jj, ...) [13:14:19.313] }) [13:14:19.313] } [13:14:19.313] }, args = future.call.arguments) [13:14:19.313] } [13:14:19.313] Lazy evaluation: FALSE [13:14:19.313] Asynchronous evaluation: TRUE [13:14:19.313] Local evaluation: TRUE [13:14:19.313] Environment: R_GlobalEnv [13:14:19.313] Capture standard output: TRUE [13:14:19.313] Capture condition classes: 'condition' (excluding 'nothing') [13:14:19.313] Globals: 5 objects totaling 4.27 KiB (function '...future.FUN' of 4.07 KiB, DotDotDotList 'future.call.arguments' of 96 bytes, list '...future.elements_ii' of 112 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:14:19.313] Packages: [13:14:19.313] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:14:19.313] Resolved: TRUE [13:14:19.313] Value: [13:14:19.313] Conditions captured: [13:14:19.313] Early signaling: FALSE [13:14:19.313] Owner process: 1bb7d580-628d-c90d-e38a-66de485868c4 [13:14:19.313] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:14:19.333] Chunk #1 of 2 ... DONE [13:14:19.333] Chunk #2 of 2 ... [13:14:19.333] - Finding globals in 'X' for chunk #2 ... [13:14:19.333] getGlobalsAndPackages() ... [13:14:19.334] Searching for globals... [13:14:19.334] [13:14:19.334] Searching for globals ... DONE [13:14:19.334] - globals: [0] [13:14:19.334] getGlobalsAndPackages() ... DONE [13:14:19.334] + additional globals found: [n=0] [13:14:19.335] + additional namespaces needed: [n=0] [13:14:19.335] - Finding globals in 'X' for chunk #2 ... DONE [13:14:19.335] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:14:19.335] - seeds: [13:14:19.335] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:19.335] getGlobalsAndPackages() ... [13:14:19.335] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:19.336] Resolving globals: FALSE [13:14:19.336] Tweak future expression to call with '...' arguments ... [13:14:19.336] { [13:14:19.336] do.call(function(...) { [13:14:19.336] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:19.336] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:19.336] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:19.336] on.exit(options(oopts), add = TRUE) [13:14:19.336] } [13:14:19.336] { [13:14:19.336] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:19.336] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:19.336] ...future.FUN(...future.X_jj, ...) [13:14:19.336] }) [13:14:19.336] } [13:14:19.336] }, args = future.call.arguments) [13:14:19.336] } [13:14:19.336] Tweak future expression to call with '...' arguments ... DONE [13:14:19.337] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:19.337] [13:14:19.337] getGlobalsAndPackages() ... DONE [13:14:19.337] run() for 'Future' ... [13:14:19.337] - state: 'created' [13:14:19.338] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:14:19.349] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:14:19.349] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:14:19.349] - Field: 'node' [13:14:19.350] - Field: 'label' [13:14:19.350] - Field: 'local' [13:14:19.350] - Field: 'owner' [13:14:19.350] - Field: 'envir' [13:14:19.350] - Field: 'workers' [13:14:19.350] - Field: 'packages' [13:14:19.350] - Field: 'gc' [13:14:19.351] - Field: 'conditions' [13:14:19.351] - Field: 'persistent' [13:14:19.351] - Field: 'expr' [13:14:19.351] - Field: 'uuid' [13:14:19.351] - Field: 'seed' [13:14:19.351] - Field: 'version' [13:14:19.351] - Field: 'result' [13:14:19.352] - Field: 'asynchronous' [13:14:19.352] - Field: 'calls' [13:14:19.352] - Field: 'globals' [13:14:19.352] - Field: 'stdout' [13:14:19.352] - Field: 'earlySignal' [13:14:19.352] - Field: 'lazy' [13:14:19.352] - Field: 'state' [13:14:19.353] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:14:19.353] - Launch lazy future ... [13:14:19.353] Packages needed by the future expression (n = 0): [13:14:19.353] Packages needed by future strategies (n = 0): [13:14:19.354] { [13:14:19.354] { [13:14:19.354] { [13:14:19.354] ...future.startTime <- base::Sys.time() [13:14:19.354] { [13:14:19.354] { [13:14:19.354] { [13:14:19.354] { [13:14:19.354] base::local({ [13:14:19.354] has_future <- base::requireNamespace("future", [13:14:19.354] quietly = TRUE) [13:14:19.354] if (has_future) { [13:14:19.354] ns <- base::getNamespace("future") [13:14:19.354] version <- ns[[".package"]][["version"]] [13:14:19.354] if (is.null(version)) [13:14:19.354] version <- utils::packageVersion("future") [13:14:19.354] } [13:14:19.354] else { [13:14:19.354] version <- NULL [13:14:19.354] } [13:14:19.354] if (!has_future || version < "1.8.0") { [13:14:19.354] info <- base::c(r_version = base::gsub("R version ", [13:14:19.354] "", base::R.version$version.string), [13:14:19.354] platform = base::sprintf("%s (%s-bit)", [13:14:19.354] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:14:19.354] os = base::paste(base::Sys.info()[base::c("sysname", [13:14:19.354] "release", "version")], collapse = " "), [13:14:19.354] hostname = base::Sys.info()[["nodename"]]) [13:14:19.354] info <- base::sprintf("%s: %s", base::names(info), [13:14:19.354] info) [13:14:19.354] info <- base::paste(info, collapse = "; ") [13:14:19.354] if (!has_future) { [13:14:19.354] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:14:19.354] info) [13:14:19.354] } [13:14:19.354] else { [13:14:19.354] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:14:19.354] info, version) [13:14:19.354] } [13:14:19.354] base::stop(msg) [13:14:19.354] } [13:14:19.354] }) [13:14:19.354] } [13:14:19.354] ...future.mc.cores.old <- base::getOption("mc.cores") [13:14:19.354] base::options(mc.cores = 1L) [13:14:19.354] } [13:14:19.354] options(future.plan = NULL) [13:14:19.354] Sys.unsetenv("R_FUTURE_PLAN") [13:14:19.354] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:14:19.354] } [13:14:19.354] ...future.workdir <- getwd() [13:14:19.354] } [13:14:19.354] ...future.oldOptions <- base::as.list(base::.Options) [13:14:19.354] ...future.oldEnvVars <- base::Sys.getenv() [13:14:19.354] } [13:14:19.354] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:14:19.354] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:14:19.354] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:14:19.354] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:14:19.354] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:14:19.354] future.stdout.windows.reencode = NULL, width = 80L) [13:14:19.354] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:14:19.354] base::names(...future.oldOptions)) [13:14:19.354] } [13:14:19.354] if (FALSE) { [13:14:19.354] } [13:14:19.354] else { [13:14:19.354] if (TRUE) { [13:14:19.354] ...future.stdout <- base::rawConnection(base::raw(0L), [13:14:19.354] open = "w") [13:14:19.354] } [13:14:19.354] else { [13:14:19.354] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:14:19.354] windows = "NUL", "/dev/null"), open = "w") [13:14:19.354] } [13:14:19.354] base::sink(...future.stdout, type = "output", split = FALSE) [13:14:19.354] base::on.exit(if (!base::is.null(...future.stdout)) { [13:14:19.354] base::sink(type = "output", split = FALSE) [13:14:19.354] base::close(...future.stdout) [13:14:19.354] }, add = TRUE) [13:14:19.354] } [13:14:19.354] ...future.frame <- base::sys.nframe() [13:14:19.354] ...future.conditions <- base::list() [13:14:19.354] ...future.rng <- base::globalenv()$.Random.seed [13:14:19.354] if (FALSE) { [13:14:19.354] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:14:19.354] "...future.value", "...future.globalenv.names", ".Random.seed") [13:14:19.354] } [13:14:19.354] ...future.result <- base::tryCatch({ [13:14:19.354] base::withCallingHandlers({ [13:14:19.354] ...future.value <- base::withVisible(base::local({ [13:14:19.354] ...future.makeSendCondition <- local({ [13:14:19.354] sendCondition <- NULL [13:14:19.354] function(frame = 1L) { [13:14:19.354] if (is.function(sendCondition)) [13:14:19.354] return(sendCondition) [13:14:19.354] ns <- getNamespace("parallel") [13:14:19.354] if (exists("sendData", mode = "function", [13:14:19.354] envir = ns)) { [13:14:19.354] parallel_sendData <- get("sendData", mode = "function", [13:14:19.354] envir = ns) [13:14:19.354] envir <- sys.frame(frame) [13:14:19.354] master <- NULL [13:14:19.354] while (!identical(envir, .GlobalEnv) && [13:14:19.354] !identical(envir, emptyenv())) { [13:14:19.354] if (exists("master", mode = "list", envir = envir, [13:14:19.354] inherits = FALSE)) { [13:14:19.354] master <- get("master", mode = "list", [13:14:19.354] envir = envir, inherits = FALSE) [13:14:19.354] if (inherits(master, c("SOCKnode", [13:14:19.354] "SOCK0node"))) { [13:14:19.354] sendCondition <<- function(cond) { [13:14:19.354] data <- list(type = "VALUE", value = cond, [13:14:19.354] success = TRUE) [13:14:19.354] parallel_sendData(master, data) [13:14:19.354] } [13:14:19.354] return(sendCondition) [13:14:19.354] } [13:14:19.354] } [13:14:19.354] frame <- frame + 1L [13:14:19.354] envir <- sys.frame(frame) [13:14:19.354] } [13:14:19.354] } [13:14:19.354] sendCondition <<- function(cond) NULL [13:14:19.354] } [13:14:19.354] }) [13:14:19.354] withCallingHandlers({ [13:14:19.354] { [13:14:19.354] do.call(function(...) { [13:14:19.354] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:19.354] if (!identical(...future.globals.maxSize.org, [13:14:19.354] ...future.globals.maxSize)) { [13:14:19.354] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:19.354] on.exit(options(oopts), add = TRUE) [13:14:19.354] } [13:14:19.354] { [13:14:19.354] lapply(seq_along(...future.elements_ii), [13:14:19.354] FUN = function(jj) { [13:14:19.354] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:19.354] ...future.FUN(...future.X_jj, ...) [13:14:19.354] }) [13:14:19.354] } [13:14:19.354] }, args = future.call.arguments) [13:14:19.354] } [13:14:19.354] }, immediateCondition = function(cond) { [13:14:19.354] sendCondition <- ...future.makeSendCondition() [13:14:19.354] sendCondition(cond) [13:14:19.354] muffleCondition <- function (cond, pattern = "^muffle") [13:14:19.354] { [13:14:19.354] inherits <- base::inherits [13:14:19.354] invokeRestart <- base::invokeRestart [13:14:19.354] is.null <- base::is.null [13:14:19.354] muffled <- FALSE [13:14:19.354] if (inherits(cond, "message")) { [13:14:19.354] muffled <- grepl(pattern, "muffleMessage") [13:14:19.354] if (muffled) [13:14:19.354] invokeRestart("muffleMessage") [13:14:19.354] } [13:14:19.354] else if (inherits(cond, "warning")) { [13:14:19.354] muffled <- grepl(pattern, "muffleWarning") [13:14:19.354] if (muffled) [13:14:19.354] invokeRestart("muffleWarning") [13:14:19.354] } [13:14:19.354] else if (inherits(cond, "condition")) { [13:14:19.354] if (!is.null(pattern)) { [13:14:19.354] computeRestarts <- base::computeRestarts [13:14:19.354] grepl <- base::grepl [13:14:19.354] restarts <- computeRestarts(cond) [13:14:19.354] for (restart in restarts) { [13:14:19.354] name <- restart$name [13:14:19.354] if (is.null(name)) [13:14:19.354] next [13:14:19.354] if (!grepl(pattern, name)) [13:14:19.354] next [13:14:19.354] invokeRestart(restart) [13:14:19.354] muffled <- TRUE [13:14:19.354] break [13:14:19.354] } [13:14:19.354] } [13:14:19.354] } [13:14:19.354] invisible(muffled) [13:14:19.354] } [13:14:19.354] muffleCondition(cond) [13:14:19.354] }) [13:14:19.354] })) [13:14:19.354] future::FutureResult(value = ...future.value$value, [13:14:19.354] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:14:19.354] ...future.rng), globalenv = if (FALSE) [13:14:19.354] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:14:19.354] ...future.globalenv.names)) [13:14:19.354] else NULL, started = ...future.startTime, version = "1.8") [13:14:19.354] }, condition = base::local({ [13:14:19.354] c <- base::c [13:14:19.354] inherits <- base::inherits [13:14:19.354] invokeRestart <- base::invokeRestart [13:14:19.354] length <- base::length [13:14:19.354] list <- base::list [13:14:19.354] seq.int <- base::seq.int [13:14:19.354] signalCondition <- base::signalCondition [13:14:19.354] sys.calls <- base::sys.calls [13:14:19.354] `[[` <- base::`[[` [13:14:19.354] `+` <- base::`+` [13:14:19.354] `<<-` <- base::`<<-` [13:14:19.354] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:14:19.354] calls[seq.int(from = from + 12L, to = length(calls) - [13:14:19.354] 3L)] [13:14:19.354] } [13:14:19.354] function(cond) { [13:14:19.354] is_error <- inherits(cond, "error") [13:14:19.354] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:14:19.354] NULL) [13:14:19.354] if (is_error) { [13:14:19.354] sessionInformation <- function() { [13:14:19.354] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:14:19.354] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:14:19.354] search = base::search(), system = base::Sys.info()) [13:14:19.354] } [13:14:19.354] ...future.conditions[[length(...future.conditions) + [13:14:19.354] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:14:19.354] cond$call), session = sessionInformation(), [13:14:19.354] timestamp = base::Sys.time(), signaled = 0L) [13:14:19.354] signalCondition(cond) [13:14:19.354] } [13:14:19.354] else if (!ignore && TRUE && inherits(cond, c("condition", [13:14:19.354] "immediateCondition"))) { [13:14:19.354] signal <- TRUE && inherits(cond, "immediateCondition") [13:14:19.354] ...future.conditions[[length(...future.conditions) + [13:14:19.354] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:14:19.354] if (TRUE && !signal) { [13:14:19.354] muffleCondition <- function (cond, pattern = "^muffle") [13:14:19.354] { [13:14:19.354] inherits <- base::inherits [13:14:19.354] invokeRestart <- base::invokeRestart [13:14:19.354] is.null <- base::is.null [13:14:19.354] muffled <- FALSE [13:14:19.354] if (inherits(cond, "message")) { [13:14:19.354] muffled <- grepl(pattern, "muffleMessage") [13:14:19.354] if (muffled) [13:14:19.354] invokeRestart("muffleMessage") [13:14:19.354] } [13:14:19.354] else if (inherits(cond, "warning")) { [13:14:19.354] muffled <- grepl(pattern, "muffleWarning") [13:14:19.354] if (muffled) [13:14:19.354] invokeRestart("muffleWarning") [13:14:19.354] } [13:14:19.354] else if (inherits(cond, "condition")) { [13:14:19.354] if (!is.null(pattern)) { [13:14:19.354] computeRestarts <- base::computeRestarts [13:14:19.354] grepl <- base::grepl [13:14:19.354] restarts <- computeRestarts(cond) [13:14:19.354] for (restart in restarts) { [13:14:19.354] name <- restart$name [13:14:19.354] if (is.null(name)) [13:14:19.354] next [13:14:19.354] if (!grepl(pattern, name)) [13:14:19.354] next [13:14:19.354] invokeRestart(restart) [13:14:19.354] muffled <- TRUE [13:14:19.354] break [13:14:19.354] } [13:14:19.354] } [13:14:19.354] } [13:14:19.354] invisible(muffled) [13:14:19.354] } [13:14:19.354] muffleCondition(cond, pattern = "^muffle") [13:14:19.354] } [13:14:19.354] } [13:14:19.354] else { [13:14:19.354] if (TRUE) { [13:14:19.354] muffleCondition <- function (cond, pattern = "^muffle") [13:14:19.354] { [13:14:19.354] inherits <- base::inherits [13:14:19.354] invokeRestart <- base::invokeRestart [13:14:19.354] is.null <- base::is.null [13:14:19.354] muffled <- FALSE [13:14:19.354] if (inherits(cond, "message")) { [13:14:19.354] muffled <- grepl(pattern, "muffleMessage") [13:14:19.354] if (muffled) [13:14:19.354] invokeRestart("muffleMessage") [13:14:19.354] } [13:14:19.354] else if (inherits(cond, "warning")) { [13:14:19.354] muffled <- grepl(pattern, "muffleWarning") [13:14:19.354] if (muffled) [13:14:19.354] invokeRestart("muffleWarning") [13:14:19.354] } [13:14:19.354] else if (inherits(cond, "condition")) { [13:14:19.354] if (!is.null(pattern)) { [13:14:19.354] computeRestarts <- base::computeRestarts [13:14:19.354] grepl <- base::grepl [13:14:19.354] restarts <- computeRestarts(cond) [13:14:19.354] for (restart in restarts) { [13:14:19.354] name <- restart$name [13:14:19.354] if (is.null(name)) [13:14:19.354] next [13:14:19.354] if (!grepl(pattern, name)) [13:14:19.354] next [13:14:19.354] invokeRestart(restart) [13:14:19.354] muffled <- TRUE [13:14:19.354] break [13:14:19.354] } [13:14:19.354] } [13:14:19.354] } [13:14:19.354] invisible(muffled) [13:14:19.354] } [13:14:19.354] muffleCondition(cond, pattern = "^muffle") [13:14:19.354] } [13:14:19.354] } [13:14:19.354] } [13:14:19.354] })) [13:14:19.354] }, error = function(ex) { [13:14:19.354] base::structure(base::list(value = NULL, visible = NULL, [13:14:19.354] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:14:19.354] ...future.rng), started = ...future.startTime, [13:14:19.354] finished = Sys.time(), session_uuid = NA_character_, [13:14:19.354] version = "1.8"), class = "FutureResult") [13:14:19.354] }, finally = { [13:14:19.354] if (!identical(...future.workdir, getwd())) [13:14:19.354] setwd(...future.workdir) [13:14:19.354] { [13:14:19.354] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:14:19.354] ...future.oldOptions$nwarnings <- NULL [13:14:19.354] } [13:14:19.354] base::options(...future.oldOptions) [13:14:19.354] if (.Platform$OS.type == "windows") { [13:14:19.354] old_names <- names(...future.oldEnvVars) [13:14:19.354] envs <- base::Sys.getenv() [13:14:19.354] names <- names(envs) [13:14:19.354] common <- intersect(names, old_names) [13:14:19.354] added <- setdiff(names, old_names) [13:14:19.354] removed <- setdiff(old_names, names) [13:14:19.354] changed <- common[...future.oldEnvVars[common] != [13:14:19.354] envs[common]] [13:14:19.354] NAMES <- toupper(changed) [13:14:19.354] args <- list() [13:14:19.354] for (kk in seq_along(NAMES)) { [13:14:19.354] name <- changed[[kk]] [13:14:19.354] NAME <- NAMES[[kk]] [13:14:19.354] if (name != NAME && is.element(NAME, old_names)) [13:14:19.354] next [13:14:19.354] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:19.354] } [13:14:19.354] NAMES <- toupper(added) [13:14:19.354] for (kk in seq_along(NAMES)) { [13:14:19.354] name <- added[[kk]] [13:14:19.354] NAME <- NAMES[[kk]] [13:14:19.354] if (name != NAME && is.element(NAME, old_names)) [13:14:19.354] next [13:14:19.354] args[[name]] <- "" [13:14:19.354] } [13:14:19.354] NAMES <- toupper(removed) [13:14:19.354] for (kk in seq_along(NAMES)) { [13:14:19.354] name <- removed[[kk]] [13:14:19.354] NAME <- NAMES[[kk]] [13:14:19.354] if (name != NAME && is.element(NAME, old_names)) [13:14:19.354] next [13:14:19.354] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:19.354] } [13:14:19.354] if (length(args) > 0) [13:14:19.354] base::do.call(base::Sys.setenv, args = args) [13:14:19.354] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:14:19.354] } [13:14:19.354] else { [13:14:19.354] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:14:19.354] } [13:14:19.354] { [13:14:19.354] if (base::length(...future.futureOptionsAdded) > [13:14:19.354] 0L) { [13:14:19.354] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:14:19.354] base::names(opts) <- ...future.futureOptionsAdded [13:14:19.354] base::options(opts) [13:14:19.354] } [13:14:19.354] { [13:14:19.354] { [13:14:19.354] base::options(mc.cores = ...future.mc.cores.old) [13:14:19.354] NULL [13:14:19.354] } [13:14:19.354] options(future.plan = NULL) [13:14:19.354] if (is.na(NA_character_)) [13:14:19.354] Sys.unsetenv("R_FUTURE_PLAN") [13:14:19.354] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:14:19.354] future::plan(list(function (..., workers = availableCores(), [13:14:19.354] lazy = FALSE, rscript_libs = .libPaths(), [13:14:19.354] envir = parent.frame()) [13:14:19.354] { [13:14:19.354] if (is.function(workers)) [13:14:19.354] workers <- workers() [13:14:19.354] workers <- structure(as.integer(workers), [13:14:19.354] class = class(workers)) [13:14:19.354] stop_if_not(length(workers) == 1, is.finite(workers), [13:14:19.354] workers >= 1) [13:14:19.354] if (workers == 1L && !inherits(workers, "AsIs")) { [13:14:19.354] return(sequential(..., lazy = TRUE, envir = envir)) [13:14:19.354] } [13:14:19.354] future <- MultisessionFuture(..., workers = workers, [13:14:19.354] lazy = lazy, rscript_libs = rscript_libs, [13:14:19.354] envir = envir) [13:14:19.354] if (!future$lazy) [13:14:19.354] future <- run(future) [13:14:19.354] invisible(future) [13:14:19.354] }), .cleanup = FALSE, .init = FALSE) [13:14:19.354] } [13:14:19.354] } [13:14:19.354] } [13:14:19.354] }) [13:14:19.354] if (TRUE) { [13:14:19.354] base::sink(type = "output", split = FALSE) [13:14:19.354] if (TRUE) { [13:14:19.354] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:14:19.354] } [13:14:19.354] else { [13:14:19.354] ...future.result["stdout"] <- base::list(NULL) [13:14:19.354] } [13:14:19.354] base::close(...future.stdout) [13:14:19.354] ...future.stdout <- NULL [13:14:19.354] } [13:14:19.354] ...future.result$conditions <- ...future.conditions [13:14:19.354] ...future.result$finished <- base::Sys.time() [13:14:19.354] ...future.result [13:14:19.354] } [13:14:19.358] Exporting 5 global objects (4.16 KiB) to cluster node #1 ... [13:14:19.358] Exporting '...future.FUN' (4.07 KiB) to cluster node #1 ... [13:14:19.358] Exporting '...future.FUN' (4.07 KiB) to cluster node #1 ... DONE [13:14:19.359] Exporting 'future.call.arguments' (96 bytes) to cluster node #1 ... [13:14:19.359] Exporting 'future.call.arguments' (96 bytes) to cluster node #1 ... DONE [13:14:19.359] Exporting '...future.elements_ii' (112 bytes) to cluster node #1 ... [13:14:19.359] Exporting '...future.elements_ii' (112 bytes) to cluster node #1 ... DONE [13:14:19.360] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:14:19.360] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:14:19.360] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:14:19.360] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:14:19.361] Exporting 5 global objects (4.16 KiB) to cluster node #1 ... DONE [13:14:19.361] MultisessionFuture started [13:14:19.361] - Launch lazy future ... done [13:14:19.361] run() for 'MultisessionFuture' ... done [13:14:19.361] Created future: [13:14:19.378] receiveMessageFromWorker() for ClusterFuture ... [13:14:19.378] - Validating connection of MultisessionFuture [13:14:19.379] - received message: FutureResult [13:14:19.379] - Received FutureResult [13:14:19.379] - Erased future from FutureRegistry [13:14:19.379] result() for ClusterFuture ... [13:14:19.379] - result already collected: FutureResult [13:14:19.379] result() for ClusterFuture ... done [13:14:19.380] receiveMessageFromWorker() for ClusterFuture ... done [13:14:19.362] MultisessionFuture: [13:14:19.362] Label: 'future_sapply-2' [13:14:19.362] Expression: [13:14:19.362] { [13:14:19.362] do.call(function(...) { [13:14:19.362] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:19.362] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:19.362] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:19.362] on.exit(options(oopts), add = TRUE) [13:14:19.362] } [13:14:19.362] { [13:14:19.362] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:19.362] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:19.362] ...future.FUN(...future.X_jj, ...) [13:14:19.362] }) [13:14:19.362] } [13:14:19.362] }, args = future.call.arguments) [13:14:19.362] } [13:14:19.362] Lazy evaluation: FALSE [13:14:19.362] Asynchronous evaluation: TRUE [13:14:19.362] Local evaluation: TRUE [13:14:19.362] Environment: R_GlobalEnv [13:14:19.362] Capture standard output: TRUE [13:14:19.362] Capture condition classes: 'condition' (excluding 'nothing') [13:14:19.362] Globals: 5 objects totaling 4.27 KiB (function '...future.FUN' of 4.07 KiB, DotDotDotList 'future.call.arguments' of 96 bytes, list '...future.elements_ii' of 112 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:14:19.362] Packages: [13:14:19.362] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:14:19.362] Resolved: TRUE [13:14:19.362] Value: [13:14:19.362] Conditions captured: [13:14:19.362] Early signaling: FALSE [13:14:19.362] Owner process: 1bb7d580-628d-c90d-e38a-66de485868c4 [13:14:19.362] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:14:19.380] Chunk #2 of 2 ... DONE [13:14:19.380] Launching 2 futures (chunks) ... DONE [13:14:19.380] Resolving 2 futures (chunks) ... [13:14:19.380] resolve() on list ... [13:14:19.380] recursive: 0 [13:14:19.381] length: 2 [13:14:19.381] [13:14:19.381] Future #1 [13:14:19.381] result() for ClusterFuture ... [13:14:19.381] - result already collected: FutureResult [13:14:19.381] result() for ClusterFuture ... done [13:14:19.381] result() for ClusterFuture ... [13:14:19.381] - result already collected: FutureResult [13:14:19.382] result() for ClusterFuture ... done [13:14:19.382] signalConditionsASAP(MultisessionFuture, pos=1) ... [13:14:19.382] - nx: 2 [13:14:19.382] - relay: TRUE [13:14:19.382] - stdout: TRUE [13:14:19.382] - signal: TRUE [13:14:19.382] - resignal: FALSE [13:14:19.382] - force: TRUE [13:14:19.383] - relayed: [n=2] FALSE, FALSE [13:14:19.383] - queued futures: [n=2] FALSE, FALSE [13:14:19.383] - until=1 [13:14:19.383] - relaying element #1 [13:14:19.383] result() for ClusterFuture ... [13:14:19.383] - result already collected: FutureResult [13:14:19.383] result() for ClusterFuture ... done [13:14:19.383] result() for ClusterFuture ... [13:14:19.384] - result already collected: FutureResult [13:14:19.384] result() for ClusterFuture ... done [13:14:19.384] result() for ClusterFuture ... [13:14:19.384] - result already collected: FutureResult [13:14:19.384] result() for ClusterFuture ... done [13:14:19.384] result() for ClusterFuture ... [13:14:19.384] - result already collected: FutureResult [13:14:19.384] result() for ClusterFuture ... done [13:14:19.385] - relayed: [n=2] TRUE, FALSE [13:14:19.385] - queued futures: [n=2] TRUE, FALSE [13:14:19.385] signalConditionsASAP(MultisessionFuture, pos=1) ... done [13:14:19.385] length: 1 (resolved future 1) [13:14:19.385] Future #2 [13:14:19.385] result() for ClusterFuture ... [13:14:19.385] - result already collected: FutureResult [13:14:19.386] result() for ClusterFuture ... done [13:14:19.386] result() for ClusterFuture ... [13:14:19.386] - result already collected: FutureResult [13:14:19.386] result() for ClusterFuture ... done [13:14:19.386] signalConditionsASAP(MultisessionFuture, pos=2) ... [13:14:19.386] - nx: 2 [13:14:19.386] - relay: TRUE [13:14:19.386] - stdout: TRUE [13:14:19.387] - signal: TRUE [13:14:19.387] - resignal: FALSE [13:14:19.387] - force: TRUE [13:14:19.387] - relayed: [n=2] TRUE, FALSE [13:14:19.387] - queued futures: [n=2] TRUE, FALSE [13:14:19.387] - until=2 [13:14:19.387] - relaying element #2 [13:14:19.387] result() for ClusterFuture ... [13:14:19.388] - result already collected: FutureResult [13:14:19.388] result() for ClusterFuture ... done [13:14:19.388] result() for ClusterFuture ... [13:14:19.388] - result already collected: FutureResult [13:14:19.388] result() for ClusterFuture ... done [13:14:19.388] result() for ClusterFuture ... [13:14:19.388] - result already collected: FutureResult [13:14:19.388] result() for ClusterFuture ... done [13:14:19.389] result() for ClusterFuture ... [13:14:19.389] - result already collected: FutureResult [13:14:19.389] result() for ClusterFuture ... done [13:14:19.389] - relayed: [n=2] TRUE, TRUE [13:14:19.389] - queued futures: [n=2] TRUE, TRUE [13:14:19.389] signalConditionsASAP(MultisessionFuture, pos=2) ... done [13:14:19.389] length: 0 (resolved future 2) [13:14:19.389] Relaying remaining futures [13:14:19.390] signalConditionsASAP(NULL, pos=0) ... [13:14:19.390] - nx: 2 [13:14:19.390] - relay: TRUE [13:14:19.390] - stdout: TRUE [13:14:19.390] - signal: TRUE [13:14:19.390] - resignal: FALSE [13:14:19.390] - force: TRUE [13:14:19.390] - relayed: [n=2] TRUE, TRUE [13:14:19.391] - queued futures: [n=2] TRUE, TRUE - flush all [13:14:19.391] - relayed: [n=2] TRUE, TRUE [13:14:19.391] - queued futures: [n=2] TRUE, TRUE [13:14:19.391] signalConditionsASAP(NULL, pos=0) ... done [13:14:19.391] resolve() on list ... DONE [13:14:19.391] result() for ClusterFuture ... [13:14:19.391] - result already collected: FutureResult [13:14:19.392] result() for ClusterFuture ... done [13:14:19.392] result() for ClusterFuture ... [13:14:19.392] - result already collected: FutureResult [13:14:19.392] result() for ClusterFuture ... done [13:14:19.392] result() for ClusterFuture ... [13:14:19.392] - result already collected: FutureResult [13:14:19.392] result() for ClusterFuture ... done [13:14:19.392] result() for ClusterFuture ... [13:14:19.393] - result already collected: FutureResult [13:14:19.393] result() for ClusterFuture ... done [13:14:19.393] - Number of value chunks collected: 2 [13:14:19.393] Resolving 2 futures (chunks) ... DONE [13:14:19.393] Reducing values from 2 chunks ... [13:14:19.393] - Number of values collected after concatenation: 4 [13:14:19.393] - Number of values expected: 4 [13:14:19.394] Reducing values from 2 chunks ... DONE [13:14:19.394] future_lapply() ... DONE [13:14:19.394] future_lapply() ... [13:14:19.398] Number of chunks: 2 [13:14:19.398] getGlobalsAndPackagesXApply() ... [13:14:19.398] - future.globals: TRUE [13:14:19.398] getGlobalsAndPackages() ... [13:14:19.398] Searching for globals... [13:14:19.402] - globals found: [18] 'FUN', '{', '<-', 'x_FUN', 'if', '!=', 'length', 'times', 'stopf', 'stop_if_not', 'all', '==', 'dim', '%in%', 'typeof', 'valid_types', 'outer', 'rep' [13:14:19.402] Searching for globals ... DONE [13:14:19.402] Resolving globals: FALSE [13:14:19.403] The total size of the 7 globals is 96.20 KiB (98504 bytes) [13:14:19.404] The total size of the 7 globals exported for future expression ('FUN(y = c(2, 4, 6, 8, 10))') is 96.20 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). The three largest globals are 'stop_if_not' (44.12 KiB of class 'function'), 'stopf' (26.43 KiB of class 'function') and 'FUN' (21.22 KiB of class 'function') [13:14:19.404] - globals: [7] 'FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types' [13:14:19.404] - packages: [1] 'future.apply' [13:14:19.404] getGlobalsAndPackages() ... DONE [13:14:19.404] - globals found/used: [n=7] 'FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types' [13:14:19.404] - needed namespaces: [n=1] 'future.apply' [13:14:19.405] Finding globals ... DONE [13:14:19.405] - use_args: TRUE [13:14:19.405] - Getting '...' globals ... [13:14:19.407] resolve() on list ... [13:14:19.407] recursive: 0 [13:14:19.407] length: 1 [13:14:19.408] elements: '...' [13:14:19.408] length: 0 (resolved future 1) [13:14:19.408] resolve() on list ... DONE [13:14:19.408] - '...' content: [n=1] 'y' [13:14:19.408] List of 1 [13:14:19.408] $ ...:List of 1 [13:14:19.408] ..$ y: num [1:5] 2 4 6 8 10 [13:14:19.408] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:14:19.408] - attr(*, "where")=List of 1 [13:14:19.408] ..$ ...: [13:14:19.408] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:14:19.408] - attr(*, "resolved")= logi TRUE [13:14:19.408] - attr(*, "total_size")= num NA [13:14:19.411] - Getting '...' globals ... DONE [13:14:19.411] Globals to be used in all futures (chunks): [n=8] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...' [13:14:19.411] List of 8 [13:14:19.411] $ ...future.FUN:function (x, ...) [13:14:19.411] $ x_FUN :function (x, y) [13:14:19.411] $ times : int 15 [13:14:19.411] $ stopf :function (fmt, ..., call. = TRUE, domain = NULL) [13:14:19.411] $ stop_if_not :function (...) [13:14:19.411] $ dim : int [1:2] 3 5 [13:14:19.411] $ valid_types : chr [1:3] "logical" "integer" "double" [13:14:19.411] $ ... :List of 1 [13:14:19.411] ..$ y: num [1:5] 2 4 6 8 10 [13:14:19.411] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:14:19.411] - attr(*, "where")=List of 8 [13:14:19.411] ..$ ...future.FUN: [13:14:19.411] ..$ x_FUN : [13:14:19.411] ..$ times : [13:14:19.411] ..$ stopf : [13:14:19.411] ..$ stop_if_not : [13:14:19.411] ..$ dim : [13:14:19.411] ..$ valid_types : [13:14:19.411] ..$ ... : [13:14:19.411] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:14:19.411] - attr(*, "resolved")= logi FALSE [13:14:19.411] - attr(*, "total_size")= num 98600 [13:14:19.417] Packages to be attached in all futures: [n=1] 'future.apply' [13:14:19.417] getGlobalsAndPackagesXApply() ... DONE [13:14:19.417] Number of futures (= number of chunks): 2 [13:14:19.417] Launching 2 futures (chunks) ... [13:14:19.418] Chunk #1 of 2 ... [13:14:19.418] - Finding globals in 'X' for chunk #1 ... [13:14:19.418] getGlobalsAndPackages() ... [13:14:19.418] Searching for globals... [13:14:19.418] [13:14:19.418] Searching for globals ... DONE [13:14:19.418] - globals: [0] [13:14:19.419] getGlobalsAndPackages() ... DONE [13:14:19.419] + additional globals found: [n=0] [13:14:19.419] + additional namespaces needed: [n=0] [13:14:19.419] - Finding globals in 'X' for chunk #1 ... DONE [13:14:19.419] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:14:19.419] - seeds: [13:14:19.419] - All globals exported: [n=11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:19.419] getGlobalsAndPackages() ... [13:14:19.420] - globals passed as-is: [11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:19.420] Resolving globals: FALSE [13:14:19.420] Tweak future expression to call with '...' arguments ... [13:14:19.420] { [13:14:19.420] do.call(function(...) { [13:14:19.420] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:19.420] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:19.420] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:19.420] on.exit(options(oopts), add = TRUE) [13:14:19.420] } [13:14:19.420] { [13:14:19.420] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:19.420] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:19.420] ...future.FUN(...future.X_jj, ...) [13:14:19.420] }) [13:14:19.420] } [13:14:19.420] }, args = future.call.arguments) [13:14:19.420] } [13:14:19.420] Tweak future expression to call with '...' arguments ... DONE [13:14:19.421] - globals: [11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:19.421] - packages: [1] 'future.apply' [13:14:19.421] getGlobalsAndPackages() ... DONE [13:14:19.421] run() for 'Future' ... [13:14:19.422] - state: 'created' [13:14:19.422] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:14:19.433] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:14:19.434] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:14:19.434] - Field: 'node' [13:14:19.434] - Field: 'label' [13:14:19.434] - Field: 'local' [13:14:19.434] - Field: 'owner' [13:14:19.434] - Field: 'envir' [13:14:19.434] - Field: 'workers' [13:14:19.435] - Field: 'packages' [13:14:19.435] - Field: 'gc' [13:14:19.435] - Field: 'conditions' [13:14:19.435] - Field: 'persistent' [13:14:19.435] - Field: 'expr' [13:14:19.435] - Field: 'uuid' [13:14:19.435] - Field: 'seed' [13:14:19.436] - Field: 'version' [13:14:19.436] - Field: 'result' [13:14:19.436] - Field: 'asynchronous' [13:14:19.436] - Field: 'calls' [13:14:19.436] - Field: 'globals' [13:14:19.436] - Field: 'stdout' [13:14:19.436] - Field: 'earlySignal' [13:14:19.437] - Field: 'lazy' [13:14:19.437] - Field: 'state' [13:14:19.437] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:14:19.437] - Launch lazy future ... [13:14:19.437] Packages needed by the future expression (n = 1): 'future.apply' [13:14:19.437] Packages needed by future strategies (n = 0): [13:14:19.438] { [13:14:19.438] { [13:14:19.438] { [13:14:19.438] ...future.startTime <- base::Sys.time() [13:14:19.438] { [13:14:19.438] { [13:14:19.438] { [13:14:19.438] { [13:14:19.438] { [13:14:19.438] base::local({ [13:14:19.438] has_future <- base::requireNamespace("future", [13:14:19.438] quietly = TRUE) [13:14:19.438] if (has_future) { [13:14:19.438] ns <- base::getNamespace("future") [13:14:19.438] version <- ns[[".package"]][["version"]] [13:14:19.438] if (is.null(version)) [13:14:19.438] version <- utils::packageVersion("future") [13:14:19.438] } [13:14:19.438] else { [13:14:19.438] version <- NULL [13:14:19.438] } [13:14:19.438] if (!has_future || version < "1.8.0") { [13:14:19.438] info <- base::c(r_version = base::gsub("R version ", [13:14:19.438] "", base::R.version$version.string), [13:14:19.438] platform = base::sprintf("%s (%s-bit)", [13:14:19.438] base::R.version$platform, 8 * [13:14:19.438] base::.Machine$sizeof.pointer), [13:14:19.438] os = base::paste(base::Sys.info()[base::c("sysname", [13:14:19.438] "release", "version")], collapse = " "), [13:14:19.438] hostname = base::Sys.info()[["nodename"]]) [13:14:19.438] info <- base::sprintf("%s: %s", base::names(info), [13:14:19.438] info) [13:14:19.438] info <- base::paste(info, collapse = "; ") [13:14:19.438] if (!has_future) { [13:14:19.438] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:14:19.438] info) [13:14:19.438] } [13:14:19.438] else { [13:14:19.438] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:14:19.438] info, version) [13:14:19.438] } [13:14:19.438] base::stop(msg) [13:14:19.438] } [13:14:19.438] }) [13:14:19.438] } [13:14:19.438] ...future.mc.cores.old <- base::getOption("mc.cores") [13:14:19.438] base::options(mc.cores = 1L) [13:14:19.438] } [13:14:19.438] base::local({ [13:14:19.438] for (pkg in "future.apply") { [13:14:19.438] base::loadNamespace(pkg) [13:14:19.438] base::library(pkg, character.only = TRUE) [13:14:19.438] } [13:14:19.438] }) [13:14:19.438] } [13:14:19.438] options(future.plan = NULL) [13:14:19.438] Sys.unsetenv("R_FUTURE_PLAN") [13:14:19.438] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:14:19.438] } [13:14:19.438] ...future.workdir <- getwd() [13:14:19.438] } [13:14:19.438] ...future.oldOptions <- base::as.list(base::.Options) [13:14:19.438] ...future.oldEnvVars <- base::Sys.getenv() [13:14:19.438] } [13:14:19.438] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:14:19.438] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:14:19.438] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:14:19.438] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:14:19.438] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:14:19.438] future.stdout.windows.reencode = NULL, width = 80L) [13:14:19.438] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:14:19.438] base::names(...future.oldOptions)) [13:14:19.438] } [13:14:19.438] if (FALSE) { [13:14:19.438] } [13:14:19.438] else { [13:14:19.438] if (TRUE) { [13:14:19.438] ...future.stdout <- base::rawConnection(base::raw(0L), [13:14:19.438] open = "w") [13:14:19.438] } [13:14:19.438] else { [13:14:19.438] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:14:19.438] windows = "NUL", "/dev/null"), open = "w") [13:14:19.438] } [13:14:19.438] base::sink(...future.stdout, type = "output", split = FALSE) [13:14:19.438] base::on.exit(if (!base::is.null(...future.stdout)) { [13:14:19.438] base::sink(type = "output", split = FALSE) [13:14:19.438] base::close(...future.stdout) [13:14:19.438] }, add = TRUE) [13:14:19.438] } [13:14:19.438] ...future.frame <- base::sys.nframe() [13:14:19.438] ...future.conditions <- base::list() [13:14:19.438] ...future.rng <- base::globalenv()$.Random.seed [13:14:19.438] if (FALSE) { [13:14:19.438] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:14:19.438] "...future.value", "...future.globalenv.names", ".Random.seed") [13:14:19.438] } [13:14:19.438] ...future.result <- base::tryCatch({ [13:14:19.438] base::withCallingHandlers({ [13:14:19.438] ...future.value <- base::withVisible(base::local({ [13:14:19.438] ...future.makeSendCondition <- local({ [13:14:19.438] sendCondition <- NULL [13:14:19.438] function(frame = 1L) { [13:14:19.438] if (is.function(sendCondition)) [13:14:19.438] return(sendCondition) [13:14:19.438] ns <- getNamespace("parallel") [13:14:19.438] if (exists("sendData", mode = "function", [13:14:19.438] envir = ns)) { [13:14:19.438] parallel_sendData <- get("sendData", mode = "function", [13:14:19.438] envir = ns) [13:14:19.438] envir <- sys.frame(frame) [13:14:19.438] master <- NULL [13:14:19.438] while (!identical(envir, .GlobalEnv) && [13:14:19.438] !identical(envir, emptyenv())) { [13:14:19.438] if (exists("master", mode = "list", envir = envir, [13:14:19.438] inherits = FALSE)) { [13:14:19.438] master <- get("master", mode = "list", [13:14:19.438] envir = envir, inherits = FALSE) [13:14:19.438] if (inherits(master, c("SOCKnode", [13:14:19.438] "SOCK0node"))) { [13:14:19.438] sendCondition <<- function(cond) { [13:14:19.438] data <- list(type = "VALUE", value = cond, [13:14:19.438] success = TRUE) [13:14:19.438] parallel_sendData(master, data) [13:14:19.438] } [13:14:19.438] return(sendCondition) [13:14:19.438] } [13:14:19.438] } [13:14:19.438] frame <- frame + 1L [13:14:19.438] envir <- sys.frame(frame) [13:14:19.438] } [13:14:19.438] } [13:14:19.438] sendCondition <<- function(cond) NULL [13:14:19.438] } [13:14:19.438] }) [13:14:19.438] withCallingHandlers({ [13:14:19.438] { [13:14:19.438] do.call(function(...) { [13:14:19.438] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:19.438] if (!identical(...future.globals.maxSize.org, [13:14:19.438] ...future.globals.maxSize)) { [13:14:19.438] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:19.438] on.exit(options(oopts), add = TRUE) [13:14:19.438] } [13:14:19.438] { [13:14:19.438] lapply(seq_along(...future.elements_ii), [13:14:19.438] FUN = function(jj) { [13:14:19.438] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:19.438] ...future.FUN(...future.X_jj, ...) [13:14:19.438] }) [13:14:19.438] } [13:14:19.438] }, args = future.call.arguments) [13:14:19.438] } [13:14:19.438] }, immediateCondition = function(cond) { [13:14:19.438] sendCondition <- ...future.makeSendCondition() [13:14:19.438] sendCondition(cond) [13:14:19.438] muffleCondition <- function (cond, pattern = "^muffle") [13:14:19.438] { [13:14:19.438] inherits <- base::inherits [13:14:19.438] invokeRestart <- base::invokeRestart [13:14:19.438] is.null <- base::is.null [13:14:19.438] muffled <- FALSE [13:14:19.438] if (inherits(cond, "message")) { [13:14:19.438] muffled <- grepl(pattern, "muffleMessage") [13:14:19.438] if (muffled) [13:14:19.438] invokeRestart("muffleMessage") [13:14:19.438] } [13:14:19.438] else if (inherits(cond, "warning")) { [13:14:19.438] muffled <- grepl(pattern, "muffleWarning") [13:14:19.438] if (muffled) [13:14:19.438] invokeRestart("muffleWarning") [13:14:19.438] } [13:14:19.438] else if (inherits(cond, "condition")) { [13:14:19.438] if (!is.null(pattern)) { [13:14:19.438] computeRestarts <- base::computeRestarts [13:14:19.438] grepl <- base::grepl [13:14:19.438] restarts <- computeRestarts(cond) [13:14:19.438] for (restart in restarts) { [13:14:19.438] name <- restart$name [13:14:19.438] if (is.null(name)) [13:14:19.438] next [13:14:19.438] if (!grepl(pattern, name)) [13:14:19.438] next [13:14:19.438] invokeRestart(restart) [13:14:19.438] muffled <- TRUE [13:14:19.438] break [13:14:19.438] } [13:14:19.438] } [13:14:19.438] } [13:14:19.438] invisible(muffled) [13:14:19.438] } [13:14:19.438] muffleCondition(cond) [13:14:19.438] }) [13:14:19.438] })) [13:14:19.438] future::FutureResult(value = ...future.value$value, [13:14:19.438] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:14:19.438] ...future.rng), globalenv = if (FALSE) [13:14:19.438] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:14:19.438] ...future.globalenv.names)) [13:14:19.438] else NULL, started = ...future.startTime, version = "1.8") [13:14:19.438] }, condition = base::local({ [13:14:19.438] c <- base::c [13:14:19.438] inherits <- base::inherits [13:14:19.438] invokeRestart <- base::invokeRestart [13:14:19.438] length <- base::length [13:14:19.438] list <- base::list [13:14:19.438] seq.int <- base::seq.int [13:14:19.438] signalCondition <- base::signalCondition [13:14:19.438] sys.calls <- base::sys.calls [13:14:19.438] `[[` <- base::`[[` [13:14:19.438] `+` <- base::`+` [13:14:19.438] `<<-` <- base::`<<-` [13:14:19.438] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:14:19.438] calls[seq.int(from = from + 12L, to = length(calls) - [13:14:19.438] 3L)] [13:14:19.438] } [13:14:19.438] function(cond) { [13:14:19.438] is_error <- inherits(cond, "error") [13:14:19.438] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:14:19.438] NULL) [13:14:19.438] if (is_error) { [13:14:19.438] sessionInformation <- function() { [13:14:19.438] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:14:19.438] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:14:19.438] search = base::search(), system = base::Sys.info()) [13:14:19.438] } [13:14:19.438] ...future.conditions[[length(...future.conditions) + [13:14:19.438] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:14:19.438] cond$call), session = sessionInformation(), [13:14:19.438] timestamp = base::Sys.time(), signaled = 0L) [13:14:19.438] signalCondition(cond) [13:14:19.438] } [13:14:19.438] else if (!ignore && TRUE && inherits(cond, c("condition", [13:14:19.438] "immediateCondition"))) { [13:14:19.438] signal <- TRUE && inherits(cond, "immediateCondition") [13:14:19.438] ...future.conditions[[length(...future.conditions) + [13:14:19.438] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:14:19.438] if (TRUE && !signal) { [13:14:19.438] muffleCondition <- function (cond, pattern = "^muffle") [13:14:19.438] { [13:14:19.438] inherits <- base::inherits [13:14:19.438] invokeRestart <- base::invokeRestart [13:14:19.438] is.null <- base::is.null [13:14:19.438] muffled <- FALSE [13:14:19.438] if (inherits(cond, "message")) { [13:14:19.438] muffled <- grepl(pattern, "muffleMessage") [13:14:19.438] if (muffled) [13:14:19.438] invokeRestart("muffleMessage") [13:14:19.438] } [13:14:19.438] else if (inherits(cond, "warning")) { [13:14:19.438] muffled <- grepl(pattern, "muffleWarning") [13:14:19.438] if (muffled) [13:14:19.438] invokeRestart("muffleWarning") [13:14:19.438] } [13:14:19.438] else if (inherits(cond, "condition")) { [13:14:19.438] if (!is.null(pattern)) { [13:14:19.438] computeRestarts <- base::computeRestarts [13:14:19.438] grepl <- base::grepl [13:14:19.438] restarts <- computeRestarts(cond) [13:14:19.438] for (restart in restarts) { [13:14:19.438] name <- restart$name [13:14:19.438] if (is.null(name)) [13:14:19.438] next [13:14:19.438] if (!grepl(pattern, name)) [13:14:19.438] next [13:14:19.438] invokeRestart(restart) [13:14:19.438] muffled <- TRUE [13:14:19.438] break [13:14:19.438] } [13:14:19.438] } [13:14:19.438] } [13:14:19.438] invisible(muffled) [13:14:19.438] } [13:14:19.438] muffleCondition(cond, pattern = "^muffle") [13:14:19.438] } [13:14:19.438] } [13:14:19.438] else { [13:14:19.438] if (TRUE) { [13:14:19.438] muffleCondition <- function (cond, pattern = "^muffle") [13:14:19.438] { [13:14:19.438] inherits <- base::inherits [13:14:19.438] invokeRestart <- base::invokeRestart [13:14:19.438] is.null <- base::is.null [13:14:19.438] muffled <- FALSE [13:14:19.438] if (inherits(cond, "message")) { [13:14:19.438] muffled <- grepl(pattern, "muffleMessage") [13:14:19.438] if (muffled) [13:14:19.438] invokeRestart("muffleMessage") [13:14:19.438] } [13:14:19.438] else if (inherits(cond, "warning")) { [13:14:19.438] muffled <- grepl(pattern, "muffleWarning") [13:14:19.438] if (muffled) [13:14:19.438] invokeRestart("muffleWarning") [13:14:19.438] } [13:14:19.438] else if (inherits(cond, "condition")) { [13:14:19.438] if (!is.null(pattern)) { [13:14:19.438] computeRestarts <- base::computeRestarts [13:14:19.438] grepl <- base::grepl [13:14:19.438] restarts <- computeRestarts(cond) [13:14:19.438] for (restart in restarts) { [13:14:19.438] name <- restart$name [13:14:19.438] if (is.null(name)) [13:14:19.438] next [13:14:19.438] if (!grepl(pattern, name)) [13:14:19.438] next [13:14:19.438] invokeRestart(restart) [13:14:19.438] muffled <- TRUE [13:14:19.438] break [13:14:19.438] } [13:14:19.438] } [13:14:19.438] } [13:14:19.438] invisible(muffled) [13:14:19.438] } [13:14:19.438] muffleCondition(cond, pattern = "^muffle") [13:14:19.438] } [13:14:19.438] } [13:14:19.438] } [13:14:19.438] })) [13:14:19.438] }, error = function(ex) { [13:14:19.438] base::structure(base::list(value = NULL, visible = NULL, [13:14:19.438] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:14:19.438] ...future.rng), started = ...future.startTime, [13:14:19.438] finished = Sys.time(), session_uuid = NA_character_, [13:14:19.438] version = "1.8"), class = "FutureResult") [13:14:19.438] }, finally = { [13:14:19.438] if (!identical(...future.workdir, getwd())) [13:14:19.438] setwd(...future.workdir) [13:14:19.438] { [13:14:19.438] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:14:19.438] ...future.oldOptions$nwarnings <- NULL [13:14:19.438] } [13:14:19.438] base::options(...future.oldOptions) [13:14:19.438] if (.Platform$OS.type == "windows") { [13:14:19.438] old_names <- names(...future.oldEnvVars) [13:14:19.438] envs <- base::Sys.getenv() [13:14:19.438] names <- names(envs) [13:14:19.438] common <- intersect(names, old_names) [13:14:19.438] added <- setdiff(names, old_names) [13:14:19.438] removed <- setdiff(old_names, names) [13:14:19.438] changed <- common[...future.oldEnvVars[common] != [13:14:19.438] envs[common]] [13:14:19.438] NAMES <- toupper(changed) [13:14:19.438] args <- list() [13:14:19.438] for (kk in seq_along(NAMES)) { [13:14:19.438] name <- changed[[kk]] [13:14:19.438] NAME <- NAMES[[kk]] [13:14:19.438] if (name != NAME && is.element(NAME, old_names)) [13:14:19.438] next [13:14:19.438] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:19.438] } [13:14:19.438] NAMES <- toupper(added) [13:14:19.438] for (kk in seq_along(NAMES)) { [13:14:19.438] name <- added[[kk]] [13:14:19.438] NAME <- NAMES[[kk]] [13:14:19.438] if (name != NAME && is.element(NAME, old_names)) [13:14:19.438] next [13:14:19.438] args[[name]] <- "" [13:14:19.438] } [13:14:19.438] NAMES <- toupper(removed) [13:14:19.438] for (kk in seq_along(NAMES)) { [13:14:19.438] name <- removed[[kk]] [13:14:19.438] NAME <- NAMES[[kk]] [13:14:19.438] if (name != NAME && is.element(NAME, old_names)) [13:14:19.438] next [13:14:19.438] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:19.438] } [13:14:19.438] if (length(args) > 0) [13:14:19.438] base::do.call(base::Sys.setenv, args = args) [13:14:19.438] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:14:19.438] } [13:14:19.438] else { [13:14:19.438] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:14:19.438] } [13:14:19.438] { [13:14:19.438] if (base::length(...future.futureOptionsAdded) > [13:14:19.438] 0L) { [13:14:19.438] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:14:19.438] base::names(opts) <- ...future.futureOptionsAdded [13:14:19.438] base::options(opts) [13:14:19.438] } [13:14:19.438] { [13:14:19.438] { [13:14:19.438] base::options(mc.cores = ...future.mc.cores.old) [13:14:19.438] NULL [13:14:19.438] } [13:14:19.438] options(future.plan = NULL) [13:14:19.438] if (is.na(NA_character_)) [13:14:19.438] Sys.unsetenv("R_FUTURE_PLAN") [13:14:19.438] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:14:19.438] future::plan(list(function (..., workers = availableCores(), [13:14:19.438] lazy = FALSE, rscript_libs = .libPaths(), [13:14:19.438] envir = parent.frame()) [13:14:19.438] { [13:14:19.438] if (is.function(workers)) [13:14:19.438] workers <- workers() [13:14:19.438] workers <- structure(as.integer(workers), [13:14:19.438] class = class(workers)) [13:14:19.438] stop_if_not(length(workers) == 1, is.finite(workers), [13:14:19.438] workers >= 1) [13:14:19.438] if (workers == 1L && !inherits(workers, "AsIs")) { [13:14:19.438] return(sequential(..., lazy = TRUE, envir = envir)) [13:14:19.438] } [13:14:19.438] future <- MultisessionFuture(..., workers = workers, [13:14:19.438] lazy = lazy, rscript_libs = rscript_libs, [13:14:19.438] envir = envir) [13:14:19.438] if (!future$lazy) [13:14:19.438] future <- run(future) [13:14:19.438] invisible(future) [13:14:19.438] }), .cleanup = FALSE, .init = FALSE) [13:14:19.438] } [13:14:19.438] } [13:14:19.438] } [13:14:19.438] }) [13:14:19.438] if (TRUE) { [13:14:19.438] base::sink(type = "output", split = FALSE) [13:14:19.438] if (TRUE) { [13:14:19.438] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:14:19.438] } [13:14:19.438] else { [13:14:19.438] ...future.result["stdout"] <- base::list(NULL) [13:14:19.438] } [13:14:19.438] base::close(...future.stdout) [13:14:19.438] ...future.stdout <- NULL [13:14:19.438] } [13:14:19.438] ...future.result$conditions <- ...future.conditions [13:14:19.438] ...future.result$finished <- base::Sys.time() [13:14:19.438] ...future.result [13:14:19.438] } [13:14:19.442] Exporting 11 global objects (96.29 KiB) to cluster node #1 ... [13:14:19.443] Exporting '...future.FUN' (21.22 KiB) to cluster node #1 ... [13:14:19.443] Exporting '...future.FUN' (21.22 KiB) to cluster node #1 ... DONE [13:14:19.443] Exporting 'x_FUN' (4.07 KiB) to cluster node #1 ... [13:14:19.443] Exporting 'x_FUN' (4.07 KiB) to cluster node #1 ... DONE [13:14:19.444] Exporting 'times' (56 bytes) to cluster node #1 ... [13:14:19.444] Exporting 'times' (56 bytes) to cluster node #1 ... DONE [13:14:19.444] Exporting 'stopf' (26.43 KiB) to cluster node #1 ... [13:14:19.444] Exporting 'stopf' (26.43 KiB) to cluster node #1 ... DONE [13:14:19.444] Exporting 'stop_if_not' (44.12 KiB) to cluster node #1 ... [13:14:19.445] Exporting 'stop_if_not' (44.12 KiB) to cluster node #1 ... DONE [13:14:19.445] Exporting 'dim' (56 bytes) to cluster node #1 ... [13:14:19.445] Exporting 'dim' (56 bytes) to cluster node #1 ... DONE [13:14:19.445] Exporting 'valid_types' (248 bytes) to cluster node #1 ... [13:14:19.446] Exporting 'valid_types' (248 bytes) to cluster node #1 ... DONE [13:14:19.446] Exporting 'future.call.arguments' (96 bytes) to cluster node #1 ... [13:14:19.446] Exporting 'future.call.arguments' (96 bytes) to cluster node #1 ... DONE [13:14:19.446] Exporting '...future.elements_ii' (112 bytes) to cluster node #1 ... [13:14:19.447] Exporting '...future.elements_ii' (112 bytes) to cluster node #1 ... DONE [13:14:19.447] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:14:19.447] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:14:19.447] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:14:19.448] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:14:19.448] Exporting 11 global objects (96.29 KiB) to cluster node #1 ... DONE [13:14:19.448] MultisessionFuture started [13:14:19.448] - Launch lazy future ... done [13:14:19.448] run() for 'MultisessionFuture' ... done [13:14:19.449] Created future: [13:14:19.468] receiveMessageFromWorker() for ClusterFuture ... [13:14:19.469] - Validating connection of MultisessionFuture [13:14:19.469] - received message: FutureResult [13:14:19.469] - Received FutureResult [13:14:19.469] - Erased future from FutureRegistry [13:14:19.469] result() for ClusterFuture ... [13:14:19.470] - result already collected: FutureResult [13:14:19.470] result() for ClusterFuture ... done [13:14:19.470] receiveMessageFromWorker() for ClusterFuture ... done [13:14:19.449] MultisessionFuture: [13:14:19.449] Label: 'future_vapply-1' [13:14:19.449] Expression: [13:14:19.449] { [13:14:19.449] do.call(function(...) { [13:14:19.449] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:19.449] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:19.449] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:19.449] on.exit(options(oopts), add = TRUE) [13:14:19.449] } [13:14:19.449] { [13:14:19.449] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:19.449] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:19.449] ...future.FUN(...future.X_jj, ...) [13:14:19.449] }) [13:14:19.449] } [13:14:19.449] }, args = future.call.arguments) [13:14:19.449] } [13:14:19.449] Lazy evaluation: FALSE [13:14:19.449] Asynchronous evaluation: TRUE [13:14:19.449] Local evaluation: TRUE [13:14:19.449] Environment: R_GlobalEnv [13:14:19.449] Capture standard output: TRUE [13:14:19.449] Capture condition classes: 'condition' (excluding 'nothing') [13:14:19.449] Globals: 11 objects totaling 96.40 KiB (function '...future.FUN' of 21.22 KiB, function 'x_FUN' of 4.07 KiB, integer 'times' of 56 bytes, function 'stopf' of 26.43 KiB, function 'stop_if_not' of 44.12 KiB, ...) [13:14:19.449] Packages: 1 packages ('future.apply') [13:14:19.449] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:14:19.449] Resolved: TRUE [13:14:19.449] Value: [13:14:19.449] Conditions captured: [13:14:19.449] Early signaling: FALSE [13:14:19.449] Owner process: 1bb7d580-628d-c90d-e38a-66de485868c4 [13:14:19.449] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:14:19.470] Chunk #1 of 2 ... DONE [13:14:19.470] Chunk #2 of 2 ... [13:14:19.471] - Finding globals in 'X' for chunk #2 ... [13:14:19.471] getGlobalsAndPackages() ... [13:14:19.471] Searching for globals... [13:14:19.471] [13:14:19.471] Searching for globals ... DONE [13:14:19.471] - globals: [0] [13:14:19.471] getGlobalsAndPackages() ... DONE [13:14:19.472] + additional globals found: [n=0] [13:14:19.472] + additional namespaces needed: [n=0] [13:14:19.472] - Finding globals in 'X' for chunk #2 ... DONE [13:14:19.472] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:14:19.472] - seeds: [13:14:19.472] - All globals exported: [n=11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:19.472] getGlobalsAndPackages() ... [13:14:19.472] - globals passed as-is: [11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:19.473] Resolving globals: FALSE [13:14:19.473] Tweak future expression to call with '...' arguments ... [13:14:19.473] { [13:14:19.473] do.call(function(...) { [13:14:19.473] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:19.473] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:19.473] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:19.473] on.exit(options(oopts), add = TRUE) [13:14:19.473] } [13:14:19.473] { [13:14:19.473] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:19.473] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:19.473] ...future.FUN(...future.X_jj, ...) [13:14:19.473] }) [13:14:19.473] } [13:14:19.473] }, args = future.call.arguments) [13:14:19.473] } [13:14:19.473] Tweak future expression to call with '...' arguments ... DONE [13:14:19.474] - globals: [11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:19.474] - packages: [1] 'future.apply' [13:14:19.474] getGlobalsAndPackages() ... DONE [13:14:19.474] run() for 'Future' ... [13:14:19.474] - state: 'created' [13:14:19.475] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:14:19.485] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:14:19.485] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:14:19.485] - Field: 'node' [13:14:19.486] - Field: 'label' [13:14:19.486] - Field: 'local' [13:14:19.486] - Field: 'owner' [13:14:19.486] - Field: 'envir' [13:14:19.486] - Field: 'workers' [13:14:19.486] - Field: 'packages' [13:14:19.486] - Field: 'gc' [13:14:19.486] - Field: 'conditions' [13:14:19.487] - Field: 'persistent' [13:14:19.487] - Field: 'expr' [13:14:19.487] - Field: 'uuid' [13:14:19.487] - Field: 'seed' [13:14:19.487] - Field: 'version' [13:14:19.487] - Field: 'result' [13:14:19.487] - Field: 'asynchronous' [13:14:19.488] - Field: 'calls' [13:14:19.488] - Field: 'globals' [13:14:19.488] - Field: 'stdout' [13:14:19.488] - Field: 'earlySignal' [13:14:19.488] - Field: 'lazy' [13:14:19.488] - Field: 'state' [13:14:19.488] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:14:19.488] - Launch lazy future ... [13:14:19.489] Packages needed by the future expression (n = 1): 'future.apply' [13:14:19.489] Packages needed by future strategies (n = 0): [13:14:19.489] { [13:14:19.489] { [13:14:19.489] { [13:14:19.489] ...future.startTime <- base::Sys.time() [13:14:19.489] { [13:14:19.489] { [13:14:19.489] { [13:14:19.489] { [13:14:19.489] { [13:14:19.489] base::local({ [13:14:19.489] has_future <- base::requireNamespace("future", [13:14:19.489] quietly = TRUE) [13:14:19.489] if (has_future) { [13:14:19.489] ns <- base::getNamespace("future") [13:14:19.489] version <- ns[[".package"]][["version"]] [13:14:19.489] if (is.null(version)) [13:14:19.489] version <- utils::packageVersion("future") [13:14:19.489] } [13:14:19.489] else { [13:14:19.489] version <- NULL [13:14:19.489] } [13:14:19.489] if (!has_future || version < "1.8.0") { [13:14:19.489] info <- base::c(r_version = base::gsub("R version ", [13:14:19.489] "", base::R.version$version.string), [13:14:19.489] platform = base::sprintf("%s (%s-bit)", [13:14:19.489] base::R.version$platform, 8 * [13:14:19.489] base::.Machine$sizeof.pointer), [13:14:19.489] os = base::paste(base::Sys.info()[base::c("sysname", [13:14:19.489] "release", "version")], collapse = " "), [13:14:19.489] hostname = base::Sys.info()[["nodename"]]) [13:14:19.489] info <- base::sprintf("%s: %s", base::names(info), [13:14:19.489] info) [13:14:19.489] info <- base::paste(info, collapse = "; ") [13:14:19.489] if (!has_future) { [13:14:19.489] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:14:19.489] info) [13:14:19.489] } [13:14:19.489] else { [13:14:19.489] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:14:19.489] info, version) [13:14:19.489] } [13:14:19.489] base::stop(msg) [13:14:19.489] } [13:14:19.489] }) [13:14:19.489] } [13:14:19.489] ...future.mc.cores.old <- base::getOption("mc.cores") [13:14:19.489] base::options(mc.cores = 1L) [13:14:19.489] } [13:14:19.489] base::local({ [13:14:19.489] for (pkg in "future.apply") { [13:14:19.489] base::loadNamespace(pkg) [13:14:19.489] base::library(pkg, character.only = TRUE) [13:14:19.489] } [13:14:19.489] }) [13:14:19.489] } [13:14:19.489] options(future.plan = NULL) [13:14:19.489] Sys.unsetenv("R_FUTURE_PLAN") [13:14:19.489] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:14:19.489] } [13:14:19.489] ...future.workdir <- getwd() [13:14:19.489] } [13:14:19.489] ...future.oldOptions <- base::as.list(base::.Options) [13:14:19.489] ...future.oldEnvVars <- base::Sys.getenv() [13:14:19.489] } [13:14:19.489] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:14:19.489] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:14:19.489] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:14:19.489] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:14:19.489] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:14:19.489] future.stdout.windows.reencode = NULL, width = 80L) [13:14:19.489] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:14:19.489] base::names(...future.oldOptions)) [13:14:19.489] } [13:14:19.489] if (FALSE) { [13:14:19.489] } [13:14:19.489] else { [13:14:19.489] if (TRUE) { [13:14:19.489] ...future.stdout <- base::rawConnection(base::raw(0L), [13:14:19.489] open = "w") [13:14:19.489] } [13:14:19.489] else { [13:14:19.489] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:14:19.489] windows = "NUL", "/dev/null"), open = "w") [13:14:19.489] } [13:14:19.489] base::sink(...future.stdout, type = "output", split = FALSE) [13:14:19.489] base::on.exit(if (!base::is.null(...future.stdout)) { [13:14:19.489] base::sink(type = "output", split = FALSE) [13:14:19.489] base::close(...future.stdout) [13:14:19.489] }, add = TRUE) [13:14:19.489] } [13:14:19.489] ...future.frame <- base::sys.nframe() [13:14:19.489] ...future.conditions <- base::list() [13:14:19.489] ...future.rng <- base::globalenv()$.Random.seed [13:14:19.489] if (FALSE) { [13:14:19.489] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:14:19.489] "...future.value", "...future.globalenv.names", ".Random.seed") [13:14:19.489] } [13:14:19.489] ...future.result <- base::tryCatch({ [13:14:19.489] base::withCallingHandlers({ [13:14:19.489] ...future.value <- base::withVisible(base::local({ [13:14:19.489] ...future.makeSendCondition <- local({ [13:14:19.489] sendCondition <- NULL [13:14:19.489] function(frame = 1L) { [13:14:19.489] if (is.function(sendCondition)) [13:14:19.489] return(sendCondition) [13:14:19.489] ns <- getNamespace("parallel") [13:14:19.489] if (exists("sendData", mode = "function", [13:14:19.489] envir = ns)) { [13:14:19.489] parallel_sendData <- get("sendData", mode = "function", [13:14:19.489] envir = ns) [13:14:19.489] envir <- sys.frame(frame) [13:14:19.489] master <- NULL [13:14:19.489] while (!identical(envir, .GlobalEnv) && [13:14:19.489] !identical(envir, emptyenv())) { [13:14:19.489] if (exists("master", mode = "list", envir = envir, [13:14:19.489] inherits = FALSE)) { [13:14:19.489] master <- get("master", mode = "list", [13:14:19.489] envir = envir, inherits = FALSE) [13:14:19.489] if (inherits(master, c("SOCKnode", [13:14:19.489] "SOCK0node"))) { [13:14:19.489] sendCondition <<- function(cond) { [13:14:19.489] data <- list(type = "VALUE", value = cond, [13:14:19.489] success = TRUE) [13:14:19.489] parallel_sendData(master, data) [13:14:19.489] } [13:14:19.489] return(sendCondition) [13:14:19.489] } [13:14:19.489] } [13:14:19.489] frame <- frame + 1L [13:14:19.489] envir <- sys.frame(frame) [13:14:19.489] } [13:14:19.489] } [13:14:19.489] sendCondition <<- function(cond) NULL [13:14:19.489] } [13:14:19.489] }) [13:14:19.489] withCallingHandlers({ [13:14:19.489] { [13:14:19.489] do.call(function(...) { [13:14:19.489] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:19.489] if (!identical(...future.globals.maxSize.org, [13:14:19.489] ...future.globals.maxSize)) { [13:14:19.489] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:19.489] on.exit(options(oopts), add = TRUE) [13:14:19.489] } [13:14:19.489] { [13:14:19.489] lapply(seq_along(...future.elements_ii), [13:14:19.489] FUN = function(jj) { [13:14:19.489] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:19.489] ...future.FUN(...future.X_jj, ...) [13:14:19.489] }) [13:14:19.489] } [13:14:19.489] }, args = future.call.arguments) [13:14:19.489] } [13:14:19.489] }, immediateCondition = function(cond) { [13:14:19.489] sendCondition <- ...future.makeSendCondition() [13:14:19.489] sendCondition(cond) [13:14:19.489] muffleCondition <- function (cond, pattern = "^muffle") [13:14:19.489] { [13:14:19.489] inherits <- base::inherits [13:14:19.489] invokeRestart <- base::invokeRestart [13:14:19.489] is.null <- base::is.null [13:14:19.489] muffled <- FALSE [13:14:19.489] if (inherits(cond, "message")) { [13:14:19.489] muffled <- grepl(pattern, "muffleMessage") [13:14:19.489] if (muffled) [13:14:19.489] invokeRestart("muffleMessage") [13:14:19.489] } [13:14:19.489] else if (inherits(cond, "warning")) { [13:14:19.489] muffled <- grepl(pattern, "muffleWarning") [13:14:19.489] if (muffled) [13:14:19.489] invokeRestart("muffleWarning") [13:14:19.489] } [13:14:19.489] else if (inherits(cond, "condition")) { [13:14:19.489] if (!is.null(pattern)) { [13:14:19.489] computeRestarts <- base::computeRestarts [13:14:19.489] grepl <- base::grepl [13:14:19.489] restarts <- computeRestarts(cond) [13:14:19.489] for (restart in restarts) { [13:14:19.489] name <- restart$name [13:14:19.489] if (is.null(name)) [13:14:19.489] next [13:14:19.489] if (!grepl(pattern, name)) [13:14:19.489] next [13:14:19.489] invokeRestart(restart) [13:14:19.489] muffled <- TRUE [13:14:19.489] break [13:14:19.489] } [13:14:19.489] } [13:14:19.489] } [13:14:19.489] invisible(muffled) [13:14:19.489] } [13:14:19.489] muffleCondition(cond) [13:14:19.489] }) [13:14:19.489] })) [13:14:19.489] future::FutureResult(value = ...future.value$value, [13:14:19.489] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:14:19.489] ...future.rng), globalenv = if (FALSE) [13:14:19.489] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:14:19.489] ...future.globalenv.names)) [13:14:19.489] else NULL, started = ...future.startTime, version = "1.8") [13:14:19.489] }, condition = base::local({ [13:14:19.489] c <- base::c [13:14:19.489] inherits <- base::inherits [13:14:19.489] invokeRestart <- base::invokeRestart [13:14:19.489] length <- base::length [13:14:19.489] list <- base::list [13:14:19.489] seq.int <- base::seq.int [13:14:19.489] signalCondition <- base::signalCondition [13:14:19.489] sys.calls <- base::sys.calls [13:14:19.489] `[[` <- base::`[[` [13:14:19.489] `+` <- base::`+` [13:14:19.489] `<<-` <- base::`<<-` [13:14:19.489] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:14:19.489] calls[seq.int(from = from + 12L, to = length(calls) - [13:14:19.489] 3L)] [13:14:19.489] } [13:14:19.489] function(cond) { [13:14:19.489] is_error <- inherits(cond, "error") [13:14:19.489] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:14:19.489] NULL) [13:14:19.489] if (is_error) { [13:14:19.489] sessionInformation <- function() { [13:14:19.489] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:14:19.489] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:14:19.489] search = base::search(), system = base::Sys.info()) [13:14:19.489] } [13:14:19.489] ...future.conditions[[length(...future.conditions) + [13:14:19.489] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:14:19.489] cond$call), session = sessionInformation(), [13:14:19.489] timestamp = base::Sys.time(), signaled = 0L) [13:14:19.489] signalCondition(cond) [13:14:19.489] } [13:14:19.489] else if (!ignore && TRUE && inherits(cond, c("condition", [13:14:19.489] "immediateCondition"))) { [13:14:19.489] signal <- TRUE && inherits(cond, "immediateCondition") [13:14:19.489] ...future.conditions[[length(...future.conditions) + [13:14:19.489] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:14:19.489] if (TRUE && !signal) { [13:14:19.489] muffleCondition <- function (cond, pattern = "^muffle") [13:14:19.489] { [13:14:19.489] inherits <- base::inherits [13:14:19.489] invokeRestart <- base::invokeRestart [13:14:19.489] is.null <- base::is.null [13:14:19.489] muffled <- FALSE [13:14:19.489] if (inherits(cond, "message")) { [13:14:19.489] muffled <- grepl(pattern, "muffleMessage") [13:14:19.489] if (muffled) [13:14:19.489] invokeRestart("muffleMessage") [13:14:19.489] } [13:14:19.489] else if (inherits(cond, "warning")) { [13:14:19.489] muffled <- grepl(pattern, "muffleWarning") [13:14:19.489] if (muffled) [13:14:19.489] invokeRestart("muffleWarning") [13:14:19.489] } [13:14:19.489] else if (inherits(cond, "condition")) { [13:14:19.489] if (!is.null(pattern)) { [13:14:19.489] computeRestarts <- base::computeRestarts [13:14:19.489] grepl <- base::grepl [13:14:19.489] restarts <- computeRestarts(cond) [13:14:19.489] for (restart in restarts) { [13:14:19.489] name <- restart$name [13:14:19.489] if (is.null(name)) [13:14:19.489] next [13:14:19.489] if (!grepl(pattern, name)) [13:14:19.489] next [13:14:19.489] invokeRestart(restart) [13:14:19.489] muffled <- TRUE [13:14:19.489] break [13:14:19.489] } [13:14:19.489] } [13:14:19.489] } [13:14:19.489] invisible(muffled) [13:14:19.489] } [13:14:19.489] muffleCondition(cond, pattern = "^muffle") [13:14:19.489] } [13:14:19.489] } [13:14:19.489] else { [13:14:19.489] if (TRUE) { [13:14:19.489] muffleCondition <- function (cond, pattern = "^muffle") [13:14:19.489] { [13:14:19.489] inherits <- base::inherits [13:14:19.489] invokeRestart <- base::invokeRestart [13:14:19.489] is.null <- base::is.null [13:14:19.489] muffled <- FALSE [13:14:19.489] if (inherits(cond, "message")) { [13:14:19.489] muffled <- grepl(pattern, "muffleMessage") [13:14:19.489] if (muffled) [13:14:19.489] invokeRestart("muffleMessage") [13:14:19.489] } [13:14:19.489] else if (inherits(cond, "warning")) { [13:14:19.489] muffled <- grepl(pattern, "muffleWarning") [13:14:19.489] if (muffled) [13:14:19.489] invokeRestart("muffleWarning") [13:14:19.489] } [13:14:19.489] else if (inherits(cond, "condition")) { [13:14:19.489] if (!is.null(pattern)) { [13:14:19.489] computeRestarts <- base::computeRestarts [13:14:19.489] grepl <- base::grepl [13:14:19.489] restarts <- computeRestarts(cond) [13:14:19.489] for (restart in restarts) { [13:14:19.489] name <- restart$name [13:14:19.489] if (is.null(name)) [13:14:19.489] next [13:14:19.489] if (!grepl(pattern, name)) [13:14:19.489] next [13:14:19.489] invokeRestart(restart) [13:14:19.489] muffled <- TRUE [13:14:19.489] break [13:14:19.489] } [13:14:19.489] } [13:14:19.489] } [13:14:19.489] invisible(muffled) [13:14:19.489] } [13:14:19.489] muffleCondition(cond, pattern = "^muffle") [13:14:19.489] } [13:14:19.489] } [13:14:19.489] } [13:14:19.489] })) [13:14:19.489] }, error = function(ex) { [13:14:19.489] base::structure(base::list(value = NULL, visible = NULL, [13:14:19.489] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:14:19.489] ...future.rng), started = ...future.startTime, [13:14:19.489] finished = Sys.time(), session_uuid = NA_character_, [13:14:19.489] version = "1.8"), class = "FutureResult") [13:14:19.489] }, finally = { [13:14:19.489] if (!identical(...future.workdir, getwd())) [13:14:19.489] setwd(...future.workdir) [13:14:19.489] { [13:14:19.489] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:14:19.489] ...future.oldOptions$nwarnings <- NULL [13:14:19.489] } [13:14:19.489] base::options(...future.oldOptions) [13:14:19.489] if (.Platform$OS.type == "windows") { [13:14:19.489] old_names <- names(...future.oldEnvVars) [13:14:19.489] envs <- base::Sys.getenv() [13:14:19.489] names <- names(envs) [13:14:19.489] common <- intersect(names, old_names) [13:14:19.489] added <- setdiff(names, old_names) [13:14:19.489] removed <- setdiff(old_names, names) [13:14:19.489] changed <- common[...future.oldEnvVars[common] != [13:14:19.489] envs[common]] [13:14:19.489] NAMES <- toupper(changed) [13:14:19.489] args <- list() [13:14:19.489] for (kk in seq_along(NAMES)) { [13:14:19.489] name <- changed[[kk]] [13:14:19.489] NAME <- NAMES[[kk]] [13:14:19.489] if (name != NAME && is.element(NAME, old_names)) [13:14:19.489] next [13:14:19.489] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:19.489] } [13:14:19.489] NAMES <- toupper(added) [13:14:19.489] for (kk in seq_along(NAMES)) { [13:14:19.489] name <- added[[kk]] [13:14:19.489] NAME <- NAMES[[kk]] [13:14:19.489] if (name != NAME && is.element(NAME, old_names)) [13:14:19.489] next [13:14:19.489] args[[name]] <- "" [13:14:19.489] } [13:14:19.489] NAMES <- toupper(removed) [13:14:19.489] for (kk in seq_along(NAMES)) { [13:14:19.489] name <- removed[[kk]] [13:14:19.489] NAME <- NAMES[[kk]] [13:14:19.489] if (name != NAME && is.element(NAME, old_names)) [13:14:19.489] next [13:14:19.489] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:19.489] } [13:14:19.489] if (length(args) > 0) [13:14:19.489] base::do.call(base::Sys.setenv, args = args) [13:14:19.489] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:14:19.489] } [13:14:19.489] else { [13:14:19.489] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:14:19.489] } [13:14:19.489] { [13:14:19.489] if (base::length(...future.futureOptionsAdded) > [13:14:19.489] 0L) { [13:14:19.489] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:14:19.489] base::names(opts) <- ...future.futureOptionsAdded [13:14:19.489] base::options(opts) [13:14:19.489] } [13:14:19.489] { [13:14:19.489] { [13:14:19.489] base::options(mc.cores = ...future.mc.cores.old) [13:14:19.489] NULL [13:14:19.489] } [13:14:19.489] options(future.plan = NULL) [13:14:19.489] if (is.na(NA_character_)) [13:14:19.489] Sys.unsetenv("R_FUTURE_PLAN") [13:14:19.489] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:14:19.489] future::plan(list(function (..., workers = availableCores(), [13:14:19.489] lazy = FALSE, rscript_libs = .libPaths(), [13:14:19.489] envir = parent.frame()) [13:14:19.489] { [13:14:19.489] if (is.function(workers)) [13:14:19.489] workers <- workers() [13:14:19.489] workers <- structure(as.integer(workers), [13:14:19.489] class = class(workers)) [13:14:19.489] stop_if_not(length(workers) == 1, is.finite(workers), [13:14:19.489] workers >= 1) [13:14:19.489] if (workers == 1L && !inherits(workers, "AsIs")) { [13:14:19.489] return(sequential(..., lazy = TRUE, envir = envir)) [13:14:19.489] } [13:14:19.489] future <- MultisessionFuture(..., workers = workers, [13:14:19.489] lazy = lazy, rscript_libs = rscript_libs, [13:14:19.489] envir = envir) [13:14:19.489] if (!future$lazy) [13:14:19.489] future <- run(future) [13:14:19.489] invisible(future) [13:14:19.489] }), .cleanup = FALSE, .init = FALSE) [13:14:19.489] } [13:14:19.489] } [13:14:19.489] } [13:14:19.489] }) [13:14:19.489] if (TRUE) { [13:14:19.489] base::sink(type = "output", split = FALSE) [13:14:19.489] if (TRUE) { [13:14:19.489] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:14:19.489] } [13:14:19.489] else { [13:14:19.489] ...future.result["stdout"] <- base::list(NULL) [13:14:19.489] } [13:14:19.489] base::close(...future.stdout) [13:14:19.489] ...future.stdout <- NULL [13:14:19.489] } [13:14:19.489] ...future.result$conditions <- ...future.conditions [13:14:19.489] ...future.result$finished <- base::Sys.time() [13:14:19.489] ...future.result [13:14:19.489] } [13:14:19.493] Exporting 11 global objects (96.29 KiB) to cluster node #1 ... [13:14:19.494] Exporting '...future.FUN' (21.22 KiB) to cluster node #1 ... [13:14:19.494] Exporting '...future.FUN' (21.22 KiB) to cluster node #1 ... DONE [13:14:19.494] Exporting 'x_FUN' (4.07 KiB) to cluster node #1 ... [13:14:19.494] Exporting 'x_FUN' (4.07 KiB) to cluster node #1 ... DONE [13:14:19.495] Exporting 'times' (56 bytes) to cluster node #1 ... [13:14:19.495] Exporting 'times' (56 bytes) to cluster node #1 ... DONE [13:14:19.495] Exporting 'stopf' (26.43 KiB) to cluster node #1 ... [13:14:19.495] Exporting 'stopf' (26.43 KiB) to cluster node #1 ... DONE [13:14:19.496] Exporting 'stop_if_not' (44.12 KiB) to cluster node #1 ... [13:14:19.496] Exporting 'stop_if_not' (44.12 KiB) to cluster node #1 ... DONE [13:14:19.496] Exporting 'dim' (56 bytes) to cluster node #1 ... [13:14:19.496] Exporting 'dim' (56 bytes) to cluster node #1 ... DONE [13:14:19.497] Exporting 'valid_types' (248 bytes) to cluster node #1 ... [13:14:19.497] Exporting 'valid_types' (248 bytes) to cluster node #1 ... DONE [13:14:19.497] Exporting 'future.call.arguments' (96 bytes) to cluster node #1 ... [13:14:19.497] Exporting 'future.call.arguments' (96 bytes) to cluster node #1 ... DONE [13:14:19.498] Exporting '...future.elements_ii' (112 bytes) to cluster node #1 ... [13:14:19.498] Exporting '...future.elements_ii' (112 bytes) to cluster node #1 ... DONE [13:14:19.498] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:14:19.498] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:14:19.498] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:14:19.499] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:14:19.499] Exporting 11 global objects (96.29 KiB) to cluster node #1 ... DONE [13:14:19.499] MultisessionFuture started [13:14:19.499] - Launch lazy future ... done [13:14:19.500] run() for 'MultisessionFuture' ... done [13:14:19.500] Created future: [13:14:19.518] receiveMessageFromWorker() for ClusterFuture ... [13:14:19.518] - Validating connection of MultisessionFuture [13:14:19.519] - received message: FutureResult [13:14:19.519] - Received FutureResult [13:14:19.519] - Erased future from FutureRegistry [13:14:19.519] result() for ClusterFuture ... [13:14:19.519] - result already collected: FutureResult [13:14:19.520] result() for ClusterFuture ... done [13:14:19.520] receiveMessageFromWorker() for ClusterFuture ... done [13:14:19.500] MultisessionFuture: [13:14:19.500] Label: 'future_vapply-2' [13:14:19.500] Expression: [13:14:19.500] { [13:14:19.500] do.call(function(...) { [13:14:19.500] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:19.500] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:19.500] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:19.500] on.exit(options(oopts), add = TRUE) [13:14:19.500] } [13:14:19.500] { [13:14:19.500] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:19.500] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:19.500] ...future.FUN(...future.X_jj, ...) [13:14:19.500] }) [13:14:19.500] } [13:14:19.500] }, args = future.call.arguments) [13:14:19.500] } [13:14:19.500] Lazy evaluation: FALSE [13:14:19.500] Asynchronous evaluation: TRUE [13:14:19.500] Local evaluation: TRUE [13:14:19.500] Environment: R_GlobalEnv [13:14:19.500] Capture standard output: TRUE [13:14:19.500] Capture condition classes: 'condition' (excluding 'nothing') [13:14:19.500] Globals: 11 objects totaling 96.40 KiB (function '...future.FUN' of 21.22 KiB, function 'x_FUN' of 4.07 KiB, integer 'times' of 56 bytes, function 'stopf' of 26.43 KiB, function 'stop_if_not' of 44.12 KiB, ...) [13:14:19.500] Packages: 1 packages ('future.apply') [13:14:19.500] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:14:19.500] Resolved: TRUE [13:14:19.500] Value: [13:14:19.500] Conditions captured: [13:14:19.500] Early signaling: FALSE [13:14:19.500] Owner process: 1bb7d580-628d-c90d-e38a-66de485868c4 [13:14:19.500] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:14:19.520] Chunk #2 of 2 ... DONE [13:14:19.520] Launching 2 futures (chunks) ... DONE [13:14:19.520] Resolving 2 futures (chunks) ... [13:14:19.520] resolve() on list ... [13:14:19.520] recursive: 0 [13:14:19.521] length: 2 [13:14:19.521] [13:14:19.521] Future #1 [13:14:19.521] result() for ClusterFuture ... [13:14:19.521] - result already collected: FutureResult [13:14:19.521] result() for ClusterFuture ... done [13:14:19.521] result() for ClusterFuture ... [13:14:19.521] - result already collected: FutureResult [13:14:19.521] result() for ClusterFuture ... done [13:14:19.522] signalConditionsASAP(MultisessionFuture, pos=1) ... [13:14:19.522] - nx: 2 [13:14:19.522] - relay: TRUE [13:14:19.522] - stdout: TRUE [13:14:19.522] - signal: TRUE [13:14:19.522] - resignal: FALSE [13:14:19.522] - force: TRUE [13:14:19.522] - relayed: [n=2] FALSE, FALSE [13:14:19.522] - queued futures: [n=2] FALSE, FALSE [13:14:19.523] - until=1 [13:14:19.523] - relaying element #1 [13:14:19.523] result() for ClusterFuture ... [13:14:19.523] - result already collected: FutureResult [13:14:19.523] result() for ClusterFuture ... done [13:14:19.523] result() for ClusterFuture ... [13:14:19.523] - result already collected: FutureResult [13:14:19.523] result() for ClusterFuture ... done [13:14:19.524] result() for ClusterFuture ... [13:14:19.524] - result already collected: FutureResult [13:14:19.524] result() for ClusterFuture ... done [13:14:19.524] result() for ClusterFuture ... [13:14:19.524] - result already collected: FutureResult [13:14:19.524] result() for ClusterFuture ... done [13:14:19.524] - relayed: [n=2] TRUE, FALSE [13:14:19.524] - queued futures: [n=2] TRUE, FALSE [13:14:19.524] signalConditionsASAP(MultisessionFuture, pos=1) ... done [13:14:19.525] length: 1 (resolved future 1) [13:14:19.525] Future #2 [13:14:19.525] result() for ClusterFuture ... [13:14:19.525] - result already collected: FutureResult [13:14:19.525] result() for ClusterFuture ... done [13:14:19.525] result() for ClusterFuture ... [13:14:19.525] - result already collected: FutureResult [13:14:19.525] result() for ClusterFuture ... done [13:14:19.526] signalConditionsASAP(MultisessionFuture, pos=2) ... [13:14:19.526] - nx: 2 [13:14:19.526] - relay: TRUE [13:14:19.526] - stdout: TRUE [13:14:19.526] - signal: TRUE [13:14:19.526] - resignal: FALSE [13:14:19.526] - force: TRUE [13:14:19.526] - relayed: [n=2] TRUE, FALSE [13:14:19.526] - queued futures: [n=2] TRUE, FALSE [13:14:19.527] - until=2 [13:14:19.527] - relaying element #2 [13:14:19.527] result() for ClusterFuture ... [13:14:19.527] - result already collected: FutureResult [13:14:19.527] result() for ClusterFuture ... done [13:14:19.527] result() for ClusterFuture ... [13:14:19.527] - result already collected: FutureResult [13:14:19.527] result() for ClusterFuture ... done [13:14:19.527] result() for ClusterFuture ... [13:14:19.528] - result already collected: FutureResult [13:14:19.528] result() for ClusterFuture ... done [13:14:19.528] result() for ClusterFuture ... [13:14:19.528] - result already collected: FutureResult [13:14:19.528] result() for ClusterFuture ... done [13:14:19.528] - relayed: [n=2] TRUE, TRUE [13:14:19.528] - queued futures: [n=2] TRUE, TRUE [13:14:19.528] signalConditionsASAP(MultisessionFuture, pos=2) ... done [13:14:19.528] length: 0 (resolved future 2) [13:14:19.529] Relaying remaining futures [13:14:19.529] signalConditionsASAP(NULL, pos=0) ... [13:14:19.529] - nx: 2 [13:14:19.529] - relay: TRUE [13:14:19.529] - stdout: TRUE [13:14:19.529] - signal: TRUE [13:14:19.529] - resignal: FALSE [13:14:19.529] - force: TRUE [13:14:19.529] - relayed: [n=2] TRUE, TRUE [13:14:19.530] - queued futures: [n=2] TRUE, TRUE - flush all [13:14:19.530] - relayed: [n=2] TRUE, TRUE [13:14:19.530] - queued futures: [n=2] TRUE, TRUE [13:14:19.530] signalConditionsASAP(NULL, pos=0) ... done [13:14:19.530] resolve() on list ... DONE [13:14:19.530] result() for ClusterFuture ... [13:14:19.530] - result already collected: FutureResult [13:14:19.530] result() for ClusterFuture ... done [13:14:19.531] result() for ClusterFuture ... [13:14:19.531] - result already collected: FutureResult [13:14:19.531] result() for ClusterFuture ... done [13:14:19.531] result() for ClusterFuture ... [13:14:19.531] - result already collected: FutureResult [13:14:19.531] result() for ClusterFuture ... done [13:14:19.531] result() for ClusterFuture ... [13:14:19.531] - result already collected: FutureResult [13:14:19.531] result() for ClusterFuture ... done [13:14:19.532] - Number of value chunks collected: 2 [13:14:19.532] Resolving 2 futures (chunks) ... DONE [13:14:19.532] Reducing values from 2 chunks ... [13:14:19.532] - Number of values collected after concatenation: 4 [13:14:19.532] - Number of values expected: 4 [13:14:19.532] Reducing values from 2 chunks ... DONE [13:14:19.532] future_lapply() ... DONE num [1:3, 1:5, 1:4] 100 100 100 200 200 200 300 300 300 400 ... - attr(*, "dimnames")=List of 3 ..$ : NULL ..$ : NULL ..$ : chr [1:4] "A" "B" "C" "D" [13:14:19.534] future_lapply() ... [13:14:19.537] Number of chunks: 2 [13:14:19.537] getGlobalsAndPackagesXApply() ... [13:14:19.538] - future.globals: TRUE [13:14:19.538] getGlobalsAndPackages() ... [13:14:19.538] Searching for globals... [13:14:19.541] - globals found: [16] 'FUN', '{', '<-', 'x_FUN', 'if', '!=', 'length', 'times', 'stopf', 'stop_if_not', 'all', '==', 'dim', '%in%', 'typeof', 'valid_types' [13:14:19.541] Searching for globals ... DONE [13:14:19.541] Resolving globals: FALSE [13:14:19.542] The total size of the 7 globals is 91.99 KiB (94200 bytes) [13:14:19.542] The total size of the 7 globals exported for future expression ('FUN()') is 91.99 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). The three largest globals are 'stop_if_not' (44.12 KiB of class 'function'), 'stopf' (26.43 KiB of class 'function') and 'FUN' (21.22 KiB of class 'function') [13:14:19.542] - globals: [7] 'FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types' [13:14:19.542] - packages: [1] 'future.apply' [13:14:19.543] getGlobalsAndPackages() ... DONE [13:14:19.543] - globals found/used: [n=7] 'FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types' [13:14:19.543] - needed namespaces: [n=1] 'future.apply' [13:14:19.543] Finding globals ... DONE [13:14:19.543] - use_args: TRUE [13:14:19.543] - Getting '...' globals ... [13:14:19.543] resolve() on list ... [13:14:19.544] recursive: 0 [13:14:19.544] length: 1 [13:14:19.544] elements: '...' [13:14:19.544] length: 0 (resolved future 1) [13:14:19.544] resolve() on list ... DONE [13:14:19.544] - '...' content: [n=0] [13:14:19.544] List of 1 [13:14:19.544] $ ...: list() [13:14:19.544] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:14:19.544] - attr(*, "where")=List of 1 [13:14:19.544] ..$ ...: [13:14:19.544] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:14:19.544] - attr(*, "resolved")= logi TRUE [13:14:19.544] - attr(*, "total_size")= num NA [13:14:19.547] - Getting '...' globals ... DONE [13:14:19.547] Globals to be used in all futures (chunks): [n=8] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...' [13:14:19.547] List of 8 [13:14:19.547] $ ...future.FUN:function (x, ...) [13:14:19.547] $ x_FUN :function (x) [13:14:19.547] $ times : int 1 [13:14:19.547] $ stopf :function (fmt, ..., call. = TRUE, domain = NULL) [13:14:19.547] $ stop_if_not :function (...) [13:14:19.547] $ dim : NULL [13:14:19.547] $ valid_types : chr "logical" [13:14:19.547] $ ... : list() [13:14:19.547] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:14:19.547] - attr(*, "where")=List of 8 [13:14:19.547] ..$ ...future.FUN: [13:14:19.547] ..$ x_FUN : [13:14:19.547] ..$ times : [13:14:19.547] ..$ stopf : [13:14:19.547] ..$ stop_if_not : [13:14:19.547] ..$ dim : [13:14:19.547] ..$ valid_types : [13:14:19.547] ..$ ... : [13:14:19.547] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:14:19.547] - attr(*, "resolved")= logi FALSE [13:14:19.547] - attr(*, "total_size")= num 94200 [13:14:19.554] Packages to be attached in all futures: [n=1] 'future.apply' [13:14:19.554] getGlobalsAndPackagesXApply() ... DONE [13:14:19.554] Number of futures (= number of chunks): 2 [13:14:19.554] Launching 2 futures (chunks) ... [13:14:19.554] Chunk #1 of 2 ... [13:14:19.555] - Finding globals in 'X' for chunk #1 ... [13:14:19.555] getGlobalsAndPackages() ... [13:14:19.555] Searching for globals... [13:14:19.555] [13:14:19.555] Searching for globals ... DONE [13:14:19.555] - globals: [0] [13:14:19.555] getGlobalsAndPackages() ... DONE [13:14:19.555] + additional globals found: [n=0] [13:14:19.556] + additional namespaces needed: [n=0] [13:14:19.556] - Finding globals in 'X' for chunk #1 ... DONE [13:14:19.556] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:14:19.556] - seeds: [13:14:19.556] - All globals exported: [n=11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:19.556] getGlobalsAndPackages() ... [13:14:19.556] - globals passed as-is: [11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:19.556] Resolving globals: FALSE [13:14:19.557] Tweak future expression to call with '...' arguments ... [13:14:19.557] { [13:14:19.557] do.call(function(...) { [13:14:19.557] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:19.557] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:19.557] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:19.557] on.exit(options(oopts), add = TRUE) [13:14:19.557] } [13:14:19.557] { [13:14:19.557] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:19.557] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:19.557] ...future.FUN(...future.X_jj, ...) [13:14:19.557] }) [13:14:19.557] } [13:14:19.557] }, args = future.call.arguments) [13:14:19.557] } [13:14:19.557] Tweak future expression to call with '...' arguments ... DONE [13:14:19.557] - globals: [11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:19.558] - packages: [1] 'future.apply' [13:14:19.558] getGlobalsAndPackages() ... DONE [13:14:19.558] run() for 'Future' ... [13:14:19.558] - state: 'created' [13:14:19.558] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:14:19.568] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:14:19.569] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:14:19.569] - Field: 'node' [13:14:19.569] - Field: 'label' [13:14:19.569] - Field: 'local' [13:14:19.569] - Field: 'owner' [13:14:19.569] - Field: 'envir' [13:14:19.569] - Field: 'workers' [13:14:19.569] - Field: 'packages' [13:14:19.570] - Field: 'gc' [13:14:19.570] - Field: 'conditions' [13:14:19.570] - Field: 'persistent' [13:14:19.570] - Field: 'expr' [13:14:19.570] - Field: 'uuid' [13:14:19.570] - Field: 'seed' [13:14:19.570] - Field: 'version' [13:14:19.570] - Field: 'result' [13:14:19.571] - Field: 'asynchronous' [13:14:19.571] - Field: 'calls' [13:14:19.571] - Field: 'globals' [13:14:19.571] - Field: 'stdout' [13:14:19.571] - Field: 'earlySignal' [13:14:19.571] - Field: 'lazy' [13:14:19.571] - Field: 'state' [13:14:19.571] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:14:19.572] - Launch lazy future ... [13:14:19.572] Packages needed by the future expression (n = 1): 'future.apply' [13:14:19.572] Packages needed by future strategies (n = 0): [13:14:19.573] { [13:14:19.573] { [13:14:19.573] { [13:14:19.573] ...future.startTime <- base::Sys.time() [13:14:19.573] { [13:14:19.573] { [13:14:19.573] { [13:14:19.573] { [13:14:19.573] { [13:14:19.573] base::local({ [13:14:19.573] has_future <- base::requireNamespace("future", [13:14:19.573] quietly = TRUE) [13:14:19.573] if (has_future) { [13:14:19.573] ns <- base::getNamespace("future") [13:14:19.573] version <- ns[[".package"]][["version"]] [13:14:19.573] if (is.null(version)) [13:14:19.573] version <- utils::packageVersion("future") [13:14:19.573] } [13:14:19.573] else { [13:14:19.573] version <- NULL [13:14:19.573] } [13:14:19.573] if (!has_future || version < "1.8.0") { [13:14:19.573] info <- base::c(r_version = base::gsub("R version ", [13:14:19.573] "", base::R.version$version.string), [13:14:19.573] platform = base::sprintf("%s (%s-bit)", [13:14:19.573] base::R.version$platform, 8 * [13:14:19.573] base::.Machine$sizeof.pointer), [13:14:19.573] os = base::paste(base::Sys.info()[base::c("sysname", [13:14:19.573] "release", "version")], collapse = " "), [13:14:19.573] hostname = base::Sys.info()[["nodename"]]) [13:14:19.573] info <- base::sprintf("%s: %s", base::names(info), [13:14:19.573] info) [13:14:19.573] info <- base::paste(info, collapse = "; ") [13:14:19.573] if (!has_future) { [13:14:19.573] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:14:19.573] info) [13:14:19.573] } [13:14:19.573] else { [13:14:19.573] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:14:19.573] info, version) [13:14:19.573] } [13:14:19.573] base::stop(msg) [13:14:19.573] } [13:14:19.573] }) [13:14:19.573] } [13:14:19.573] ...future.mc.cores.old <- base::getOption("mc.cores") [13:14:19.573] base::options(mc.cores = 1L) [13:14:19.573] } [13:14:19.573] base::local({ [13:14:19.573] for (pkg in "future.apply") { [13:14:19.573] base::loadNamespace(pkg) [13:14:19.573] base::library(pkg, character.only = TRUE) [13:14:19.573] } [13:14:19.573] }) [13:14:19.573] } [13:14:19.573] options(future.plan = NULL) [13:14:19.573] Sys.unsetenv("R_FUTURE_PLAN") [13:14:19.573] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:14:19.573] } [13:14:19.573] ...future.workdir <- getwd() [13:14:19.573] } [13:14:19.573] ...future.oldOptions <- base::as.list(base::.Options) [13:14:19.573] ...future.oldEnvVars <- base::Sys.getenv() [13:14:19.573] } [13:14:19.573] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:14:19.573] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:14:19.573] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:14:19.573] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:14:19.573] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:14:19.573] future.stdout.windows.reencode = NULL, width = 80L) [13:14:19.573] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:14:19.573] base::names(...future.oldOptions)) [13:14:19.573] } [13:14:19.573] if (FALSE) { [13:14:19.573] } [13:14:19.573] else { [13:14:19.573] if (TRUE) { [13:14:19.573] ...future.stdout <- base::rawConnection(base::raw(0L), [13:14:19.573] open = "w") [13:14:19.573] } [13:14:19.573] else { [13:14:19.573] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:14:19.573] windows = "NUL", "/dev/null"), open = "w") [13:14:19.573] } [13:14:19.573] base::sink(...future.stdout, type = "output", split = FALSE) [13:14:19.573] base::on.exit(if (!base::is.null(...future.stdout)) { [13:14:19.573] base::sink(type = "output", split = FALSE) [13:14:19.573] base::close(...future.stdout) [13:14:19.573] }, add = TRUE) [13:14:19.573] } [13:14:19.573] ...future.frame <- base::sys.nframe() [13:14:19.573] ...future.conditions <- base::list() [13:14:19.573] ...future.rng <- base::globalenv()$.Random.seed [13:14:19.573] if (FALSE) { [13:14:19.573] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:14:19.573] "...future.value", "...future.globalenv.names", ".Random.seed") [13:14:19.573] } [13:14:19.573] ...future.result <- base::tryCatch({ [13:14:19.573] base::withCallingHandlers({ [13:14:19.573] ...future.value <- base::withVisible(base::local({ [13:14:19.573] ...future.makeSendCondition <- local({ [13:14:19.573] sendCondition <- NULL [13:14:19.573] function(frame = 1L) { [13:14:19.573] if (is.function(sendCondition)) [13:14:19.573] return(sendCondition) [13:14:19.573] ns <- getNamespace("parallel") [13:14:19.573] if (exists("sendData", mode = "function", [13:14:19.573] envir = ns)) { [13:14:19.573] parallel_sendData <- get("sendData", mode = "function", [13:14:19.573] envir = ns) [13:14:19.573] envir <- sys.frame(frame) [13:14:19.573] master <- NULL [13:14:19.573] while (!identical(envir, .GlobalEnv) && [13:14:19.573] !identical(envir, emptyenv())) { [13:14:19.573] if (exists("master", mode = "list", envir = envir, [13:14:19.573] inherits = FALSE)) { [13:14:19.573] master <- get("master", mode = "list", [13:14:19.573] envir = envir, inherits = FALSE) [13:14:19.573] if (inherits(master, c("SOCKnode", [13:14:19.573] "SOCK0node"))) { [13:14:19.573] sendCondition <<- function(cond) { [13:14:19.573] data <- list(type = "VALUE", value = cond, [13:14:19.573] success = TRUE) [13:14:19.573] parallel_sendData(master, data) [13:14:19.573] } [13:14:19.573] return(sendCondition) [13:14:19.573] } [13:14:19.573] } [13:14:19.573] frame <- frame + 1L [13:14:19.573] envir <- sys.frame(frame) [13:14:19.573] } [13:14:19.573] } [13:14:19.573] sendCondition <<- function(cond) NULL [13:14:19.573] } [13:14:19.573] }) [13:14:19.573] withCallingHandlers({ [13:14:19.573] { [13:14:19.573] do.call(function(...) { [13:14:19.573] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:19.573] if (!identical(...future.globals.maxSize.org, [13:14:19.573] ...future.globals.maxSize)) { [13:14:19.573] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:19.573] on.exit(options(oopts), add = TRUE) [13:14:19.573] } [13:14:19.573] { [13:14:19.573] lapply(seq_along(...future.elements_ii), [13:14:19.573] FUN = function(jj) { [13:14:19.573] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:19.573] ...future.FUN(...future.X_jj, ...) [13:14:19.573] }) [13:14:19.573] } [13:14:19.573] }, args = future.call.arguments) [13:14:19.573] } [13:14:19.573] }, immediateCondition = function(cond) { [13:14:19.573] sendCondition <- ...future.makeSendCondition() [13:14:19.573] sendCondition(cond) [13:14:19.573] muffleCondition <- function (cond, pattern = "^muffle") [13:14:19.573] { [13:14:19.573] inherits <- base::inherits [13:14:19.573] invokeRestart <- base::invokeRestart [13:14:19.573] is.null <- base::is.null [13:14:19.573] muffled <- FALSE [13:14:19.573] if (inherits(cond, "message")) { [13:14:19.573] muffled <- grepl(pattern, "muffleMessage") [13:14:19.573] if (muffled) [13:14:19.573] invokeRestart("muffleMessage") [13:14:19.573] } [13:14:19.573] else if (inherits(cond, "warning")) { [13:14:19.573] muffled <- grepl(pattern, "muffleWarning") [13:14:19.573] if (muffled) [13:14:19.573] invokeRestart("muffleWarning") [13:14:19.573] } [13:14:19.573] else if (inherits(cond, "condition")) { [13:14:19.573] if (!is.null(pattern)) { [13:14:19.573] computeRestarts <- base::computeRestarts [13:14:19.573] grepl <- base::grepl [13:14:19.573] restarts <- computeRestarts(cond) [13:14:19.573] for (restart in restarts) { [13:14:19.573] name <- restart$name [13:14:19.573] if (is.null(name)) [13:14:19.573] next [13:14:19.573] if (!grepl(pattern, name)) [13:14:19.573] next [13:14:19.573] invokeRestart(restart) [13:14:19.573] muffled <- TRUE [13:14:19.573] break [13:14:19.573] } [13:14:19.573] } [13:14:19.573] } [13:14:19.573] invisible(muffled) [13:14:19.573] } [13:14:19.573] muffleCondition(cond) [13:14:19.573] }) [13:14:19.573] })) [13:14:19.573] future::FutureResult(value = ...future.value$value, [13:14:19.573] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:14:19.573] ...future.rng), globalenv = if (FALSE) [13:14:19.573] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:14:19.573] ...future.globalenv.names)) [13:14:19.573] else NULL, started = ...future.startTime, version = "1.8") [13:14:19.573] }, condition = base::local({ [13:14:19.573] c <- base::c [13:14:19.573] inherits <- base::inherits [13:14:19.573] invokeRestart <- base::invokeRestart [13:14:19.573] length <- base::length [13:14:19.573] list <- base::list [13:14:19.573] seq.int <- base::seq.int [13:14:19.573] signalCondition <- base::signalCondition [13:14:19.573] sys.calls <- base::sys.calls [13:14:19.573] `[[` <- base::`[[` [13:14:19.573] `+` <- base::`+` [13:14:19.573] `<<-` <- base::`<<-` [13:14:19.573] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:14:19.573] calls[seq.int(from = from + 12L, to = length(calls) - [13:14:19.573] 3L)] [13:14:19.573] } [13:14:19.573] function(cond) { [13:14:19.573] is_error <- inherits(cond, "error") [13:14:19.573] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:14:19.573] NULL) [13:14:19.573] if (is_error) { [13:14:19.573] sessionInformation <- function() { [13:14:19.573] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:14:19.573] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:14:19.573] search = base::search(), system = base::Sys.info()) [13:14:19.573] } [13:14:19.573] ...future.conditions[[length(...future.conditions) + [13:14:19.573] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:14:19.573] cond$call), session = sessionInformation(), [13:14:19.573] timestamp = base::Sys.time(), signaled = 0L) [13:14:19.573] signalCondition(cond) [13:14:19.573] } [13:14:19.573] else if (!ignore && TRUE && inherits(cond, c("condition", [13:14:19.573] "immediateCondition"))) { [13:14:19.573] signal <- TRUE && inherits(cond, "immediateCondition") [13:14:19.573] ...future.conditions[[length(...future.conditions) + [13:14:19.573] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:14:19.573] if (TRUE && !signal) { [13:14:19.573] muffleCondition <- function (cond, pattern = "^muffle") [13:14:19.573] { [13:14:19.573] inherits <- base::inherits [13:14:19.573] invokeRestart <- base::invokeRestart [13:14:19.573] is.null <- base::is.null [13:14:19.573] muffled <- FALSE [13:14:19.573] if (inherits(cond, "message")) { [13:14:19.573] muffled <- grepl(pattern, "muffleMessage") [13:14:19.573] if (muffled) [13:14:19.573] invokeRestart("muffleMessage") [13:14:19.573] } [13:14:19.573] else if (inherits(cond, "warning")) { [13:14:19.573] muffled <- grepl(pattern, "muffleWarning") [13:14:19.573] if (muffled) [13:14:19.573] invokeRestart("muffleWarning") [13:14:19.573] } [13:14:19.573] else if (inherits(cond, "condition")) { [13:14:19.573] if (!is.null(pattern)) { [13:14:19.573] computeRestarts <- base::computeRestarts [13:14:19.573] grepl <- base::grepl [13:14:19.573] restarts <- computeRestarts(cond) [13:14:19.573] for (restart in restarts) { [13:14:19.573] name <- restart$name [13:14:19.573] if (is.null(name)) [13:14:19.573] next [13:14:19.573] if (!grepl(pattern, name)) [13:14:19.573] next [13:14:19.573] invokeRestart(restart) [13:14:19.573] muffled <- TRUE [13:14:19.573] break [13:14:19.573] } [13:14:19.573] } [13:14:19.573] } [13:14:19.573] invisible(muffled) [13:14:19.573] } [13:14:19.573] muffleCondition(cond, pattern = "^muffle") [13:14:19.573] } [13:14:19.573] } [13:14:19.573] else { [13:14:19.573] if (TRUE) { [13:14:19.573] muffleCondition <- function (cond, pattern = "^muffle") [13:14:19.573] { [13:14:19.573] inherits <- base::inherits [13:14:19.573] invokeRestart <- base::invokeRestart [13:14:19.573] is.null <- base::is.null [13:14:19.573] muffled <- FALSE [13:14:19.573] if (inherits(cond, "message")) { [13:14:19.573] muffled <- grepl(pattern, "muffleMessage") [13:14:19.573] if (muffled) [13:14:19.573] invokeRestart("muffleMessage") [13:14:19.573] } [13:14:19.573] else if (inherits(cond, "warning")) { [13:14:19.573] muffled <- grepl(pattern, "muffleWarning") [13:14:19.573] if (muffled) [13:14:19.573] invokeRestart("muffleWarning") [13:14:19.573] } [13:14:19.573] else if (inherits(cond, "condition")) { [13:14:19.573] if (!is.null(pattern)) { [13:14:19.573] computeRestarts <- base::computeRestarts [13:14:19.573] grepl <- base::grepl [13:14:19.573] restarts <- computeRestarts(cond) [13:14:19.573] for (restart in restarts) { [13:14:19.573] name <- restart$name [13:14:19.573] if (is.null(name)) [13:14:19.573] next [13:14:19.573] if (!grepl(pattern, name)) [13:14:19.573] next [13:14:19.573] invokeRestart(restart) [13:14:19.573] muffled <- TRUE [13:14:19.573] break [13:14:19.573] } [13:14:19.573] } [13:14:19.573] } [13:14:19.573] invisible(muffled) [13:14:19.573] } [13:14:19.573] muffleCondition(cond, pattern = "^muffle") [13:14:19.573] } [13:14:19.573] } [13:14:19.573] } [13:14:19.573] })) [13:14:19.573] }, error = function(ex) { [13:14:19.573] base::structure(base::list(value = NULL, visible = NULL, [13:14:19.573] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:14:19.573] ...future.rng), started = ...future.startTime, [13:14:19.573] finished = Sys.time(), session_uuid = NA_character_, [13:14:19.573] version = "1.8"), class = "FutureResult") [13:14:19.573] }, finally = { [13:14:19.573] if (!identical(...future.workdir, getwd())) [13:14:19.573] setwd(...future.workdir) [13:14:19.573] { [13:14:19.573] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:14:19.573] ...future.oldOptions$nwarnings <- NULL [13:14:19.573] } [13:14:19.573] base::options(...future.oldOptions) [13:14:19.573] if (.Platform$OS.type == "windows") { [13:14:19.573] old_names <- names(...future.oldEnvVars) [13:14:19.573] envs <- base::Sys.getenv() [13:14:19.573] names <- names(envs) [13:14:19.573] common <- intersect(names, old_names) [13:14:19.573] added <- setdiff(names, old_names) [13:14:19.573] removed <- setdiff(old_names, names) [13:14:19.573] changed <- common[...future.oldEnvVars[common] != [13:14:19.573] envs[common]] [13:14:19.573] NAMES <- toupper(changed) [13:14:19.573] args <- list() [13:14:19.573] for (kk in seq_along(NAMES)) { [13:14:19.573] name <- changed[[kk]] [13:14:19.573] NAME <- NAMES[[kk]] [13:14:19.573] if (name != NAME && is.element(NAME, old_names)) [13:14:19.573] next [13:14:19.573] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:19.573] } [13:14:19.573] NAMES <- toupper(added) [13:14:19.573] for (kk in seq_along(NAMES)) { [13:14:19.573] name <- added[[kk]] [13:14:19.573] NAME <- NAMES[[kk]] [13:14:19.573] if (name != NAME && is.element(NAME, old_names)) [13:14:19.573] next [13:14:19.573] args[[name]] <- "" [13:14:19.573] } [13:14:19.573] NAMES <- toupper(removed) [13:14:19.573] for (kk in seq_along(NAMES)) { [13:14:19.573] name <- removed[[kk]] [13:14:19.573] NAME <- NAMES[[kk]] [13:14:19.573] if (name != NAME && is.element(NAME, old_names)) [13:14:19.573] next [13:14:19.573] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:19.573] } [13:14:19.573] if (length(args) > 0) [13:14:19.573] base::do.call(base::Sys.setenv, args = args) [13:14:19.573] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:14:19.573] } [13:14:19.573] else { [13:14:19.573] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:14:19.573] } [13:14:19.573] { [13:14:19.573] if (base::length(...future.futureOptionsAdded) > [13:14:19.573] 0L) { [13:14:19.573] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:14:19.573] base::names(opts) <- ...future.futureOptionsAdded [13:14:19.573] base::options(opts) [13:14:19.573] } [13:14:19.573] { [13:14:19.573] { [13:14:19.573] base::options(mc.cores = ...future.mc.cores.old) [13:14:19.573] NULL [13:14:19.573] } [13:14:19.573] options(future.plan = NULL) [13:14:19.573] if (is.na(NA_character_)) [13:14:19.573] Sys.unsetenv("R_FUTURE_PLAN") [13:14:19.573] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:14:19.573] future::plan(list(function (..., workers = availableCores(), [13:14:19.573] lazy = FALSE, rscript_libs = .libPaths(), [13:14:19.573] envir = parent.frame()) [13:14:19.573] { [13:14:19.573] if (is.function(workers)) [13:14:19.573] workers <- workers() [13:14:19.573] workers <- structure(as.integer(workers), [13:14:19.573] class = class(workers)) [13:14:19.573] stop_if_not(length(workers) == 1, is.finite(workers), [13:14:19.573] workers >= 1) [13:14:19.573] if (workers == 1L && !inherits(workers, "AsIs")) { [13:14:19.573] return(sequential(..., lazy = TRUE, envir = envir)) [13:14:19.573] } [13:14:19.573] future <- MultisessionFuture(..., workers = workers, [13:14:19.573] lazy = lazy, rscript_libs = rscript_libs, [13:14:19.573] envir = envir) [13:14:19.573] if (!future$lazy) [13:14:19.573] future <- run(future) [13:14:19.573] invisible(future) [13:14:19.573] }), .cleanup = FALSE, .init = FALSE) [13:14:19.573] } [13:14:19.573] } [13:14:19.573] } [13:14:19.573] }) [13:14:19.573] if (TRUE) { [13:14:19.573] base::sink(type = "output", split = FALSE) [13:14:19.573] if (TRUE) { [13:14:19.573] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:14:19.573] } [13:14:19.573] else { [13:14:19.573] ...future.result["stdout"] <- base::list(NULL) [13:14:19.573] } [13:14:19.573] base::close(...future.stdout) [13:14:19.573] ...future.stdout <- NULL [13:14:19.573] } [13:14:19.573] ...future.result$conditions <- ...future.conditions [13:14:19.573] ...future.result$finished <- base::Sys.time() [13:14:19.573] ...future.result [13:14:19.573] } [13:14:19.577] Exporting 11 global objects (91.99 KiB) to cluster node #1 ... [13:14:19.577] Exporting '...future.FUN' (21.22 KiB) to cluster node #1 ... [13:14:19.577] Exporting '...future.FUN' (21.22 KiB) to cluster node #1 ... DONE [13:14:19.577] Exporting 'x_FUN' (56 bytes) to cluster node #1 ... [13:14:19.578] Exporting 'x_FUN' (56 bytes) to cluster node #1 ... DONE [13:14:19.578] Exporting 'times' (56 bytes) to cluster node #1 ... [13:14:19.578] Exporting 'times' (56 bytes) to cluster node #1 ... DONE [13:14:19.578] Exporting 'stopf' (26.43 KiB) to cluster node #1 ... [13:14:19.578] Exporting 'stopf' (26.43 KiB) to cluster node #1 ... DONE [13:14:19.579] Exporting 'stop_if_not' (44.12 KiB) to cluster node #1 ... [13:14:19.579] Exporting 'stop_if_not' (44.12 KiB) to cluster node #1 ... DONE [13:14:19.579] Exporting 'dim' (0 bytes) to cluster node #1 ... [13:14:19.579] Exporting 'dim' (0 bytes) to cluster node #1 ... DONE [13:14:19.580] Exporting 'valid_types' (112 bytes) to cluster node #1 ... [13:14:19.580] Exporting 'valid_types' (112 bytes) to cluster node #1 ... DONE [13:14:19.580] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... [13:14:19.580] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... DONE [13:14:19.581] Exporting '...future.elements_ii' (1.78 KiB) to cluster node #1 ... [13:14:19.581] Exporting '...future.elements_ii' (1.78 KiB) to cluster node #1 ... DONE [13:14:19.581] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:14:19.581] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:14:19.581] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:14:19.582] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:14:19.582] Exporting 11 global objects (91.99 KiB) to cluster node #1 ... DONE [13:14:19.582] MultisessionFuture started [13:14:19.582] - Launch lazy future ... done [13:14:19.583] run() for 'MultisessionFuture' ... done [13:14:19.583] Created future: [13:14:19.600] receiveMessageFromWorker() for ClusterFuture ... [13:14:19.600] - Validating connection of MultisessionFuture [13:14:19.601] - received message: FutureResult [13:14:19.601] - Received FutureResult [13:14:19.601] - Erased future from FutureRegistry [13:14:19.601] result() for ClusterFuture ... [13:14:19.601] - result already collected: FutureResult [13:14:19.601] result() for ClusterFuture ... done [13:14:19.602] receiveMessageFromWorker() for ClusterFuture ... done [13:14:19.583] MultisessionFuture: [13:14:19.583] Label: 'future_vapply-1' [13:14:19.583] Expression: [13:14:19.583] { [13:14:19.583] do.call(function(...) { [13:14:19.583] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:19.583] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:19.583] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:19.583] on.exit(options(oopts), add = TRUE) [13:14:19.583] } [13:14:19.583] { [13:14:19.583] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:19.583] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:19.583] ...future.FUN(...future.X_jj, ...) [13:14:19.583] }) [13:14:19.583] } [13:14:19.583] }, args = future.call.arguments) [13:14:19.583] } [13:14:19.583] Lazy evaluation: FALSE [13:14:19.583] Asynchronous evaluation: TRUE [13:14:19.583] Local evaluation: TRUE [13:14:19.583] Environment: R_GlobalEnv [13:14:19.583] Capture standard output: TRUE [13:14:19.583] Capture condition classes: 'condition' (excluding 'nothing') [13:14:19.583] Globals: 11 objects totaling 93.77 KiB (function '...future.FUN' of 21.22 KiB, function 'x_FUN' of 56 bytes, integer 'times' of 56 bytes, function 'stopf' of 26.43 KiB, function 'stop_if_not' of 44.12 KiB, ...) [13:14:19.583] Packages: 1 packages ('future.apply') [13:14:19.583] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:14:19.583] Resolved: TRUE [13:14:19.583] Value: [13:14:19.583] Conditions captured: [13:14:19.583] Early signaling: FALSE [13:14:19.583] Owner process: 1bb7d580-628d-c90d-e38a-66de485868c4 [13:14:19.583] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:14:19.602] Chunk #1 of 2 ... DONE [13:14:19.602] Chunk #2 of 2 ... [13:14:19.602] - Finding globals in 'X' for chunk #2 ... [13:14:19.602] getGlobalsAndPackages() ... [13:14:19.602] Searching for globals... [13:14:19.603] [13:14:19.603] Searching for globals ... DONE [13:14:19.603] - globals: [0] [13:14:19.603] getGlobalsAndPackages() ... DONE [13:14:19.603] + additional globals found: [n=0] [13:14:19.603] + additional namespaces needed: [n=0] [13:14:19.603] - Finding globals in 'X' for chunk #2 ... DONE [13:14:19.603] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:14:19.604] - seeds: [13:14:19.604] - All globals exported: [n=11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:19.604] getGlobalsAndPackages() ... [13:14:19.604] - globals passed as-is: [11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:19.604] Resolving globals: FALSE [13:14:19.604] Tweak future expression to call with '...' arguments ... [13:14:19.604] { [13:14:19.604] do.call(function(...) { [13:14:19.604] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:19.604] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:19.604] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:19.604] on.exit(options(oopts), add = TRUE) [13:14:19.604] } [13:14:19.604] { [13:14:19.604] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:19.604] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:19.604] ...future.FUN(...future.X_jj, ...) [13:14:19.604] }) [13:14:19.604] } [13:14:19.604] }, args = future.call.arguments) [13:14:19.604] } [13:14:19.605] Tweak future expression to call with '...' arguments ... DONE [13:14:19.605] - globals: [11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:19.605] - packages: [1] 'future.apply' [13:14:19.605] getGlobalsAndPackages() ... DONE [13:14:19.606] run() for 'Future' ... [13:14:19.606] - state: 'created' [13:14:19.606] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:14:19.616] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:14:19.616] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:14:19.616] - Field: 'node' [13:14:19.616] - Field: 'label' [13:14:19.616] - Field: 'local' [13:14:19.617] - Field: 'owner' [13:14:19.617] - Field: 'envir' [13:14:19.617] - Field: 'workers' [13:14:19.617] - Field: 'packages' [13:14:19.617] - Field: 'gc' [13:14:19.617] - Field: 'conditions' [13:14:19.617] - Field: 'persistent' [13:14:19.617] - Field: 'expr' [13:14:19.618] - Field: 'uuid' [13:14:19.618] - Field: 'seed' [13:14:19.618] - Field: 'version' [13:14:19.618] - Field: 'result' [13:14:19.618] - Field: 'asynchronous' [13:14:19.618] - Field: 'calls' [13:14:19.618] - Field: 'globals' [13:14:19.618] - Field: 'stdout' [13:14:19.619] - Field: 'earlySignal' [13:14:19.619] - Field: 'lazy' [13:14:19.619] - Field: 'state' [13:14:19.619] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:14:19.619] - Launch lazy future ... [13:14:19.619] Packages needed by the future expression (n = 1): 'future.apply' [13:14:19.620] Packages needed by future strategies (n = 0): [13:14:19.620] { [13:14:19.620] { [13:14:19.620] { [13:14:19.620] ...future.startTime <- base::Sys.time() [13:14:19.620] { [13:14:19.620] { [13:14:19.620] { [13:14:19.620] { [13:14:19.620] { [13:14:19.620] base::local({ [13:14:19.620] has_future <- base::requireNamespace("future", [13:14:19.620] quietly = TRUE) [13:14:19.620] if (has_future) { [13:14:19.620] ns <- base::getNamespace("future") [13:14:19.620] version <- ns[[".package"]][["version"]] [13:14:19.620] if (is.null(version)) [13:14:19.620] version <- utils::packageVersion("future") [13:14:19.620] } [13:14:19.620] else { [13:14:19.620] version <- NULL [13:14:19.620] } [13:14:19.620] if (!has_future || version < "1.8.0") { [13:14:19.620] info <- base::c(r_version = base::gsub("R version ", [13:14:19.620] "", base::R.version$version.string), [13:14:19.620] platform = base::sprintf("%s (%s-bit)", [13:14:19.620] base::R.version$platform, 8 * [13:14:19.620] base::.Machine$sizeof.pointer), [13:14:19.620] os = base::paste(base::Sys.info()[base::c("sysname", [13:14:19.620] "release", "version")], collapse = " "), [13:14:19.620] hostname = base::Sys.info()[["nodename"]]) [13:14:19.620] info <- base::sprintf("%s: %s", base::names(info), [13:14:19.620] info) [13:14:19.620] info <- base::paste(info, collapse = "; ") [13:14:19.620] if (!has_future) { [13:14:19.620] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:14:19.620] info) [13:14:19.620] } [13:14:19.620] else { [13:14:19.620] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:14:19.620] info, version) [13:14:19.620] } [13:14:19.620] base::stop(msg) [13:14:19.620] } [13:14:19.620] }) [13:14:19.620] } [13:14:19.620] ...future.mc.cores.old <- base::getOption("mc.cores") [13:14:19.620] base::options(mc.cores = 1L) [13:14:19.620] } [13:14:19.620] base::local({ [13:14:19.620] for (pkg in "future.apply") { [13:14:19.620] base::loadNamespace(pkg) [13:14:19.620] base::library(pkg, character.only = TRUE) [13:14:19.620] } [13:14:19.620] }) [13:14:19.620] } [13:14:19.620] options(future.plan = NULL) [13:14:19.620] Sys.unsetenv("R_FUTURE_PLAN") [13:14:19.620] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:14:19.620] } [13:14:19.620] ...future.workdir <- getwd() [13:14:19.620] } [13:14:19.620] ...future.oldOptions <- base::as.list(base::.Options) [13:14:19.620] ...future.oldEnvVars <- base::Sys.getenv() [13:14:19.620] } [13:14:19.620] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:14:19.620] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:14:19.620] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:14:19.620] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:14:19.620] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:14:19.620] future.stdout.windows.reencode = NULL, width = 80L) [13:14:19.620] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:14:19.620] base::names(...future.oldOptions)) [13:14:19.620] } [13:14:19.620] if (FALSE) { [13:14:19.620] } [13:14:19.620] else { [13:14:19.620] if (TRUE) { [13:14:19.620] ...future.stdout <- base::rawConnection(base::raw(0L), [13:14:19.620] open = "w") [13:14:19.620] } [13:14:19.620] else { [13:14:19.620] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:14:19.620] windows = "NUL", "/dev/null"), open = "w") [13:14:19.620] } [13:14:19.620] base::sink(...future.stdout, type = "output", split = FALSE) [13:14:19.620] base::on.exit(if (!base::is.null(...future.stdout)) { [13:14:19.620] base::sink(type = "output", split = FALSE) [13:14:19.620] base::close(...future.stdout) [13:14:19.620] }, add = TRUE) [13:14:19.620] } [13:14:19.620] ...future.frame <- base::sys.nframe() [13:14:19.620] ...future.conditions <- base::list() [13:14:19.620] ...future.rng <- base::globalenv()$.Random.seed [13:14:19.620] if (FALSE) { [13:14:19.620] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:14:19.620] "...future.value", "...future.globalenv.names", ".Random.seed") [13:14:19.620] } [13:14:19.620] ...future.result <- base::tryCatch({ [13:14:19.620] base::withCallingHandlers({ [13:14:19.620] ...future.value <- base::withVisible(base::local({ [13:14:19.620] ...future.makeSendCondition <- local({ [13:14:19.620] sendCondition <- NULL [13:14:19.620] function(frame = 1L) { [13:14:19.620] if (is.function(sendCondition)) [13:14:19.620] return(sendCondition) [13:14:19.620] ns <- getNamespace("parallel") [13:14:19.620] if (exists("sendData", mode = "function", [13:14:19.620] envir = ns)) { [13:14:19.620] parallel_sendData <- get("sendData", mode = "function", [13:14:19.620] envir = ns) [13:14:19.620] envir <- sys.frame(frame) [13:14:19.620] master <- NULL [13:14:19.620] while (!identical(envir, .GlobalEnv) && [13:14:19.620] !identical(envir, emptyenv())) { [13:14:19.620] if (exists("master", mode = "list", envir = envir, [13:14:19.620] inherits = FALSE)) { [13:14:19.620] master <- get("master", mode = "list", [13:14:19.620] envir = envir, inherits = FALSE) [13:14:19.620] if (inherits(master, c("SOCKnode", [13:14:19.620] "SOCK0node"))) { [13:14:19.620] sendCondition <<- function(cond) { [13:14:19.620] data <- list(type = "VALUE", value = cond, [13:14:19.620] success = TRUE) [13:14:19.620] parallel_sendData(master, data) [13:14:19.620] } [13:14:19.620] return(sendCondition) [13:14:19.620] } [13:14:19.620] } [13:14:19.620] frame <- frame + 1L [13:14:19.620] envir <- sys.frame(frame) [13:14:19.620] } [13:14:19.620] } [13:14:19.620] sendCondition <<- function(cond) NULL [13:14:19.620] } [13:14:19.620] }) [13:14:19.620] withCallingHandlers({ [13:14:19.620] { [13:14:19.620] do.call(function(...) { [13:14:19.620] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:19.620] if (!identical(...future.globals.maxSize.org, [13:14:19.620] ...future.globals.maxSize)) { [13:14:19.620] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:19.620] on.exit(options(oopts), add = TRUE) [13:14:19.620] } [13:14:19.620] { [13:14:19.620] lapply(seq_along(...future.elements_ii), [13:14:19.620] FUN = function(jj) { [13:14:19.620] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:19.620] ...future.FUN(...future.X_jj, ...) [13:14:19.620] }) [13:14:19.620] } [13:14:19.620] }, args = future.call.arguments) [13:14:19.620] } [13:14:19.620] }, immediateCondition = function(cond) { [13:14:19.620] sendCondition <- ...future.makeSendCondition() [13:14:19.620] sendCondition(cond) [13:14:19.620] muffleCondition <- function (cond, pattern = "^muffle") [13:14:19.620] { [13:14:19.620] inherits <- base::inherits [13:14:19.620] invokeRestart <- base::invokeRestart [13:14:19.620] is.null <- base::is.null [13:14:19.620] muffled <- FALSE [13:14:19.620] if (inherits(cond, "message")) { [13:14:19.620] muffled <- grepl(pattern, "muffleMessage") [13:14:19.620] if (muffled) [13:14:19.620] invokeRestart("muffleMessage") [13:14:19.620] } [13:14:19.620] else if (inherits(cond, "warning")) { [13:14:19.620] muffled <- grepl(pattern, "muffleWarning") [13:14:19.620] if (muffled) [13:14:19.620] invokeRestart("muffleWarning") [13:14:19.620] } [13:14:19.620] else if (inherits(cond, "condition")) { [13:14:19.620] if (!is.null(pattern)) { [13:14:19.620] computeRestarts <- base::computeRestarts [13:14:19.620] grepl <- base::grepl [13:14:19.620] restarts <- computeRestarts(cond) [13:14:19.620] for (restart in restarts) { [13:14:19.620] name <- restart$name [13:14:19.620] if (is.null(name)) [13:14:19.620] next [13:14:19.620] if (!grepl(pattern, name)) [13:14:19.620] next [13:14:19.620] invokeRestart(restart) [13:14:19.620] muffled <- TRUE [13:14:19.620] break [13:14:19.620] } [13:14:19.620] } [13:14:19.620] } [13:14:19.620] invisible(muffled) [13:14:19.620] } [13:14:19.620] muffleCondition(cond) [13:14:19.620] }) [13:14:19.620] })) [13:14:19.620] future::FutureResult(value = ...future.value$value, [13:14:19.620] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:14:19.620] ...future.rng), globalenv = if (FALSE) [13:14:19.620] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:14:19.620] ...future.globalenv.names)) [13:14:19.620] else NULL, started = ...future.startTime, version = "1.8") [13:14:19.620] }, condition = base::local({ [13:14:19.620] c <- base::c [13:14:19.620] inherits <- base::inherits [13:14:19.620] invokeRestart <- base::invokeRestart [13:14:19.620] length <- base::length [13:14:19.620] list <- base::list [13:14:19.620] seq.int <- base::seq.int [13:14:19.620] signalCondition <- base::signalCondition [13:14:19.620] sys.calls <- base::sys.calls [13:14:19.620] `[[` <- base::`[[` [13:14:19.620] `+` <- base::`+` [13:14:19.620] `<<-` <- base::`<<-` [13:14:19.620] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:14:19.620] calls[seq.int(from = from + 12L, to = length(calls) - [13:14:19.620] 3L)] [13:14:19.620] } [13:14:19.620] function(cond) { [13:14:19.620] is_error <- inherits(cond, "error") [13:14:19.620] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:14:19.620] NULL) [13:14:19.620] if (is_error) { [13:14:19.620] sessionInformation <- function() { [13:14:19.620] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:14:19.620] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:14:19.620] search = base::search(), system = base::Sys.info()) [13:14:19.620] } [13:14:19.620] ...future.conditions[[length(...future.conditions) + [13:14:19.620] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:14:19.620] cond$call), session = sessionInformation(), [13:14:19.620] timestamp = base::Sys.time(), signaled = 0L) [13:14:19.620] signalCondition(cond) [13:14:19.620] } [13:14:19.620] else if (!ignore && TRUE && inherits(cond, c("condition", [13:14:19.620] "immediateCondition"))) { [13:14:19.620] signal <- TRUE && inherits(cond, "immediateCondition") [13:14:19.620] ...future.conditions[[length(...future.conditions) + [13:14:19.620] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:14:19.620] if (TRUE && !signal) { [13:14:19.620] muffleCondition <- function (cond, pattern = "^muffle") [13:14:19.620] { [13:14:19.620] inherits <- base::inherits [13:14:19.620] invokeRestart <- base::invokeRestart [13:14:19.620] is.null <- base::is.null [13:14:19.620] muffled <- FALSE [13:14:19.620] if (inherits(cond, "message")) { [13:14:19.620] muffled <- grepl(pattern, "muffleMessage") [13:14:19.620] if (muffled) [13:14:19.620] invokeRestart("muffleMessage") [13:14:19.620] } [13:14:19.620] else if (inherits(cond, "warning")) { [13:14:19.620] muffled <- grepl(pattern, "muffleWarning") [13:14:19.620] if (muffled) [13:14:19.620] invokeRestart("muffleWarning") [13:14:19.620] } [13:14:19.620] else if (inherits(cond, "condition")) { [13:14:19.620] if (!is.null(pattern)) { [13:14:19.620] computeRestarts <- base::computeRestarts [13:14:19.620] grepl <- base::grepl [13:14:19.620] restarts <- computeRestarts(cond) [13:14:19.620] for (restart in restarts) { [13:14:19.620] name <- restart$name [13:14:19.620] if (is.null(name)) [13:14:19.620] next [13:14:19.620] if (!grepl(pattern, name)) [13:14:19.620] next [13:14:19.620] invokeRestart(restart) [13:14:19.620] muffled <- TRUE [13:14:19.620] break [13:14:19.620] } [13:14:19.620] } [13:14:19.620] } [13:14:19.620] invisible(muffled) [13:14:19.620] } [13:14:19.620] muffleCondition(cond, pattern = "^muffle") [13:14:19.620] } [13:14:19.620] } [13:14:19.620] else { [13:14:19.620] if (TRUE) { [13:14:19.620] muffleCondition <- function (cond, pattern = "^muffle") [13:14:19.620] { [13:14:19.620] inherits <- base::inherits [13:14:19.620] invokeRestart <- base::invokeRestart [13:14:19.620] is.null <- base::is.null [13:14:19.620] muffled <- FALSE [13:14:19.620] if (inherits(cond, "message")) { [13:14:19.620] muffled <- grepl(pattern, "muffleMessage") [13:14:19.620] if (muffled) [13:14:19.620] invokeRestart("muffleMessage") [13:14:19.620] } [13:14:19.620] else if (inherits(cond, "warning")) { [13:14:19.620] muffled <- grepl(pattern, "muffleWarning") [13:14:19.620] if (muffled) [13:14:19.620] invokeRestart("muffleWarning") [13:14:19.620] } [13:14:19.620] else if (inherits(cond, "condition")) { [13:14:19.620] if (!is.null(pattern)) { [13:14:19.620] computeRestarts <- base::computeRestarts [13:14:19.620] grepl <- base::grepl [13:14:19.620] restarts <- computeRestarts(cond) [13:14:19.620] for (restart in restarts) { [13:14:19.620] name <- restart$name [13:14:19.620] if (is.null(name)) [13:14:19.620] next [13:14:19.620] if (!grepl(pattern, name)) [13:14:19.620] next [13:14:19.620] invokeRestart(restart) [13:14:19.620] muffled <- TRUE [13:14:19.620] break [13:14:19.620] } [13:14:19.620] } [13:14:19.620] } [13:14:19.620] invisible(muffled) [13:14:19.620] } [13:14:19.620] muffleCondition(cond, pattern = "^muffle") [13:14:19.620] } [13:14:19.620] } [13:14:19.620] } [13:14:19.620] })) [13:14:19.620] }, error = function(ex) { [13:14:19.620] base::structure(base::list(value = NULL, visible = NULL, [13:14:19.620] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:14:19.620] ...future.rng), started = ...future.startTime, [13:14:19.620] finished = Sys.time(), session_uuid = NA_character_, [13:14:19.620] version = "1.8"), class = "FutureResult") [13:14:19.620] }, finally = { [13:14:19.620] if (!identical(...future.workdir, getwd())) [13:14:19.620] setwd(...future.workdir) [13:14:19.620] { [13:14:19.620] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:14:19.620] ...future.oldOptions$nwarnings <- NULL [13:14:19.620] } [13:14:19.620] base::options(...future.oldOptions) [13:14:19.620] if (.Platform$OS.type == "windows") { [13:14:19.620] old_names <- names(...future.oldEnvVars) [13:14:19.620] envs <- base::Sys.getenv() [13:14:19.620] names <- names(envs) [13:14:19.620] common <- intersect(names, old_names) [13:14:19.620] added <- setdiff(names, old_names) [13:14:19.620] removed <- setdiff(old_names, names) [13:14:19.620] changed <- common[...future.oldEnvVars[common] != [13:14:19.620] envs[common]] [13:14:19.620] NAMES <- toupper(changed) [13:14:19.620] args <- list() [13:14:19.620] for (kk in seq_along(NAMES)) { [13:14:19.620] name <- changed[[kk]] [13:14:19.620] NAME <- NAMES[[kk]] [13:14:19.620] if (name != NAME && is.element(NAME, old_names)) [13:14:19.620] next [13:14:19.620] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:19.620] } [13:14:19.620] NAMES <- toupper(added) [13:14:19.620] for (kk in seq_along(NAMES)) { [13:14:19.620] name <- added[[kk]] [13:14:19.620] NAME <- NAMES[[kk]] [13:14:19.620] if (name != NAME && is.element(NAME, old_names)) [13:14:19.620] next [13:14:19.620] args[[name]] <- "" [13:14:19.620] } [13:14:19.620] NAMES <- toupper(removed) [13:14:19.620] for (kk in seq_along(NAMES)) { [13:14:19.620] name <- removed[[kk]] [13:14:19.620] NAME <- NAMES[[kk]] [13:14:19.620] if (name != NAME && is.element(NAME, old_names)) [13:14:19.620] next [13:14:19.620] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:19.620] } [13:14:19.620] if (length(args) > 0) [13:14:19.620] base::do.call(base::Sys.setenv, args = args) [13:14:19.620] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:14:19.620] } [13:14:19.620] else { [13:14:19.620] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:14:19.620] } [13:14:19.620] { [13:14:19.620] if (base::length(...future.futureOptionsAdded) > [13:14:19.620] 0L) { [13:14:19.620] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:14:19.620] base::names(opts) <- ...future.futureOptionsAdded [13:14:19.620] base::options(opts) [13:14:19.620] } [13:14:19.620] { [13:14:19.620] { [13:14:19.620] base::options(mc.cores = ...future.mc.cores.old) [13:14:19.620] NULL [13:14:19.620] } [13:14:19.620] options(future.plan = NULL) [13:14:19.620] if (is.na(NA_character_)) [13:14:19.620] Sys.unsetenv("R_FUTURE_PLAN") [13:14:19.620] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:14:19.620] future::plan(list(function (..., workers = availableCores(), [13:14:19.620] lazy = FALSE, rscript_libs = .libPaths(), [13:14:19.620] envir = parent.frame()) [13:14:19.620] { [13:14:19.620] if (is.function(workers)) [13:14:19.620] workers <- workers() [13:14:19.620] workers <- structure(as.integer(workers), [13:14:19.620] class = class(workers)) [13:14:19.620] stop_if_not(length(workers) == 1, is.finite(workers), [13:14:19.620] workers >= 1) [13:14:19.620] if (workers == 1L && !inherits(workers, "AsIs")) { [13:14:19.620] return(sequential(..., lazy = TRUE, envir = envir)) [13:14:19.620] } [13:14:19.620] future <- MultisessionFuture(..., workers = workers, [13:14:19.620] lazy = lazy, rscript_libs = rscript_libs, [13:14:19.620] envir = envir) [13:14:19.620] if (!future$lazy) [13:14:19.620] future <- run(future) [13:14:19.620] invisible(future) [13:14:19.620] }), .cleanup = FALSE, .init = FALSE) [13:14:19.620] } [13:14:19.620] } [13:14:19.620] } [13:14:19.620] }) [13:14:19.620] if (TRUE) { [13:14:19.620] base::sink(type = "output", split = FALSE) [13:14:19.620] if (TRUE) { [13:14:19.620] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:14:19.620] } [13:14:19.620] else { [13:14:19.620] ...future.result["stdout"] <- base::list(NULL) [13:14:19.620] } [13:14:19.620] base::close(...future.stdout) [13:14:19.620] ...future.stdout <- NULL [13:14:19.620] } [13:14:19.620] ...future.result$conditions <- ...future.conditions [13:14:19.620] ...future.result$finished <- base::Sys.time() [13:14:19.620] ...future.result [13:14:19.620] } [13:14:19.624] Exporting 11 global objects (91.99 KiB) to cluster node #1 ... [13:14:19.624] Exporting '...future.FUN' (21.22 KiB) to cluster node #1 ... [13:14:19.624] Exporting '...future.FUN' (21.22 KiB) to cluster node #1 ... DONE [13:14:19.625] Exporting 'x_FUN' (56 bytes) to cluster node #1 ... [13:14:19.625] Exporting 'x_FUN' (56 bytes) to cluster node #1 ... DONE [13:14:19.625] Exporting 'times' (56 bytes) to cluster node #1 ... [13:14:19.625] Exporting 'times' (56 bytes) to cluster node #1 ... DONE [13:14:19.625] Exporting 'stopf' (26.43 KiB) to cluster node #1 ... [13:14:19.626] Exporting 'stopf' (26.43 KiB) to cluster node #1 ... DONE [13:14:19.626] Exporting 'stop_if_not' (44.12 KiB) to cluster node #1 ... [13:14:19.626] Exporting 'stop_if_not' (44.12 KiB) to cluster node #1 ... DONE [13:14:19.626] Exporting 'dim' (0 bytes) to cluster node #1 ... [13:14:19.627] Exporting 'dim' (0 bytes) to cluster node #1 ... DONE [13:14:19.627] Exporting 'valid_types' (112 bytes) to cluster node #1 ... [13:14:19.628] Exporting 'valid_types' (112 bytes) to cluster node #1 ... DONE [13:14:19.629] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... [13:14:19.629] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... DONE [13:14:19.629] Exporting '...future.elements_ii' (1.48 KiB) to cluster node #1 ... [13:14:19.629] Exporting '...future.elements_ii' (1.48 KiB) to cluster node #1 ... DONE [13:14:19.630] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:14:19.630] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:14:19.630] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:14:19.630] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:14:19.630] Exporting 11 global objects (91.99 KiB) to cluster node #1 ... DONE [13:14:19.631] MultisessionFuture started [13:14:19.631] - Launch lazy future ... done [13:14:19.631] run() for 'MultisessionFuture' ... done [13:14:19.631] Created future: [13:14:19.649] receiveMessageFromWorker() for ClusterFuture ... [13:14:19.649] - Validating connection of MultisessionFuture [13:14:19.649] - received message: FutureResult [13:14:19.649] - Received FutureResult [13:14:19.649] - Erased future from FutureRegistry [13:14:19.650] result() for ClusterFuture ... [13:14:19.650] - result already collected: FutureResult [13:14:19.650] result() for ClusterFuture ... done [13:14:19.650] receiveMessageFromWorker() for ClusterFuture ... done [13:14:19.631] MultisessionFuture: [13:14:19.631] Label: 'future_vapply-2' [13:14:19.631] Expression: [13:14:19.631] { [13:14:19.631] do.call(function(...) { [13:14:19.631] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:19.631] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:19.631] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:19.631] on.exit(options(oopts), add = TRUE) [13:14:19.631] } [13:14:19.631] { [13:14:19.631] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:19.631] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:19.631] ...future.FUN(...future.X_jj, ...) [13:14:19.631] }) [13:14:19.631] } [13:14:19.631] }, args = future.call.arguments) [13:14:19.631] } [13:14:19.631] Lazy evaluation: FALSE [13:14:19.631] Asynchronous evaluation: TRUE [13:14:19.631] Local evaluation: TRUE [13:14:19.631] Environment: R_GlobalEnv [13:14:19.631] Capture standard output: TRUE [13:14:19.631] Capture condition classes: 'condition' (excluding 'nothing') [13:14:19.631] Globals: 11 objects totaling 93.48 KiB (function '...future.FUN' of 21.22 KiB, function 'x_FUN' of 56 bytes, integer 'times' of 56 bytes, function 'stopf' of 26.43 KiB, function 'stop_if_not' of 44.12 KiB, ...) [13:14:19.631] Packages: 1 packages ('future.apply') [13:14:19.631] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:14:19.631] Resolved: TRUE [13:14:19.631] Value: [13:14:19.631] Conditions captured: [13:14:19.631] Early signaling: FALSE [13:14:19.631] Owner process: 1bb7d580-628d-c90d-e38a-66de485868c4 [13:14:19.631] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:14:19.650] Chunk #2 of 2 ... DONE [13:14:19.651] Launching 2 futures (chunks) ... DONE [13:14:19.651] Resolving 2 futures (chunks) ... [13:14:19.651] resolve() on list ... [13:14:19.651] recursive: 0 [13:14:19.651] length: 2 [13:14:19.651] [13:14:19.651] Future #1 [13:14:19.651] result() for ClusterFuture ... [13:14:19.652] - result already collected: FutureResult [13:14:19.652] result() for ClusterFuture ... done [13:14:19.652] result() for ClusterFuture ... [13:14:19.652] - result already collected: FutureResult [13:14:19.652] result() for ClusterFuture ... done [13:14:19.652] signalConditionsASAP(MultisessionFuture, pos=1) ... [13:14:19.652] - nx: 2 [13:14:19.652] - relay: TRUE [13:14:19.652] - stdout: TRUE [13:14:19.653] - signal: TRUE [13:14:19.653] - resignal: FALSE [13:14:19.653] - force: TRUE [13:14:19.653] - relayed: [n=2] FALSE, FALSE [13:14:19.653] - queued futures: [n=2] FALSE, FALSE [13:14:19.653] - until=1 [13:14:19.653] - relaying element #1 [13:14:19.653] result() for ClusterFuture ... [13:14:19.653] - result already collected: FutureResult [13:14:19.654] result() for ClusterFuture ... done [13:14:19.654] result() for ClusterFuture ... [13:14:19.654] - result already collected: FutureResult [13:14:19.654] result() for ClusterFuture ... done [13:14:19.654] result() for ClusterFuture ... [13:14:19.654] - result already collected: FutureResult [13:14:19.654] result() for ClusterFuture ... done [13:14:19.654] result() for ClusterFuture ... [13:14:19.655] - result already collected: FutureResult [13:14:19.655] result() for ClusterFuture ... done [13:14:19.655] - relayed: [n=2] TRUE, FALSE [13:14:19.655] - queued futures: [n=2] TRUE, FALSE [13:14:19.655] signalConditionsASAP(MultisessionFuture, pos=1) ... done [13:14:19.655] length: 1 (resolved future 1) [13:14:19.655] Future #2 [13:14:19.655] result() for ClusterFuture ... [13:14:19.655] - result already collected: FutureResult [13:14:19.656] result() for ClusterFuture ... done [13:14:19.656] result() for ClusterFuture ... [13:14:19.656] - result already collected: FutureResult [13:14:19.656] result() for ClusterFuture ... done [13:14:19.656] signalConditionsASAP(MultisessionFuture, pos=2) ... [13:14:19.656] - nx: 2 [13:14:19.656] - relay: TRUE [13:14:19.656] - stdout: TRUE [13:14:19.657] - signal: TRUE [13:14:19.657] - resignal: FALSE [13:14:19.657] - force: TRUE [13:14:19.657] - relayed: [n=2] TRUE, FALSE [13:14:19.657] - queued futures: [n=2] TRUE, FALSE [13:14:19.657] - until=2 [13:14:19.657] - relaying element #2 [13:14:19.657] result() for ClusterFuture ... [13:14:19.657] - result already collected: FutureResult [13:14:19.658] result() for ClusterFuture ... done [13:14:19.658] result() for ClusterFuture ... [13:14:19.658] - result already collected: FutureResult [13:14:19.658] result() for ClusterFuture ... done [13:14:19.658] result() for ClusterFuture ... [13:14:19.658] - result already collected: FutureResult [13:14:19.658] result() for ClusterFuture ... done [13:14:19.658] result() for ClusterFuture ... [13:14:19.658] - result already collected: FutureResult [13:14:19.659] result() for ClusterFuture ... done [13:14:19.659] - relayed: [n=2] TRUE, TRUE [13:14:19.659] - queued futures: [n=2] TRUE, TRUE [13:14:19.659] signalConditionsASAP(MultisessionFuture, pos=2) ... done [13:14:19.659] length: 0 (resolved future 2) [13:14:19.659] Relaying remaining futures [13:14:19.659] signalConditionsASAP(NULL, pos=0) ... [13:14:19.659] - nx: 2 [13:14:19.659] - relay: TRUE [13:14:19.660] - stdout: TRUE [13:14:19.660] - signal: TRUE [13:14:19.660] - resignal: FALSE [13:14:19.660] - force: TRUE [13:14:19.660] - relayed: [n=2] TRUE, TRUE [13:14:19.660] - queued futures: [n=2] TRUE, TRUE - flush all [13:14:19.660] - relayed: [n=2] TRUE, TRUE [13:14:19.660] - queued futures: [n=2] TRUE, TRUE [13:14:19.661] signalConditionsASAP(NULL, pos=0) ... done [13:14:19.661] resolve() on list ... DONE [13:14:19.661] result() for ClusterFuture ... [13:14:19.661] - result already collected: FutureResult [13:14:19.661] result() for ClusterFuture ... done [13:14:19.661] result() for ClusterFuture ... [13:14:19.661] - result already collected: FutureResult [13:14:19.661] result() for ClusterFuture ... done [13:14:19.661] result() for ClusterFuture ... [13:14:19.662] - result already collected: FutureResult [13:14:19.662] result() for ClusterFuture ... done [13:14:19.662] result() for ClusterFuture ... [13:14:19.662] - result already collected: FutureResult [13:14:19.662] result() for ClusterFuture ... done [13:14:19.662] - Number of value chunks collected: 2 [13:14:19.662] Resolving 2 futures (chunks) ... DONE [13:14:19.662] Reducing values from 2 chunks ... [13:14:19.663] - Number of values collected after concatenation: 11 [13:14:19.663] - Number of values expected: 11 [13:14:19.663] Reducing values from 2 chunks ... DONE [13:14:19.663] future_lapply() ... DONE Named logi [1:11] TRUE TRUE TRUE TRUE TRUE TRUE ... - attr(*, "names")= chr [1:11] "mpg" "cyl" "disp" "hp" ... - future_vapply(x, ...) where length(x) != length(as.list(x)) ... [13:14:19.664] future_lapply() ... [13:14:19.667] Number of chunks: 2 [13:14:19.667] getGlobalsAndPackagesXApply() ... [13:14:19.667] - future.globals: TRUE [13:14:19.668] getGlobalsAndPackages() ... [13:14:19.668] Searching for globals... [13:14:19.670] - globals found: [16] 'FUN', '{', '<-', 'x_FUN', 'if', '!=', 'length', 'times', 'stopf', 'stop_if_not', 'all', '==', 'dim', '%in%', 'typeof', 'valid_types' [13:14:19.671] Searching for globals ... DONE [13:14:19.671] Resolving globals: FALSE [13:14:19.672] The total size of the 7 globals is 92.05 KiB (94264 bytes) [13:14:19.672] The total size of the 7 globals exported for future expression ('FUN()') is 92.05 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). The three largest globals are 'stop_if_not' (44.12 KiB of class 'function'), 'stopf' (26.43 KiB of class 'function') and 'FUN' (21.22 KiB of class 'function') [13:14:19.672] - globals: [7] 'FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types' [13:14:19.672] - packages: [1] 'future.apply' [13:14:19.672] getGlobalsAndPackages() ... DONE [13:14:19.672] - globals found/used: [n=7] 'FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types' [13:14:19.673] - needed namespaces: [n=1] 'future.apply' [13:14:19.673] Finding globals ... DONE [13:14:19.673] - use_args: TRUE [13:14:19.673] - Getting '...' globals ... [13:14:19.673] resolve() on list ... [13:14:19.673] recursive: 0 [13:14:19.673] length: 1 [13:14:19.674] elements: '...' [13:14:19.674] length: 0 (resolved future 1) [13:14:19.674] resolve() on list ... DONE [13:14:19.674] - '...' content: [n=0] [13:14:19.674] List of 1 [13:14:19.674] $ ...: list() [13:14:19.674] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:14:19.674] - attr(*, "where")=List of 1 [13:14:19.674] ..$ ...: [13:14:19.674] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:14:19.674] - attr(*, "resolved")= logi TRUE [13:14:19.674] - attr(*, "total_size")= num NA [13:14:19.676] - Getting '...' globals ... DONE [13:14:19.677] Globals to be used in all futures (chunks): [n=8] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...' [13:14:19.677] List of 8 [13:14:19.677] $ ...future.FUN:function (x, ...) [13:14:19.677] $ x_FUN :function (x) [13:14:19.677] $ times : int 1 [13:14:19.677] $ stopf :function (fmt, ..., call. = TRUE, domain = NULL) [13:14:19.677] $ stop_if_not :function (...) [13:14:19.677] $ dim : NULL [13:14:19.677] $ valid_types : chr [1:2] "logical" "integer" [13:14:19.677] $ ... : list() [13:14:19.677] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:14:19.677] - attr(*, "where")=List of 8 [13:14:19.677] ..$ ...future.FUN: [13:14:19.677] ..$ x_FUN : [13:14:19.677] ..$ times : [13:14:19.677] ..$ stopf : [13:14:19.677] ..$ stop_if_not : [13:14:19.677] ..$ dim : [13:14:19.677] ..$ valid_types : [13:14:19.677] ..$ ... : [13:14:19.677] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:14:19.677] - attr(*, "resolved")= logi FALSE [13:14:19.677] - attr(*, "total_size")= num 94264 [13:14:19.682] Packages to be attached in all futures: [n=1] 'future.apply' [13:14:19.682] getGlobalsAndPackagesXApply() ... DONE [13:14:19.682] Number of futures (= number of chunks): 2 [13:14:19.682] Launching 2 futures (chunks) ... [13:14:19.682] Chunk #1 of 2 ... [13:14:19.682] - Finding globals in 'X' for chunk #1 ... [13:14:19.682] getGlobalsAndPackages() ... [13:14:19.682] Searching for globals... [13:14:19.683] [13:14:19.683] Searching for globals ... DONE [13:14:19.683] - globals: [0] [13:14:19.683] getGlobalsAndPackages() ... DONE [13:14:19.683] + additional globals found: [n=0] [13:14:19.683] + additional namespaces needed: [n=0] [13:14:19.683] - Finding globals in 'X' for chunk #1 ... DONE [13:14:19.684] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:14:19.684] - seeds: [13:14:19.684] - All globals exported: [n=11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:19.684] getGlobalsAndPackages() ... [13:14:19.684] - globals passed as-is: [11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:19.684] Resolving globals: FALSE [13:14:19.684] Tweak future expression to call with '...' arguments ... [13:14:19.684] { [13:14:19.684] do.call(function(...) { [13:14:19.684] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:19.684] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:19.684] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:19.684] on.exit(options(oopts), add = TRUE) [13:14:19.684] } [13:14:19.684] { [13:14:19.684] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:19.684] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:19.684] ...future.FUN(...future.X_jj, ...) [13:14:19.684] }) [13:14:19.684] } [13:14:19.684] }, args = future.call.arguments) [13:14:19.684] } [13:14:19.685] Tweak future expression to call with '...' arguments ... DONE [13:14:19.685] - globals: [11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:19.685] - packages: [1] 'future.apply' [13:14:19.686] getGlobalsAndPackages() ... DONE [13:14:19.686] run() for 'Future' ... [13:14:19.694] - state: 'created' [13:14:19.694] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:14:19.704] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:14:19.704] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:14:19.705] - Field: 'node' [13:14:19.705] - Field: 'label' [13:14:19.705] - Field: 'local' [13:14:19.705] - Field: 'owner' [13:14:19.705] - Field: 'envir' [13:14:19.705] - Field: 'workers' [13:14:19.705] - Field: 'packages' [13:14:19.705] - Field: 'gc' [13:14:19.706] - Field: 'conditions' [13:14:19.706] - Field: 'persistent' [13:14:19.706] - Field: 'expr' [13:14:19.706] - Field: 'uuid' [13:14:19.706] - Field: 'seed' [13:14:19.706] - Field: 'version' [13:14:19.706] - Field: 'result' [13:14:19.706] - Field: 'asynchronous' [13:14:19.707] - Field: 'calls' [13:14:19.707] - Field: 'globals' [13:14:19.707] - Field: 'stdout' [13:14:19.707] - Field: 'earlySignal' [13:14:19.707] - Field: 'lazy' [13:14:19.707] - Field: 'state' [13:14:19.707] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:14:19.707] - Launch lazy future ... [13:14:19.708] Packages needed by the future expression (n = 1): 'future.apply' [13:14:19.708] Packages needed by future strategies (n = 0): [13:14:19.708] { [13:14:19.708] { [13:14:19.708] { [13:14:19.708] ...future.startTime <- base::Sys.time() [13:14:19.708] { [13:14:19.708] { [13:14:19.708] { [13:14:19.708] { [13:14:19.708] { [13:14:19.708] base::local({ [13:14:19.708] has_future <- base::requireNamespace("future", [13:14:19.708] quietly = TRUE) [13:14:19.708] if (has_future) { [13:14:19.708] ns <- base::getNamespace("future") [13:14:19.708] version <- ns[[".package"]][["version"]] [13:14:19.708] if (is.null(version)) [13:14:19.708] version <- utils::packageVersion("future") [13:14:19.708] } [13:14:19.708] else { [13:14:19.708] version <- NULL [13:14:19.708] } [13:14:19.708] if (!has_future || version < "1.8.0") { [13:14:19.708] info <- base::c(r_version = base::gsub("R version ", [13:14:19.708] "", base::R.version$version.string), [13:14:19.708] platform = base::sprintf("%s (%s-bit)", [13:14:19.708] base::R.version$platform, 8 * [13:14:19.708] base::.Machine$sizeof.pointer), [13:14:19.708] os = base::paste(base::Sys.info()[base::c("sysname", [13:14:19.708] "release", "version")], collapse = " "), [13:14:19.708] hostname = base::Sys.info()[["nodename"]]) [13:14:19.708] info <- base::sprintf("%s: %s", base::names(info), [13:14:19.708] info) [13:14:19.708] info <- base::paste(info, collapse = "; ") [13:14:19.708] if (!has_future) { [13:14:19.708] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:14:19.708] info) [13:14:19.708] } [13:14:19.708] else { [13:14:19.708] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:14:19.708] info, version) [13:14:19.708] } [13:14:19.708] base::stop(msg) [13:14:19.708] } [13:14:19.708] }) [13:14:19.708] } [13:14:19.708] ...future.mc.cores.old <- base::getOption("mc.cores") [13:14:19.708] base::options(mc.cores = 1L) [13:14:19.708] } [13:14:19.708] base::local({ [13:14:19.708] for (pkg in "future.apply") { [13:14:19.708] base::loadNamespace(pkg) [13:14:19.708] base::library(pkg, character.only = TRUE) [13:14:19.708] } [13:14:19.708] }) [13:14:19.708] } [13:14:19.708] options(future.plan = NULL) [13:14:19.708] Sys.unsetenv("R_FUTURE_PLAN") [13:14:19.708] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:14:19.708] } [13:14:19.708] ...future.workdir <- getwd() [13:14:19.708] } [13:14:19.708] ...future.oldOptions <- base::as.list(base::.Options) [13:14:19.708] ...future.oldEnvVars <- base::Sys.getenv() [13:14:19.708] } [13:14:19.708] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:14:19.708] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:14:19.708] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:14:19.708] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:14:19.708] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:14:19.708] future.stdout.windows.reencode = NULL, width = 80L) [13:14:19.708] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:14:19.708] base::names(...future.oldOptions)) [13:14:19.708] } [13:14:19.708] if (FALSE) { [13:14:19.708] } [13:14:19.708] else { [13:14:19.708] if (TRUE) { [13:14:19.708] ...future.stdout <- base::rawConnection(base::raw(0L), [13:14:19.708] open = "w") [13:14:19.708] } [13:14:19.708] else { [13:14:19.708] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:14:19.708] windows = "NUL", "/dev/null"), open = "w") [13:14:19.708] } [13:14:19.708] base::sink(...future.stdout, type = "output", split = FALSE) [13:14:19.708] base::on.exit(if (!base::is.null(...future.stdout)) { [13:14:19.708] base::sink(type = "output", split = FALSE) [13:14:19.708] base::close(...future.stdout) [13:14:19.708] }, add = TRUE) [13:14:19.708] } [13:14:19.708] ...future.frame <- base::sys.nframe() [13:14:19.708] ...future.conditions <- base::list() [13:14:19.708] ...future.rng <- base::globalenv()$.Random.seed [13:14:19.708] if (FALSE) { [13:14:19.708] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:14:19.708] "...future.value", "...future.globalenv.names", ".Random.seed") [13:14:19.708] } [13:14:19.708] ...future.result <- base::tryCatch({ [13:14:19.708] base::withCallingHandlers({ [13:14:19.708] ...future.value <- base::withVisible(base::local({ [13:14:19.708] ...future.makeSendCondition <- local({ [13:14:19.708] sendCondition <- NULL [13:14:19.708] function(frame = 1L) { [13:14:19.708] if (is.function(sendCondition)) [13:14:19.708] return(sendCondition) [13:14:19.708] ns <- getNamespace("parallel") [13:14:19.708] if (exists("sendData", mode = "function", [13:14:19.708] envir = ns)) { [13:14:19.708] parallel_sendData <- get("sendData", mode = "function", [13:14:19.708] envir = ns) [13:14:19.708] envir <- sys.frame(frame) [13:14:19.708] master <- NULL [13:14:19.708] while (!identical(envir, .GlobalEnv) && [13:14:19.708] !identical(envir, emptyenv())) { [13:14:19.708] if (exists("master", mode = "list", envir = envir, [13:14:19.708] inherits = FALSE)) { [13:14:19.708] master <- get("master", mode = "list", [13:14:19.708] envir = envir, inherits = FALSE) [13:14:19.708] if (inherits(master, c("SOCKnode", [13:14:19.708] "SOCK0node"))) { [13:14:19.708] sendCondition <<- function(cond) { [13:14:19.708] data <- list(type = "VALUE", value = cond, [13:14:19.708] success = TRUE) [13:14:19.708] parallel_sendData(master, data) [13:14:19.708] } [13:14:19.708] return(sendCondition) [13:14:19.708] } [13:14:19.708] } [13:14:19.708] frame <- frame + 1L [13:14:19.708] envir <- sys.frame(frame) [13:14:19.708] } [13:14:19.708] } [13:14:19.708] sendCondition <<- function(cond) NULL [13:14:19.708] } [13:14:19.708] }) [13:14:19.708] withCallingHandlers({ [13:14:19.708] { [13:14:19.708] do.call(function(...) { [13:14:19.708] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:19.708] if (!identical(...future.globals.maxSize.org, [13:14:19.708] ...future.globals.maxSize)) { [13:14:19.708] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:19.708] on.exit(options(oopts), add = TRUE) [13:14:19.708] } [13:14:19.708] { [13:14:19.708] lapply(seq_along(...future.elements_ii), [13:14:19.708] FUN = function(jj) { [13:14:19.708] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:19.708] ...future.FUN(...future.X_jj, ...) [13:14:19.708] }) [13:14:19.708] } [13:14:19.708] }, args = future.call.arguments) [13:14:19.708] } [13:14:19.708] }, immediateCondition = function(cond) { [13:14:19.708] sendCondition <- ...future.makeSendCondition() [13:14:19.708] sendCondition(cond) [13:14:19.708] muffleCondition <- function (cond, pattern = "^muffle") [13:14:19.708] { [13:14:19.708] inherits <- base::inherits [13:14:19.708] invokeRestart <- base::invokeRestart [13:14:19.708] is.null <- base::is.null [13:14:19.708] muffled <- FALSE [13:14:19.708] if (inherits(cond, "message")) { [13:14:19.708] muffled <- grepl(pattern, "muffleMessage") [13:14:19.708] if (muffled) [13:14:19.708] invokeRestart("muffleMessage") [13:14:19.708] } [13:14:19.708] else if (inherits(cond, "warning")) { [13:14:19.708] muffled <- grepl(pattern, "muffleWarning") [13:14:19.708] if (muffled) [13:14:19.708] invokeRestart("muffleWarning") [13:14:19.708] } [13:14:19.708] else if (inherits(cond, "condition")) { [13:14:19.708] if (!is.null(pattern)) { [13:14:19.708] computeRestarts <- base::computeRestarts [13:14:19.708] grepl <- base::grepl [13:14:19.708] restarts <- computeRestarts(cond) [13:14:19.708] for (restart in restarts) { [13:14:19.708] name <- restart$name [13:14:19.708] if (is.null(name)) [13:14:19.708] next [13:14:19.708] if (!grepl(pattern, name)) [13:14:19.708] next [13:14:19.708] invokeRestart(restart) [13:14:19.708] muffled <- TRUE [13:14:19.708] break [13:14:19.708] } [13:14:19.708] } [13:14:19.708] } [13:14:19.708] invisible(muffled) [13:14:19.708] } [13:14:19.708] muffleCondition(cond) [13:14:19.708] }) [13:14:19.708] })) [13:14:19.708] future::FutureResult(value = ...future.value$value, [13:14:19.708] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:14:19.708] ...future.rng), globalenv = if (FALSE) [13:14:19.708] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:14:19.708] ...future.globalenv.names)) [13:14:19.708] else NULL, started = ...future.startTime, version = "1.8") [13:14:19.708] }, condition = base::local({ [13:14:19.708] c <- base::c [13:14:19.708] inherits <- base::inherits [13:14:19.708] invokeRestart <- base::invokeRestart [13:14:19.708] length <- base::length [13:14:19.708] list <- base::list [13:14:19.708] seq.int <- base::seq.int [13:14:19.708] signalCondition <- base::signalCondition [13:14:19.708] sys.calls <- base::sys.calls [13:14:19.708] `[[` <- base::`[[` [13:14:19.708] `+` <- base::`+` [13:14:19.708] `<<-` <- base::`<<-` [13:14:19.708] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:14:19.708] calls[seq.int(from = from + 12L, to = length(calls) - [13:14:19.708] 3L)] [13:14:19.708] } [13:14:19.708] function(cond) { [13:14:19.708] is_error <- inherits(cond, "error") [13:14:19.708] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:14:19.708] NULL) [13:14:19.708] if (is_error) { [13:14:19.708] sessionInformation <- function() { [13:14:19.708] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:14:19.708] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:14:19.708] search = base::search(), system = base::Sys.info()) [13:14:19.708] } [13:14:19.708] ...future.conditions[[length(...future.conditions) + [13:14:19.708] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:14:19.708] cond$call), session = sessionInformation(), [13:14:19.708] timestamp = base::Sys.time(), signaled = 0L) [13:14:19.708] signalCondition(cond) [13:14:19.708] } [13:14:19.708] else if (!ignore && TRUE && inherits(cond, c("condition", [13:14:19.708] "immediateCondition"))) { [13:14:19.708] signal <- TRUE && inherits(cond, "immediateCondition") [13:14:19.708] ...future.conditions[[length(...future.conditions) + [13:14:19.708] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:14:19.708] if (TRUE && !signal) { [13:14:19.708] muffleCondition <- function (cond, pattern = "^muffle") [13:14:19.708] { [13:14:19.708] inherits <- base::inherits [13:14:19.708] invokeRestart <- base::invokeRestart [13:14:19.708] is.null <- base::is.null [13:14:19.708] muffled <- FALSE [13:14:19.708] if (inherits(cond, "message")) { [13:14:19.708] muffled <- grepl(pattern, "muffleMessage") [13:14:19.708] if (muffled) [13:14:19.708] invokeRestart("muffleMessage") [13:14:19.708] } [13:14:19.708] else if (inherits(cond, "warning")) { [13:14:19.708] muffled <- grepl(pattern, "muffleWarning") [13:14:19.708] if (muffled) [13:14:19.708] invokeRestart("muffleWarning") [13:14:19.708] } [13:14:19.708] else if (inherits(cond, "condition")) { [13:14:19.708] if (!is.null(pattern)) { [13:14:19.708] computeRestarts <- base::computeRestarts [13:14:19.708] grepl <- base::grepl [13:14:19.708] restarts <- computeRestarts(cond) [13:14:19.708] for (restart in restarts) { [13:14:19.708] name <- restart$name [13:14:19.708] if (is.null(name)) [13:14:19.708] next [13:14:19.708] if (!grepl(pattern, name)) [13:14:19.708] next [13:14:19.708] invokeRestart(restart) [13:14:19.708] muffled <- TRUE [13:14:19.708] break [13:14:19.708] } [13:14:19.708] } [13:14:19.708] } [13:14:19.708] invisible(muffled) [13:14:19.708] } [13:14:19.708] muffleCondition(cond, pattern = "^muffle") [13:14:19.708] } [13:14:19.708] } [13:14:19.708] else { [13:14:19.708] if (TRUE) { [13:14:19.708] muffleCondition <- function (cond, pattern = "^muffle") [13:14:19.708] { [13:14:19.708] inherits <- base::inherits [13:14:19.708] invokeRestart <- base::invokeRestart [13:14:19.708] is.null <- base::is.null [13:14:19.708] muffled <- FALSE [13:14:19.708] if (inherits(cond, "message")) { [13:14:19.708] muffled <- grepl(pattern, "muffleMessage") [13:14:19.708] if (muffled) [13:14:19.708] invokeRestart("muffleMessage") [13:14:19.708] } [13:14:19.708] else if (inherits(cond, "warning")) { [13:14:19.708] muffled <- grepl(pattern, "muffleWarning") [13:14:19.708] if (muffled) [13:14:19.708] invokeRestart("muffleWarning") [13:14:19.708] } [13:14:19.708] else if (inherits(cond, "condition")) { [13:14:19.708] if (!is.null(pattern)) { [13:14:19.708] computeRestarts <- base::computeRestarts [13:14:19.708] grepl <- base::grepl [13:14:19.708] restarts <- computeRestarts(cond) [13:14:19.708] for (restart in restarts) { [13:14:19.708] name <- restart$name [13:14:19.708] if (is.null(name)) [13:14:19.708] next [13:14:19.708] if (!grepl(pattern, name)) [13:14:19.708] next [13:14:19.708] invokeRestart(restart) [13:14:19.708] muffled <- TRUE [13:14:19.708] break [13:14:19.708] } [13:14:19.708] } [13:14:19.708] } [13:14:19.708] invisible(muffled) [13:14:19.708] } [13:14:19.708] muffleCondition(cond, pattern = "^muffle") [13:14:19.708] } [13:14:19.708] } [13:14:19.708] } [13:14:19.708] })) [13:14:19.708] }, error = function(ex) { [13:14:19.708] base::structure(base::list(value = NULL, visible = NULL, [13:14:19.708] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:14:19.708] ...future.rng), started = ...future.startTime, [13:14:19.708] finished = Sys.time(), session_uuid = NA_character_, [13:14:19.708] version = "1.8"), class = "FutureResult") [13:14:19.708] }, finally = { [13:14:19.708] if (!identical(...future.workdir, getwd())) [13:14:19.708] setwd(...future.workdir) [13:14:19.708] { [13:14:19.708] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:14:19.708] ...future.oldOptions$nwarnings <- NULL [13:14:19.708] } [13:14:19.708] base::options(...future.oldOptions) [13:14:19.708] if (.Platform$OS.type == "windows") { [13:14:19.708] old_names <- names(...future.oldEnvVars) [13:14:19.708] envs <- base::Sys.getenv() [13:14:19.708] names <- names(envs) [13:14:19.708] common <- intersect(names, old_names) [13:14:19.708] added <- setdiff(names, old_names) [13:14:19.708] removed <- setdiff(old_names, names) [13:14:19.708] changed <- common[...future.oldEnvVars[common] != [13:14:19.708] envs[common]] [13:14:19.708] NAMES <- toupper(changed) [13:14:19.708] args <- list() [13:14:19.708] for (kk in seq_along(NAMES)) { [13:14:19.708] name <- changed[[kk]] [13:14:19.708] NAME <- NAMES[[kk]] [13:14:19.708] if (name != NAME && is.element(NAME, old_names)) [13:14:19.708] next [13:14:19.708] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:19.708] } [13:14:19.708] NAMES <- toupper(added) [13:14:19.708] for (kk in seq_along(NAMES)) { [13:14:19.708] name <- added[[kk]] [13:14:19.708] NAME <- NAMES[[kk]] [13:14:19.708] if (name != NAME && is.element(NAME, old_names)) [13:14:19.708] next [13:14:19.708] args[[name]] <- "" [13:14:19.708] } [13:14:19.708] NAMES <- toupper(removed) [13:14:19.708] for (kk in seq_along(NAMES)) { [13:14:19.708] name <- removed[[kk]] [13:14:19.708] NAME <- NAMES[[kk]] [13:14:19.708] if (name != NAME && is.element(NAME, old_names)) [13:14:19.708] next [13:14:19.708] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:19.708] } [13:14:19.708] if (length(args) > 0) [13:14:19.708] base::do.call(base::Sys.setenv, args = args) [13:14:19.708] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:14:19.708] } [13:14:19.708] else { [13:14:19.708] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:14:19.708] } [13:14:19.708] { [13:14:19.708] if (base::length(...future.futureOptionsAdded) > [13:14:19.708] 0L) { [13:14:19.708] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:14:19.708] base::names(opts) <- ...future.futureOptionsAdded [13:14:19.708] base::options(opts) [13:14:19.708] } [13:14:19.708] { [13:14:19.708] { [13:14:19.708] base::options(mc.cores = ...future.mc.cores.old) [13:14:19.708] NULL [13:14:19.708] } [13:14:19.708] options(future.plan = NULL) [13:14:19.708] if (is.na(NA_character_)) [13:14:19.708] Sys.unsetenv("R_FUTURE_PLAN") [13:14:19.708] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:14:19.708] future::plan(list(function (..., workers = availableCores(), [13:14:19.708] lazy = FALSE, rscript_libs = .libPaths(), [13:14:19.708] envir = parent.frame()) [13:14:19.708] { [13:14:19.708] if (is.function(workers)) [13:14:19.708] workers <- workers() [13:14:19.708] workers <- structure(as.integer(workers), [13:14:19.708] class = class(workers)) [13:14:19.708] stop_if_not(length(workers) == 1, is.finite(workers), [13:14:19.708] workers >= 1) [13:14:19.708] if (workers == 1L && !inherits(workers, "AsIs")) { [13:14:19.708] return(sequential(..., lazy = TRUE, envir = envir)) [13:14:19.708] } [13:14:19.708] future <- MultisessionFuture(..., workers = workers, [13:14:19.708] lazy = lazy, rscript_libs = rscript_libs, [13:14:19.708] envir = envir) [13:14:19.708] if (!future$lazy) [13:14:19.708] future <- run(future) [13:14:19.708] invisible(future) [13:14:19.708] }), .cleanup = FALSE, .init = FALSE) [13:14:19.708] } [13:14:19.708] } [13:14:19.708] } [13:14:19.708] }) [13:14:19.708] if (TRUE) { [13:14:19.708] base::sink(type = "output", split = FALSE) [13:14:19.708] if (TRUE) { [13:14:19.708] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:14:19.708] } [13:14:19.708] else { [13:14:19.708] ...future.result["stdout"] <- base::list(NULL) [13:14:19.708] } [13:14:19.708] base::close(...future.stdout) [13:14:19.708] ...future.stdout <- NULL [13:14:19.708] } [13:14:19.708] ...future.result$conditions <- ...future.conditions [13:14:19.708] ...future.result$finished <- base::Sys.time() [13:14:19.708] ...future.result [13:14:19.708] } [13:14:19.712] Exporting 11 global objects (92.05 KiB) to cluster node #1 ... [13:14:19.712] Exporting '...future.FUN' (21.22 KiB) to cluster node #1 ... [13:14:19.713] Exporting '...future.FUN' (21.22 KiB) to cluster node #1 ... DONE [13:14:19.713] Exporting 'x_FUN' (56 bytes) to cluster node #1 ... [13:14:19.713] Exporting 'x_FUN' (56 bytes) to cluster node #1 ... DONE [13:14:19.713] Exporting 'times' (56 bytes) to cluster node #1 ... [13:14:19.714] Exporting 'times' (56 bytes) to cluster node #1 ... DONE [13:14:19.714] Exporting 'stopf' (26.43 KiB) to cluster node #1 ... [13:14:19.714] Exporting 'stopf' (26.43 KiB) to cluster node #1 ... DONE [13:14:19.714] Exporting 'stop_if_not' (44.12 KiB) to cluster node #1 ... [13:14:19.715] Exporting 'stop_if_not' (44.12 KiB) to cluster node #1 ... DONE [13:14:19.715] Exporting 'dim' (0 bytes) to cluster node #1 ... [13:14:19.715] Exporting 'dim' (0 bytes) to cluster node #1 ... DONE [13:14:19.715] Exporting 'valid_types' (176 bytes) to cluster node #1 ... [13:14:19.715] Exporting 'valid_types' (176 bytes) to cluster node #1 ... DONE [13:14:19.716] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... [13:14:19.716] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... DONE [13:14:19.716] Exporting '...future.elements_ii' (56 bytes) to cluster node #1 ... [13:14:19.716] Exporting '...future.elements_ii' (56 bytes) to cluster node #1 ... DONE [13:14:19.716] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:14:19.717] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:14:19.717] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:14:19.717] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:14:19.717] Exporting 11 global objects (92.05 KiB) to cluster node #1 ... DONE [13:14:19.718] MultisessionFuture started [13:14:19.718] - Launch lazy future ... done [13:14:19.718] run() for 'MultisessionFuture' ... done [13:14:19.718] Created future: [13:14:19.738] receiveMessageFromWorker() for ClusterFuture ... [13:14:19.738] - Validating connection of MultisessionFuture [13:14:19.739] - received message: FutureResult [13:14:19.739] - Received FutureResult [13:14:19.739] - Erased future from FutureRegistry [13:14:19.739] result() for ClusterFuture ... [13:14:19.739] - result already collected: FutureResult [13:14:19.739] result() for ClusterFuture ... done [13:14:19.740] receiveMessageFromWorker() for ClusterFuture ... done [13:14:19.718] MultisessionFuture: [13:14:19.718] Label: 'future_vapply-1' [13:14:19.718] Expression: [13:14:19.718] { [13:14:19.718] do.call(function(...) { [13:14:19.718] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:19.718] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:19.718] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:19.718] on.exit(options(oopts), add = TRUE) [13:14:19.718] } [13:14:19.718] { [13:14:19.718] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:19.718] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:19.718] ...future.FUN(...future.X_jj, ...) [13:14:19.718] }) [13:14:19.718] } [13:14:19.718] }, args = future.call.arguments) [13:14:19.718] } [13:14:19.718] Lazy evaluation: FALSE [13:14:19.718] Asynchronous evaluation: TRUE [13:14:19.718] Local evaluation: TRUE [13:14:19.718] Environment: R_GlobalEnv [13:14:19.718] Capture standard output: TRUE [13:14:19.718] Capture condition classes: 'condition' (excluding 'nothing') [13:14:19.718] Globals: 11 objects totaling 92.11 KiB (function '...future.FUN' of 21.22 KiB, function 'x_FUN' of 56 bytes, integer 'times' of 56 bytes, function 'stopf' of 26.43 KiB, function 'stop_if_not' of 44.12 KiB, ...) [13:14:19.718] Packages: 1 packages ('future.apply') [13:14:19.718] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:14:19.718] Resolved: TRUE [13:14:19.718] Value: [13:14:19.718] Conditions captured: [13:14:19.718] Early signaling: FALSE [13:14:19.718] Owner process: 1bb7d580-628d-c90d-e38a-66de485868c4 [13:14:19.718] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:14:19.740] Chunk #1 of 2 ... DONE [13:14:19.740] Chunk #2 of 2 ... [13:14:19.740] - Finding globals in 'X' for chunk #2 ... [13:14:19.740] getGlobalsAndPackages() ... [13:14:19.740] Searching for globals... [13:14:19.741] [13:14:19.741] Searching for globals ... DONE [13:14:19.741] - globals: [0] [13:14:19.741] getGlobalsAndPackages() ... DONE [13:14:19.741] + additional globals found: [n=0] [13:14:19.741] + additional namespaces needed: [n=0] [13:14:19.741] - Finding globals in 'X' for chunk #2 ... DONE [13:14:19.741] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:14:19.742] - seeds: [13:14:19.742] - All globals exported: [n=11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:19.742] getGlobalsAndPackages() ... [13:14:19.742] - globals passed as-is: [11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:19.742] Resolving globals: FALSE [13:14:19.742] Tweak future expression to call with '...' arguments ... [13:14:19.742] { [13:14:19.742] do.call(function(...) { [13:14:19.742] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:19.742] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:19.742] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:19.742] on.exit(options(oopts), add = TRUE) [13:14:19.742] } [13:14:19.742] { [13:14:19.742] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:19.742] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:19.742] ...future.FUN(...future.X_jj, ...) [13:14:19.742] }) [13:14:19.742] } [13:14:19.742] }, args = future.call.arguments) [13:14:19.742] } [13:14:19.743] Tweak future expression to call with '...' arguments ... DONE [13:14:19.743] - globals: [11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:19.743] - packages: [1] 'future.apply' [13:14:19.743] getGlobalsAndPackages() ... DONE [13:14:19.744] run() for 'Future' ... [13:14:19.744] - state: 'created' [13:14:19.744] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:14:19.754] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:14:19.754] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:14:19.754] - Field: 'node' [13:14:19.755] - Field: 'label' [13:14:19.755] - Field: 'local' [13:14:19.755] - Field: 'owner' [13:14:19.755] - Field: 'envir' [13:14:19.755] - Field: 'workers' [13:14:19.755] - Field: 'packages' [13:14:19.755] - Field: 'gc' [13:14:19.755] - Field: 'conditions' [13:14:19.756] - Field: 'persistent' [13:14:19.756] - Field: 'expr' [13:14:19.756] - Field: 'uuid' [13:14:19.756] - Field: 'seed' [13:14:19.756] - Field: 'version' [13:14:19.756] - Field: 'result' [13:14:19.756] - Field: 'asynchronous' [13:14:19.756] - Field: 'calls' [13:14:19.757] - Field: 'globals' [13:14:19.757] - Field: 'stdout' [13:14:19.757] - Field: 'earlySignal' [13:14:19.757] - Field: 'lazy' [13:14:19.757] - Field: 'state' [13:14:19.757] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:14:19.757] - Launch lazy future ... [13:14:19.758] Packages needed by the future expression (n = 1): 'future.apply' [13:14:19.758] Packages needed by future strategies (n = 0): [13:14:19.758] { [13:14:19.758] { [13:14:19.758] { [13:14:19.758] ...future.startTime <- base::Sys.time() [13:14:19.758] { [13:14:19.758] { [13:14:19.758] { [13:14:19.758] { [13:14:19.758] { [13:14:19.758] base::local({ [13:14:19.758] has_future <- base::requireNamespace("future", [13:14:19.758] quietly = TRUE) [13:14:19.758] if (has_future) { [13:14:19.758] ns <- base::getNamespace("future") [13:14:19.758] version <- ns[[".package"]][["version"]] [13:14:19.758] if (is.null(version)) [13:14:19.758] version <- utils::packageVersion("future") [13:14:19.758] } [13:14:19.758] else { [13:14:19.758] version <- NULL [13:14:19.758] } [13:14:19.758] if (!has_future || version < "1.8.0") { [13:14:19.758] info <- base::c(r_version = base::gsub("R version ", [13:14:19.758] "", base::R.version$version.string), [13:14:19.758] platform = base::sprintf("%s (%s-bit)", [13:14:19.758] base::R.version$platform, 8 * [13:14:19.758] base::.Machine$sizeof.pointer), [13:14:19.758] os = base::paste(base::Sys.info()[base::c("sysname", [13:14:19.758] "release", "version")], collapse = " "), [13:14:19.758] hostname = base::Sys.info()[["nodename"]]) [13:14:19.758] info <- base::sprintf("%s: %s", base::names(info), [13:14:19.758] info) [13:14:19.758] info <- base::paste(info, collapse = "; ") [13:14:19.758] if (!has_future) { [13:14:19.758] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:14:19.758] info) [13:14:19.758] } [13:14:19.758] else { [13:14:19.758] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:14:19.758] info, version) [13:14:19.758] } [13:14:19.758] base::stop(msg) [13:14:19.758] } [13:14:19.758] }) [13:14:19.758] } [13:14:19.758] ...future.mc.cores.old <- base::getOption("mc.cores") [13:14:19.758] base::options(mc.cores = 1L) [13:14:19.758] } [13:14:19.758] base::local({ [13:14:19.758] for (pkg in "future.apply") { [13:14:19.758] base::loadNamespace(pkg) [13:14:19.758] base::library(pkg, character.only = TRUE) [13:14:19.758] } [13:14:19.758] }) [13:14:19.758] } [13:14:19.758] options(future.plan = NULL) [13:14:19.758] Sys.unsetenv("R_FUTURE_PLAN") [13:14:19.758] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:14:19.758] } [13:14:19.758] ...future.workdir <- getwd() [13:14:19.758] } [13:14:19.758] ...future.oldOptions <- base::as.list(base::.Options) [13:14:19.758] ...future.oldEnvVars <- base::Sys.getenv() [13:14:19.758] } [13:14:19.758] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:14:19.758] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:14:19.758] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:14:19.758] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:14:19.758] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:14:19.758] future.stdout.windows.reencode = NULL, width = 80L) [13:14:19.758] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:14:19.758] base::names(...future.oldOptions)) [13:14:19.758] } [13:14:19.758] if (FALSE) { [13:14:19.758] } [13:14:19.758] else { [13:14:19.758] if (TRUE) { [13:14:19.758] ...future.stdout <- base::rawConnection(base::raw(0L), [13:14:19.758] open = "w") [13:14:19.758] } [13:14:19.758] else { [13:14:19.758] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:14:19.758] windows = "NUL", "/dev/null"), open = "w") [13:14:19.758] } [13:14:19.758] base::sink(...future.stdout, type = "output", split = FALSE) [13:14:19.758] base::on.exit(if (!base::is.null(...future.stdout)) { [13:14:19.758] base::sink(type = "output", split = FALSE) [13:14:19.758] base::close(...future.stdout) [13:14:19.758] }, add = TRUE) [13:14:19.758] } [13:14:19.758] ...future.frame <- base::sys.nframe() [13:14:19.758] ...future.conditions <- base::list() [13:14:19.758] ...future.rng <- base::globalenv()$.Random.seed [13:14:19.758] if (FALSE) { [13:14:19.758] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:14:19.758] "...future.value", "...future.globalenv.names", ".Random.seed") [13:14:19.758] } [13:14:19.758] ...future.result <- base::tryCatch({ [13:14:19.758] base::withCallingHandlers({ [13:14:19.758] ...future.value <- base::withVisible(base::local({ [13:14:19.758] ...future.makeSendCondition <- local({ [13:14:19.758] sendCondition <- NULL [13:14:19.758] function(frame = 1L) { [13:14:19.758] if (is.function(sendCondition)) [13:14:19.758] return(sendCondition) [13:14:19.758] ns <- getNamespace("parallel") [13:14:19.758] if (exists("sendData", mode = "function", [13:14:19.758] envir = ns)) { [13:14:19.758] parallel_sendData <- get("sendData", mode = "function", [13:14:19.758] envir = ns) [13:14:19.758] envir <- sys.frame(frame) [13:14:19.758] master <- NULL [13:14:19.758] while (!identical(envir, .GlobalEnv) && [13:14:19.758] !identical(envir, emptyenv())) { [13:14:19.758] if (exists("master", mode = "list", envir = envir, [13:14:19.758] inherits = FALSE)) { [13:14:19.758] master <- get("master", mode = "list", [13:14:19.758] envir = envir, inherits = FALSE) [13:14:19.758] if (inherits(master, c("SOCKnode", [13:14:19.758] "SOCK0node"))) { [13:14:19.758] sendCondition <<- function(cond) { [13:14:19.758] data <- list(type = "VALUE", value = cond, [13:14:19.758] success = TRUE) [13:14:19.758] parallel_sendData(master, data) [13:14:19.758] } [13:14:19.758] return(sendCondition) [13:14:19.758] } [13:14:19.758] } [13:14:19.758] frame <- frame + 1L [13:14:19.758] envir <- sys.frame(frame) [13:14:19.758] } [13:14:19.758] } [13:14:19.758] sendCondition <<- function(cond) NULL [13:14:19.758] } [13:14:19.758] }) [13:14:19.758] withCallingHandlers({ [13:14:19.758] { [13:14:19.758] do.call(function(...) { [13:14:19.758] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:19.758] if (!identical(...future.globals.maxSize.org, [13:14:19.758] ...future.globals.maxSize)) { [13:14:19.758] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:19.758] on.exit(options(oopts), add = TRUE) [13:14:19.758] } [13:14:19.758] { [13:14:19.758] lapply(seq_along(...future.elements_ii), [13:14:19.758] FUN = function(jj) { [13:14:19.758] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:19.758] ...future.FUN(...future.X_jj, ...) [13:14:19.758] }) [13:14:19.758] } [13:14:19.758] }, args = future.call.arguments) [13:14:19.758] } [13:14:19.758] }, immediateCondition = function(cond) { [13:14:19.758] sendCondition <- ...future.makeSendCondition() [13:14:19.758] sendCondition(cond) [13:14:19.758] muffleCondition <- function (cond, pattern = "^muffle") [13:14:19.758] { [13:14:19.758] inherits <- base::inherits [13:14:19.758] invokeRestart <- base::invokeRestart [13:14:19.758] is.null <- base::is.null [13:14:19.758] muffled <- FALSE [13:14:19.758] if (inherits(cond, "message")) { [13:14:19.758] muffled <- grepl(pattern, "muffleMessage") [13:14:19.758] if (muffled) [13:14:19.758] invokeRestart("muffleMessage") [13:14:19.758] } [13:14:19.758] else if (inherits(cond, "warning")) { [13:14:19.758] muffled <- grepl(pattern, "muffleWarning") [13:14:19.758] if (muffled) [13:14:19.758] invokeRestart("muffleWarning") [13:14:19.758] } [13:14:19.758] else if (inherits(cond, "condition")) { [13:14:19.758] if (!is.null(pattern)) { [13:14:19.758] computeRestarts <- base::computeRestarts [13:14:19.758] grepl <- base::grepl [13:14:19.758] restarts <- computeRestarts(cond) [13:14:19.758] for (restart in restarts) { [13:14:19.758] name <- restart$name [13:14:19.758] if (is.null(name)) [13:14:19.758] next [13:14:19.758] if (!grepl(pattern, name)) [13:14:19.758] next [13:14:19.758] invokeRestart(restart) [13:14:19.758] muffled <- TRUE [13:14:19.758] break [13:14:19.758] } [13:14:19.758] } [13:14:19.758] } [13:14:19.758] invisible(muffled) [13:14:19.758] } [13:14:19.758] muffleCondition(cond) [13:14:19.758] }) [13:14:19.758] })) [13:14:19.758] future::FutureResult(value = ...future.value$value, [13:14:19.758] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:14:19.758] ...future.rng), globalenv = if (FALSE) [13:14:19.758] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:14:19.758] ...future.globalenv.names)) [13:14:19.758] else NULL, started = ...future.startTime, version = "1.8") [13:14:19.758] }, condition = base::local({ [13:14:19.758] c <- base::c [13:14:19.758] inherits <- base::inherits [13:14:19.758] invokeRestart <- base::invokeRestart [13:14:19.758] length <- base::length [13:14:19.758] list <- base::list [13:14:19.758] seq.int <- base::seq.int [13:14:19.758] signalCondition <- base::signalCondition [13:14:19.758] sys.calls <- base::sys.calls [13:14:19.758] `[[` <- base::`[[` [13:14:19.758] `+` <- base::`+` [13:14:19.758] `<<-` <- base::`<<-` [13:14:19.758] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:14:19.758] calls[seq.int(from = from + 12L, to = length(calls) - [13:14:19.758] 3L)] [13:14:19.758] } [13:14:19.758] function(cond) { [13:14:19.758] is_error <- inherits(cond, "error") [13:14:19.758] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:14:19.758] NULL) [13:14:19.758] if (is_error) { [13:14:19.758] sessionInformation <- function() { [13:14:19.758] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:14:19.758] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:14:19.758] search = base::search(), system = base::Sys.info()) [13:14:19.758] } [13:14:19.758] ...future.conditions[[length(...future.conditions) + [13:14:19.758] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:14:19.758] cond$call), session = sessionInformation(), [13:14:19.758] timestamp = base::Sys.time(), signaled = 0L) [13:14:19.758] signalCondition(cond) [13:14:19.758] } [13:14:19.758] else if (!ignore && TRUE && inherits(cond, c("condition", [13:14:19.758] "immediateCondition"))) { [13:14:19.758] signal <- TRUE && inherits(cond, "immediateCondition") [13:14:19.758] ...future.conditions[[length(...future.conditions) + [13:14:19.758] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:14:19.758] if (TRUE && !signal) { [13:14:19.758] muffleCondition <- function (cond, pattern = "^muffle") [13:14:19.758] { [13:14:19.758] inherits <- base::inherits [13:14:19.758] invokeRestart <- base::invokeRestart [13:14:19.758] is.null <- base::is.null [13:14:19.758] muffled <- FALSE [13:14:19.758] if (inherits(cond, "message")) { [13:14:19.758] muffled <- grepl(pattern, "muffleMessage") [13:14:19.758] if (muffled) [13:14:19.758] invokeRestart("muffleMessage") [13:14:19.758] } [13:14:19.758] else if (inherits(cond, "warning")) { [13:14:19.758] muffled <- grepl(pattern, "muffleWarning") [13:14:19.758] if (muffled) [13:14:19.758] invokeRestart("muffleWarning") [13:14:19.758] } [13:14:19.758] else if (inherits(cond, "condition")) { [13:14:19.758] if (!is.null(pattern)) { [13:14:19.758] computeRestarts <- base::computeRestarts [13:14:19.758] grepl <- base::grepl [13:14:19.758] restarts <- computeRestarts(cond) [13:14:19.758] for (restart in restarts) { [13:14:19.758] name <- restart$name [13:14:19.758] if (is.null(name)) [13:14:19.758] next [13:14:19.758] if (!grepl(pattern, name)) [13:14:19.758] next [13:14:19.758] invokeRestart(restart) [13:14:19.758] muffled <- TRUE [13:14:19.758] break [13:14:19.758] } [13:14:19.758] } [13:14:19.758] } [13:14:19.758] invisible(muffled) [13:14:19.758] } [13:14:19.758] muffleCondition(cond, pattern = "^muffle") [13:14:19.758] } [13:14:19.758] } [13:14:19.758] else { [13:14:19.758] if (TRUE) { [13:14:19.758] muffleCondition <- function (cond, pattern = "^muffle") [13:14:19.758] { [13:14:19.758] inherits <- base::inherits [13:14:19.758] invokeRestart <- base::invokeRestart [13:14:19.758] is.null <- base::is.null [13:14:19.758] muffled <- FALSE [13:14:19.758] if (inherits(cond, "message")) { [13:14:19.758] muffled <- grepl(pattern, "muffleMessage") [13:14:19.758] if (muffled) [13:14:19.758] invokeRestart("muffleMessage") [13:14:19.758] } [13:14:19.758] else if (inherits(cond, "warning")) { [13:14:19.758] muffled <- grepl(pattern, "muffleWarning") [13:14:19.758] if (muffled) [13:14:19.758] invokeRestart("muffleWarning") [13:14:19.758] } [13:14:19.758] else if (inherits(cond, "condition")) { [13:14:19.758] if (!is.null(pattern)) { [13:14:19.758] computeRestarts <- base::computeRestarts [13:14:19.758] grepl <- base::grepl [13:14:19.758] restarts <- computeRestarts(cond) [13:14:19.758] for (restart in restarts) { [13:14:19.758] name <- restart$name [13:14:19.758] if (is.null(name)) [13:14:19.758] next [13:14:19.758] if (!grepl(pattern, name)) [13:14:19.758] next [13:14:19.758] invokeRestart(restart) [13:14:19.758] muffled <- TRUE [13:14:19.758] break [13:14:19.758] } [13:14:19.758] } [13:14:19.758] } [13:14:19.758] invisible(muffled) [13:14:19.758] } [13:14:19.758] muffleCondition(cond, pattern = "^muffle") [13:14:19.758] } [13:14:19.758] } [13:14:19.758] } [13:14:19.758] })) [13:14:19.758] }, error = function(ex) { [13:14:19.758] base::structure(base::list(value = NULL, visible = NULL, [13:14:19.758] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:14:19.758] ...future.rng), started = ...future.startTime, [13:14:19.758] finished = Sys.time(), session_uuid = NA_character_, [13:14:19.758] version = "1.8"), class = "FutureResult") [13:14:19.758] }, finally = { [13:14:19.758] if (!identical(...future.workdir, getwd())) [13:14:19.758] setwd(...future.workdir) [13:14:19.758] { [13:14:19.758] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:14:19.758] ...future.oldOptions$nwarnings <- NULL [13:14:19.758] } [13:14:19.758] base::options(...future.oldOptions) [13:14:19.758] if (.Platform$OS.type == "windows") { [13:14:19.758] old_names <- names(...future.oldEnvVars) [13:14:19.758] envs <- base::Sys.getenv() [13:14:19.758] names <- names(envs) [13:14:19.758] common <- intersect(names, old_names) [13:14:19.758] added <- setdiff(names, old_names) [13:14:19.758] removed <- setdiff(old_names, names) [13:14:19.758] changed <- common[...future.oldEnvVars[common] != [13:14:19.758] envs[common]] [13:14:19.758] NAMES <- toupper(changed) [13:14:19.758] args <- list() [13:14:19.758] for (kk in seq_along(NAMES)) { [13:14:19.758] name <- changed[[kk]] [13:14:19.758] NAME <- NAMES[[kk]] [13:14:19.758] if (name != NAME && is.element(NAME, old_names)) [13:14:19.758] next [13:14:19.758] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:19.758] } [13:14:19.758] NAMES <- toupper(added) [13:14:19.758] for (kk in seq_along(NAMES)) { [13:14:19.758] name <- added[[kk]] [13:14:19.758] NAME <- NAMES[[kk]] [13:14:19.758] if (name != NAME && is.element(NAME, old_names)) [13:14:19.758] next [13:14:19.758] args[[name]] <- "" [13:14:19.758] } [13:14:19.758] NAMES <- toupper(removed) [13:14:19.758] for (kk in seq_along(NAMES)) { [13:14:19.758] name <- removed[[kk]] [13:14:19.758] NAME <- NAMES[[kk]] [13:14:19.758] if (name != NAME && is.element(NAME, old_names)) [13:14:19.758] next [13:14:19.758] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:19.758] } [13:14:19.758] if (length(args) > 0) [13:14:19.758] base::do.call(base::Sys.setenv, args = args) [13:14:19.758] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:14:19.758] } [13:14:19.758] else { [13:14:19.758] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:14:19.758] } [13:14:19.758] { [13:14:19.758] if (base::length(...future.futureOptionsAdded) > [13:14:19.758] 0L) { [13:14:19.758] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:14:19.758] base::names(opts) <- ...future.futureOptionsAdded [13:14:19.758] base::options(opts) [13:14:19.758] } [13:14:19.758] { [13:14:19.758] { [13:14:19.758] base::options(mc.cores = ...future.mc.cores.old) [13:14:19.758] NULL [13:14:19.758] } [13:14:19.758] options(future.plan = NULL) [13:14:19.758] if (is.na(NA_character_)) [13:14:19.758] Sys.unsetenv("R_FUTURE_PLAN") [13:14:19.758] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:14:19.758] future::plan(list(function (..., workers = availableCores(), [13:14:19.758] lazy = FALSE, rscript_libs = .libPaths(), [13:14:19.758] envir = parent.frame()) [13:14:19.758] { [13:14:19.758] if (is.function(workers)) [13:14:19.758] workers <- workers() [13:14:19.758] workers <- structure(as.integer(workers), [13:14:19.758] class = class(workers)) [13:14:19.758] stop_if_not(length(workers) == 1, is.finite(workers), [13:14:19.758] workers >= 1) [13:14:19.758] if (workers == 1L && !inherits(workers, "AsIs")) { [13:14:19.758] return(sequential(..., lazy = TRUE, envir = envir)) [13:14:19.758] } [13:14:19.758] future <- MultisessionFuture(..., workers = workers, [13:14:19.758] lazy = lazy, rscript_libs = rscript_libs, [13:14:19.758] envir = envir) [13:14:19.758] if (!future$lazy) [13:14:19.758] future <- run(future) [13:14:19.758] invisible(future) [13:14:19.758] }), .cleanup = FALSE, .init = FALSE) [13:14:19.758] } [13:14:19.758] } [13:14:19.758] } [13:14:19.758] }) [13:14:19.758] if (TRUE) { [13:14:19.758] base::sink(type = "output", split = FALSE) [13:14:19.758] if (TRUE) { [13:14:19.758] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:14:19.758] } [13:14:19.758] else { [13:14:19.758] ...future.result["stdout"] <- base::list(NULL) [13:14:19.758] } [13:14:19.758] base::close(...future.stdout) [13:14:19.758] ...future.stdout <- NULL [13:14:19.758] } [13:14:19.758] ...future.result$conditions <- ...future.conditions [13:14:19.758] ...future.result$finished <- base::Sys.time() [13:14:19.758] ...future.result [13:14:19.758] } [13:14:19.762] Exporting 11 global objects (92.05 KiB) to cluster node #1 ... [13:14:19.762] Exporting '...future.FUN' (21.22 KiB) to cluster node #1 ... [13:14:19.763] Exporting '...future.FUN' (21.22 KiB) to cluster node #1 ... DONE [13:14:19.763] Exporting 'x_FUN' (56 bytes) to cluster node #1 ... [13:14:19.763] Exporting 'x_FUN' (56 bytes) to cluster node #1 ... DONE [13:14:19.763] Exporting 'times' (56 bytes) to cluster node #1 ... [13:14:19.763] Exporting 'times' (56 bytes) to cluster node #1 ... DONE [13:14:19.764] Exporting 'stopf' (26.43 KiB) to cluster node #1 ... [13:14:19.764] Exporting 'stopf' (26.43 KiB) to cluster node #1 ... DONE [13:14:19.764] Exporting 'stop_if_not' (44.12 KiB) to cluster node #1 ... [13:14:19.764] Exporting 'stop_if_not' (44.12 KiB) to cluster node #1 ... DONE [13:14:19.764] Exporting 'dim' (0 bytes) to cluster node #1 ... [13:14:19.765] Exporting 'dim' (0 bytes) to cluster node #1 ... DONE [13:14:19.765] Exporting 'valid_types' (176 bytes) to cluster node #1 ... [13:14:19.765] Exporting 'valid_types' (176 bytes) to cluster node #1 ... DONE [13:14:19.765] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... [13:14:19.766] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... DONE [13:14:19.766] Exporting '...future.elements_ii' (112 bytes) to cluster node #1 ... [13:14:19.766] Exporting '...future.elements_ii' (112 bytes) to cluster node #1 ... DONE [13:14:19.766] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:14:19.766] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:14:19.767] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:14:19.767] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:14:19.767] Exporting 11 global objects (92.05 KiB) to cluster node #1 ... DONE [13:14:19.767] MultisessionFuture started [13:14:19.768] - Launch lazy future ... done [13:14:19.768] run() for 'MultisessionFuture' ... done [13:14:19.768] Created future: [13:14:19.786] receiveMessageFromWorker() for ClusterFuture ... [13:14:19.786] - Validating connection of MultisessionFuture [13:14:19.787] - received message: FutureResult [13:14:19.787] - Received FutureResult [13:14:19.787] - Erased future from FutureRegistry [13:14:19.787] result() for ClusterFuture ... [13:14:19.787] - result already collected: FutureResult [13:14:19.787] result() for ClusterFuture ... done [13:14:19.787] receiveMessageFromWorker() for ClusterFuture ... done [13:14:19.768] MultisessionFuture: [13:14:19.768] Label: 'future_vapply-2' [13:14:19.768] Expression: [13:14:19.768] { [13:14:19.768] do.call(function(...) { [13:14:19.768] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:19.768] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:19.768] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:19.768] on.exit(options(oopts), add = TRUE) [13:14:19.768] } [13:14:19.768] { [13:14:19.768] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:19.768] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:19.768] ...future.FUN(...future.X_jj, ...) [13:14:19.768] }) [13:14:19.768] } [13:14:19.768] }, args = future.call.arguments) [13:14:19.768] } [13:14:19.768] Lazy evaluation: FALSE [13:14:19.768] Asynchronous evaluation: TRUE [13:14:19.768] Local evaluation: TRUE [13:14:19.768] Environment: R_GlobalEnv [13:14:19.768] Capture standard output: TRUE [13:14:19.768] Capture condition classes: 'condition' (excluding 'nothing') [13:14:19.768] Globals: 11 objects totaling 92.16 KiB (function '...future.FUN' of 21.22 KiB, function 'x_FUN' of 56 bytes, integer 'times' of 56 bytes, function 'stopf' of 26.43 KiB, function 'stop_if_not' of 44.12 KiB, ...) [13:14:19.768] Packages: 1 packages ('future.apply') [13:14:19.768] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:14:19.768] Resolved: TRUE [13:14:19.768] Value: [13:14:19.768] Conditions captured: [13:14:19.768] Early signaling: FALSE [13:14:19.768] Owner process: 1bb7d580-628d-c90d-e38a-66de485868c4 [13:14:19.768] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:14:19.788] Chunk #2 of 2 ... DONE [13:14:19.788] Launching 2 futures (chunks) ... DONE [13:14:19.788] Resolving 2 futures (chunks) ... [13:14:19.788] resolve() on list ... [13:14:19.788] recursive: 0 [13:14:19.789] length: 2 [13:14:19.789] [13:14:19.789] Future #1 [13:14:19.789] result() for ClusterFuture ... [13:14:19.789] - result already collected: FutureResult [13:14:19.789] result() for ClusterFuture ... done [13:14:19.789] result() for ClusterFuture ... [13:14:19.789] - result already collected: FutureResult [13:14:19.789] result() for ClusterFuture ... done [13:14:19.790] signalConditionsASAP(MultisessionFuture, pos=1) ... [13:14:19.790] - nx: 2 [13:14:19.790] - relay: TRUE [13:14:19.790] - stdout: TRUE [13:14:19.790] - signal: TRUE [13:14:19.790] - resignal: FALSE [13:14:19.790] - force: TRUE [13:14:19.790] - relayed: [n=2] FALSE, FALSE [13:14:19.791] - queued futures: [n=2] FALSE, FALSE [13:14:19.791] - until=1 [13:14:19.791] - relaying element #1 [13:14:19.791] result() for ClusterFuture ... [13:14:19.791] - result already collected: FutureResult [13:14:19.791] result() for ClusterFuture ... done [13:14:19.791] result() for ClusterFuture ... [13:14:19.791] - result already collected: FutureResult [13:14:19.792] result() for ClusterFuture ... done [13:14:19.792] result() for ClusterFuture ... [13:14:19.792] - result already collected: FutureResult [13:14:19.792] result() for ClusterFuture ... done [13:14:19.792] result() for ClusterFuture ... [13:14:19.792] - result already collected: FutureResult [13:14:19.792] result() for ClusterFuture ... done [13:14:19.793] - relayed: [n=2] TRUE, FALSE [13:14:19.793] - queued futures: [n=2] TRUE, FALSE [13:14:19.793] signalConditionsASAP(MultisessionFuture, pos=1) ... done [13:14:19.793] length: 1 (resolved future 1) [13:14:19.793] Future #2 [13:14:19.793] result() for ClusterFuture ... [13:14:19.793] - result already collected: FutureResult [13:14:19.793] result() for ClusterFuture ... done [13:14:19.794] result() for ClusterFuture ... [13:14:19.794] - result already collected: FutureResult [13:14:19.794] result() for ClusterFuture ... done [13:14:19.794] signalConditionsASAP(MultisessionFuture, pos=2) ... [13:14:19.794] - nx: 2 [13:14:19.794] - relay: TRUE [13:14:19.794] - stdout: TRUE [13:14:19.794] - signal: TRUE [13:14:19.795] - resignal: FALSE [13:14:19.795] - force: TRUE [13:14:19.795] - relayed: [n=2] TRUE, FALSE [13:14:19.795] - queued futures: [n=2] TRUE, FALSE [13:14:19.795] - until=2 [13:14:19.795] - relaying element #2 [13:14:19.795] result() for ClusterFuture ... [13:14:19.795] - result already collected: FutureResult [13:14:19.796] result() for ClusterFuture ... done [13:14:19.796] result() for ClusterFuture ... [13:14:19.796] - result already collected: FutureResult [13:14:19.796] result() for ClusterFuture ... done [13:14:19.796] result() for ClusterFuture ... [13:14:19.796] - result already collected: FutureResult [13:14:19.796] result() for ClusterFuture ... done [13:14:19.796] result() for ClusterFuture ... [13:14:19.797] - result already collected: FutureResult [13:14:19.797] result() for ClusterFuture ... done [13:14:19.797] - relayed: [n=2] TRUE, TRUE [13:14:19.797] - queued futures: [n=2] TRUE, TRUE [13:14:19.797] signalConditionsASAP(MultisessionFuture, pos=2) ... done [13:14:19.797] length: 0 (resolved future 2) [13:14:19.797] Relaying remaining futures [13:14:19.797] signalConditionsASAP(NULL, pos=0) ... [13:14:19.798] - nx: 2 [13:14:19.798] - relay: TRUE [13:14:19.798] - stdout: TRUE [13:14:19.798] - signal: TRUE [13:14:19.798] - resignal: FALSE [13:14:19.798] - force: TRUE [13:14:19.798] - relayed: [n=2] TRUE, TRUE [13:14:19.798] - queued futures: [n=2] TRUE, TRUE - flush all [13:14:19.799] - relayed: [n=2] TRUE, TRUE [13:14:19.799] - queued futures: [n=2] TRUE, TRUE [13:14:19.799] signalConditionsASAP(NULL, pos=0) ... done [13:14:19.799] resolve() on list ... DONE [13:14:19.799] result() for ClusterFuture ... [13:14:19.799] - result already collected: FutureResult [13:14:19.799] result() for ClusterFuture ... done [13:14:19.799] result() for ClusterFuture ... [13:14:19.800] - result already collected: FutureResult [13:14:19.800] result() for ClusterFuture ... done [13:14:19.800] result() for ClusterFuture ... [13:14:19.800] - result already collected: FutureResult [13:14:19.800] result() for ClusterFuture ... done [13:14:19.800] result() for ClusterFuture ... [13:14:19.800] - result already collected: FutureResult [13:14:19.801] result() for ClusterFuture ... done [13:14:19.801] - Number of value chunks collected: 2 [13:14:19.801] Resolving 2 futures (chunks) ... DONE [13:14:19.801] Reducing values from 2 chunks ... [13:14:19.801] - Number of values collected after concatenation: 3 [13:14:19.801] - Number of values expected: 3 [13:14:19.801] Reducing values from 2 chunks ... DONE [13:14:19.801] future_lapply() ... DONE - exceptions ... [13:14:19.802] future_lapply() ... [13:14:19.805] Number of chunks: 2 [13:14:19.805] getGlobalsAndPackagesXApply() ... [13:14:19.805] - future.globals: TRUE [13:14:19.806] getGlobalsAndPackages() ... [13:14:19.806] Searching for globals... [13:14:19.809] - globals found: [16] 'FUN', '{', '<-', 'x_FUN', 'if', '!=', 'length', 'times', 'stopf', 'stop_if_not', 'all', '==', 'dim', '%in%', 'typeof', 'valid_types' [13:14:19.809] Searching for globals ... DONE [13:14:19.809] Resolving globals: FALSE [13:14:19.810] The total size of the 7 globals is 92.90 KiB (95128 bytes) [13:14:19.810] The total size of the 7 globals exported for future expression ('FUN()') is 92.90 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). The three largest globals are 'stop_if_not' (44.12 KiB of class 'function'), 'stopf' (26.43 KiB of class 'function') and 'FUN' (21.22 KiB of class 'function') [13:14:19.811] - globals: [7] 'FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types' [13:14:19.811] - packages: [1] 'future.apply' [13:14:19.811] getGlobalsAndPackages() ... DONE [13:14:19.811] - globals found/used: [n=7] 'FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types' [13:14:19.811] - needed namespaces: [n=1] 'future.apply' [13:14:19.811] Finding globals ... DONE [13:14:19.811] - use_args: TRUE [13:14:19.812] - Getting '...' globals ... [13:14:19.812] resolve() on list ... [13:14:19.812] recursive: 0 [13:14:19.812] length: 1 [13:14:19.812] elements: '...' [13:14:19.812] length: 0 (resolved future 1) [13:14:19.813] resolve() on list ... DONE [13:14:19.813] - '...' content: [n=0] [13:14:19.813] List of 1 [13:14:19.813] $ ...: list() [13:14:19.813] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:14:19.813] - attr(*, "where")=List of 1 [13:14:19.813] ..$ ...: [13:14:19.813] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:14:19.813] - attr(*, "resolved")= logi TRUE [13:14:19.813] - attr(*, "total_size")= num NA [13:14:19.815] - Getting '...' globals ... DONE [13:14:19.816] Globals to be used in all futures (chunks): [n=8] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...' [13:14:19.816] List of 8 [13:14:19.816] $ ...future.FUN:function (x, ...) [13:14:19.816] $ x_FUN :function (x) [13:14:19.816] $ times : int 2 [13:14:19.816] $ stopf :function (fmt, ..., call. = TRUE, domain = NULL) [13:14:19.816] $ stop_if_not :function (...) [13:14:19.816] $ dim : NULL [13:14:19.816] $ valid_types : chr [1:3] "logical" "integer" "double" [13:14:19.816] $ ... : list() [13:14:19.816] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:14:19.816] - attr(*, "where")=List of 8 [13:14:19.816] ..$ ...future.FUN: [13:14:19.816] ..$ x_FUN : [13:14:19.816] ..$ times : [13:14:19.816] ..$ stopf : [13:14:19.816] ..$ stop_if_not : [13:14:19.816] ..$ dim : [13:14:19.816] ..$ valid_types : [13:14:19.816] ..$ ... : [13:14:19.816] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:14:19.816] - attr(*, "resolved")= logi FALSE [13:14:19.816] - attr(*, "total_size")= num 95128 [13:14:19.821] Packages to be attached in all futures: [n=1] 'future.apply' [13:14:19.821] getGlobalsAndPackagesXApply() ... DONE [13:14:19.821] Number of futures (= number of chunks): 2 [13:14:19.822] Launching 2 futures (chunks) ... [13:14:19.822] Chunk #1 of 2 ... [13:14:19.822] - Finding globals in 'X' for chunk #1 ... [13:14:19.822] getGlobalsAndPackages() ... [13:14:19.822] Searching for globals... [13:14:19.822] [13:14:19.823] Searching for globals ... DONE [13:14:19.823] - globals: [0] [13:14:19.823] getGlobalsAndPackages() ... DONE [13:14:19.823] + additional globals found: [n=0] [13:14:19.823] + additional namespaces needed: [n=0] [13:14:19.823] - Finding globals in 'X' for chunk #1 ... DONE [13:14:19.823] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:14:19.823] - seeds: [13:14:19.823] - All globals exported: [n=11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:19.824] getGlobalsAndPackages() ... [13:14:19.824] - globals passed as-is: [11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:19.824] Resolving globals: FALSE [13:14:19.824] Tweak future expression to call with '...' arguments ... [13:14:19.824] { [13:14:19.824] do.call(function(...) { [13:14:19.824] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:19.824] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:19.824] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:19.824] on.exit(options(oopts), add = TRUE) [13:14:19.824] } [13:14:19.824] { [13:14:19.824] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:19.824] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:19.824] ...future.FUN(...future.X_jj, ...) [13:14:19.824] }) [13:14:19.824] } [13:14:19.824] }, args = future.call.arguments) [13:14:19.824] } [13:14:19.825] Tweak future expression to call with '...' arguments ... DONE [13:14:19.825] - globals: [11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:19.825] - packages: [1] 'future.apply' [13:14:19.825] getGlobalsAndPackages() ... DONE [13:14:19.826] run() for 'Future' ... [13:14:19.826] - state: 'created' [13:14:19.826] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:14:19.836] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:14:19.836] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:14:19.836] - Field: 'node' [13:14:19.836] - Field: 'label' [13:14:19.837] - Field: 'local' [13:14:19.837] - Field: 'owner' [13:14:19.837] - Field: 'envir' [13:14:19.837] - Field: 'workers' [13:14:19.837] - Field: 'packages' [13:14:19.837] - Field: 'gc' [13:14:19.837] - Field: 'conditions' [13:14:19.837] - Field: 'persistent' [13:14:19.838] - Field: 'expr' [13:14:19.838] - Field: 'uuid' [13:14:19.838] - Field: 'seed' [13:14:19.838] - Field: 'version' [13:14:19.838] - Field: 'result' [13:14:19.838] - Field: 'asynchronous' [13:14:19.838] - Field: 'calls' [13:14:19.839] - Field: 'globals' [13:14:19.839] - Field: 'stdout' [13:14:19.839] - Field: 'earlySignal' [13:14:19.839] - Field: 'lazy' [13:14:19.839] - Field: 'state' [13:14:19.839] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:14:19.839] - Launch lazy future ... [13:14:19.840] Packages needed by the future expression (n = 1): 'future.apply' [13:14:19.840] Packages needed by future strategies (n = 0): [13:14:19.840] { [13:14:19.840] { [13:14:19.840] { [13:14:19.840] ...future.startTime <- base::Sys.time() [13:14:19.840] { [13:14:19.840] { [13:14:19.840] { [13:14:19.840] { [13:14:19.840] { [13:14:19.840] base::local({ [13:14:19.840] has_future <- base::requireNamespace("future", [13:14:19.840] quietly = TRUE) [13:14:19.840] if (has_future) { [13:14:19.840] ns <- base::getNamespace("future") [13:14:19.840] version <- ns[[".package"]][["version"]] [13:14:19.840] if (is.null(version)) [13:14:19.840] version <- utils::packageVersion("future") [13:14:19.840] } [13:14:19.840] else { [13:14:19.840] version <- NULL [13:14:19.840] } [13:14:19.840] if (!has_future || version < "1.8.0") { [13:14:19.840] info <- base::c(r_version = base::gsub("R version ", [13:14:19.840] "", base::R.version$version.string), [13:14:19.840] platform = base::sprintf("%s (%s-bit)", [13:14:19.840] base::R.version$platform, 8 * [13:14:19.840] base::.Machine$sizeof.pointer), [13:14:19.840] os = base::paste(base::Sys.info()[base::c("sysname", [13:14:19.840] "release", "version")], collapse = " "), [13:14:19.840] hostname = base::Sys.info()[["nodename"]]) [13:14:19.840] info <- base::sprintf("%s: %s", base::names(info), [13:14:19.840] info) [13:14:19.840] info <- base::paste(info, collapse = "; ") [13:14:19.840] if (!has_future) { [13:14:19.840] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:14:19.840] info) [13:14:19.840] } [13:14:19.840] else { [13:14:19.840] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:14:19.840] info, version) [13:14:19.840] } [13:14:19.840] base::stop(msg) [13:14:19.840] } [13:14:19.840] }) [13:14:19.840] } [13:14:19.840] ...future.mc.cores.old <- base::getOption("mc.cores") [13:14:19.840] base::options(mc.cores = 1L) [13:14:19.840] } [13:14:19.840] base::local({ [13:14:19.840] for (pkg in "future.apply") { [13:14:19.840] base::loadNamespace(pkg) [13:14:19.840] base::library(pkg, character.only = TRUE) [13:14:19.840] } [13:14:19.840] }) [13:14:19.840] } [13:14:19.840] options(future.plan = NULL) [13:14:19.840] Sys.unsetenv("R_FUTURE_PLAN") [13:14:19.840] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:14:19.840] } [13:14:19.840] ...future.workdir <- getwd() [13:14:19.840] } [13:14:19.840] ...future.oldOptions <- base::as.list(base::.Options) [13:14:19.840] ...future.oldEnvVars <- base::Sys.getenv() [13:14:19.840] } [13:14:19.840] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:14:19.840] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:14:19.840] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:14:19.840] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:14:19.840] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:14:19.840] future.stdout.windows.reencode = NULL, width = 80L) [13:14:19.840] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:14:19.840] base::names(...future.oldOptions)) [13:14:19.840] } [13:14:19.840] if (FALSE) { [13:14:19.840] } [13:14:19.840] else { [13:14:19.840] if (TRUE) { [13:14:19.840] ...future.stdout <- base::rawConnection(base::raw(0L), [13:14:19.840] open = "w") [13:14:19.840] } [13:14:19.840] else { [13:14:19.840] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:14:19.840] windows = "NUL", "/dev/null"), open = "w") [13:14:19.840] } [13:14:19.840] base::sink(...future.stdout, type = "output", split = FALSE) [13:14:19.840] base::on.exit(if (!base::is.null(...future.stdout)) { [13:14:19.840] base::sink(type = "output", split = FALSE) [13:14:19.840] base::close(...future.stdout) [13:14:19.840] }, add = TRUE) [13:14:19.840] } [13:14:19.840] ...future.frame <- base::sys.nframe() [13:14:19.840] ...future.conditions <- base::list() [13:14:19.840] ...future.rng <- base::globalenv()$.Random.seed [13:14:19.840] if (FALSE) { [13:14:19.840] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:14:19.840] "...future.value", "...future.globalenv.names", ".Random.seed") [13:14:19.840] } [13:14:19.840] ...future.result <- base::tryCatch({ [13:14:19.840] base::withCallingHandlers({ [13:14:19.840] ...future.value <- base::withVisible(base::local({ [13:14:19.840] ...future.makeSendCondition <- local({ [13:14:19.840] sendCondition <- NULL [13:14:19.840] function(frame = 1L) { [13:14:19.840] if (is.function(sendCondition)) [13:14:19.840] return(sendCondition) [13:14:19.840] ns <- getNamespace("parallel") [13:14:19.840] if (exists("sendData", mode = "function", [13:14:19.840] envir = ns)) { [13:14:19.840] parallel_sendData <- get("sendData", mode = "function", [13:14:19.840] envir = ns) [13:14:19.840] envir <- sys.frame(frame) [13:14:19.840] master <- NULL [13:14:19.840] while (!identical(envir, .GlobalEnv) && [13:14:19.840] !identical(envir, emptyenv())) { [13:14:19.840] if (exists("master", mode = "list", envir = envir, [13:14:19.840] inherits = FALSE)) { [13:14:19.840] master <- get("master", mode = "list", [13:14:19.840] envir = envir, inherits = FALSE) [13:14:19.840] if (inherits(master, c("SOCKnode", [13:14:19.840] "SOCK0node"))) { [13:14:19.840] sendCondition <<- function(cond) { [13:14:19.840] data <- list(type = "VALUE", value = cond, [13:14:19.840] success = TRUE) [13:14:19.840] parallel_sendData(master, data) [13:14:19.840] } [13:14:19.840] return(sendCondition) [13:14:19.840] } [13:14:19.840] } [13:14:19.840] frame <- frame + 1L [13:14:19.840] envir <- sys.frame(frame) [13:14:19.840] } [13:14:19.840] } [13:14:19.840] sendCondition <<- function(cond) NULL [13:14:19.840] } [13:14:19.840] }) [13:14:19.840] withCallingHandlers({ [13:14:19.840] { [13:14:19.840] do.call(function(...) { [13:14:19.840] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:19.840] if (!identical(...future.globals.maxSize.org, [13:14:19.840] ...future.globals.maxSize)) { [13:14:19.840] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:19.840] on.exit(options(oopts), add = TRUE) [13:14:19.840] } [13:14:19.840] { [13:14:19.840] lapply(seq_along(...future.elements_ii), [13:14:19.840] FUN = function(jj) { [13:14:19.840] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:19.840] ...future.FUN(...future.X_jj, ...) [13:14:19.840] }) [13:14:19.840] } [13:14:19.840] }, args = future.call.arguments) [13:14:19.840] } [13:14:19.840] }, immediateCondition = function(cond) { [13:14:19.840] sendCondition <- ...future.makeSendCondition() [13:14:19.840] sendCondition(cond) [13:14:19.840] muffleCondition <- function (cond, pattern = "^muffle") [13:14:19.840] { [13:14:19.840] inherits <- base::inherits [13:14:19.840] invokeRestart <- base::invokeRestart [13:14:19.840] is.null <- base::is.null [13:14:19.840] muffled <- FALSE [13:14:19.840] if (inherits(cond, "message")) { [13:14:19.840] muffled <- grepl(pattern, "muffleMessage") [13:14:19.840] if (muffled) [13:14:19.840] invokeRestart("muffleMessage") [13:14:19.840] } [13:14:19.840] else if (inherits(cond, "warning")) { [13:14:19.840] muffled <- grepl(pattern, "muffleWarning") [13:14:19.840] if (muffled) [13:14:19.840] invokeRestart("muffleWarning") [13:14:19.840] } [13:14:19.840] else if (inherits(cond, "condition")) { [13:14:19.840] if (!is.null(pattern)) { [13:14:19.840] computeRestarts <- base::computeRestarts [13:14:19.840] grepl <- base::grepl [13:14:19.840] restarts <- computeRestarts(cond) [13:14:19.840] for (restart in restarts) { [13:14:19.840] name <- restart$name [13:14:19.840] if (is.null(name)) [13:14:19.840] next [13:14:19.840] if (!grepl(pattern, name)) [13:14:19.840] next [13:14:19.840] invokeRestart(restart) [13:14:19.840] muffled <- TRUE [13:14:19.840] break [13:14:19.840] } [13:14:19.840] } [13:14:19.840] } [13:14:19.840] invisible(muffled) [13:14:19.840] } [13:14:19.840] muffleCondition(cond) [13:14:19.840] }) [13:14:19.840] })) [13:14:19.840] future::FutureResult(value = ...future.value$value, [13:14:19.840] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:14:19.840] ...future.rng), globalenv = if (FALSE) [13:14:19.840] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:14:19.840] ...future.globalenv.names)) [13:14:19.840] else NULL, started = ...future.startTime, version = "1.8") [13:14:19.840] }, condition = base::local({ [13:14:19.840] c <- base::c [13:14:19.840] inherits <- base::inherits [13:14:19.840] invokeRestart <- base::invokeRestart [13:14:19.840] length <- base::length [13:14:19.840] list <- base::list [13:14:19.840] seq.int <- base::seq.int [13:14:19.840] signalCondition <- base::signalCondition [13:14:19.840] sys.calls <- base::sys.calls [13:14:19.840] `[[` <- base::`[[` [13:14:19.840] `+` <- base::`+` [13:14:19.840] `<<-` <- base::`<<-` [13:14:19.840] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:14:19.840] calls[seq.int(from = from + 12L, to = length(calls) - [13:14:19.840] 3L)] [13:14:19.840] } [13:14:19.840] function(cond) { [13:14:19.840] is_error <- inherits(cond, "error") [13:14:19.840] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:14:19.840] NULL) [13:14:19.840] if (is_error) { [13:14:19.840] sessionInformation <- function() { [13:14:19.840] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:14:19.840] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:14:19.840] search = base::search(), system = base::Sys.info()) [13:14:19.840] } [13:14:19.840] ...future.conditions[[length(...future.conditions) + [13:14:19.840] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:14:19.840] cond$call), session = sessionInformation(), [13:14:19.840] timestamp = base::Sys.time(), signaled = 0L) [13:14:19.840] signalCondition(cond) [13:14:19.840] } [13:14:19.840] else if (!ignore && TRUE && inherits(cond, c("condition", [13:14:19.840] "immediateCondition"))) { [13:14:19.840] signal <- TRUE && inherits(cond, "immediateCondition") [13:14:19.840] ...future.conditions[[length(...future.conditions) + [13:14:19.840] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:14:19.840] if (TRUE && !signal) { [13:14:19.840] muffleCondition <- function (cond, pattern = "^muffle") [13:14:19.840] { [13:14:19.840] inherits <- base::inherits [13:14:19.840] invokeRestart <- base::invokeRestart [13:14:19.840] is.null <- base::is.null [13:14:19.840] muffled <- FALSE [13:14:19.840] if (inherits(cond, "message")) { [13:14:19.840] muffled <- grepl(pattern, "muffleMessage") [13:14:19.840] if (muffled) [13:14:19.840] invokeRestart("muffleMessage") [13:14:19.840] } [13:14:19.840] else if (inherits(cond, "warning")) { [13:14:19.840] muffled <- grepl(pattern, "muffleWarning") [13:14:19.840] if (muffled) [13:14:19.840] invokeRestart("muffleWarning") [13:14:19.840] } [13:14:19.840] else if (inherits(cond, "condition")) { [13:14:19.840] if (!is.null(pattern)) { [13:14:19.840] computeRestarts <- base::computeRestarts [13:14:19.840] grepl <- base::grepl [13:14:19.840] restarts <- computeRestarts(cond) [13:14:19.840] for (restart in restarts) { [13:14:19.840] name <- restart$name [13:14:19.840] if (is.null(name)) [13:14:19.840] next [13:14:19.840] if (!grepl(pattern, name)) [13:14:19.840] next [13:14:19.840] invokeRestart(restart) [13:14:19.840] muffled <- TRUE [13:14:19.840] break [13:14:19.840] } [13:14:19.840] } [13:14:19.840] } [13:14:19.840] invisible(muffled) [13:14:19.840] } [13:14:19.840] muffleCondition(cond, pattern = "^muffle") [13:14:19.840] } [13:14:19.840] } [13:14:19.840] else { [13:14:19.840] if (TRUE) { [13:14:19.840] muffleCondition <- function (cond, pattern = "^muffle") [13:14:19.840] { [13:14:19.840] inherits <- base::inherits [13:14:19.840] invokeRestart <- base::invokeRestart [13:14:19.840] is.null <- base::is.null [13:14:19.840] muffled <- FALSE [13:14:19.840] if (inherits(cond, "message")) { [13:14:19.840] muffled <- grepl(pattern, "muffleMessage") [13:14:19.840] if (muffled) [13:14:19.840] invokeRestart("muffleMessage") [13:14:19.840] } [13:14:19.840] else if (inherits(cond, "warning")) { [13:14:19.840] muffled <- grepl(pattern, "muffleWarning") [13:14:19.840] if (muffled) [13:14:19.840] invokeRestart("muffleWarning") [13:14:19.840] } [13:14:19.840] else if (inherits(cond, "condition")) { [13:14:19.840] if (!is.null(pattern)) { [13:14:19.840] computeRestarts <- base::computeRestarts [13:14:19.840] grepl <- base::grepl [13:14:19.840] restarts <- computeRestarts(cond) [13:14:19.840] for (restart in restarts) { [13:14:19.840] name <- restart$name [13:14:19.840] if (is.null(name)) [13:14:19.840] next [13:14:19.840] if (!grepl(pattern, name)) [13:14:19.840] next [13:14:19.840] invokeRestart(restart) [13:14:19.840] muffled <- TRUE [13:14:19.840] break [13:14:19.840] } [13:14:19.840] } [13:14:19.840] } [13:14:19.840] invisible(muffled) [13:14:19.840] } [13:14:19.840] muffleCondition(cond, pattern = "^muffle") [13:14:19.840] } [13:14:19.840] } [13:14:19.840] } [13:14:19.840] })) [13:14:19.840] }, error = function(ex) { [13:14:19.840] base::structure(base::list(value = NULL, visible = NULL, [13:14:19.840] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:14:19.840] ...future.rng), started = ...future.startTime, [13:14:19.840] finished = Sys.time(), session_uuid = NA_character_, [13:14:19.840] version = "1.8"), class = "FutureResult") [13:14:19.840] }, finally = { [13:14:19.840] if (!identical(...future.workdir, getwd())) [13:14:19.840] setwd(...future.workdir) [13:14:19.840] { [13:14:19.840] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:14:19.840] ...future.oldOptions$nwarnings <- NULL [13:14:19.840] } [13:14:19.840] base::options(...future.oldOptions) [13:14:19.840] if (.Platform$OS.type == "windows") { [13:14:19.840] old_names <- names(...future.oldEnvVars) [13:14:19.840] envs <- base::Sys.getenv() [13:14:19.840] names <- names(envs) [13:14:19.840] common <- intersect(names, old_names) [13:14:19.840] added <- setdiff(names, old_names) [13:14:19.840] removed <- setdiff(old_names, names) [13:14:19.840] changed <- common[...future.oldEnvVars[common] != [13:14:19.840] envs[common]] [13:14:19.840] NAMES <- toupper(changed) [13:14:19.840] args <- list() [13:14:19.840] for (kk in seq_along(NAMES)) { [13:14:19.840] name <- changed[[kk]] [13:14:19.840] NAME <- NAMES[[kk]] [13:14:19.840] if (name != NAME && is.element(NAME, old_names)) [13:14:19.840] next [13:14:19.840] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:19.840] } [13:14:19.840] NAMES <- toupper(added) [13:14:19.840] for (kk in seq_along(NAMES)) { [13:14:19.840] name <- added[[kk]] [13:14:19.840] NAME <- NAMES[[kk]] [13:14:19.840] if (name != NAME && is.element(NAME, old_names)) [13:14:19.840] next [13:14:19.840] args[[name]] <- "" [13:14:19.840] } [13:14:19.840] NAMES <- toupper(removed) [13:14:19.840] for (kk in seq_along(NAMES)) { [13:14:19.840] name <- removed[[kk]] [13:14:19.840] NAME <- NAMES[[kk]] [13:14:19.840] if (name != NAME && is.element(NAME, old_names)) [13:14:19.840] next [13:14:19.840] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:19.840] } [13:14:19.840] if (length(args) > 0) [13:14:19.840] base::do.call(base::Sys.setenv, args = args) [13:14:19.840] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:14:19.840] } [13:14:19.840] else { [13:14:19.840] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:14:19.840] } [13:14:19.840] { [13:14:19.840] if (base::length(...future.futureOptionsAdded) > [13:14:19.840] 0L) { [13:14:19.840] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:14:19.840] base::names(opts) <- ...future.futureOptionsAdded [13:14:19.840] base::options(opts) [13:14:19.840] } [13:14:19.840] { [13:14:19.840] { [13:14:19.840] base::options(mc.cores = ...future.mc.cores.old) [13:14:19.840] NULL [13:14:19.840] } [13:14:19.840] options(future.plan = NULL) [13:14:19.840] if (is.na(NA_character_)) [13:14:19.840] Sys.unsetenv("R_FUTURE_PLAN") [13:14:19.840] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:14:19.840] future::plan(list(function (..., workers = availableCores(), [13:14:19.840] lazy = FALSE, rscript_libs = .libPaths(), [13:14:19.840] envir = parent.frame()) [13:14:19.840] { [13:14:19.840] if (is.function(workers)) [13:14:19.840] workers <- workers() [13:14:19.840] workers <- structure(as.integer(workers), [13:14:19.840] class = class(workers)) [13:14:19.840] stop_if_not(length(workers) == 1, is.finite(workers), [13:14:19.840] workers >= 1) [13:14:19.840] if (workers == 1L && !inherits(workers, "AsIs")) { [13:14:19.840] return(sequential(..., lazy = TRUE, envir = envir)) [13:14:19.840] } [13:14:19.840] future <- MultisessionFuture(..., workers = workers, [13:14:19.840] lazy = lazy, rscript_libs = rscript_libs, [13:14:19.840] envir = envir) [13:14:19.840] if (!future$lazy) [13:14:19.840] future <- run(future) [13:14:19.840] invisible(future) [13:14:19.840] }), .cleanup = FALSE, .init = FALSE) [13:14:19.840] } [13:14:19.840] } [13:14:19.840] } [13:14:19.840] }) [13:14:19.840] if (TRUE) { [13:14:19.840] base::sink(type = "output", split = FALSE) [13:14:19.840] if (TRUE) { [13:14:19.840] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:14:19.840] } [13:14:19.840] else { [13:14:19.840] ...future.result["stdout"] <- base::list(NULL) [13:14:19.840] } [13:14:19.840] base::close(...future.stdout) [13:14:19.840] ...future.stdout <- NULL [13:14:19.840] } [13:14:19.840] ...future.result$conditions <- ...future.conditions [13:14:19.840] ...future.result$finished <- base::Sys.time() [13:14:19.840] ...future.result [13:14:19.840] } [13:14:19.844] Exporting 11 global objects (92.90 KiB) to cluster node #1 ... [13:14:19.845] Exporting '...future.FUN' (21.22 KiB) to cluster node #1 ... [13:14:19.845] Exporting '...future.FUN' (21.22 KiB) to cluster node #1 ... DONE [13:14:19.845] Exporting 'x_FUN' (848 bytes) to cluster node #1 ... [13:14:19.845] Exporting 'x_FUN' (848 bytes) to cluster node #1 ... DONE [13:14:19.846] Exporting 'times' (56 bytes) to cluster node #1 ... [13:14:19.846] Exporting 'times' (56 bytes) to cluster node #1 ... DONE [13:14:19.846] Exporting 'stopf' (26.43 KiB) to cluster node #1 ... [13:14:19.846] Exporting 'stopf' (26.43 KiB) to cluster node #1 ... DONE [13:14:19.847] Exporting 'stop_if_not' (44.12 KiB) to cluster node #1 ... [13:14:19.847] Exporting 'stop_if_not' (44.12 KiB) to cluster node #1 ... DONE [13:14:19.847] Exporting 'dim' (0 bytes) to cluster node #1 ... [13:14:19.847] Exporting 'dim' (0 bytes) to cluster node #1 ... DONE [13:14:19.848] Exporting 'valid_types' (248 bytes) to cluster node #1 ... [13:14:19.848] Exporting 'valid_types' (248 bytes) to cluster node #1 ... DONE [13:14:19.848] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... [13:14:19.849] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... DONE [13:14:19.849] Exporting '...future.elements_ii' (56 bytes) to cluster node #1 ... [13:14:19.849] Exporting '...future.elements_ii' (56 bytes) to cluster node #1 ... DONE [13:14:19.849] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:14:19.851] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:14:19.852] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:14:19.852] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:14:19.852] Exporting 11 global objects (92.90 KiB) to cluster node #1 ... DONE [13:14:19.853] MultisessionFuture started [13:14:19.853] - Launch lazy future ... done [13:14:19.853] run() for 'MultisessionFuture' ... done [13:14:19.853] Created future: [13:14:19.873] receiveMessageFromWorker() for ClusterFuture ... [13:14:19.873] - Validating connection of MultisessionFuture [13:14:19.873] - received message: FutureResult [13:14:19.874] - Received FutureResult [13:14:19.874] - Erased future from FutureRegistry [13:14:19.874] result() for ClusterFuture ... [13:14:19.874] - result already collected: FutureResult [13:14:19.874] result() for ClusterFuture ... done [13:14:19.874] signalConditions() ... [13:14:19.875] - include = 'immediateCondition' [13:14:19.875] - exclude = [13:14:19.875] - resignal = FALSE [13:14:19.875] - Number of conditions: 1 [13:14:19.875] signalConditions() ... done [13:14:19.875] receiveMessageFromWorker() for ClusterFuture ... done [13:14:19.853] MultisessionFuture: [13:14:19.853] Label: 'future_vapply-1' [13:14:19.853] Expression: [13:14:19.853] { [13:14:19.853] do.call(function(...) { [13:14:19.853] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:19.853] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:19.853] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:19.853] on.exit(options(oopts), add = TRUE) [13:14:19.853] } [13:14:19.853] { [13:14:19.853] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:19.853] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:19.853] ...future.FUN(...future.X_jj, ...) [13:14:19.853] }) [13:14:19.853] } [13:14:19.853] }, args = future.call.arguments) [13:14:19.853] } [13:14:19.853] Lazy evaluation: FALSE [13:14:19.853] Asynchronous evaluation: TRUE [13:14:19.853] Local evaluation: TRUE [13:14:19.853] Environment: R_GlobalEnv [13:14:19.853] Capture standard output: TRUE [13:14:19.853] Capture condition classes: 'condition' (excluding 'nothing') [13:14:19.853] Globals: 11 objects totaling 92.95 KiB (function '...future.FUN' of 21.22 KiB, function 'x_FUN' of 848 bytes, integer 'times' of 56 bytes, function 'stopf' of 26.43 KiB, function 'stop_if_not' of 44.12 KiB, ...) [13:14:19.853] Packages: 1 packages ('future.apply') [13:14:19.853] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:14:19.853] Resolved: TRUE [13:14:19.853] Value: [13:14:19.853] Conditions captured: [13:14:19.853] Early signaling: FALSE [13:14:19.853] Owner process: 1bb7d580-628d-c90d-e38a-66de485868c4 [13:14:19.853] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:14:19.876] Chunk #1 of 2 ... DONE [13:14:19.876] Chunk #2 of 2 ... [13:14:19.876] - Finding globals in 'X' for chunk #2 ... [13:14:19.876] getGlobalsAndPackages() ... [13:14:19.876] Searching for globals... [13:14:19.876] [13:14:19.876] Searching for globals ... DONE [13:14:19.876] - globals: [0] [13:14:19.877] getGlobalsAndPackages() ... DONE [13:14:19.877] + additional globals found: [n=0] [13:14:19.877] + additional namespaces needed: [n=0] [13:14:19.877] - Finding globals in 'X' for chunk #2 ... DONE [13:14:19.877] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:14:19.877] - seeds: [13:14:19.877] - All globals exported: [n=11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:19.877] getGlobalsAndPackages() ... [13:14:19.878] - globals passed as-is: [11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:19.878] Resolving globals: FALSE [13:14:19.878] Tweak future expression to call with '...' arguments ... [13:14:19.878] { [13:14:19.878] do.call(function(...) { [13:14:19.878] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:19.878] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:19.878] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:19.878] on.exit(options(oopts), add = TRUE) [13:14:19.878] } [13:14:19.878] { [13:14:19.878] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:19.878] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:19.878] ...future.FUN(...future.X_jj, ...) [13:14:19.878] }) [13:14:19.878] } [13:14:19.878] }, args = future.call.arguments) [13:14:19.878] } [13:14:19.878] Tweak future expression to call with '...' arguments ... DONE [13:14:19.879] - globals: [11] '...future.FUN', 'x_FUN', 'times', 'stopf', 'stop_if_not', 'dim', 'valid_types', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:14:19.879] - packages: [1] 'future.apply' [13:14:19.879] getGlobalsAndPackages() ... DONE [13:14:19.879] run() for 'Future' ... [13:14:19.879] - state: 'created' [13:14:19.880] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:14:19.890] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:14:19.890] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:14:19.890] - Field: 'node' [13:14:19.890] - Field: 'label' [13:14:19.890] - Field: 'local' [13:14:19.890] - Field: 'owner' [13:14:19.891] - Field: 'envir' [13:14:19.891] - Field: 'workers' [13:14:19.891] - Field: 'packages' [13:14:19.891] - Field: 'gc' [13:14:19.891] - Field: 'conditions' [13:14:19.891] - Field: 'persistent' [13:14:19.891] - Field: 'expr' [13:14:19.891] - Field: 'uuid' [13:14:19.892] - Field: 'seed' [13:14:19.892] - Field: 'version' [13:14:19.892] - Field: 'result' [13:14:19.892] - Field: 'asynchronous' [13:14:19.892] - Field: 'calls' [13:14:19.892] - Field: 'globals' [13:14:19.892] - Field: 'stdout' [13:14:19.892] - Field: 'earlySignal' [13:14:19.893] - Field: 'lazy' [13:14:19.893] - Field: 'state' [13:14:19.893] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:14:19.893] - Launch lazy future ... [13:14:19.893] Packages needed by the future expression (n = 1): 'future.apply' [13:14:19.893] Packages needed by future strategies (n = 0): [13:14:19.894] { [13:14:19.894] { [13:14:19.894] { [13:14:19.894] ...future.startTime <- base::Sys.time() [13:14:19.894] { [13:14:19.894] { [13:14:19.894] { [13:14:19.894] { [13:14:19.894] { [13:14:19.894] base::local({ [13:14:19.894] has_future <- base::requireNamespace("future", [13:14:19.894] quietly = TRUE) [13:14:19.894] if (has_future) { [13:14:19.894] ns <- base::getNamespace("future") [13:14:19.894] version <- ns[[".package"]][["version"]] [13:14:19.894] if (is.null(version)) [13:14:19.894] version <- utils::packageVersion("future") [13:14:19.894] } [13:14:19.894] else { [13:14:19.894] version <- NULL [13:14:19.894] } [13:14:19.894] if (!has_future || version < "1.8.0") { [13:14:19.894] info <- base::c(r_version = base::gsub("R version ", [13:14:19.894] "", base::R.version$version.string), [13:14:19.894] platform = base::sprintf("%s (%s-bit)", [13:14:19.894] base::R.version$platform, 8 * [13:14:19.894] base::.Machine$sizeof.pointer), [13:14:19.894] os = base::paste(base::Sys.info()[base::c("sysname", [13:14:19.894] "release", "version")], collapse = " "), [13:14:19.894] hostname = base::Sys.info()[["nodename"]]) [13:14:19.894] info <- base::sprintf("%s: %s", base::names(info), [13:14:19.894] info) [13:14:19.894] info <- base::paste(info, collapse = "; ") [13:14:19.894] if (!has_future) { [13:14:19.894] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:14:19.894] info) [13:14:19.894] } [13:14:19.894] else { [13:14:19.894] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:14:19.894] info, version) [13:14:19.894] } [13:14:19.894] base::stop(msg) [13:14:19.894] } [13:14:19.894] }) [13:14:19.894] } [13:14:19.894] ...future.mc.cores.old <- base::getOption("mc.cores") [13:14:19.894] base::options(mc.cores = 1L) [13:14:19.894] } [13:14:19.894] base::local({ [13:14:19.894] for (pkg in "future.apply") { [13:14:19.894] base::loadNamespace(pkg) [13:14:19.894] base::library(pkg, character.only = TRUE) [13:14:19.894] } [13:14:19.894] }) [13:14:19.894] } [13:14:19.894] options(future.plan = NULL) [13:14:19.894] Sys.unsetenv("R_FUTURE_PLAN") [13:14:19.894] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:14:19.894] } [13:14:19.894] ...future.workdir <- getwd() [13:14:19.894] } [13:14:19.894] ...future.oldOptions <- base::as.list(base::.Options) [13:14:19.894] ...future.oldEnvVars <- base::Sys.getenv() [13:14:19.894] } [13:14:19.894] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:14:19.894] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:14:19.894] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:14:19.894] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:14:19.894] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:14:19.894] future.stdout.windows.reencode = NULL, width = 80L) [13:14:19.894] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:14:19.894] base::names(...future.oldOptions)) [13:14:19.894] } [13:14:19.894] if (FALSE) { [13:14:19.894] } [13:14:19.894] else { [13:14:19.894] if (TRUE) { [13:14:19.894] ...future.stdout <- base::rawConnection(base::raw(0L), [13:14:19.894] open = "w") [13:14:19.894] } [13:14:19.894] else { [13:14:19.894] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:14:19.894] windows = "NUL", "/dev/null"), open = "w") [13:14:19.894] } [13:14:19.894] base::sink(...future.stdout, type = "output", split = FALSE) [13:14:19.894] base::on.exit(if (!base::is.null(...future.stdout)) { [13:14:19.894] base::sink(type = "output", split = FALSE) [13:14:19.894] base::close(...future.stdout) [13:14:19.894] }, add = TRUE) [13:14:19.894] } [13:14:19.894] ...future.frame <- base::sys.nframe() [13:14:19.894] ...future.conditions <- base::list() [13:14:19.894] ...future.rng <- base::globalenv()$.Random.seed [13:14:19.894] if (FALSE) { [13:14:19.894] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:14:19.894] "...future.value", "...future.globalenv.names", ".Random.seed") [13:14:19.894] } [13:14:19.894] ...future.result <- base::tryCatch({ [13:14:19.894] base::withCallingHandlers({ [13:14:19.894] ...future.value <- base::withVisible(base::local({ [13:14:19.894] ...future.makeSendCondition <- local({ [13:14:19.894] sendCondition <- NULL [13:14:19.894] function(frame = 1L) { [13:14:19.894] if (is.function(sendCondition)) [13:14:19.894] return(sendCondition) [13:14:19.894] ns <- getNamespace("parallel") [13:14:19.894] if (exists("sendData", mode = "function", [13:14:19.894] envir = ns)) { [13:14:19.894] parallel_sendData <- get("sendData", mode = "function", [13:14:19.894] envir = ns) [13:14:19.894] envir <- sys.frame(frame) [13:14:19.894] master <- NULL [13:14:19.894] while (!identical(envir, .GlobalEnv) && [13:14:19.894] !identical(envir, emptyenv())) { [13:14:19.894] if (exists("master", mode = "list", envir = envir, [13:14:19.894] inherits = FALSE)) { [13:14:19.894] master <- get("master", mode = "list", [13:14:19.894] envir = envir, inherits = FALSE) [13:14:19.894] if (inherits(master, c("SOCKnode", [13:14:19.894] "SOCK0node"))) { [13:14:19.894] sendCondition <<- function(cond) { [13:14:19.894] data <- list(type = "VALUE", value = cond, [13:14:19.894] success = TRUE) [13:14:19.894] parallel_sendData(master, data) [13:14:19.894] } [13:14:19.894] return(sendCondition) [13:14:19.894] } [13:14:19.894] } [13:14:19.894] frame <- frame + 1L [13:14:19.894] envir <- sys.frame(frame) [13:14:19.894] } [13:14:19.894] } [13:14:19.894] sendCondition <<- function(cond) NULL [13:14:19.894] } [13:14:19.894] }) [13:14:19.894] withCallingHandlers({ [13:14:19.894] { [13:14:19.894] do.call(function(...) { [13:14:19.894] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:19.894] if (!identical(...future.globals.maxSize.org, [13:14:19.894] ...future.globals.maxSize)) { [13:14:19.894] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:19.894] on.exit(options(oopts), add = TRUE) [13:14:19.894] } [13:14:19.894] { [13:14:19.894] lapply(seq_along(...future.elements_ii), [13:14:19.894] FUN = function(jj) { [13:14:19.894] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:19.894] ...future.FUN(...future.X_jj, ...) [13:14:19.894] }) [13:14:19.894] } [13:14:19.894] }, args = future.call.arguments) [13:14:19.894] } [13:14:19.894] }, immediateCondition = function(cond) { [13:14:19.894] sendCondition <- ...future.makeSendCondition() [13:14:19.894] sendCondition(cond) [13:14:19.894] muffleCondition <- function (cond, pattern = "^muffle") [13:14:19.894] { [13:14:19.894] inherits <- base::inherits [13:14:19.894] invokeRestart <- base::invokeRestart [13:14:19.894] is.null <- base::is.null [13:14:19.894] muffled <- FALSE [13:14:19.894] if (inherits(cond, "message")) { [13:14:19.894] muffled <- grepl(pattern, "muffleMessage") [13:14:19.894] if (muffled) [13:14:19.894] invokeRestart("muffleMessage") [13:14:19.894] } [13:14:19.894] else if (inherits(cond, "warning")) { [13:14:19.894] muffled <- grepl(pattern, "muffleWarning") [13:14:19.894] if (muffled) [13:14:19.894] invokeRestart("muffleWarning") [13:14:19.894] } [13:14:19.894] else if (inherits(cond, "condition")) { [13:14:19.894] if (!is.null(pattern)) { [13:14:19.894] computeRestarts <- base::computeRestarts [13:14:19.894] grepl <- base::grepl [13:14:19.894] restarts <- computeRestarts(cond) [13:14:19.894] for (restart in restarts) { [13:14:19.894] name <- restart$name [13:14:19.894] if (is.null(name)) [13:14:19.894] next [13:14:19.894] if (!grepl(pattern, name)) [13:14:19.894] next [13:14:19.894] invokeRestart(restart) [13:14:19.894] muffled <- TRUE [13:14:19.894] break [13:14:19.894] } [13:14:19.894] } [13:14:19.894] } [13:14:19.894] invisible(muffled) [13:14:19.894] } [13:14:19.894] muffleCondition(cond) [13:14:19.894] }) [13:14:19.894] })) [13:14:19.894] future::FutureResult(value = ...future.value$value, [13:14:19.894] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:14:19.894] ...future.rng), globalenv = if (FALSE) [13:14:19.894] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:14:19.894] ...future.globalenv.names)) [13:14:19.894] else NULL, started = ...future.startTime, version = "1.8") [13:14:19.894] }, condition = base::local({ [13:14:19.894] c <- base::c [13:14:19.894] inherits <- base::inherits [13:14:19.894] invokeRestart <- base::invokeRestart [13:14:19.894] length <- base::length [13:14:19.894] list <- base::list [13:14:19.894] seq.int <- base::seq.int [13:14:19.894] signalCondition <- base::signalCondition [13:14:19.894] sys.calls <- base::sys.calls [13:14:19.894] `[[` <- base::`[[` [13:14:19.894] `+` <- base::`+` [13:14:19.894] `<<-` <- base::`<<-` [13:14:19.894] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:14:19.894] calls[seq.int(from = from + 12L, to = length(calls) - [13:14:19.894] 3L)] [13:14:19.894] } [13:14:19.894] function(cond) { [13:14:19.894] is_error <- inherits(cond, "error") [13:14:19.894] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:14:19.894] NULL) [13:14:19.894] if (is_error) { [13:14:19.894] sessionInformation <- function() { [13:14:19.894] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:14:19.894] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:14:19.894] search = base::search(), system = base::Sys.info()) [13:14:19.894] } [13:14:19.894] ...future.conditions[[length(...future.conditions) + [13:14:19.894] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:14:19.894] cond$call), session = sessionInformation(), [13:14:19.894] timestamp = base::Sys.time(), signaled = 0L) [13:14:19.894] signalCondition(cond) [13:14:19.894] } [13:14:19.894] else if (!ignore && TRUE && inherits(cond, c("condition", [13:14:19.894] "immediateCondition"))) { [13:14:19.894] signal <- TRUE && inherits(cond, "immediateCondition") [13:14:19.894] ...future.conditions[[length(...future.conditions) + [13:14:19.894] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:14:19.894] if (TRUE && !signal) { [13:14:19.894] muffleCondition <- function (cond, pattern = "^muffle") [13:14:19.894] { [13:14:19.894] inherits <- base::inherits [13:14:19.894] invokeRestart <- base::invokeRestart [13:14:19.894] is.null <- base::is.null [13:14:19.894] muffled <- FALSE [13:14:19.894] if (inherits(cond, "message")) { [13:14:19.894] muffled <- grepl(pattern, "muffleMessage") [13:14:19.894] if (muffled) [13:14:19.894] invokeRestart("muffleMessage") [13:14:19.894] } [13:14:19.894] else if (inherits(cond, "warning")) { [13:14:19.894] muffled <- grepl(pattern, "muffleWarning") [13:14:19.894] if (muffled) [13:14:19.894] invokeRestart("muffleWarning") [13:14:19.894] } [13:14:19.894] else if (inherits(cond, "condition")) { [13:14:19.894] if (!is.null(pattern)) { [13:14:19.894] computeRestarts <- base::computeRestarts [13:14:19.894] grepl <- base::grepl [13:14:19.894] restarts <- computeRestarts(cond) [13:14:19.894] for (restart in restarts) { [13:14:19.894] name <- restart$name [13:14:19.894] if (is.null(name)) [13:14:19.894] next [13:14:19.894] if (!grepl(pattern, name)) [13:14:19.894] next [13:14:19.894] invokeRestart(restart) [13:14:19.894] muffled <- TRUE [13:14:19.894] break [13:14:19.894] } [13:14:19.894] } [13:14:19.894] } [13:14:19.894] invisible(muffled) [13:14:19.894] } [13:14:19.894] muffleCondition(cond, pattern = "^muffle") [13:14:19.894] } [13:14:19.894] } [13:14:19.894] else { [13:14:19.894] if (TRUE) { [13:14:19.894] muffleCondition <- function (cond, pattern = "^muffle") [13:14:19.894] { [13:14:19.894] inherits <- base::inherits [13:14:19.894] invokeRestart <- base::invokeRestart [13:14:19.894] is.null <- base::is.null [13:14:19.894] muffled <- FALSE [13:14:19.894] if (inherits(cond, "message")) { [13:14:19.894] muffled <- grepl(pattern, "muffleMessage") [13:14:19.894] if (muffled) [13:14:19.894] invokeRestart("muffleMessage") [13:14:19.894] } [13:14:19.894] else if (inherits(cond, "warning")) { [13:14:19.894] muffled <- grepl(pattern, "muffleWarning") [13:14:19.894] if (muffled) [13:14:19.894] invokeRestart("muffleWarning") [13:14:19.894] } [13:14:19.894] else if (inherits(cond, "condition")) { [13:14:19.894] if (!is.null(pattern)) { [13:14:19.894] computeRestarts <- base::computeRestarts [13:14:19.894] grepl <- base::grepl [13:14:19.894] restarts <- computeRestarts(cond) [13:14:19.894] for (restart in restarts) { [13:14:19.894] name <- restart$name [13:14:19.894] if (is.null(name)) [13:14:19.894] next [13:14:19.894] if (!grepl(pattern, name)) [13:14:19.894] next [13:14:19.894] invokeRestart(restart) [13:14:19.894] muffled <- TRUE [13:14:19.894] break [13:14:19.894] } [13:14:19.894] } [13:14:19.894] } [13:14:19.894] invisible(muffled) [13:14:19.894] } [13:14:19.894] muffleCondition(cond, pattern = "^muffle") [13:14:19.894] } [13:14:19.894] } [13:14:19.894] } [13:14:19.894] })) [13:14:19.894] }, error = function(ex) { [13:14:19.894] base::structure(base::list(value = NULL, visible = NULL, [13:14:19.894] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:14:19.894] ...future.rng), started = ...future.startTime, [13:14:19.894] finished = Sys.time(), session_uuid = NA_character_, [13:14:19.894] version = "1.8"), class = "FutureResult") [13:14:19.894] }, finally = { [13:14:19.894] if (!identical(...future.workdir, getwd())) [13:14:19.894] setwd(...future.workdir) [13:14:19.894] { [13:14:19.894] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:14:19.894] ...future.oldOptions$nwarnings <- NULL [13:14:19.894] } [13:14:19.894] base::options(...future.oldOptions) [13:14:19.894] if (.Platform$OS.type == "windows") { [13:14:19.894] old_names <- names(...future.oldEnvVars) [13:14:19.894] envs <- base::Sys.getenv() [13:14:19.894] names <- names(envs) [13:14:19.894] common <- intersect(names, old_names) [13:14:19.894] added <- setdiff(names, old_names) [13:14:19.894] removed <- setdiff(old_names, names) [13:14:19.894] changed <- common[...future.oldEnvVars[common] != [13:14:19.894] envs[common]] [13:14:19.894] NAMES <- toupper(changed) [13:14:19.894] args <- list() [13:14:19.894] for (kk in seq_along(NAMES)) { [13:14:19.894] name <- changed[[kk]] [13:14:19.894] NAME <- NAMES[[kk]] [13:14:19.894] if (name != NAME && is.element(NAME, old_names)) [13:14:19.894] next [13:14:19.894] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:19.894] } [13:14:19.894] NAMES <- toupper(added) [13:14:19.894] for (kk in seq_along(NAMES)) { [13:14:19.894] name <- added[[kk]] [13:14:19.894] NAME <- NAMES[[kk]] [13:14:19.894] if (name != NAME && is.element(NAME, old_names)) [13:14:19.894] next [13:14:19.894] args[[name]] <- "" [13:14:19.894] } [13:14:19.894] NAMES <- toupper(removed) [13:14:19.894] for (kk in seq_along(NAMES)) { [13:14:19.894] name <- removed[[kk]] [13:14:19.894] NAME <- NAMES[[kk]] [13:14:19.894] if (name != NAME && is.element(NAME, old_names)) [13:14:19.894] next [13:14:19.894] args[[name]] <- ...future.oldEnvVars[[name]] [13:14:19.894] } [13:14:19.894] if (length(args) > 0) [13:14:19.894] base::do.call(base::Sys.setenv, args = args) [13:14:19.894] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:14:19.894] } [13:14:19.894] else { [13:14:19.894] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:14:19.894] } [13:14:19.894] { [13:14:19.894] if (base::length(...future.futureOptionsAdded) > [13:14:19.894] 0L) { [13:14:19.894] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:14:19.894] base::names(opts) <- ...future.futureOptionsAdded [13:14:19.894] base::options(opts) [13:14:19.894] } [13:14:19.894] { [13:14:19.894] { [13:14:19.894] base::options(mc.cores = ...future.mc.cores.old) [13:14:19.894] NULL [13:14:19.894] } [13:14:19.894] options(future.plan = NULL) [13:14:19.894] if (is.na(NA_character_)) [13:14:19.894] Sys.unsetenv("R_FUTURE_PLAN") [13:14:19.894] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:14:19.894] future::plan(list(function (..., workers = availableCores(), [13:14:19.894] lazy = FALSE, rscript_libs = .libPaths(), [13:14:19.894] envir = parent.frame()) [13:14:19.894] { [13:14:19.894] if (is.function(workers)) [13:14:19.894] workers <- workers() [13:14:19.894] workers <- structure(as.integer(workers), [13:14:19.894] class = class(workers)) [13:14:19.894] stop_if_not(length(workers) == 1, is.finite(workers), [13:14:19.894] workers >= 1) [13:14:19.894] if (workers == 1L && !inherits(workers, "AsIs")) { [13:14:19.894] return(sequential(..., lazy = TRUE, envir = envir)) [13:14:19.894] } [13:14:19.894] future <- MultisessionFuture(..., workers = workers, [13:14:19.894] lazy = lazy, rscript_libs = rscript_libs, [13:14:19.894] envir = envir) [13:14:19.894] if (!future$lazy) [13:14:19.894] future <- run(future) [13:14:19.894] invisible(future) [13:14:19.894] }), .cleanup = FALSE, .init = FALSE) [13:14:19.894] } [13:14:19.894] } [13:14:19.894] } [13:14:19.894] }) [13:14:19.894] if (TRUE) { [13:14:19.894] base::sink(type = "output", split = FALSE) [13:14:19.894] if (TRUE) { [13:14:19.894] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:14:19.894] } [13:14:19.894] else { [13:14:19.894] ...future.result["stdout"] <- base::list(NULL) [13:14:19.894] } [13:14:19.894] base::close(...future.stdout) [13:14:19.894] ...future.stdout <- NULL [13:14:19.894] } [13:14:19.894] ...future.result$conditions <- ...future.conditions [13:14:19.894] ...future.result$finished <- base::Sys.time() [13:14:19.894] ...future.result [13:14:19.894] } [13:14:19.898] Exporting 11 global objects (92.90 KiB) to cluster node #1 ... [13:14:19.898] Exporting '...future.FUN' (21.22 KiB) to cluster node #1 ... [13:14:19.899] Exporting '...future.FUN' (21.22 KiB) to cluster node #1 ... DONE [13:14:19.899] Exporting 'x_FUN' (848 bytes) to cluster node #1 ... [13:14:19.899] Exporting 'x_FUN' (848 bytes) to cluster node #1 ... DONE [13:14:19.899] Exporting 'times' (56 bytes) to cluster node #1 ... [13:14:19.899] Exporting 'times' (56 bytes) to cluster node #1 ... DONE [13:14:19.900] Exporting 'stopf' (26.43 KiB) to cluster node #1 ... [13:14:19.900] Exporting 'stopf' (26.43 KiB) to cluster node #1 ... DONE [13:14:19.900] Exporting 'stop_if_not' (44.12 KiB) to cluster node #1 ... [13:14:19.900] Exporting 'stop_if_not' (44.12 KiB) to cluster node #1 ... DONE [13:14:19.901] Exporting 'dim' (0 bytes) to cluster node #1 ... [13:14:19.901] Exporting 'dim' (0 bytes) to cluster node #1 ... DONE [13:14:19.901] Exporting 'valid_types' (248 bytes) to cluster node #1 ... [13:14:19.901] Exporting 'valid_types' (248 bytes) to cluster node #1 ... DONE [13:14:19.902] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... [13:14:19.902] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... DONE [13:14:19.902] Exporting '...future.elements_ii' (112 bytes) to cluster node #1 ... [13:14:19.902] Exporting '...future.elements_ii' (112 bytes) to cluster node #1 ... DONE [13:14:19.902] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:14:19.903] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:14:19.903] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:14:19.903] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:14:19.903] Exporting 11 global objects (92.90 KiB) to cluster node #1 ... DONE [13:14:19.904] MultisessionFuture started [13:14:19.904] - Launch lazy future ... done [13:14:19.904] run() for 'MultisessionFuture' ... done [13:14:19.904] Created future: [13:14:19.922] receiveMessageFromWorker() for ClusterFuture ... [13:14:19.922] - Validating connection of MultisessionFuture [13:14:19.922] - received message: FutureResult [13:14:19.923] - Received FutureResult [13:14:19.923] - Erased future from FutureRegistry [13:14:19.923] result() for ClusterFuture ... [13:14:19.923] - result already collected: FutureResult [13:14:19.923] result() for ClusterFuture ... done [13:14:19.924] signalConditions() ... [13:14:19.924] - include = 'immediateCondition' [13:14:19.924] - exclude = [13:14:19.924] - resignal = FALSE [13:14:19.924] - Number of conditions: 1 [13:14:19.924] signalConditions() ... done [13:14:19.924] receiveMessageFromWorker() for ClusterFuture ... done [13:14:19.904] MultisessionFuture: [13:14:19.904] Label: 'future_vapply-2' [13:14:19.904] Expression: [13:14:19.904] { [13:14:19.904] do.call(function(...) { [13:14:19.904] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:14:19.904] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:14:19.904] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:14:19.904] on.exit(options(oopts), add = TRUE) [13:14:19.904] } [13:14:19.904] { [13:14:19.904] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:14:19.904] ...future.X_jj <- ...future.elements_ii[[jj]] [13:14:19.904] ...future.FUN(...future.X_jj, ...) [13:14:19.904] }) [13:14:19.904] } [13:14:19.904] }, args = future.call.arguments) [13:14:19.904] } [13:14:19.904] Lazy evaluation: FALSE [13:14:19.904] Asynchronous evaluation: TRUE [13:14:19.904] Local evaluation: TRUE [13:14:19.904] Environment: R_GlobalEnv [13:14:19.904] Capture standard output: TRUE [13:14:19.904] Capture condition classes: 'condition' (excluding 'nothing') [13:14:19.904] Globals: 11 objects totaling 93.01 KiB (function '...future.FUN' of 21.22 KiB, function 'x_FUN' of 848 bytes, integer 'times' of 56 bytes, function 'stopf' of 26.43 KiB, function 'stop_if_not' of 44.12 KiB, ...) [13:14:19.904] Packages: 1 packages ('future.apply') [13:14:19.904] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:14:19.904] Resolved: TRUE [13:14:19.904] Value: [13:14:19.904] Conditions captured: [13:14:19.904] Early signaling: FALSE [13:14:19.904] Owner process: 1bb7d580-628d-c90d-e38a-66de485868c4 [13:14:19.904] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:14:19.925] Chunk #2 of 2 ... DONE [13:14:19.925] Launching 2 futures (chunks) ... DONE [13:14:19.925] Resolving 2 futures (chunks) ... [13:14:19.925] resolve() on list ... [13:14:19.925] recursive: 0 [13:14:19.925] length: 2 [13:14:19.925] [13:14:19.925] Future #1 [13:14:19.926] result() for ClusterFuture ... [13:14:19.926] - result already collected: FutureResult [13:14:19.926] result() for ClusterFuture ... done [13:14:19.926] result() for ClusterFuture ... [13:14:19.926] - result already collected: FutureResult [13:14:19.926] result() for ClusterFuture ... done [13:14:19.926] signalConditions() ... [13:14:19.926] - include = 'immediateCondition' [13:14:19.926] - exclude = [13:14:19.927] - resignal = FALSE [13:14:19.927] - Number of conditions: 1 [13:14:19.927] signalConditions() ... done [13:14:19.927] signalConditionsASAP(MultisessionFuture, pos=1) ... [13:14:19.927] - nx: 2 [13:14:19.927] - relay: TRUE [13:14:19.927] - stdout: TRUE [13:14:19.927] - signal: TRUE [13:14:19.928] - resignal: FALSE [13:14:19.928] - force: TRUE [13:14:19.928] - relayed: [n=2] FALSE, FALSE [13:14:19.928] - queued futures: [n=2] FALSE, FALSE [13:14:19.928] - until=1 [13:14:19.928] - relaying element #1 [13:14:19.928] result() for ClusterFuture ... [13:14:19.928] - result already collected: FutureResult [13:14:19.928] result() for ClusterFuture ... done [13:14:19.929] result() for ClusterFuture ... [13:14:19.929] - result already collected: FutureResult [13:14:19.929] result() for ClusterFuture ... done [13:14:19.929] signalConditions() ... [13:14:19.929] - include = 'immediateCondition' [13:14:19.929] - exclude = [13:14:19.929] - resignal = FALSE [13:14:19.929] - Number of conditions: 1 [13:14:19.930] signalConditions() ... done [13:14:19.930] result() for ClusterFuture ... [13:14:19.930] - result already collected: FutureResult [13:14:19.930] result() for ClusterFuture ... done [13:14:19.930] signalConditions() ... [13:14:19.930] - include = 'immediateCondition' [13:14:19.930] - exclude = [13:14:19.930] - resignal = FALSE [13:14:19.930] - Number of conditions: 1 [13:14:19.931] signalConditions() ... done [13:14:19.931] result() for ClusterFuture ... [13:14:19.931] - result already collected: FutureResult [13:14:19.931] result() for ClusterFuture ... done [13:14:19.931] signalConditions() ... [13:14:19.931] - include = 'condition' [13:14:19.931] - exclude = 'immediateCondition' [13:14:19.931] - resignal = TRUE [13:14:19.932] - Number of conditions: 1 [13:14:19.932] - Condition #1: 'simpleError', 'error', 'condition' [13:14:19.932] signalConditions() ... done [13:14:19.932] - relayed: [n=2] FALSE, FALSE [13:14:19.932] - queued futures: [n=2] TRUE, FALSE [13:14:19.932] signalConditionsASAP(MultisessionFuture, pos=1) ... done [13:14:19.932] plan(): Setting new future strategy stack: [13:14:19.933] List of future strategies: [13:14:19.933] 1. sequential: [13:14:19.933] - args: function (..., envir = parent.frame(), workers = "") [13:14:19.933] - tweaked: FALSE [13:14:19.933] - call: plan(sequential) [13:14:19.933] plan(): nbrOfWorkers() = 1 *** strategy = 'multisession' ... done > > > message("*** future_vapply() ... DONE") *** future_vapply() ... DONE > > source("incl/end.R") [13:14:19.934] plan(): Setting new future strategy stack: [13:14:19.934] List of future strategies: [13:14:19.934] 1. FutureStrategy: [13:14:19.934] - args: function (..., envir = parent.frame(), workers = "") [13:14:19.934] - tweaked: FALSE [13:14:19.934] - call: future::plan(oplan) [13:14:19.935] plan(): nbrOfWorkers() = 1 > > proc.time() user system elapsed 3.54 0.09 4.86