R Under development (unstable) (2023-12-20 r85711 ucrt) -- "Unsuffered Consequences" Copyright (C) 2023 The R Foundation for Statistical Computing Platform: x86_64-w64-mingw32/x64 R is free software and comes with ABSOLUTELY NO WARRANTY. You are welcome to redistribute it under certain conditions. Type 'license()' or 'licence()' for distribution details. R is a collaborative project with many contributors. Type 'contributors()' for more information and 'citation()' on how to cite R or R packages in publications. Type 'demo()' for some demos, 'help()' for on-line help, or 'help.start()' for an HTML browser interface to help. Type 'q()' to quit R. > source("incl/start.R") Loading required package: future [13:13:14.103] plan(): Setting new future strategy stack: [13:13:14.104] List of future strategies: [13:13:14.104] 1. sequential: [13:13:14.104] - args: function (..., envir = parent.frame(), workers = "") [13:13:14.104] - tweaked: FALSE [13:13:14.104] - call: future::plan("sequential") [13:13:14.122] plan(): nbrOfWorkers() = 1 > library("listenv") > > all_equal_but_call <- function(target, current, ...) { + attr(target, "call") <- NULL + attr(current, "call") <- NULL + all.equal(target = target, current = current, ...) + } > > message("*** future_by() ...") *** future_by() ... > > ## --------------------------------------------------------- > ## by() > ## --------------------------------------------------------- > if (require("datasets") && require("stats")) { ## warpbreaks & lm() + ## Use a local variable to test that it is properly exported, because + ## 'warpbreaks' is available in all R sessions + data <- warpbreaks + + y0 <- by(data[, 1:2], INDICES = data[,"tension"], FUN = summary) + y1 <- by(data[, 1], INDICES = data[, -1], FUN = summary, digits = 2L) + y2 <- by(data, INDICES = data[,"tension"], FUN = function(x, ...) { + lm(breaks ~ wool, data = x, ...) + }, singular.ok = FALSE) + + ## now suppose we want to extract the coefficients by group + tmp <- with(data, by(data, INDICES = tension, FUN = function(x) { + lm(breaks ~ wool, data = x) + })) + y3 <- sapply(tmp, coef) + + ## Source: {r-source}/tests/reg-tests-1d.R + by2 <- function(data, INDICES, FUN) { + by(data, INDICES = INDICES, FUN = FUN) + } + future_by2 <- function(data, INDICES, FUN) { + future_by(data, INDICES = INDICES, FUN = FUN) + } + y4 <- by2(data, INDICES = data[,"tension"], FUN = summary) + + for (cores in 1:availCores) { + message(sprintf("Testing with %d cores ...", cores)) + options(mc.cores = cores) + strategies <- supportedStrategies(cores) + + for (strategy in supportedStrategies()) { + message(sprintf("- plan('%s') ...", strategy)) + plan(strategy) + + y0f <- future_by(data[, 1:2], INDICES = data[,"tension"], FUN = summary) + stopifnot(all_equal_but_call(y0f, y0, check.attributes = FALSE)) + + y1f <- future_by(data[, 1], INDICES = data[, -1], FUN = summary, digits = 2L) + stopifnot(all_equal_but_call(y1f, y1)) + + y2f <- future_by(data, INDICES = data[,"tension"], FUN = function(x, ...) { + lm(breaks ~ wool, data = x, ...) + }, singular.ok = FALSE) + stopifnot(all_equal_but_call(y2f, y2)) + + ## now suppose we want to extract the coefficients by group + tmp <- with(data, future_by(data, INDICES = tension, FUN = function(x) { + lm(breaks ~ wool, data = x) + })) + y3f <- sapply(tmp, coef) + stopifnot(all_equal_but_call(y3f, y3)) + + y4f <- future_by2(data, INDICES = data[,"tension"], FUN = summary) + stopifnot(all_equal_but_call(y4f, y4)) + + ## Deprecated /HB 2022-10-24 + y4f2 <- future_by2(data, INDICES = data[,"tension"], FUN = "summary") + stopifnot(all_equal_but_call(y4f2, y4)) + + res <- tryCatch({ + y4f2 <- future_by2(data, INDICES = data[,"tension"], FUN = "summary") + }, warning = identity) + stopifnot(inherits(res, "warning")) + if (getRversion() >= "3.6.0") { + stopifnot(inherits(res, "deprecatedWarning")) + } + } ## for (strategy ...) + + message(sprintf("Testing with %d cores ... DONE", cores)) + } ## for (cores ...) + } ## if (require("stats")) Testing with 1 cores ... - plan('sequential') ... [13:13:14.197] plan(): Setting new future strategy stack: [13:13:14.197] List of future strategies: [13:13:14.197] 1. sequential: [13:13:14.197] - args: function (..., envir = parent.frame(), workers = "") [13:13:14.197] - tweaked: FALSE [13:13:14.197] - call: plan(strategy) [13:13:14.210] plan(): nbrOfWorkers() = 1 [13:13:14.211] future_by_internal() ... [13:13:14.212] future_lapply() ... [13:13:14.217] Number of chunks: 1 [13:13:14.218] getGlobalsAndPackagesXApply() ... [13:13:14.218] - future.globals: TRUE [13:13:14.219] getGlobalsAndPackages() ... [13:13:14.219] Searching for globals... [13:13:14.222] - globals found: [2] 'FUN', 'UseMethod' [13:13:14.222] Searching for globals ... DONE [13:13:14.222] Resolving globals: FALSE [13:13:14.223] The total size of the 1 globals is 1.21 KiB (1240 bytes) [13:13:14.224] The total size of the 1 globals exported for future expression ('FUN()') is 1.21 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (1.21 KiB of class 'function') [13:13:14.224] - globals: [1] 'FUN' [13:13:14.224] [13:13:14.225] getGlobalsAndPackages() ... DONE [13:13:14.225] - globals found/used: [n=1] 'FUN' [13:13:14.225] - needed namespaces: [n=0] [13:13:14.225] Finding globals ... DONE [13:13:14.225] - use_args: TRUE [13:13:14.225] - Getting '...' globals ... [13:13:14.226] resolve() on list ... [13:13:14.227] recursive: 0 [13:13:14.227] length: 1 [13:13:14.227] elements: '...' [13:13:14.227] length: 0 (resolved future 1) [13:13:14.228] resolve() on list ... DONE [13:13:14.228] - '...' content: [n=0] [13:13:14.228] List of 1 [13:13:14.228] $ ...: list() [13:13:14.228] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:14.228] - attr(*, "where")=List of 1 [13:13:14.228] ..$ ...: [13:13:14.228] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:14.228] - attr(*, "resolved")= logi TRUE [13:13:14.228] - attr(*, "total_size")= num NA [13:13:14.234] - Getting '...' globals ... DONE [13:13:14.234] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:14.234] List of 2 [13:13:14.234] $ ...future.FUN:function (object, ...) [13:13:14.234] $ ... : list() [13:13:14.234] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:14.234] - attr(*, "where")=List of 2 [13:13:14.234] ..$ ...future.FUN: [13:13:14.234] ..$ ... : [13:13:14.234] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:14.234] - attr(*, "resolved")= logi FALSE [13:13:14.234] - attr(*, "total_size")= num 1240 [13:13:14.238] Packages to be attached in all futures: [n=0] [13:13:14.238] getGlobalsAndPackagesXApply() ... DONE [13:13:14.238] Number of futures (= number of chunks): 1 [13:13:14.239] Launching 1 futures (chunks) ... [13:13:14.239] Chunk #1 of 1 ... [13:13:14.239] - Finding globals in 'X' for chunk #1 ... [13:13:14.239] getGlobalsAndPackages() ... [13:13:14.240] Searching for globals... [13:13:14.240] [13:13:14.241] Searching for globals ... DONE [13:13:14.241] - globals: [0] [13:13:14.241] getGlobalsAndPackages() ... DONE [13:13:14.241] + additional globals found: [n=0] [13:13:14.241] + additional namespaces needed: [n=0] [13:13:14.241] - Finding globals in 'X' for chunk #1 ... DONE [13:13:14.242] - seeds: [13:13:14.242] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:14.242] getGlobalsAndPackages() ... [13:13:14.242] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:14.243] Resolving globals: FALSE [13:13:14.243] Tweak future expression to call with '...' arguments ... [13:13:14.243] { [13:13:14.243] do.call(function(...) { [13:13:14.243] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:14.243] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:14.243] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:14.243] on.exit(options(oopts), add = TRUE) [13:13:14.243] } [13:13:14.243] { [13:13:14.243] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:14.243] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:14.243] ...future.FUN(...future.X_jj, ...) [13:13:14.243] }) [13:13:14.243] } [13:13:14.243] }, args = future.call.arguments) [13:13:14.243] } [13:13:14.243] Tweak future expression to call with '...' arguments ... DONE [13:13:14.244] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:14.244] [13:13:14.244] getGlobalsAndPackages() ... DONE [13:13:14.245] run() for 'Future' ... [13:13:14.245] - state: 'created' [13:13:14.246] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:13:14.246] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:14.247] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:14.247] - Field: 'label' [13:13:14.247] - Field: 'local' [13:13:14.247] - Field: 'owner' [13:13:14.247] - Field: 'envir' [13:13:14.247] - Field: 'packages' [13:13:14.248] - Field: 'gc' [13:13:14.248] - Field: 'conditions' [13:13:14.248] - Field: 'expr' [13:13:14.248] - Field: 'uuid' [13:13:14.248] - Field: 'seed' [13:13:14.249] - Field: 'version' [13:13:14.249] - Field: 'result' [13:13:14.249] - Field: 'asynchronous' [13:13:14.249] - Field: 'calls' [13:13:14.249] - Field: 'globals' [13:13:14.250] - Field: 'stdout' [13:13:14.250] - Field: 'earlySignal' [13:13:14.250] - Field: 'lazy' [13:13:14.250] - Field: 'state' [13:13:14.250] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:14.250] - Launch lazy future ... [13:13:14.254] Packages needed by the future expression (n = 0): [13:13:14.254] Packages needed by future strategies (n = 0): [13:13:14.255] { [13:13:14.255] { [13:13:14.255] { [13:13:14.255] ...future.startTime <- base::Sys.time() [13:13:14.255] { [13:13:14.255] { [13:13:14.255] { [13:13:14.255] base::local({ [13:13:14.255] has_future <- base::requireNamespace("future", [13:13:14.255] quietly = TRUE) [13:13:14.255] if (has_future) { [13:13:14.255] ns <- base::getNamespace("future") [13:13:14.255] version <- ns[[".package"]][["version"]] [13:13:14.255] if (is.null(version)) [13:13:14.255] version <- utils::packageVersion("future") [13:13:14.255] } [13:13:14.255] else { [13:13:14.255] version <- NULL [13:13:14.255] } [13:13:14.255] if (!has_future || version < "1.8.0") { [13:13:14.255] info <- base::c(r_version = base::gsub("R version ", [13:13:14.255] "", base::R.version$version.string), [13:13:14.255] platform = base::sprintf("%s (%s-bit)", [13:13:14.255] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:14.255] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:14.255] "release", "version")], collapse = " "), [13:13:14.255] hostname = base::Sys.info()[["nodename"]]) [13:13:14.255] info <- base::sprintf("%s: %s", base::names(info), [13:13:14.255] info) [13:13:14.255] info <- base::paste(info, collapse = "; ") [13:13:14.255] if (!has_future) { [13:13:14.255] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:14.255] info) [13:13:14.255] } [13:13:14.255] else { [13:13:14.255] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:14.255] info, version) [13:13:14.255] } [13:13:14.255] base::stop(msg) [13:13:14.255] } [13:13:14.255] }) [13:13:14.255] } [13:13:14.255] options(future.plan = NULL) [13:13:14.255] Sys.unsetenv("R_FUTURE_PLAN") [13:13:14.255] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:14.255] } [13:13:14.255] ...future.workdir <- getwd() [13:13:14.255] } [13:13:14.255] ...future.oldOptions <- base::as.list(base::.Options) [13:13:14.255] ...future.oldEnvVars <- base::Sys.getenv() [13:13:14.255] } [13:13:14.255] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:14.255] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:14.255] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:14.255] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:14.255] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:14.255] future.stdout.windows.reencode = NULL, width = 80L) [13:13:14.255] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:14.255] base::names(...future.oldOptions)) [13:13:14.255] } [13:13:14.255] if (FALSE) { [13:13:14.255] } [13:13:14.255] else { [13:13:14.255] if (TRUE) { [13:13:14.255] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:14.255] open = "w") [13:13:14.255] } [13:13:14.255] else { [13:13:14.255] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:14.255] windows = "NUL", "/dev/null"), open = "w") [13:13:14.255] } [13:13:14.255] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:14.255] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:14.255] base::sink(type = "output", split = FALSE) [13:13:14.255] base::close(...future.stdout) [13:13:14.255] }, add = TRUE) [13:13:14.255] } [13:13:14.255] ...future.frame <- base::sys.nframe() [13:13:14.255] ...future.conditions <- base::list() [13:13:14.255] ...future.rng <- base::globalenv()$.Random.seed [13:13:14.255] if (FALSE) { [13:13:14.255] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:14.255] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:14.255] } [13:13:14.255] ...future.result <- base::tryCatch({ [13:13:14.255] base::withCallingHandlers({ [13:13:14.255] ...future.value <- base::withVisible(base::local({ [13:13:14.255] do.call(function(...) { [13:13:14.255] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:14.255] if (!identical(...future.globals.maxSize.org, [13:13:14.255] ...future.globals.maxSize)) { [13:13:14.255] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:14.255] on.exit(options(oopts), add = TRUE) [13:13:14.255] } [13:13:14.255] { [13:13:14.255] lapply(seq_along(...future.elements_ii), [13:13:14.255] FUN = function(jj) { [13:13:14.255] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:14.255] ...future.FUN(...future.X_jj, ...) [13:13:14.255] }) [13:13:14.255] } [13:13:14.255] }, args = future.call.arguments) [13:13:14.255] })) [13:13:14.255] future::FutureResult(value = ...future.value$value, [13:13:14.255] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:14.255] ...future.rng), globalenv = if (FALSE) [13:13:14.255] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:14.255] ...future.globalenv.names)) [13:13:14.255] else NULL, started = ...future.startTime, version = "1.8") [13:13:14.255] }, condition = base::local({ [13:13:14.255] c <- base::c [13:13:14.255] inherits <- base::inherits [13:13:14.255] invokeRestart <- base::invokeRestart [13:13:14.255] length <- base::length [13:13:14.255] list <- base::list [13:13:14.255] seq.int <- base::seq.int [13:13:14.255] signalCondition <- base::signalCondition [13:13:14.255] sys.calls <- base::sys.calls [13:13:14.255] `[[` <- base::`[[` [13:13:14.255] `+` <- base::`+` [13:13:14.255] `<<-` <- base::`<<-` [13:13:14.255] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:14.255] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:14.255] 3L)] [13:13:14.255] } [13:13:14.255] function(cond) { [13:13:14.255] is_error <- inherits(cond, "error") [13:13:14.255] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:14.255] NULL) [13:13:14.255] if (is_error) { [13:13:14.255] sessionInformation <- function() { [13:13:14.255] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:14.255] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:14.255] search = base::search(), system = base::Sys.info()) [13:13:14.255] } [13:13:14.255] ...future.conditions[[length(...future.conditions) + [13:13:14.255] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:14.255] cond$call), session = sessionInformation(), [13:13:14.255] timestamp = base::Sys.time(), signaled = 0L) [13:13:14.255] signalCondition(cond) [13:13:14.255] } [13:13:14.255] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:14.255] "immediateCondition"))) { [13:13:14.255] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:14.255] ...future.conditions[[length(...future.conditions) + [13:13:14.255] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:14.255] if (TRUE && !signal) { [13:13:14.255] muffleCondition <- function (cond, pattern = "^muffle") [13:13:14.255] { [13:13:14.255] inherits <- base::inherits [13:13:14.255] invokeRestart <- base::invokeRestart [13:13:14.255] is.null <- base::is.null [13:13:14.255] muffled <- FALSE [13:13:14.255] if (inherits(cond, "message")) { [13:13:14.255] muffled <- grepl(pattern, "muffleMessage") [13:13:14.255] if (muffled) [13:13:14.255] invokeRestart("muffleMessage") [13:13:14.255] } [13:13:14.255] else if (inherits(cond, "warning")) { [13:13:14.255] muffled <- grepl(pattern, "muffleWarning") [13:13:14.255] if (muffled) [13:13:14.255] invokeRestart("muffleWarning") [13:13:14.255] } [13:13:14.255] else if (inherits(cond, "condition")) { [13:13:14.255] if (!is.null(pattern)) { [13:13:14.255] computeRestarts <- base::computeRestarts [13:13:14.255] grepl <- base::grepl [13:13:14.255] restarts <- computeRestarts(cond) [13:13:14.255] for (restart in restarts) { [13:13:14.255] name <- restart$name [13:13:14.255] if (is.null(name)) [13:13:14.255] next [13:13:14.255] if (!grepl(pattern, name)) [13:13:14.255] next [13:13:14.255] invokeRestart(restart) [13:13:14.255] muffled <- TRUE [13:13:14.255] break [13:13:14.255] } [13:13:14.255] } [13:13:14.255] } [13:13:14.255] invisible(muffled) [13:13:14.255] } [13:13:14.255] muffleCondition(cond, pattern = "^muffle") [13:13:14.255] } [13:13:14.255] } [13:13:14.255] else { [13:13:14.255] if (TRUE) { [13:13:14.255] muffleCondition <- function (cond, pattern = "^muffle") [13:13:14.255] { [13:13:14.255] inherits <- base::inherits [13:13:14.255] invokeRestart <- base::invokeRestart [13:13:14.255] is.null <- base::is.null [13:13:14.255] muffled <- FALSE [13:13:14.255] if (inherits(cond, "message")) { [13:13:14.255] muffled <- grepl(pattern, "muffleMessage") [13:13:14.255] if (muffled) [13:13:14.255] invokeRestart("muffleMessage") [13:13:14.255] } [13:13:14.255] else if (inherits(cond, "warning")) { [13:13:14.255] muffled <- grepl(pattern, "muffleWarning") [13:13:14.255] if (muffled) [13:13:14.255] invokeRestart("muffleWarning") [13:13:14.255] } [13:13:14.255] else if (inherits(cond, "condition")) { [13:13:14.255] if (!is.null(pattern)) { [13:13:14.255] computeRestarts <- base::computeRestarts [13:13:14.255] grepl <- base::grepl [13:13:14.255] restarts <- computeRestarts(cond) [13:13:14.255] for (restart in restarts) { [13:13:14.255] name <- restart$name [13:13:14.255] if (is.null(name)) [13:13:14.255] next [13:13:14.255] if (!grepl(pattern, name)) [13:13:14.255] next [13:13:14.255] invokeRestart(restart) [13:13:14.255] muffled <- TRUE [13:13:14.255] break [13:13:14.255] } [13:13:14.255] } [13:13:14.255] } [13:13:14.255] invisible(muffled) [13:13:14.255] } [13:13:14.255] muffleCondition(cond, pattern = "^muffle") [13:13:14.255] } [13:13:14.255] } [13:13:14.255] } [13:13:14.255] })) [13:13:14.255] }, error = function(ex) { [13:13:14.255] base::structure(base::list(value = NULL, visible = NULL, [13:13:14.255] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:14.255] ...future.rng), started = ...future.startTime, [13:13:14.255] finished = Sys.time(), session_uuid = NA_character_, [13:13:14.255] version = "1.8"), class = "FutureResult") [13:13:14.255] }, finally = { [13:13:14.255] if (!identical(...future.workdir, getwd())) [13:13:14.255] setwd(...future.workdir) [13:13:14.255] { [13:13:14.255] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:14.255] ...future.oldOptions$nwarnings <- NULL [13:13:14.255] } [13:13:14.255] base::options(...future.oldOptions) [13:13:14.255] if (.Platform$OS.type == "windows") { [13:13:14.255] old_names <- names(...future.oldEnvVars) [13:13:14.255] envs <- base::Sys.getenv() [13:13:14.255] names <- names(envs) [13:13:14.255] common <- intersect(names, old_names) [13:13:14.255] added <- setdiff(names, old_names) [13:13:14.255] removed <- setdiff(old_names, names) [13:13:14.255] changed <- common[...future.oldEnvVars[common] != [13:13:14.255] envs[common]] [13:13:14.255] NAMES <- toupper(changed) [13:13:14.255] args <- list() [13:13:14.255] for (kk in seq_along(NAMES)) { [13:13:14.255] name <- changed[[kk]] [13:13:14.255] NAME <- NAMES[[kk]] [13:13:14.255] if (name != NAME && is.element(NAME, old_names)) [13:13:14.255] next [13:13:14.255] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:14.255] } [13:13:14.255] NAMES <- toupper(added) [13:13:14.255] for (kk in seq_along(NAMES)) { [13:13:14.255] name <- added[[kk]] [13:13:14.255] NAME <- NAMES[[kk]] [13:13:14.255] if (name != NAME && is.element(NAME, old_names)) [13:13:14.255] next [13:13:14.255] args[[name]] <- "" [13:13:14.255] } [13:13:14.255] NAMES <- toupper(removed) [13:13:14.255] for (kk in seq_along(NAMES)) { [13:13:14.255] name <- removed[[kk]] [13:13:14.255] NAME <- NAMES[[kk]] [13:13:14.255] if (name != NAME && is.element(NAME, old_names)) [13:13:14.255] next [13:13:14.255] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:14.255] } [13:13:14.255] if (length(args) > 0) [13:13:14.255] base::do.call(base::Sys.setenv, args = args) [13:13:14.255] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:14.255] } [13:13:14.255] else { [13:13:14.255] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:14.255] } [13:13:14.255] { [13:13:14.255] if (base::length(...future.futureOptionsAdded) > [13:13:14.255] 0L) { [13:13:14.255] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:14.255] base::names(opts) <- ...future.futureOptionsAdded [13:13:14.255] base::options(opts) [13:13:14.255] } [13:13:14.255] { [13:13:14.255] { [13:13:14.255] NULL [13:13:14.255] RNGkind("Mersenne-Twister") [13:13:14.255] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:14.255] inherits = FALSE) [13:13:14.255] } [13:13:14.255] options(future.plan = NULL) [13:13:14.255] if (is.na(NA_character_)) [13:13:14.255] Sys.unsetenv("R_FUTURE_PLAN") [13:13:14.255] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:14.255] future::plan(list(function (..., envir = parent.frame()) [13:13:14.255] { [13:13:14.255] future <- SequentialFuture(..., envir = envir) [13:13:14.255] if (!future$lazy) [13:13:14.255] future <- run(future) [13:13:14.255] invisible(future) [13:13:14.255] }), .cleanup = FALSE, .init = FALSE) [13:13:14.255] } [13:13:14.255] } [13:13:14.255] } [13:13:14.255] }) [13:13:14.255] if (TRUE) { [13:13:14.255] base::sink(type = "output", split = FALSE) [13:13:14.255] if (TRUE) { [13:13:14.255] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:14.255] } [13:13:14.255] else { [13:13:14.255] ...future.result["stdout"] <- base::list(NULL) [13:13:14.255] } [13:13:14.255] base::close(...future.stdout) [13:13:14.255] ...future.stdout <- NULL [13:13:14.255] } [13:13:14.255] ...future.result$conditions <- ...future.conditions [13:13:14.255] ...future.result$finished <- base::Sys.time() [13:13:14.255] ...future.result [13:13:14.255] } [13:13:14.260] assign_globals() ... [13:13:14.260] List of 5 [13:13:14.260] $ ...future.FUN :function (object, ...) [13:13:14.260] $ future.call.arguments : list() [13:13:14.260] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:14.260] $ ...future.elements_ii :List of 3 [13:13:14.260] ..$ :'data.frame': 18 obs. of 2 variables: [13:13:14.260] .. ..$ breaks: num [1:18] 26 30 54 25 70 52 51 26 67 27 ... [13:13:14.260] .. ..$ wool : Factor w/ 2 levels "A","B": 1 1 1 1 1 1 1 1 1 2 ... [13:13:14.260] ..$ :'data.frame': 18 obs. of 2 variables: [13:13:14.260] .. ..$ breaks: num [1:18] 18 21 29 17 12 18 35 30 36 42 ... [13:13:14.260] .. ..$ wool : Factor w/ 2 levels "A","B": 1 1 1 1 1 1 1 1 1 2 ... [13:13:14.260] ..$ :'data.frame': 18 obs. of 2 variables: [13:13:14.260] .. ..$ breaks: num [1:18] 36 21 24 18 10 43 28 15 26 20 ... [13:13:14.260] .. ..$ wool : Factor w/ 2 levels "A","B": 1 1 1 1 1 1 1 1 1 2 ... [13:13:14.260] $ ...future.seeds_ii : NULL [13:13:14.260] $ ...future.globals.maxSize: NULL [13:13:14.260] - attr(*, "where")=List of 5 [13:13:14.260] ..$ ...future.FUN : [13:13:14.260] ..$ future.call.arguments : [13:13:14.260] ..$ ...future.elements_ii : [13:13:14.260] ..$ ...future.seeds_ii : [13:13:14.260] ..$ ...future.globals.maxSize: [13:13:14.260] - attr(*, "resolved")= logi FALSE [13:13:14.260] - attr(*, "total_size")= num 1240 [13:13:14.260] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:14.260] - attr(*, "already-done")= logi TRUE [13:13:14.269] - copied '...future.FUN' to environment [13:13:14.269] - copied 'future.call.arguments' to environment [13:13:14.270] - copied '...future.elements_ii' to environment [13:13:14.270] - copied '...future.seeds_ii' to environment [13:13:14.270] - copied '...future.globals.maxSize' to environment [13:13:14.270] assign_globals() ... done [13:13:14.271] plan(): Setting new future strategy stack: [13:13:14.271] List of future strategies: [13:13:14.271] 1. sequential: [13:13:14.271] - args: function (..., envir = parent.frame(), workers = "") [13:13:14.271] - tweaked: FALSE [13:13:14.271] - call: NULL [13:13:14.271] plan(): nbrOfWorkers() = 1 [13:13:14.275] plan(): Setting new future strategy stack: [13:13:14.275] List of future strategies: [13:13:14.275] 1. sequential: [13:13:14.275] - args: function (..., envir = parent.frame(), workers = "") [13:13:14.275] - tweaked: FALSE [13:13:14.275] - call: plan(strategy) [13:13:14.276] plan(): nbrOfWorkers() = 1 [13:13:14.276] SequentialFuture started (and completed) [13:13:14.277] - Launch lazy future ... done [13:13:14.277] run() for 'SequentialFuture' ... done [13:13:14.277] Created future: [13:13:14.278] SequentialFuture: [13:13:14.278] Label: 'future_by-1' [13:13:14.278] Expression: [13:13:14.278] { [13:13:14.278] do.call(function(...) { [13:13:14.278] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:14.278] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:14.278] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:14.278] on.exit(options(oopts), add = TRUE) [13:13:14.278] } [13:13:14.278] { [13:13:14.278] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:14.278] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:14.278] ...future.FUN(...future.X_jj, ...) [13:13:14.278] }) [13:13:14.278] } [13:13:14.278] }, args = future.call.arguments) [13:13:14.278] } [13:13:14.278] Lazy evaluation: FALSE [13:13:14.278] Asynchronous evaluation: FALSE [13:13:14.278] Local evaluation: TRUE [13:13:14.278] Environment: R_GlobalEnv [13:13:14.278] Capture standard output: TRUE [13:13:14.278] Capture condition classes: 'condition' (excluding 'nothing') [13:13:14.278] Globals: 5 objects totaling 3.79 KiB (function '...future.FUN' of 1.21 KiB, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 2.58 KiB, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:13:14.278] Packages: [13:13:14.278] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:14.278] Resolved: TRUE [13:13:14.278] Value: 4.62 KiB of class 'list' [13:13:14.278] Early signaling: FALSE [13:13:14.278] Owner process: f0659542-730c-c20a-65b3-84f202449c4d [13:13:14.278] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:14.280] Chunk #1 of 1 ... DONE [13:13:14.280] Launching 1 futures (chunks) ... DONE [13:13:14.280] Resolving 1 futures (chunks) ... [13:13:14.281] resolve() on list ... [13:13:14.281] recursive: 0 [13:13:14.281] length: 1 [13:13:14.281] [13:13:14.281] resolved() for 'SequentialFuture' ... [13:13:14.282] - state: 'finished' [13:13:14.282] - run: TRUE [13:13:14.282] - result: 'FutureResult' [13:13:14.282] resolved() for 'SequentialFuture' ... done [13:13:14.282] Future #1 [13:13:14.283] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:14.283] - nx: 1 [13:13:14.283] - relay: TRUE [13:13:14.283] - stdout: TRUE [13:13:14.284] - signal: TRUE [13:13:14.284] - resignal: FALSE [13:13:14.284] - force: TRUE [13:13:14.285] - relayed: [n=1] FALSE [13:13:14.286] - queued futures: [n=1] FALSE [13:13:14.286] - until=1 [13:13:14.286] - relaying element #1 [13:13:14.286] - relayed: [n=1] TRUE [13:13:14.286] - queued futures: [n=1] TRUE [13:13:14.286] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:14.287] length: 0 (resolved future 1) [13:13:14.287] Relaying remaining futures [13:13:14.287] signalConditionsASAP(NULL, pos=0) ... [13:13:14.287] - nx: 1 [13:13:14.287] - relay: TRUE [13:13:14.288] - stdout: TRUE [13:13:14.288] - signal: TRUE [13:13:14.288] - resignal: FALSE [13:13:14.288] - force: TRUE [13:13:14.288] - relayed: [n=1] TRUE [13:13:14.288] - queued futures: [n=1] TRUE - flush all [13:13:14.289] - relayed: [n=1] TRUE [13:13:14.289] - queued futures: [n=1] TRUE [13:13:14.289] signalConditionsASAP(NULL, pos=0) ... done [13:13:14.289] resolve() on list ... DONE [13:13:14.289] - Number of value chunks collected: 1 [13:13:14.289] Resolving 1 futures (chunks) ... DONE [13:13:14.290] Reducing values from 1 chunks ... [13:13:14.290] - Number of values collected after concatenation: 3 [13:13:14.290] - Number of values expected: 3 [13:13:14.290] Reducing values from 1 chunks ... DONE [13:13:14.290] future_lapply() ... DONE [13:13:14.291] future_by_internal() ... DONE [13:13:14.291] future_by_internal() ... [13:13:14.292] future_lapply() ... [13:13:14.292] Number of chunks: 1 [13:13:14.293] getGlobalsAndPackagesXApply() ... [13:13:14.293] - future.globals: TRUE [13:13:14.293] getGlobalsAndPackages() ... [13:13:14.293] Searching for globals... [13:13:14.294] - globals found: [2] 'FUN', 'UseMethod' [13:13:14.295] Searching for globals ... DONE [13:13:14.295] Resolving globals: FALSE [13:13:14.295] The total size of the 1 globals is 1.21 KiB (1240 bytes) [13:13:14.296] The total size of the 1 globals exported for future expression ('FUN(digits = 2L)') is 1.21 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (1.21 KiB of class 'function') [13:13:14.296] - globals: [1] 'FUN' [13:13:14.296] [13:13:14.296] getGlobalsAndPackages() ... DONE [13:13:14.296] - globals found/used: [n=1] 'FUN' [13:13:14.297] - needed namespaces: [n=0] [13:13:14.297] Finding globals ... DONE [13:13:14.297] - use_args: TRUE [13:13:14.297] - Getting '...' globals ... [13:13:14.297] resolve() on list ... [13:13:14.298] recursive: 0 [13:13:14.298] length: 1 [13:13:14.298] elements: '...' [13:13:14.298] length: 0 (resolved future 1) [13:13:14.299] resolve() on list ... DONE [13:13:14.299] - '...' content: [n=1] 'digits' [13:13:14.299] List of 1 [13:13:14.299] $ ...:List of 1 [13:13:14.299] ..$ digits: int 2 [13:13:14.299] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:14.299] - attr(*, "where")=List of 1 [13:13:14.299] ..$ ...: [13:13:14.299] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:14.299] - attr(*, "resolved")= logi TRUE [13:13:14.299] - attr(*, "total_size")= num NA [13:13:14.303] - Getting '...' globals ... DONE [13:13:14.303] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:14.303] List of 2 [13:13:14.303] $ ...future.FUN:function (object, ...) [13:13:14.303] $ ... :List of 1 [13:13:14.303] ..$ digits: int 2 [13:13:14.303] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:14.303] - attr(*, "where")=List of 2 [13:13:14.303] ..$ ...future.FUN: [13:13:14.303] ..$ ... : [13:13:14.303] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:14.303] - attr(*, "resolved")= logi FALSE [13:13:14.303] - attr(*, "total_size")= num 1296 [13:13:14.307] Packages to be attached in all futures: [n=0] [13:13:14.307] getGlobalsAndPackagesXApply() ... DONE [13:13:14.307] Number of futures (= number of chunks): 1 [13:13:14.308] Launching 1 futures (chunks) ... [13:13:14.308] Chunk #1 of 1 ... [13:13:14.308] - Finding globals in 'X' for chunk #1 ... [13:13:14.308] getGlobalsAndPackages() ... [13:13:14.308] Searching for globals... [13:13:14.309] [13:13:14.310] Searching for globals ... DONE [13:13:14.310] - globals: [0] [13:13:14.310] getGlobalsAndPackages() ... DONE [13:13:14.311] + additional globals found: [n=0] [13:13:14.311] + additional namespaces needed: [n=0] [13:13:14.311] - Finding globals in 'X' for chunk #1 ... DONE [13:13:14.311] - seeds: [13:13:14.311] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:14.311] getGlobalsAndPackages() ... [13:13:14.312] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:14.312] Resolving globals: FALSE [13:13:14.312] Tweak future expression to call with '...' arguments ... [13:13:14.312] { [13:13:14.312] do.call(function(...) { [13:13:14.312] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:14.312] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:14.312] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:14.312] on.exit(options(oopts), add = TRUE) [13:13:14.312] } [13:13:14.312] { [13:13:14.312] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:14.312] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:14.312] ...future.FUN(...future.X_jj, ...) [13:13:14.312] }) [13:13:14.312] } [13:13:14.312] }, args = future.call.arguments) [13:13:14.312] } [13:13:14.313] Tweak future expression to call with '...' arguments ... DONE [13:13:14.313] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:14.313] [13:13:14.313] getGlobalsAndPackages() ... DONE [13:13:14.314] run() for 'Future' ... [13:13:14.314] - state: 'created' [13:13:14.314] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:13:14.315] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:14.315] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:14.315] - Field: 'label' [13:13:14.315] - Field: 'local' [13:13:14.315] - Field: 'owner' [13:13:14.316] - Field: 'envir' [13:13:14.316] - Field: 'packages' [13:13:14.316] - Field: 'gc' [13:13:14.316] - Field: 'conditions' [13:13:14.316] - Field: 'expr' [13:13:14.316] - Field: 'uuid' [13:13:14.317] - Field: 'seed' [13:13:14.317] - Field: 'version' [13:13:14.317] - Field: 'result' [13:13:14.317] - Field: 'asynchronous' [13:13:14.317] - Field: 'calls' [13:13:14.318] - Field: 'globals' [13:13:14.318] - Field: 'stdout' [13:13:14.318] - Field: 'earlySignal' [13:13:14.318] - Field: 'lazy' [13:13:14.318] - Field: 'state' [13:13:14.318] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:14.319] - Launch lazy future ... [13:13:14.319] Packages needed by the future expression (n = 0): [13:13:14.319] Packages needed by future strategies (n = 0): [13:13:14.320] { [13:13:14.320] { [13:13:14.320] { [13:13:14.320] ...future.startTime <- base::Sys.time() [13:13:14.320] { [13:13:14.320] { [13:13:14.320] { [13:13:14.320] base::local({ [13:13:14.320] has_future <- base::requireNamespace("future", [13:13:14.320] quietly = TRUE) [13:13:14.320] if (has_future) { [13:13:14.320] ns <- base::getNamespace("future") [13:13:14.320] version <- ns[[".package"]][["version"]] [13:13:14.320] if (is.null(version)) [13:13:14.320] version <- utils::packageVersion("future") [13:13:14.320] } [13:13:14.320] else { [13:13:14.320] version <- NULL [13:13:14.320] } [13:13:14.320] if (!has_future || version < "1.8.0") { [13:13:14.320] info <- base::c(r_version = base::gsub("R version ", [13:13:14.320] "", base::R.version$version.string), [13:13:14.320] platform = base::sprintf("%s (%s-bit)", [13:13:14.320] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:14.320] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:14.320] "release", "version")], collapse = " "), [13:13:14.320] hostname = base::Sys.info()[["nodename"]]) [13:13:14.320] info <- base::sprintf("%s: %s", base::names(info), [13:13:14.320] info) [13:13:14.320] info <- base::paste(info, collapse = "; ") [13:13:14.320] if (!has_future) { [13:13:14.320] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:14.320] info) [13:13:14.320] } [13:13:14.320] else { [13:13:14.320] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:14.320] info, version) [13:13:14.320] } [13:13:14.320] base::stop(msg) [13:13:14.320] } [13:13:14.320] }) [13:13:14.320] } [13:13:14.320] options(future.plan = NULL) [13:13:14.320] Sys.unsetenv("R_FUTURE_PLAN") [13:13:14.320] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:14.320] } [13:13:14.320] ...future.workdir <- getwd() [13:13:14.320] } [13:13:14.320] ...future.oldOptions <- base::as.list(base::.Options) [13:13:14.320] ...future.oldEnvVars <- base::Sys.getenv() [13:13:14.320] } [13:13:14.320] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:14.320] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:14.320] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:14.320] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:14.320] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:14.320] future.stdout.windows.reencode = NULL, width = 80L) [13:13:14.320] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:14.320] base::names(...future.oldOptions)) [13:13:14.320] } [13:13:14.320] if (FALSE) { [13:13:14.320] } [13:13:14.320] else { [13:13:14.320] if (TRUE) { [13:13:14.320] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:14.320] open = "w") [13:13:14.320] } [13:13:14.320] else { [13:13:14.320] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:14.320] windows = "NUL", "/dev/null"), open = "w") [13:13:14.320] } [13:13:14.320] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:14.320] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:14.320] base::sink(type = "output", split = FALSE) [13:13:14.320] base::close(...future.stdout) [13:13:14.320] }, add = TRUE) [13:13:14.320] } [13:13:14.320] ...future.frame <- base::sys.nframe() [13:13:14.320] ...future.conditions <- base::list() [13:13:14.320] ...future.rng <- base::globalenv()$.Random.seed [13:13:14.320] if (FALSE) { [13:13:14.320] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:14.320] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:14.320] } [13:13:14.320] ...future.result <- base::tryCatch({ [13:13:14.320] base::withCallingHandlers({ [13:13:14.320] ...future.value <- base::withVisible(base::local({ [13:13:14.320] do.call(function(...) { [13:13:14.320] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:14.320] if (!identical(...future.globals.maxSize.org, [13:13:14.320] ...future.globals.maxSize)) { [13:13:14.320] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:14.320] on.exit(options(oopts), add = TRUE) [13:13:14.320] } [13:13:14.320] { [13:13:14.320] lapply(seq_along(...future.elements_ii), [13:13:14.320] FUN = function(jj) { [13:13:14.320] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:14.320] ...future.FUN(...future.X_jj, ...) [13:13:14.320] }) [13:13:14.320] } [13:13:14.320] }, args = future.call.arguments) [13:13:14.320] })) [13:13:14.320] future::FutureResult(value = ...future.value$value, [13:13:14.320] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:14.320] ...future.rng), globalenv = if (FALSE) [13:13:14.320] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:14.320] ...future.globalenv.names)) [13:13:14.320] else NULL, started = ...future.startTime, version = "1.8") [13:13:14.320] }, condition = base::local({ [13:13:14.320] c <- base::c [13:13:14.320] inherits <- base::inherits [13:13:14.320] invokeRestart <- base::invokeRestart [13:13:14.320] length <- base::length [13:13:14.320] list <- base::list [13:13:14.320] seq.int <- base::seq.int [13:13:14.320] signalCondition <- base::signalCondition [13:13:14.320] sys.calls <- base::sys.calls [13:13:14.320] `[[` <- base::`[[` [13:13:14.320] `+` <- base::`+` [13:13:14.320] `<<-` <- base::`<<-` [13:13:14.320] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:14.320] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:14.320] 3L)] [13:13:14.320] } [13:13:14.320] function(cond) { [13:13:14.320] is_error <- inherits(cond, "error") [13:13:14.320] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:14.320] NULL) [13:13:14.320] if (is_error) { [13:13:14.320] sessionInformation <- function() { [13:13:14.320] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:14.320] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:14.320] search = base::search(), system = base::Sys.info()) [13:13:14.320] } [13:13:14.320] ...future.conditions[[length(...future.conditions) + [13:13:14.320] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:14.320] cond$call), session = sessionInformation(), [13:13:14.320] timestamp = base::Sys.time(), signaled = 0L) [13:13:14.320] signalCondition(cond) [13:13:14.320] } [13:13:14.320] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:14.320] "immediateCondition"))) { [13:13:14.320] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:14.320] ...future.conditions[[length(...future.conditions) + [13:13:14.320] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:14.320] if (TRUE && !signal) { [13:13:14.320] muffleCondition <- function (cond, pattern = "^muffle") [13:13:14.320] { [13:13:14.320] inherits <- base::inherits [13:13:14.320] invokeRestart <- base::invokeRestart [13:13:14.320] is.null <- base::is.null [13:13:14.320] muffled <- FALSE [13:13:14.320] if (inherits(cond, "message")) { [13:13:14.320] muffled <- grepl(pattern, "muffleMessage") [13:13:14.320] if (muffled) [13:13:14.320] invokeRestart("muffleMessage") [13:13:14.320] } [13:13:14.320] else if (inherits(cond, "warning")) { [13:13:14.320] muffled <- grepl(pattern, "muffleWarning") [13:13:14.320] if (muffled) [13:13:14.320] invokeRestart("muffleWarning") [13:13:14.320] } [13:13:14.320] else if (inherits(cond, "condition")) { [13:13:14.320] if (!is.null(pattern)) { [13:13:14.320] computeRestarts <- base::computeRestarts [13:13:14.320] grepl <- base::grepl [13:13:14.320] restarts <- computeRestarts(cond) [13:13:14.320] for (restart in restarts) { [13:13:14.320] name <- restart$name [13:13:14.320] if (is.null(name)) [13:13:14.320] next [13:13:14.320] if (!grepl(pattern, name)) [13:13:14.320] next [13:13:14.320] invokeRestart(restart) [13:13:14.320] muffled <- TRUE [13:13:14.320] break [13:13:14.320] } [13:13:14.320] } [13:13:14.320] } [13:13:14.320] invisible(muffled) [13:13:14.320] } [13:13:14.320] muffleCondition(cond, pattern = "^muffle") [13:13:14.320] } [13:13:14.320] } [13:13:14.320] else { [13:13:14.320] if (TRUE) { [13:13:14.320] muffleCondition <- function (cond, pattern = "^muffle") [13:13:14.320] { [13:13:14.320] inherits <- base::inherits [13:13:14.320] invokeRestart <- base::invokeRestart [13:13:14.320] is.null <- base::is.null [13:13:14.320] muffled <- FALSE [13:13:14.320] if (inherits(cond, "message")) { [13:13:14.320] muffled <- grepl(pattern, "muffleMessage") [13:13:14.320] if (muffled) [13:13:14.320] invokeRestart("muffleMessage") [13:13:14.320] } [13:13:14.320] else if (inherits(cond, "warning")) { [13:13:14.320] muffled <- grepl(pattern, "muffleWarning") [13:13:14.320] if (muffled) [13:13:14.320] invokeRestart("muffleWarning") [13:13:14.320] } [13:13:14.320] else if (inherits(cond, "condition")) { [13:13:14.320] if (!is.null(pattern)) { [13:13:14.320] computeRestarts <- base::computeRestarts [13:13:14.320] grepl <- base::grepl [13:13:14.320] restarts <- computeRestarts(cond) [13:13:14.320] for (restart in restarts) { [13:13:14.320] name <- restart$name [13:13:14.320] if (is.null(name)) [13:13:14.320] next [13:13:14.320] if (!grepl(pattern, name)) [13:13:14.320] next [13:13:14.320] invokeRestart(restart) [13:13:14.320] muffled <- TRUE [13:13:14.320] break [13:13:14.320] } [13:13:14.320] } [13:13:14.320] } [13:13:14.320] invisible(muffled) [13:13:14.320] } [13:13:14.320] muffleCondition(cond, pattern = "^muffle") [13:13:14.320] } [13:13:14.320] } [13:13:14.320] } [13:13:14.320] })) [13:13:14.320] }, error = function(ex) { [13:13:14.320] base::structure(base::list(value = NULL, visible = NULL, [13:13:14.320] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:14.320] ...future.rng), started = ...future.startTime, [13:13:14.320] finished = Sys.time(), session_uuid = NA_character_, [13:13:14.320] version = "1.8"), class = "FutureResult") [13:13:14.320] }, finally = { [13:13:14.320] if (!identical(...future.workdir, getwd())) [13:13:14.320] setwd(...future.workdir) [13:13:14.320] { [13:13:14.320] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:14.320] ...future.oldOptions$nwarnings <- NULL [13:13:14.320] } [13:13:14.320] base::options(...future.oldOptions) [13:13:14.320] if (.Platform$OS.type == "windows") { [13:13:14.320] old_names <- names(...future.oldEnvVars) [13:13:14.320] envs <- base::Sys.getenv() [13:13:14.320] names <- names(envs) [13:13:14.320] common <- intersect(names, old_names) [13:13:14.320] added <- setdiff(names, old_names) [13:13:14.320] removed <- setdiff(old_names, names) [13:13:14.320] changed <- common[...future.oldEnvVars[common] != [13:13:14.320] envs[common]] [13:13:14.320] NAMES <- toupper(changed) [13:13:14.320] args <- list() [13:13:14.320] for (kk in seq_along(NAMES)) { [13:13:14.320] name <- changed[[kk]] [13:13:14.320] NAME <- NAMES[[kk]] [13:13:14.320] if (name != NAME && is.element(NAME, old_names)) [13:13:14.320] next [13:13:14.320] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:14.320] } [13:13:14.320] NAMES <- toupper(added) [13:13:14.320] for (kk in seq_along(NAMES)) { [13:13:14.320] name <- added[[kk]] [13:13:14.320] NAME <- NAMES[[kk]] [13:13:14.320] if (name != NAME && is.element(NAME, old_names)) [13:13:14.320] next [13:13:14.320] args[[name]] <- "" [13:13:14.320] } [13:13:14.320] NAMES <- toupper(removed) [13:13:14.320] for (kk in seq_along(NAMES)) { [13:13:14.320] name <- removed[[kk]] [13:13:14.320] NAME <- NAMES[[kk]] [13:13:14.320] if (name != NAME && is.element(NAME, old_names)) [13:13:14.320] next [13:13:14.320] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:14.320] } [13:13:14.320] if (length(args) > 0) [13:13:14.320] base::do.call(base::Sys.setenv, args = args) [13:13:14.320] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:14.320] } [13:13:14.320] else { [13:13:14.320] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:14.320] } [13:13:14.320] { [13:13:14.320] if (base::length(...future.futureOptionsAdded) > [13:13:14.320] 0L) { [13:13:14.320] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:14.320] base::names(opts) <- ...future.futureOptionsAdded [13:13:14.320] base::options(opts) [13:13:14.320] } [13:13:14.320] { [13:13:14.320] { [13:13:14.320] NULL [13:13:14.320] RNGkind("Mersenne-Twister") [13:13:14.320] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:14.320] inherits = FALSE) [13:13:14.320] } [13:13:14.320] options(future.plan = NULL) [13:13:14.320] if (is.na(NA_character_)) [13:13:14.320] Sys.unsetenv("R_FUTURE_PLAN") [13:13:14.320] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:14.320] future::plan(list(function (..., envir = parent.frame()) [13:13:14.320] { [13:13:14.320] future <- SequentialFuture(..., envir = envir) [13:13:14.320] if (!future$lazy) [13:13:14.320] future <- run(future) [13:13:14.320] invisible(future) [13:13:14.320] }), .cleanup = FALSE, .init = FALSE) [13:13:14.320] } [13:13:14.320] } [13:13:14.320] } [13:13:14.320] }) [13:13:14.320] if (TRUE) { [13:13:14.320] base::sink(type = "output", split = FALSE) [13:13:14.320] if (TRUE) { [13:13:14.320] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:14.320] } [13:13:14.320] else { [13:13:14.320] ...future.result["stdout"] <- base::list(NULL) [13:13:14.320] } [13:13:14.320] base::close(...future.stdout) [13:13:14.320] ...future.stdout <- NULL [13:13:14.320] } [13:13:14.320] ...future.result$conditions <- ...future.conditions [13:13:14.320] ...future.result$finished <- base::Sys.time() [13:13:14.320] ...future.result [13:13:14.320] } [13:13:14.324] assign_globals() ... [13:13:14.324] List of 5 [13:13:14.324] $ ...future.FUN :function (object, ...) [13:13:14.324] $ future.call.arguments :List of 1 [13:13:14.324] ..$ digits: int 2 [13:13:14.324] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:14.324] $ ...future.elements_ii :List of 6 [13:13:14.324] ..$ : num [1:9] 26 30 54 25 70 52 51 26 67 [13:13:14.324] ..$ : num [1:9] 27 14 29 19 29 31 41 20 44 [13:13:14.324] ..$ : num [1:9] 18 21 29 17 12 18 35 30 36 [13:13:14.324] ..$ : num [1:9] 42 26 19 16 39 28 21 39 29 [13:13:14.324] ..$ : num [1:9] 36 21 24 18 10 43 28 15 26 [13:13:14.324] ..$ : num [1:9] 20 21 24 17 13 15 15 16 28 [13:13:14.324] $ ...future.seeds_ii : NULL [13:13:14.324] $ ...future.globals.maxSize: NULL [13:13:14.324] - attr(*, "where")=List of 5 [13:13:14.324] ..$ ...future.FUN : [13:13:14.324] ..$ future.call.arguments : [13:13:14.324] ..$ ...future.elements_ii : [13:13:14.324] ..$ ...future.seeds_ii : [13:13:14.324] ..$ ...future.globals.maxSize: [13:13:14.324] - attr(*, "resolved")= logi FALSE [13:13:14.324] - attr(*, "total_size")= num 1296 [13:13:14.324] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:14.324] - attr(*, "already-done")= logi TRUE [13:13:14.335] - copied '...future.FUN' to environment [13:13:14.336] - copied 'future.call.arguments' to environment [13:13:14.336] - copied '...future.elements_ii' to environment [13:13:14.336] - copied '...future.seeds_ii' to environment [13:13:14.336] - copied '...future.globals.maxSize' to environment [13:13:14.337] assign_globals() ... done [13:13:14.337] plan(): Setting new future strategy stack: [13:13:14.337] List of future strategies: [13:13:14.337] 1. sequential: [13:13:14.337] - args: function (..., envir = parent.frame(), workers = "") [13:13:14.337] - tweaked: FALSE [13:13:14.337] - call: NULL [13:13:14.338] plan(): nbrOfWorkers() = 1 [13:13:14.341] plan(): Setting new future strategy stack: [13:13:14.345] List of future strategies: [13:13:14.345] 1. sequential: [13:13:14.345] - args: function (..., envir = parent.frame(), workers = "") [13:13:14.345] - tweaked: FALSE [13:13:14.345] - call: plan(strategy) [13:13:14.346] plan(): nbrOfWorkers() = 1 [13:13:14.346] SequentialFuture started (and completed) [13:13:14.347] - Launch lazy future ... done [13:13:14.347] run() for 'SequentialFuture' ... done [13:13:14.347] Created future: [13:13:14.347] SequentialFuture: [13:13:14.347] Label: 'future_by-1' [13:13:14.347] Expression: [13:13:14.347] { [13:13:14.347] do.call(function(...) { [13:13:14.347] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:14.347] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:14.347] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:14.347] on.exit(options(oopts), add = TRUE) [13:13:14.347] } [13:13:14.347] { [13:13:14.347] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:14.347] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:14.347] ...future.FUN(...future.X_jj, ...) [13:13:14.347] }) [13:13:14.347] } [13:13:14.347] }, args = future.call.arguments) [13:13:14.347] } [13:13:14.347] Lazy evaluation: FALSE [13:13:14.347] Asynchronous evaluation: FALSE [13:13:14.347] Local evaluation: TRUE [13:13:14.347] Environment: R_GlobalEnv [13:13:14.347] Capture standard output: TRUE [13:13:14.347] Capture condition classes: 'condition' (excluding 'nothing') [13:13:14.347] Globals: 5 objects totaling 2.30 KiB (function '...future.FUN' of 1.21 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 1.03 KiB, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:13:14.347] Packages: [13:13:14.347] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:14.347] Resolved: TRUE [13:13:14.347] Value: 5.48 KiB of class 'list' [13:13:14.347] Early signaling: FALSE [13:13:14.347] Owner process: f0659542-730c-c20a-65b3-84f202449c4d [13:13:14.347] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:14.349] Chunk #1 of 1 ... DONE [13:13:14.349] Launching 1 futures (chunks) ... DONE [13:13:14.350] Resolving 1 futures (chunks) ... [13:13:14.350] resolve() on list ... [13:13:14.350] recursive: 0 [13:13:14.350] length: 1 [13:13:14.350] [13:13:14.351] resolved() for 'SequentialFuture' ... [13:13:14.351] - state: 'finished' [13:13:14.351] - run: TRUE [13:13:14.351] - result: 'FutureResult' [13:13:14.352] resolved() for 'SequentialFuture' ... done [13:13:14.352] Future #1 [13:13:14.352] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:14.352] - nx: 1 [13:13:14.353] - relay: TRUE [13:13:14.353] - stdout: TRUE [13:13:14.353] - signal: TRUE [13:13:14.353] - resignal: FALSE [13:13:14.353] - force: TRUE [13:13:14.353] - relayed: [n=1] FALSE [13:13:14.354] - queued futures: [n=1] FALSE [13:13:14.354] - until=1 [13:13:14.354] - relaying element #1 [13:13:14.354] - relayed: [n=1] TRUE [13:13:14.355] - queued futures: [n=1] TRUE [13:13:14.355] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:14.355] length: 0 (resolved future 1) [13:13:14.355] Relaying remaining futures [13:13:14.355] signalConditionsASAP(NULL, pos=0) ... [13:13:14.356] - nx: 1 [13:13:14.356] - relay: TRUE [13:13:14.356] - stdout: TRUE [13:13:14.356] - signal: TRUE [13:13:14.356] - resignal: FALSE [13:13:14.357] - force: TRUE [13:13:14.357] - relayed: [n=1] TRUE [13:13:14.357] - queued futures: [n=1] TRUE - flush all [13:13:14.357] - relayed: [n=1] TRUE [13:13:14.357] - queued futures: [n=1] TRUE [13:13:14.358] signalConditionsASAP(NULL, pos=0) ... done [13:13:14.358] resolve() on list ... DONE [13:13:14.358] - Number of value chunks collected: 1 [13:13:14.358] Resolving 1 futures (chunks) ... DONE [13:13:14.358] Reducing values from 1 chunks ... [13:13:14.359] - Number of values collected after concatenation: 6 [13:13:14.359] - Number of values expected: 6 [13:13:14.359] Reducing values from 1 chunks ... DONE [13:13:14.359] future_lapply() ... DONE [13:13:14.360] future_by_internal() ... DONE [13:13:14.364] future_by_internal() ... [13:13:14.365] future_lapply() ... [13:13:14.366] Number of chunks: 1 [13:13:14.366] getGlobalsAndPackagesXApply() ... [13:13:14.367] - future.globals: TRUE [13:13:14.367] getGlobalsAndPackages() ... [13:13:14.367] Searching for globals... [13:13:14.369] - globals found: [6] 'FUN', '{', 'lm', '~', 'breaks', 'wool' [13:13:14.369] Searching for globals ... DONE [13:13:14.369] Resolving globals: FALSE [13:13:14.370] The total size of the 1 globals is 5.20 KiB (5328 bytes) [13:13:14.371] The total size of the 1 globals exported for future expression ('FUN(singular.ok = FALSE)') is 5.20 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (5.20 KiB of class 'function') [13:13:14.371] - globals: [1] 'FUN' [13:13:14.371] - packages: [1] 'stats' [13:13:14.371] getGlobalsAndPackages() ... DONE [13:13:14.371] - globals found/used: [n=1] 'FUN' [13:13:14.432] - needed namespaces: [n=1] 'stats' [13:13:14.432] Finding globals ... DONE [13:13:14.432] - use_args: TRUE [13:13:14.432] - Getting '...' globals ... [13:13:14.433] resolve() on list ... [13:13:14.433] recursive: 0 [13:13:14.433] length: 1 [13:13:14.434] elements: '...' [13:13:14.434] length: 0 (resolved future 1) [13:13:14.434] resolve() on list ... DONE [13:13:14.434] - '...' content: [n=1] 'singular.ok' [13:13:14.435] List of 1 [13:13:14.435] $ ...:List of 1 [13:13:14.435] ..$ singular.ok: logi FALSE [13:13:14.435] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:14.435] - attr(*, "where")=List of 1 [13:13:14.435] ..$ ...: [13:13:14.435] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:14.435] - attr(*, "resolved")= logi TRUE [13:13:14.435] - attr(*, "total_size")= num NA [13:13:14.439] - Getting '...' globals ... DONE [13:13:14.440] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:14.440] List of 2 [13:13:14.440] $ ...future.FUN:function (x, ...) [13:13:14.440] $ ... :List of 1 [13:13:14.440] ..$ singular.ok: logi FALSE [13:13:14.440] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:14.440] - attr(*, "where")=List of 2 [13:13:14.440] ..$ ...future.FUN: [13:13:14.440] ..$ ... : [13:13:14.440] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:14.440] - attr(*, "resolved")= logi FALSE [13:13:14.440] - attr(*, "total_size")= num 5384 [13:13:14.446] Packages to be attached in all futures: [n=1] 'stats' [13:13:14.446] getGlobalsAndPackagesXApply() ... DONE [13:13:14.446] Number of futures (= number of chunks): 1 [13:13:14.446] Launching 1 futures (chunks) ... [13:13:14.447] Chunk #1 of 1 ... [13:13:14.447] - Finding globals in 'X' for chunk #1 ... [13:13:14.447] getGlobalsAndPackages() ... [13:13:14.447] Searching for globals... [13:13:14.448] [13:13:14.448] Searching for globals ... DONE [13:13:14.449] - globals: [0] [13:13:14.449] getGlobalsAndPackages() ... DONE [13:13:14.449] + additional globals found: [n=0] [13:13:14.449] + additional namespaces needed: [n=0] [13:13:14.449] - Finding globals in 'X' for chunk #1 ... DONE [13:13:14.450] - seeds: [13:13:14.450] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:14.450] getGlobalsAndPackages() ... [13:13:14.450] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:14.450] Resolving globals: FALSE [13:13:14.451] Tweak future expression to call with '...' arguments ... [13:13:14.451] { [13:13:14.451] do.call(function(...) { [13:13:14.451] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:14.451] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:14.451] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:14.451] on.exit(options(oopts), add = TRUE) [13:13:14.451] } [13:13:14.451] { [13:13:14.451] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:14.451] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:14.451] ...future.FUN(...future.X_jj, ...) [13:13:14.451] }) [13:13:14.451] } [13:13:14.451] }, args = future.call.arguments) [13:13:14.451] } [13:13:14.451] Tweak future expression to call with '...' arguments ... DONE [13:13:14.452] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:14.452] [13:13:14.453] getGlobalsAndPackages() ... DONE [13:13:14.453] run() for 'Future' ... [13:13:14.453] - state: 'created' [13:13:14.454] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:13:14.454] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:14.454] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:14.455] - Field: 'label' [13:13:14.455] - Field: 'local' [13:13:14.455] - Field: 'owner' [13:13:14.455] - Field: 'envir' [13:13:14.456] - Field: 'packages' [13:13:14.456] - Field: 'gc' [13:13:14.456] - Field: 'conditions' [13:13:14.456] - Field: 'expr' [13:13:14.456] - Field: 'uuid' [13:13:14.457] - Field: 'seed' [13:13:14.457] - Field: 'version' [13:13:14.457] - Field: 'result' [13:13:14.457] - Field: 'asynchronous' [13:13:14.458] - Field: 'calls' [13:13:14.458] - Field: 'globals' [13:13:14.458] - Field: 'stdout' [13:13:14.458] - Field: 'earlySignal' [13:13:14.458] - Field: 'lazy' [13:13:14.459] - Field: 'state' [13:13:14.459] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:14.459] - Launch lazy future ... [13:13:14.460] Packages needed by the future expression (n = 1): 'stats' [13:13:14.460] Packages needed by future strategies (n = 0): [13:13:14.461] { [13:13:14.461] { [13:13:14.461] { [13:13:14.461] ...future.startTime <- base::Sys.time() [13:13:14.461] { [13:13:14.461] { [13:13:14.461] { [13:13:14.461] { [13:13:14.461] base::local({ [13:13:14.461] has_future <- base::requireNamespace("future", [13:13:14.461] quietly = TRUE) [13:13:14.461] if (has_future) { [13:13:14.461] ns <- base::getNamespace("future") [13:13:14.461] version <- ns[[".package"]][["version"]] [13:13:14.461] if (is.null(version)) [13:13:14.461] version <- utils::packageVersion("future") [13:13:14.461] } [13:13:14.461] else { [13:13:14.461] version <- NULL [13:13:14.461] } [13:13:14.461] if (!has_future || version < "1.8.0") { [13:13:14.461] info <- base::c(r_version = base::gsub("R version ", [13:13:14.461] "", base::R.version$version.string), [13:13:14.461] platform = base::sprintf("%s (%s-bit)", [13:13:14.461] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:14.461] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:14.461] "release", "version")], collapse = " "), [13:13:14.461] hostname = base::Sys.info()[["nodename"]]) [13:13:14.461] info <- base::sprintf("%s: %s", base::names(info), [13:13:14.461] info) [13:13:14.461] info <- base::paste(info, collapse = "; ") [13:13:14.461] if (!has_future) { [13:13:14.461] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:14.461] info) [13:13:14.461] } [13:13:14.461] else { [13:13:14.461] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:14.461] info, version) [13:13:14.461] } [13:13:14.461] base::stop(msg) [13:13:14.461] } [13:13:14.461] }) [13:13:14.461] } [13:13:14.461] base::local({ [13:13:14.461] for (pkg in "stats") { [13:13:14.461] base::loadNamespace(pkg) [13:13:14.461] base::library(pkg, character.only = TRUE) [13:13:14.461] } [13:13:14.461] }) [13:13:14.461] } [13:13:14.461] options(future.plan = NULL) [13:13:14.461] Sys.unsetenv("R_FUTURE_PLAN") [13:13:14.461] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:14.461] } [13:13:14.461] ...future.workdir <- getwd() [13:13:14.461] } [13:13:14.461] ...future.oldOptions <- base::as.list(base::.Options) [13:13:14.461] ...future.oldEnvVars <- base::Sys.getenv() [13:13:14.461] } [13:13:14.461] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:14.461] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:14.461] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:14.461] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:14.461] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:14.461] future.stdout.windows.reencode = NULL, width = 80L) [13:13:14.461] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:14.461] base::names(...future.oldOptions)) [13:13:14.461] } [13:13:14.461] if (FALSE) { [13:13:14.461] } [13:13:14.461] else { [13:13:14.461] if (TRUE) { [13:13:14.461] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:14.461] open = "w") [13:13:14.461] } [13:13:14.461] else { [13:13:14.461] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:14.461] windows = "NUL", "/dev/null"), open = "w") [13:13:14.461] } [13:13:14.461] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:14.461] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:14.461] base::sink(type = "output", split = FALSE) [13:13:14.461] base::close(...future.stdout) [13:13:14.461] }, add = TRUE) [13:13:14.461] } [13:13:14.461] ...future.frame <- base::sys.nframe() [13:13:14.461] ...future.conditions <- base::list() [13:13:14.461] ...future.rng <- base::globalenv()$.Random.seed [13:13:14.461] if (FALSE) { [13:13:14.461] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:14.461] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:14.461] } [13:13:14.461] ...future.result <- base::tryCatch({ [13:13:14.461] base::withCallingHandlers({ [13:13:14.461] ...future.value <- base::withVisible(base::local({ [13:13:14.461] do.call(function(...) { [13:13:14.461] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:14.461] if (!identical(...future.globals.maxSize.org, [13:13:14.461] ...future.globals.maxSize)) { [13:13:14.461] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:14.461] on.exit(options(oopts), add = TRUE) [13:13:14.461] } [13:13:14.461] { [13:13:14.461] lapply(seq_along(...future.elements_ii), [13:13:14.461] FUN = function(jj) { [13:13:14.461] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:14.461] ...future.FUN(...future.X_jj, ...) [13:13:14.461] }) [13:13:14.461] } [13:13:14.461] }, args = future.call.arguments) [13:13:14.461] })) [13:13:14.461] future::FutureResult(value = ...future.value$value, [13:13:14.461] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:14.461] ...future.rng), globalenv = if (FALSE) [13:13:14.461] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:14.461] ...future.globalenv.names)) [13:13:14.461] else NULL, started = ...future.startTime, version = "1.8") [13:13:14.461] }, condition = base::local({ [13:13:14.461] c <- base::c [13:13:14.461] inherits <- base::inherits [13:13:14.461] invokeRestart <- base::invokeRestart [13:13:14.461] length <- base::length [13:13:14.461] list <- base::list [13:13:14.461] seq.int <- base::seq.int [13:13:14.461] signalCondition <- base::signalCondition [13:13:14.461] sys.calls <- base::sys.calls [13:13:14.461] `[[` <- base::`[[` [13:13:14.461] `+` <- base::`+` [13:13:14.461] `<<-` <- base::`<<-` [13:13:14.461] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:14.461] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:14.461] 3L)] [13:13:14.461] } [13:13:14.461] function(cond) { [13:13:14.461] is_error <- inherits(cond, "error") [13:13:14.461] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:14.461] NULL) [13:13:14.461] if (is_error) { [13:13:14.461] sessionInformation <- function() { [13:13:14.461] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:14.461] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:14.461] search = base::search(), system = base::Sys.info()) [13:13:14.461] } [13:13:14.461] ...future.conditions[[length(...future.conditions) + [13:13:14.461] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:14.461] cond$call), session = sessionInformation(), [13:13:14.461] timestamp = base::Sys.time(), signaled = 0L) [13:13:14.461] signalCondition(cond) [13:13:14.461] } [13:13:14.461] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:14.461] "immediateCondition"))) { [13:13:14.461] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:14.461] ...future.conditions[[length(...future.conditions) + [13:13:14.461] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:14.461] if (TRUE && !signal) { [13:13:14.461] muffleCondition <- function (cond, pattern = "^muffle") [13:13:14.461] { [13:13:14.461] inherits <- base::inherits [13:13:14.461] invokeRestart <- base::invokeRestart [13:13:14.461] is.null <- base::is.null [13:13:14.461] muffled <- FALSE [13:13:14.461] if (inherits(cond, "message")) { [13:13:14.461] muffled <- grepl(pattern, "muffleMessage") [13:13:14.461] if (muffled) [13:13:14.461] invokeRestart("muffleMessage") [13:13:14.461] } [13:13:14.461] else if (inherits(cond, "warning")) { [13:13:14.461] muffled <- grepl(pattern, "muffleWarning") [13:13:14.461] if (muffled) [13:13:14.461] invokeRestart("muffleWarning") [13:13:14.461] } [13:13:14.461] else if (inherits(cond, "condition")) { [13:13:14.461] if (!is.null(pattern)) { [13:13:14.461] computeRestarts <- base::computeRestarts [13:13:14.461] grepl <- base::grepl [13:13:14.461] restarts <- computeRestarts(cond) [13:13:14.461] for (restart in restarts) { [13:13:14.461] name <- restart$name [13:13:14.461] if (is.null(name)) [13:13:14.461] next [13:13:14.461] if (!grepl(pattern, name)) [13:13:14.461] next [13:13:14.461] invokeRestart(restart) [13:13:14.461] muffled <- TRUE [13:13:14.461] break [13:13:14.461] } [13:13:14.461] } [13:13:14.461] } [13:13:14.461] invisible(muffled) [13:13:14.461] } [13:13:14.461] muffleCondition(cond, pattern = "^muffle") [13:13:14.461] } [13:13:14.461] } [13:13:14.461] else { [13:13:14.461] if (TRUE) { [13:13:14.461] muffleCondition <- function (cond, pattern = "^muffle") [13:13:14.461] { [13:13:14.461] inherits <- base::inherits [13:13:14.461] invokeRestart <- base::invokeRestart [13:13:14.461] is.null <- base::is.null [13:13:14.461] muffled <- FALSE [13:13:14.461] if (inherits(cond, "message")) { [13:13:14.461] muffled <- grepl(pattern, "muffleMessage") [13:13:14.461] if (muffled) [13:13:14.461] invokeRestart("muffleMessage") [13:13:14.461] } [13:13:14.461] else if (inherits(cond, "warning")) { [13:13:14.461] muffled <- grepl(pattern, "muffleWarning") [13:13:14.461] if (muffled) [13:13:14.461] invokeRestart("muffleWarning") [13:13:14.461] } [13:13:14.461] else if (inherits(cond, "condition")) { [13:13:14.461] if (!is.null(pattern)) { [13:13:14.461] computeRestarts <- base::computeRestarts [13:13:14.461] grepl <- base::grepl [13:13:14.461] restarts <- computeRestarts(cond) [13:13:14.461] for (restart in restarts) { [13:13:14.461] name <- restart$name [13:13:14.461] if (is.null(name)) [13:13:14.461] next [13:13:14.461] if (!grepl(pattern, name)) [13:13:14.461] next [13:13:14.461] invokeRestart(restart) [13:13:14.461] muffled <- TRUE [13:13:14.461] break [13:13:14.461] } [13:13:14.461] } [13:13:14.461] } [13:13:14.461] invisible(muffled) [13:13:14.461] } [13:13:14.461] muffleCondition(cond, pattern = "^muffle") [13:13:14.461] } [13:13:14.461] } [13:13:14.461] } [13:13:14.461] })) [13:13:14.461] }, error = function(ex) { [13:13:14.461] base::structure(base::list(value = NULL, visible = NULL, [13:13:14.461] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:14.461] ...future.rng), started = ...future.startTime, [13:13:14.461] finished = Sys.time(), session_uuid = NA_character_, [13:13:14.461] version = "1.8"), class = "FutureResult") [13:13:14.461] }, finally = { [13:13:14.461] if (!identical(...future.workdir, getwd())) [13:13:14.461] setwd(...future.workdir) [13:13:14.461] { [13:13:14.461] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:14.461] ...future.oldOptions$nwarnings <- NULL [13:13:14.461] } [13:13:14.461] base::options(...future.oldOptions) [13:13:14.461] if (.Platform$OS.type == "windows") { [13:13:14.461] old_names <- names(...future.oldEnvVars) [13:13:14.461] envs <- base::Sys.getenv() [13:13:14.461] names <- names(envs) [13:13:14.461] common <- intersect(names, old_names) [13:13:14.461] added <- setdiff(names, old_names) [13:13:14.461] removed <- setdiff(old_names, names) [13:13:14.461] changed <- common[...future.oldEnvVars[common] != [13:13:14.461] envs[common]] [13:13:14.461] NAMES <- toupper(changed) [13:13:14.461] args <- list() [13:13:14.461] for (kk in seq_along(NAMES)) { [13:13:14.461] name <- changed[[kk]] [13:13:14.461] NAME <- NAMES[[kk]] [13:13:14.461] if (name != NAME && is.element(NAME, old_names)) [13:13:14.461] next [13:13:14.461] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:14.461] } [13:13:14.461] NAMES <- toupper(added) [13:13:14.461] for (kk in seq_along(NAMES)) { [13:13:14.461] name <- added[[kk]] [13:13:14.461] NAME <- NAMES[[kk]] [13:13:14.461] if (name != NAME && is.element(NAME, old_names)) [13:13:14.461] next [13:13:14.461] args[[name]] <- "" [13:13:14.461] } [13:13:14.461] NAMES <- toupper(removed) [13:13:14.461] for (kk in seq_along(NAMES)) { [13:13:14.461] name <- removed[[kk]] [13:13:14.461] NAME <- NAMES[[kk]] [13:13:14.461] if (name != NAME && is.element(NAME, old_names)) [13:13:14.461] next [13:13:14.461] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:14.461] } [13:13:14.461] if (length(args) > 0) [13:13:14.461] base::do.call(base::Sys.setenv, args = args) [13:13:14.461] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:14.461] } [13:13:14.461] else { [13:13:14.461] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:14.461] } [13:13:14.461] { [13:13:14.461] if (base::length(...future.futureOptionsAdded) > [13:13:14.461] 0L) { [13:13:14.461] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:14.461] base::names(opts) <- ...future.futureOptionsAdded [13:13:14.461] base::options(opts) [13:13:14.461] } [13:13:14.461] { [13:13:14.461] { [13:13:14.461] NULL [13:13:14.461] RNGkind("Mersenne-Twister") [13:13:14.461] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:14.461] inherits = FALSE) [13:13:14.461] } [13:13:14.461] options(future.plan = NULL) [13:13:14.461] if (is.na(NA_character_)) [13:13:14.461] Sys.unsetenv("R_FUTURE_PLAN") [13:13:14.461] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:14.461] future::plan(list(function (..., envir = parent.frame()) [13:13:14.461] { [13:13:14.461] future <- SequentialFuture(..., envir = envir) [13:13:14.461] if (!future$lazy) [13:13:14.461] future <- run(future) [13:13:14.461] invisible(future) [13:13:14.461] }), .cleanup = FALSE, .init = FALSE) [13:13:14.461] } [13:13:14.461] } [13:13:14.461] } [13:13:14.461] }) [13:13:14.461] if (TRUE) { [13:13:14.461] base::sink(type = "output", split = FALSE) [13:13:14.461] if (TRUE) { [13:13:14.461] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:14.461] } [13:13:14.461] else { [13:13:14.461] ...future.result["stdout"] <- base::list(NULL) [13:13:14.461] } [13:13:14.461] base::close(...future.stdout) [13:13:14.461] ...future.stdout <- NULL [13:13:14.461] } [13:13:14.461] ...future.result$conditions <- ...future.conditions [13:13:14.461] ...future.result$finished <- base::Sys.time() [13:13:14.461] ...future.result [13:13:14.461] } [13:13:14.465] assign_globals() ... [13:13:14.465] List of 5 [13:13:14.465] $ ...future.FUN :function (x, ...) [13:13:14.465] $ future.call.arguments :List of 1 [13:13:14.465] ..$ singular.ok: logi FALSE [13:13:14.465] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:14.465] $ ...future.elements_ii :List of 3 [13:13:14.465] ..$ :'data.frame': 18 obs. of 3 variables: [13:13:14.465] .. ..$ breaks : num [1:18] 26 30 54 25 70 52 51 26 67 27 ... [13:13:14.465] .. ..$ wool : Factor w/ 2 levels "A","B": 1 1 1 1 1 1 1 1 1 2 ... [13:13:14.465] .. ..$ tension: Factor w/ 3 levels "L","M","H": 1 1 1 1 1 1 1 1 1 1 ... [13:13:14.465] ..$ :'data.frame': 18 obs. of 3 variables: [13:13:14.465] .. ..$ breaks : num [1:18] 18 21 29 17 12 18 35 30 36 42 ... [13:13:14.465] .. ..$ wool : Factor w/ 2 levels "A","B": 1 1 1 1 1 1 1 1 1 2 ... [13:13:14.465] .. ..$ tension: Factor w/ 3 levels "L","M","H": 2 2 2 2 2 2 2 2 2 2 ... [13:13:14.465] ..$ :'data.frame': 18 obs. of 3 variables: [13:13:14.465] .. ..$ breaks : num [1:18] 36 21 24 18 10 43 28 15 26 20 ... [13:13:14.465] .. ..$ wool : Factor w/ 2 levels "A","B": 1 1 1 1 1 1 1 1 1 2 ... [13:13:14.465] .. ..$ tension: Factor w/ 3 levels "L","M","H": 3 3 3 3 3 3 3 3 3 3 ... [13:13:14.465] $ ...future.seeds_ii : NULL [13:13:14.465] $ ...future.globals.maxSize: NULL [13:13:14.465] - attr(*, "where")=List of 5 [13:13:14.465] ..$ ...future.FUN : [13:13:14.465] ..$ future.call.arguments : [13:13:14.465] ..$ ...future.elements_ii : [13:13:14.465] ..$ ...future.seeds_ii : [13:13:14.465] ..$ ...future.globals.maxSize: [13:13:14.465] - attr(*, "resolved")= logi FALSE [13:13:14.465] - attr(*, "total_size")= num 5384 [13:13:14.465] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:14.465] - attr(*, "already-done")= logi TRUE [13:13:14.479] - reassign environment for '...future.FUN' [13:13:14.479] - copied '...future.FUN' to environment [13:13:14.479] - copied 'future.call.arguments' to environment [13:13:14.479] - copied '...future.elements_ii' to environment [13:13:14.479] - copied '...future.seeds_ii' to environment [13:13:14.479] - copied '...future.globals.maxSize' to environment [13:13:14.480] assign_globals() ... done [13:13:14.480] plan(): Setting new future strategy stack: [13:13:14.481] List of future strategies: [13:13:14.481] 1. sequential: [13:13:14.481] - args: function (..., envir = parent.frame(), workers = "") [13:13:14.481] - tweaked: FALSE [13:13:14.481] - call: NULL [13:13:14.481] plan(): nbrOfWorkers() = 1 [13:13:14.485] plan(): Setting new future strategy stack: [13:13:14.485] List of future strategies: [13:13:14.485] 1. sequential: [13:13:14.485] - args: function (..., envir = parent.frame(), workers = "") [13:13:14.485] - tweaked: FALSE [13:13:14.485] - call: plan(strategy) [13:13:14.486] plan(): nbrOfWorkers() = 1 [13:13:14.486] SequentialFuture started (and completed) [13:13:14.487] - Launch lazy future ... done [13:13:14.487] run() for 'SequentialFuture' ... done [13:13:14.487] Created future: [13:13:14.487] SequentialFuture: [13:13:14.487] Label: 'future_by-1' [13:13:14.487] Expression: [13:13:14.487] { [13:13:14.487] do.call(function(...) { [13:13:14.487] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:14.487] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:14.487] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:14.487] on.exit(options(oopts), add = TRUE) [13:13:14.487] } [13:13:14.487] { [13:13:14.487] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:14.487] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:14.487] ...future.FUN(...future.X_jj, ...) [13:13:14.487] }) [13:13:14.487] } [13:13:14.487] }, args = future.call.arguments) [13:13:14.487] } [13:13:14.487] Lazy evaluation: FALSE [13:13:14.487] Asynchronous evaluation: FALSE [13:13:14.487] Local evaluation: TRUE [13:13:14.487] Environment: R_GlobalEnv [13:13:14.487] Capture standard output: TRUE [13:13:14.487] Capture condition classes: 'condition' (excluding 'nothing') [13:13:14.487] Globals: 5 objects totaling 10.06 KiB (function '...future.FUN' of 5.20 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 4.80 KiB, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:13:14.487] Packages: 1 packages ('stats') [13:13:14.487] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:14.487] Resolved: TRUE [13:13:14.487] Value: 26.06 KiB of class 'list' [13:13:14.487] Early signaling: FALSE [13:13:14.487] Owner process: f0659542-730c-c20a-65b3-84f202449c4d [13:13:14.487] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:14.489] Chunk #1 of 1 ... DONE [13:13:14.489] Launching 1 futures (chunks) ... DONE [13:13:14.490] Resolving 1 futures (chunks) ... [13:13:14.490] resolve() on list ... [13:13:14.490] recursive: 0 [13:13:14.490] length: 1 [13:13:14.490] [13:13:14.490] resolved() for 'SequentialFuture' ... [13:13:14.491] - state: 'finished' [13:13:14.491] - run: TRUE [13:13:14.491] - result: 'FutureResult' [13:13:14.492] resolved() for 'SequentialFuture' ... done [13:13:14.492] Future #1 [13:13:14.492] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:14.493] - nx: 1 [13:13:14.493] - relay: TRUE [13:13:14.493] - stdout: TRUE [13:13:14.493] - signal: TRUE [13:13:14.493] - resignal: FALSE [13:13:14.493] - force: TRUE [13:13:14.493] - relayed: [n=1] FALSE [13:13:14.494] - queued futures: [n=1] FALSE [13:13:14.494] - until=1 [13:13:14.494] - relaying element #1 [13:13:14.494] - relayed: [n=1] TRUE [13:13:14.494] - queued futures: [n=1] TRUE [13:13:14.495] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:14.495] length: 0 (resolved future 1) [13:13:14.495] Relaying remaining futures [13:13:14.495] signalConditionsASAP(NULL, pos=0) ... [13:13:14.495] - nx: 1 [13:13:14.495] - relay: TRUE [13:13:14.496] - stdout: TRUE [13:13:14.496] - signal: TRUE [13:13:14.496] - resignal: FALSE [13:13:14.496] - force: TRUE [13:13:14.496] - relayed: [n=1] TRUE [13:13:14.496] - queued futures: [n=1] TRUE - flush all [13:13:14.497] - relayed: [n=1] TRUE [13:13:14.497] - queued futures: [n=1] TRUE [13:13:14.497] signalConditionsASAP(NULL, pos=0) ... done [13:13:14.497] resolve() on list ... DONE [13:13:14.497] - Number of value chunks collected: 1 [13:13:14.497] Resolving 1 futures (chunks) ... DONE [13:13:14.498] Reducing values from 1 chunks ... [13:13:14.498] - Number of values collected after concatenation: 3 [13:13:14.498] - Number of values expected: 3 [13:13:14.498] Reducing values from 1 chunks ... DONE [13:13:14.498] future_lapply() ... DONE [13:13:14.498] future_by_internal() ... DONE [13:13:14.504] future_by_internal() ... [13:13:14.504] future_lapply() ... [13:13:14.506] Number of chunks: 1 [13:13:14.506] getGlobalsAndPackagesXApply() ... [13:13:14.506] - future.globals: TRUE [13:13:14.506] getGlobalsAndPackages() ... [13:13:14.506] Searching for globals... [13:13:14.508] - globals found: [6] 'FUN', '{', 'lm', '~', 'breaks', 'wool' [13:13:14.509] Searching for globals ... DONE [13:13:14.509] Resolving globals: FALSE [13:13:14.509] The total size of the 3 globals is 2.27 KiB (2320 bytes) [13:13:14.510] The total size of the 3 globals exported for future expression ('FUN()') is 2.27 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There are three globals: 'FUN' (1.04 KiB of class 'function'), 'wool' (776 bytes of class 'numeric') and 'breaks' (480 bytes of class 'numeric') [13:13:14.510] - globals: [3] 'FUN', 'breaks', 'wool' [13:13:14.510] - packages: [1] 'stats' [13:13:14.511] getGlobalsAndPackages() ... DONE [13:13:14.511] - globals found/used: [n=3] 'FUN', 'breaks', 'wool' [13:13:14.511] - needed namespaces: [n=1] 'stats' [13:13:14.511] Finding globals ... DONE [13:13:14.511] - use_args: TRUE [13:13:14.511] - Getting '...' globals ... [13:13:14.512] resolve() on list ... [13:13:14.512] recursive: 0 [13:13:14.512] length: 1 [13:13:14.512] elements: '...' [13:13:14.513] length: 0 (resolved future 1) [13:13:14.513] resolve() on list ... DONE [13:13:14.514] - '...' content: [n=0] [13:13:14.514] List of 1 [13:13:14.514] $ ...: list() [13:13:14.514] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:14.514] - attr(*, "where")=List of 1 [13:13:14.514] ..$ ...: [13:13:14.514] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:14.514] - attr(*, "resolved")= logi TRUE [13:13:14.514] - attr(*, "total_size")= num NA [13:13:14.517] - Getting '...' globals ... DONE [13:13:14.517] Globals to be used in all futures (chunks): [n=4] '...future.FUN', 'breaks', 'wool', '...' [13:13:14.517] List of 4 [13:13:14.517] $ ...future.FUN:function (x) [13:13:14.517] $ breaks : num [1:54] 26 30 54 25 70 52 51 26 67 18 ... [13:13:14.517] $ wool : Factor w/ 2 levels "A","B": 1 1 1 1 1 1 1 1 1 1 ... [13:13:14.517] $ ... : list() [13:13:14.517] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:14.517] - attr(*, "where")=List of 4 [13:13:14.517] ..$ ...future.FUN: [13:13:14.517] ..$ breaks : [13:13:14.517] ..$ wool : [13:13:14.517] ..$ ... : [13:13:14.517] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:14.517] - attr(*, "resolved")= logi FALSE [13:13:14.517] - attr(*, "total_size")= num 2320 [13:13:14.522] Packages to be attached in all futures: [n=1] 'stats' [13:13:14.522] getGlobalsAndPackagesXApply() ... DONE [13:13:14.522] Number of futures (= number of chunks): 1 [13:13:14.523] Launching 1 futures (chunks) ... [13:13:14.523] Chunk #1 of 1 ... [13:13:14.523] - Finding globals in 'X' for chunk #1 ... [13:13:14.523] getGlobalsAndPackages() ... [13:13:14.523] Searching for globals... [13:13:14.524] [13:13:14.524] Searching for globals ... DONE [13:13:14.524] - globals: [0] [13:13:14.524] getGlobalsAndPackages() ... DONE [13:13:14.524] + additional globals found: [n=0] [13:13:14.525] + additional namespaces needed: [n=0] [13:13:14.525] - Finding globals in 'X' for chunk #1 ... DONE [13:13:14.525] - seeds: [13:13:14.525] - All globals exported: [n=7] '...future.FUN', 'breaks', 'wool', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:14.525] getGlobalsAndPackages() ... [13:13:14.525] - globals passed as-is: [7] '...future.FUN', 'breaks', 'wool', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:14.526] Resolving globals: FALSE [13:13:14.526] Tweak future expression to call with '...' arguments ... [13:13:14.526] { [13:13:14.526] do.call(function(...) { [13:13:14.526] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:14.526] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:14.526] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:14.526] on.exit(options(oopts), add = TRUE) [13:13:14.526] } [13:13:14.526] { [13:13:14.526] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:14.526] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:14.526] ...future.FUN(...future.X_jj, ...) [13:13:14.526] }) [13:13:14.526] } [13:13:14.526] }, args = future.call.arguments) [13:13:14.526] } [13:13:14.526] Tweak future expression to call with '...' arguments ... DONE [13:13:14.527] - globals: [7] '...future.FUN', 'breaks', 'wool', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:14.527] [13:13:14.527] getGlobalsAndPackages() ... DONE [13:13:14.528] run() for 'Future' ... [13:13:14.528] - state: 'created' [13:13:14.528] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:13:14.528] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:14.529] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:14.529] - Field: 'label' [13:13:14.529] - Field: 'local' [13:13:14.529] - Field: 'owner' [13:13:14.529] - Field: 'envir' [13:13:14.530] - Field: 'packages' [13:13:14.530] - Field: 'gc' [13:13:14.530] - Field: 'conditions' [13:13:14.530] - Field: 'expr' [13:13:14.530] - Field: 'uuid' [13:13:14.530] - Field: 'seed' [13:13:14.531] - Field: 'version' [13:13:14.531] - Field: 'result' [13:13:14.531] - Field: 'asynchronous' [13:13:14.531] - Field: 'calls' [13:13:14.531] - Field: 'globals' [13:13:14.532] - Field: 'stdout' [13:13:14.532] - Field: 'earlySignal' [13:13:14.532] - Field: 'lazy' [13:13:14.532] - Field: 'state' [13:13:14.532] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:14.532] - Launch lazy future ... [13:13:14.533] Packages needed by the future expression (n = 1): 'stats' [13:13:14.533] Packages needed by future strategies (n = 0): [13:13:14.534] { [13:13:14.534] { [13:13:14.534] { [13:13:14.534] ...future.startTime <- base::Sys.time() [13:13:14.534] { [13:13:14.534] { [13:13:14.534] { [13:13:14.534] { [13:13:14.534] base::local({ [13:13:14.534] has_future <- base::requireNamespace("future", [13:13:14.534] quietly = TRUE) [13:13:14.534] if (has_future) { [13:13:14.534] ns <- base::getNamespace("future") [13:13:14.534] version <- ns[[".package"]][["version"]] [13:13:14.534] if (is.null(version)) [13:13:14.534] version <- utils::packageVersion("future") [13:13:14.534] } [13:13:14.534] else { [13:13:14.534] version <- NULL [13:13:14.534] } [13:13:14.534] if (!has_future || version < "1.8.0") { [13:13:14.534] info <- base::c(r_version = base::gsub("R version ", [13:13:14.534] "", base::R.version$version.string), [13:13:14.534] platform = base::sprintf("%s (%s-bit)", [13:13:14.534] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:14.534] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:14.534] "release", "version")], collapse = " "), [13:13:14.534] hostname = base::Sys.info()[["nodename"]]) [13:13:14.534] info <- base::sprintf("%s: %s", base::names(info), [13:13:14.534] info) [13:13:14.534] info <- base::paste(info, collapse = "; ") [13:13:14.534] if (!has_future) { [13:13:14.534] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:14.534] info) [13:13:14.534] } [13:13:14.534] else { [13:13:14.534] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:14.534] info, version) [13:13:14.534] } [13:13:14.534] base::stop(msg) [13:13:14.534] } [13:13:14.534] }) [13:13:14.534] } [13:13:14.534] base::local({ [13:13:14.534] for (pkg in "stats") { [13:13:14.534] base::loadNamespace(pkg) [13:13:14.534] base::library(pkg, character.only = TRUE) [13:13:14.534] } [13:13:14.534] }) [13:13:14.534] } [13:13:14.534] options(future.plan = NULL) [13:13:14.534] Sys.unsetenv("R_FUTURE_PLAN") [13:13:14.534] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:14.534] } [13:13:14.534] ...future.workdir <- getwd() [13:13:14.534] } [13:13:14.534] ...future.oldOptions <- base::as.list(base::.Options) [13:13:14.534] ...future.oldEnvVars <- base::Sys.getenv() [13:13:14.534] } [13:13:14.534] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:14.534] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:14.534] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:14.534] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:14.534] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:14.534] future.stdout.windows.reencode = NULL, width = 80L) [13:13:14.534] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:14.534] base::names(...future.oldOptions)) [13:13:14.534] } [13:13:14.534] if (FALSE) { [13:13:14.534] } [13:13:14.534] else { [13:13:14.534] if (TRUE) { [13:13:14.534] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:14.534] open = "w") [13:13:14.534] } [13:13:14.534] else { [13:13:14.534] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:14.534] windows = "NUL", "/dev/null"), open = "w") [13:13:14.534] } [13:13:14.534] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:14.534] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:14.534] base::sink(type = "output", split = FALSE) [13:13:14.534] base::close(...future.stdout) [13:13:14.534] }, add = TRUE) [13:13:14.534] } [13:13:14.534] ...future.frame <- base::sys.nframe() [13:13:14.534] ...future.conditions <- base::list() [13:13:14.534] ...future.rng <- base::globalenv()$.Random.seed [13:13:14.534] if (FALSE) { [13:13:14.534] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:14.534] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:14.534] } [13:13:14.534] ...future.result <- base::tryCatch({ [13:13:14.534] base::withCallingHandlers({ [13:13:14.534] ...future.value <- base::withVisible(base::local({ [13:13:14.534] do.call(function(...) { [13:13:14.534] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:14.534] if (!identical(...future.globals.maxSize.org, [13:13:14.534] ...future.globals.maxSize)) { [13:13:14.534] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:14.534] on.exit(options(oopts), add = TRUE) [13:13:14.534] } [13:13:14.534] { [13:13:14.534] lapply(seq_along(...future.elements_ii), [13:13:14.534] FUN = function(jj) { [13:13:14.534] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:14.534] ...future.FUN(...future.X_jj, ...) [13:13:14.534] }) [13:13:14.534] } [13:13:14.534] }, args = future.call.arguments) [13:13:14.534] })) [13:13:14.534] future::FutureResult(value = ...future.value$value, [13:13:14.534] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:14.534] ...future.rng), globalenv = if (FALSE) [13:13:14.534] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:14.534] ...future.globalenv.names)) [13:13:14.534] else NULL, started = ...future.startTime, version = "1.8") [13:13:14.534] }, condition = base::local({ [13:13:14.534] c <- base::c [13:13:14.534] inherits <- base::inherits [13:13:14.534] invokeRestart <- base::invokeRestart [13:13:14.534] length <- base::length [13:13:14.534] list <- base::list [13:13:14.534] seq.int <- base::seq.int [13:13:14.534] signalCondition <- base::signalCondition [13:13:14.534] sys.calls <- base::sys.calls [13:13:14.534] `[[` <- base::`[[` [13:13:14.534] `+` <- base::`+` [13:13:14.534] `<<-` <- base::`<<-` [13:13:14.534] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:14.534] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:14.534] 3L)] [13:13:14.534] } [13:13:14.534] function(cond) { [13:13:14.534] is_error <- inherits(cond, "error") [13:13:14.534] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:14.534] NULL) [13:13:14.534] if (is_error) { [13:13:14.534] sessionInformation <- function() { [13:13:14.534] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:14.534] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:14.534] search = base::search(), system = base::Sys.info()) [13:13:14.534] } [13:13:14.534] ...future.conditions[[length(...future.conditions) + [13:13:14.534] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:14.534] cond$call), session = sessionInformation(), [13:13:14.534] timestamp = base::Sys.time(), signaled = 0L) [13:13:14.534] signalCondition(cond) [13:13:14.534] } [13:13:14.534] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:14.534] "immediateCondition"))) { [13:13:14.534] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:14.534] ...future.conditions[[length(...future.conditions) + [13:13:14.534] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:14.534] if (TRUE && !signal) { [13:13:14.534] muffleCondition <- function (cond, pattern = "^muffle") [13:13:14.534] { [13:13:14.534] inherits <- base::inherits [13:13:14.534] invokeRestart <- base::invokeRestart [13:13:14.534] is.null <- base::is.null [13:13:14.534] muffled <- FALSE [13:13:14.534] if (inherits(cond, "message")) { [13:13:14.534] muffled <- grepl(pattern, "muffleMessage") [13:13:14.534] if (muffled) [13:13:14.534] invokeRestart("muffleMessage") [13:13:14.534] } [13:13:14.534] else if (inherits(cond, "warning")) { [13:13:14.534] muffled <- grepl(pattern, "muffleWarning") [13:13:14.534] if (muffled) [13:13:14.534] invokeRestart("muffleWarning") [13:13:14.534] } [13:13:14.534] else if (inherits(cond, "condition")) { [13:13:14.534] if (!is.null(pattern)) { [13:13:14.534] computeRestarts <- base::computeRestarts [13:13:14.534] grepl <- base::grepl [13:13:14.534] restarts <- computeRestarts(cond) [13:13:14.534] for (restart in restarts) { [13:13:14.534] name <- restart$name [13:13:14.534] if (is.null(name)) [13:13:14.534] next [13:13:14.534] if (!grepl(pattern, name)) [13:13:14.534] next [13:13:14.534] invokeRestart(restart) [13:13:14.534] muffled <- TRUE [13:13:14.534] break [13:13:14.534] } [13:13:14.534] } [13:13:14.534] } [13:13:14.534] invisible(muffled) [13:13:14.534] } [13:13:14.534] muffleCondition(cond, pattern = "^muffle") [13:13:14.534] } [13:13:14.534] } [13:13:14.534] else { [13:13:14.534] if (TRUE) { [13:13:14.534] muffleCondition <- function (cond, pattern = "^muffle") [13:13:14.534] { [13:13:14.534] inherits <- base::inherits [13:13:14.534] invokeRestart <- base::invokeRestart [13:13:14.534] is.null <- base::is.null [13:13:14.534] muffled <- FALSE [13:13:14.534] if (inherits(cond, "message")) { [13:13:14.534] muffled <- grepl(pattern, "muffleMessage") [13:13:14.534] if (muffled) [13:13:14.534] invokeRestart("muffleMessage") [13:13:14.534] } [13:13:14.534] else if (inherits(cond, "warning")) { [13:13:14.534] muffled <- grepl(pattern, "muffleWarning") [13:13:14.534] if (muffled) [13:13:14.534] invokeRestart("muffleWarning") [13:13:14.534] } [13:13:14.534] else if (inherits(cond, "condition")) { [13:13:14.534] if (!is.null(pattern)) { [13:13:14.534] computeRestarts <- base::computeRestarts [13:13:14.534] grepl <- base::grepl [13:13:14.534] restarts <- computeRestarts(cond) [13:13:14.534] for (restart in restarts) { [13:13:14.534] name <- restart$name [13:13:14.534] if (is.null(name)) [13:13:14.534] next [13:13:14.534] if (!grepl(pattern, name)) [13:13:14.534] next [13:13:14.534] invokeRestart(restart) [13:13:14.534] muffled <- TRUE [13:13:14.534] break [13:13:14.534] } [13:13:14.534] } [13:13:14.534] } [13:13:14.534] invisible(muffled) [13:13:14.534] } [13:13:14.534] muffleCondition(cond, pattern = "^muffle") [13:13:14.534] } [13:13:14.534] } [13:13:14.534] } [13:13:14.534] })) [13:13:14.534] }, error = function(ex) { [13:13:14.534] base::structure(base::list(value = NULL, visible = NULL, [13:13:14.534] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:14.534] ...future.rng), started = ...future.startTime, [13:13:14.534] finished = Sys.time(), session_uuid = NA_character_, [13:13:14.534] version = "1.8"), class = "FutureResult") [13:13:14.534] }, finally = { [13:13:14.534] if (!identical(...future.workdir, getwd())) [13:13:14.534] setwd(...future.workdir) [13:13:14.534] { [13:13:14.534] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:14.534] ...future.oldOptions$nwarnings <- NULL [13:13:14.534] } [13:13:14.534] base::options(...future.oldOptions) [13:13:14.534] if (.Platform$OS.type == "windows") { [13:13:14.534] old_names <- names(...future.oldEnvVars) [13:13:14.534] envs <- base::Sys.getenv() [13:13:14.534] names <- names(envs) [13:13:14.534] common <- intersect(names, old_names) [13:13:14.534] added <- setdiff(names, old_names) [13:13:14.534] removed <- setdiff(old_names, names) [13:13:14.534] changed <- common[...future.oldEnvVars[common] != [13:13:14.534] envs[common]] [13:13:14.534] NAMES <- toupper(changed) [13:13:14.534] args <- list() [13:13:14.534] for (kk in seq_along(NAMES)) { [13:13:14.534] name <- changed[[kk]] [13:13:14.534] NAME <- NAMES[[kk]] [13:13:14.534] if (name != NAME && is.element(NAME, old_names)) [13:13:14.534] next [13:13:14.534] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:14.534] } [13:13:14.534] NAMES <- toupper(added) [13:13:14.534] for (kk in seq_along(NAMES)) { [13:13:14.534] name <- added[[kk]] [13:13:14.534] NAME <- NAMES[[kk]] [13:13:14.534] if (name != NAME && is.element(NAME, old_names)) [13:13:14.534] next [13:13:14.534] args[[name]] <- "" [13:13:14.534] } [13:13:14.534] NAMES <- toupper(removed) [13:13:14.534] for (kk in seq_along(NAMES)) { [13:13:14.534] name <- removed[[kk]] [13:13:14.534] NAME <- NAMES[[kk]] [13:13:14.534] if (name != NAME && is.element(NAME, old_names)) [13:13:14.534] next [13:13:14.534] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:14.534] } [13:13:14.534] if (length(args) > 0) [13:13:14.534] base::do.call(base::Sys.setenv, args = args) [13:13:14.534] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:14.534] } [13:13:14.534] else { [13:13:14.534] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:14.534] } [13:13:14.534] { [13:13:14.534] if (base::length(...future.futureOptionsAdded) > [13:13:14.534] 0L) { [13:13:14.534] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:14.534] base::names(opts) <- ...future.futureOptionsAdded [13:13:14.534] base::options(opts) [13:13:14.534] } [13:13:14.534] { [13:13:14.534] { [13:13:14.534] NULL [13:13:14.534] RNGkind("Mersenne-Twister") [13:13:14.534] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:14.534] inherits = FALSE) [13:13:14.534] } [13:13:14.534] options(future.plan = NULL) [13:13:14.534] if (is.na(NA_character_)) [13:13:14.534] Sys.unsetenv("R_FUTURE_PLAN") [13:13:14.534] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:14.534] future::plan(list(function (..., envir = parent.frame()) [13:13:14.534] { [13:13:14.534] future <- SequentialFuture(..., envir = envir) [13:13:14.534] if (!future$lazy) [13:13:14.534] future <- run(future) [13:13:14.534] invisible(future) [13:13:14.534] }), .cleanup = FALSE, .init = FALSE) [13:13:14.534] } [13:13:14.534] } [13:13:14.534] } [13:13:14.534] }) [13:13:14.534] if (TRUE) { [13:13:14.534] base::sink(type = "output", split = FALSE) [13:13:14.534] if (TRUE) { [13:13:14.534] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:14.534] } [13:13:14.534] else { [13:13:14.534] ...future.result["stdout"] <- base::list(NULL) [13:13:14.534] } [13:13:14.534] base::close(...future.stdout) [13:13:14.534] ...future.stdout <- NULL [13:13:14.534] } [13:13:14.534] ...future.result$conditions <- ...future.conditions [13:13:14.534] ...future.result$finished <- base::Sys.time() [13:13:14.534] ...future.result [13:13:14.534] } [13:13:14.538] assign_globals() ... [13:13:14.538] List of 7 [13:13:14.538] $ ...future.FUN :function (x) [13:13:14.538] $ breaks : num [1:54] 26 30 54 25 70 52 51 26 67 18 ... [13:13:14.538] $ wool : Factor w/ 2 levels "A","B": 1 1 1 1 1 1 1 1 1 1 ... [13:13:14.538] $ future.call.arguments : list() [13:13:14.538] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:14.538] $ ...future.elements_ii :List of 3 [13:13:14.538] ..$ :'data.frame': 18 obs. of 3 variables: [13:13:14.538] .. ..$ breaks : num [1:18] 26 30 54 25 70 52 51 26 67 27 ... [13:13:14.538] .. ..$ wool : Factor w/ 2 levels "A","B": 1 1 1 1 1 1 1 1 1 2 ... [13:13:14.538] .. ..$ tension: Factor w/ 3 levels "L","M","H": 1 1 1 1 1 1 1 1 1 1 ... [13:13:14.538] ..$ :'data.frame': 18 obs. of 3 variables: [13:13:14.538] .. ..$ breaks : num [1:18] 18 21 29 17 12 18 35 30 36 42 ... [13:13:14.538] .. ..$ wool : Factor w/ 2 levels "A","B": 1 1 1 1 1 1 1 1 1 2 ... [13:13:14.538] .. ..$ tension: Factor w/ 3 levels "L","M","H": 2 2 2 2 2 2 2 2 2 2 ... [13:13:14.538] ..$ :'data.frame': 18 obs. of 3 variables: [13:13:14.538] .. ..$ breaks : num [1:18] 36 21 24 18 10 43 28 15 26 20 ... [13:13:14.538] .. ..$ wool : Factor w/ 2 levels "A","B": 1 1 1 1 1 1 1 1 1 2 ... [13:13:14.538] .. ..$ tension: Factor w/ 3 levels "L","M","H": 3 3 3 3 3 3 3 3 3 3 ... [13:13:14.538] $ ...future.seeds_ii : NULL [13:13:14.538] $ ...future.globals.maxSize: NULL [13:13:14.538] - attr(*, "where")=List of 7 [13:13:14.538] ..$ ...future.FUN : [13:13:14.538] ..$ breaks : [13:13:14.538] ..$ wool : [13:13:14.538] ..$ future.call.arguments : [13:13:14.538] ..$ ...future.elements_ii : [13:13:14.538] ..$ ...future.seeds_ii : [13:13:14.538] ..$ ...future.globals.maxSize: [13:13:14.538] - attr(*, "resolved")= logi FALSE [13:13:14.538] - attr(*, "total_size")= num 2320 [13:13:14.538] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:14.538] - attr(*, "already-done")= logi TRUE [13:13:14.550] - reassign environment for '...future.FUN' [13:13:14.551] - copied '...future.FUN' to environment [13:13:14.551] - copied 'breaks' to environment [13:13:14.551] - copied 'wool' to environment [13:13:14.551] - copied 'future.call.arguments' to environment [13:13:14.551] - copied '...future.elements_ii' to environment [13:13:14.551] - copied '...future.seeds_ii' to environment [13:13:14.552] - copied '...future.globals.maxSize' to environment [13:13:14.552] assign_globals() ... done [13:13:14.552] plan(): Setting new future strategy stack: [13:13:14.553] List of future strategies: [13:13:14.553] 1. sequential: [13:13:14.553] - args: function (..., envir = parent.frame(), workers = "") [13:13:14.553] - tweaked: FALSE [13:13:14.553] - call: NULL [13:13:14.553] plan(): nbrOfWorkers() = 1 [13:13:14.557] plan(): Setting new future strategy stack: [13:13:14.557] List of future strategies: [13:13:14.557] 1. sequential: [13:13:14.557] - args: function (..., envir = parent.frame(), workers = "") [13:13:14.557] - tweaked: FALSE [13:13:14.557] - call: plan(strategy) [13:13:14.557] plan(): nbrOfWorkers() = 1 [13:13:14.558] SequentialFuture started (and completed) [13:13:14.558] - Launch lazy future ... done [13:13:14.558] run() for 'SequentialFuture' ... done [13:13:14.558] Created future: [13:13:14.559] SequentialFuture: [13:13:14.559] Label: 'future_by-1' [13:13:14.559] Expression: [13:13:14.559] { [13:13:14.559] do.call(function(...) { [13:13:14.559] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:14.559] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:14.559] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:14.559] on.exit(options(oopts), add = TRUE) [13:13:14.559] } [13:13:14.559] { [13:13:14.559] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:14.559] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:14.559] ...future.FUN(...future.X_jj, ...) [13:13:14.559] }) [13:13:14.559] } [13:13:14.559] }, args = future.call.arguments) [13:13:14.559] } [13:13:14.559] Lazy evaluation: FALSE [13:13:14.559] Asynchronous evaluation: FALSE [13:13:14.559] Local evaluation: TRUE [13:13:14.559] Environment: 0x000001868d26a0d0 [13:13:14.559] Capture standard output: TRUE [13:13:14.559] Capture condition classes: 'condition' (excluding 'nothing') [13:13:14.559] Globals: 7 objects totaling 7.07 KiB (function '...future.FUN' of 1.04 KiB, numeric 'breaks' of 480 bytes, factor 'wool' of 776 bytes, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 4.80 KiB, ...) [13:13:14.559] Packages: 1 packages ('stats') [13:13:14.559] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:14.559] Resolved: TRUE [13:13:14.559] Value: 25.57 KiB of class 'list' [13:13:14.559] Early signaling: FALSE [13:13:14.559] Owner process: f0659542-730c-c20a-65b3-84f202449c4d [13:13:14.559] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:14.561] Chunk #1 of 1 ... DONE [13:13:14.561] Launching 1 futures (chunks) ... DONE [13:13:14.562] Resolving 1 futures (chunks) ... [13:13:14.562] resolve() on list ... [13:13:14.562] recursive: 0 [13:13:14.562] length: 1 [13:13:14.562] [13:13:14.562] resolved() for 'SequentialFuture' ... [13:13:14.563] - state: 'finished' [13:13:14.563] - run: TRUE [13:13:14.563] - result: 'FutureResult' [13:13:14.563] resolved() for 'SequentialFuture' ... done [13:13:14.563] Future #1 [13:13:14.564] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:14.564] - nx: 1 [13:13:14.564] - relay: TRUE [13:13:14.564] - stdout: TRUE [13:13:14.564] - signal: TRUE [13:13:14.564] - resignal: FALSE [13:13:14.565] - force: TRUE [13:13:14.565] - relayed: [n=1] FALSE [13:13:14.565] - queued futures: [n=1] FALSE [13:13:14.565] - until=1 [13:13:14.565] - relaying element #1 [13:13:14.565] - relayed: [n=1] TRUE [13:13:14.566] - queued futures: [n=1] TRUE [13:13:14.566] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:14.566] length: 0 (resolved future 1) [13:13:14.566] Relaying remaining futures [13:13:14.566] signalConditionsASAP(NULL, pos=0) ... [13:13:14.566] - nx: 1 [13:13:14.567] - relay: TRUE [13:13:14.567] - stdout: TRUE [13:13:14.567] - signal: TRUE [13:13:14.567] - resignal: FALSE [13:13:14.567] - force: TRUE [13:13:14.567] - relayed: [n=1] TRUE [13:13:14.567] - queued futures: [n=1] TRUE - flush all [13:13:14.568] - relayed: [n=1] TRUE [13:13:14.568] - queued futures: [n=1] TRUE [13:13:14.568] signalConditionsASAP(NULL, pos=0) ... done [13:13:14.568] resolve() on list ... DONE [13:13:14.568] - Number of value chunks collected: 1 [13:13:14.569] Resolving 1 futures (chunks) ... DONE [13:13:14.569] Reducing values from 1 chunks ... [13:13:14.569] - Number of values collected after concatenation: 3 [13:13:14.569] - Number of values expected: 3 [13:13:14.569] Reducing values from 1 chunks ... DONE [13:13:14.569] future_lapply() ... DONE [13:13:14.569] future_by_internal() ... DONE [13:13:14.570] future_by_internal() ... [13:13:14.571] future_lapply() ... [13:13:14.571] Number of chunks: 1 [13:13:14.571] getGlobalsAndPackagesXApply() ... [13:13:14.571] - future.globals: TRUE [13:13:14.572] getGlobalsAndPackages() ... [13:13:14.572] Searching for globals... [13:13:14.573] - globals found: [2] 'FUN', 'UseMethod' [13:13:14.573] Searching for globals ... DONE [13:13:14.573] Resolving globals: FALSE [13:13:14.574] The total size of the 1 globals is 1.21 KiB (1240 bytes) [13:13:14.574] The total size of the 1 globals exported for future expression ('FUN()') is 1.21 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (1.21 KiB of class 'function') [13:13:14.574] - globals: [1] 'FUN' [13:13:14.575] [13:13:14.575] getGlobalsAndPackages() ... DONE [13:13:14.575] - globals found/used: [n=1] 'FUN' [13:13:14.575] - needed namespaces: [n=0] [13:13:14.575] Finding globals ... DONE [13:13:14.575] - use_args: TRUE [13:13:14.576] - Getting '...' globals ... [13:13:14.576] resolve() on list ... [13:13:14.576] recursive: 0 [13:13:14.576] length: 1 [13:13:14.577] elements: '...' [13:13:14.577] length: 0 (resolved future 1) [13:13:14.577] resolve() on list ... DONE [13:13:14.577] - '...' content: [n=0] [13:13:14.577] List of 1 [13:13:14.577] $ ...: list() [13:13:14.577] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:14.577] - attr(*, "where")=List of 1 [13:13:14.577] ..$ ...: [13:13:14.577] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:14.577] - attr(*, "resolved")= logi TRUE [13:13:14.577] - attr(*, "total_size")= num NA [13:13:14.580] - Getting '...' globals ... DONE [13:13:14.581] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:14.581] List of 2 [13:13:14.581] $ ...future.FUN:function (object, ...) [13:13:14.581] $ ... : list() [13:13:14.581] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:14.581] - attr(*, "where")=List of 2 [13:13:14.581] ..$ ...future.FUN: [13:13:14.581] ..$ ... : [13:13:14.581] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:14.581] - attr(*, "resolved")= logi FALSE [13:13:14.581] - attr(*, "total_size")= num 1240 [13:13:14.585] Packages to be attached in all futures: [n=0] [13:13:14.585] getGlobalsAndPackagesXApply() ... DONE [13:13:14.585] Number of futures (= number of chunks): 1 [13:13:14.586] Launching 1 futures (chunks) ... [13:13:14.586] Chunk #1 of 1 ... [13:13:14.586] - Finding globals in 'X' for chunk #1 ... [13:13:14.586] getGlobalsAndPackages() ... [13:13:14.586] Searching for globals... [13:13:14.587] [13:13:14.587] Searching for globals ... DONE [13:13:14.587] - globals: [0] [13:13:14.587] getGlobalsAndPackages() ... DONE [13:13:14.588] + additional globals found: [n=0] [13:13:14.588] + additional namespaces needed: [n=0] [13:13:14.588] - Finding globals in 'X' for chunk #1 ... DONE [13:13:14.588] - seeds: [13:13:14.588] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:14.588] getGlobalsAndPackages() ... [13:13:14.589] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:14.589] Resolving globals: FALSE [13:13:14.589] Tweak future expression to call with '...' arguments ... [13:13:14.589] { [13:13:14.589] do.call(function(...) { [13:13:14.589] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:14.589] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:14.589] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:14.589] on.exit(options(oopts), add = TRUE) [13:13:14.589] } [13:13:14.589] { [13:13:14.589] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:14.589] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:14.589] ...future.FUN(...future.X_jj, ...) [13:13:14.589] }) [13:13:14.589] } [13:13:14.589] }, args = future.call.arguments) [13:13:14.589] } [13:13:14.590] Tweak future expression to call with '...' arguments ... DONE [13:13:14.590] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:14.590] [13:13:14.590] getGlobalsAndPackages() ... DONE [13:13:14.591] run() for 'Future' ... [13:13:14.591] - state: 'created' [13:13:14.591] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:13:14.592] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:14.592] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:14.592] - Field: 'label' [13:13:14.592] - Field: 'local' [13:13:14.592] - Field: 'owner' [13:13:14.592] - Field: 'envir' [13:13:14.593] - Field: 'packages' [13:13:14.593] - Field: 'gc' [13:13:14.593] - Field: 'conditions' [13:13:14.593] - Field: 'expr' [13:13:14.593] - Field: 'uuid' [13:13:14.593] - Field: 'seed' [13:13:14.594] - Field: 'version' [13:13:14.594] - Field: 'result' [13:13:14.594] - Field: 'asynchronous' [13:13:14.594] - Field: 'calls' [13:13:14.594] - Field: 'globals' [13:13:14.595] - Field: 'stdout' [13:13:14.595] - Field: 'earlySignal' [13:13:14.595] - Field: 'lazy' [13:13:14.595] - Field: 'state' [13:13:14.595] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:14.595] - Launch lazy future ... [13:13:14.596] Packages needed by the future expression (n = 0): [13:13:14.596] Packages needed by future strategies (n = 0): [13:13:14.596] { [13:13:14.596] { [13:13:14.596] { [13:13:14.596] ...future.startTime <- base::Sys.time() [13:13:14.596] { [13:13:14.596] { [13:13:14.596] { [13:13:14.596] base::local({ [13:13:14.596] has_future <- base::requireNamespace("future", [13:13:14.596] quietly = TRUE) [13:13:14.596] if (has_future) { [13:13:14.596] ns <- base::getNamespace("future") [13:13:14.596] version <- ns[[".package"]][["version"]] [13:13:14.596] if (is.null(version)) [13:13:14.596] version <- utils::packageVersion("future") [13:13:14.596] } [13:13:14.596] else { [13:13:14.596] version <- NULL [13:13:14.596] } [13:13:14.596] if (!has_future || version < "1.8.0") { [13:13:14.596] info <- base::c(r_version = base::gsub("R version ", [13:13:14.596] "", base::R.version$version.string), [13:13:14.596] platform = base::sprintf("%s (%s-bit)", [13:13:14.596] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:14.596] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:14.596] "release", "version")], collapse = " "), [13:13:14.596] hostname = base::Sys.info()[["nodename"]]) [13:13:14.596] info <- base::sprintf("%s: %s", base::names(info), [13:13:14.596] info) [13:13:14.596] info <- base::paste(info, collapse = "; ") [13:13:14.596] if (!has_future) { [13:13:14.596] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:14.596] info) [13:13:14.596] } [13:13:14.596] else { [13:13:14.596] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:14.596] info, version) [13:13:14.596] } [13:13:14.596] base::stop(msg) [13:13:14.596] } [13:13:14.596] }) [13:13:14.596] } [13:13:14.596] options(future.plan = NULL) [13:13:14.596] Sys.unsetenv("R_FUTURE_PLAN") [13:13:14.596] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:14.596] } [13:13:14.596] ...future.workdir <- getwd() [13:13:14.596] } [13:13:14.596] ...future.oldOptions <- base::as.list(base::.Options) [13:13:14.596] ...future.oldEnvVars <- base::Sys.getenv() [13:13:14.596] } [13:13:14.596] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:14.596] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:14.596] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:14.596] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:14.596] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:14.596] future.stdout.windows.reencode = NULL, width = 80L) [13:13:14.596] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:14.596] base::names(...future.oldOptions)) [13:13:14.596] } [13:13:14.596] if (FALSE) { [13:13:14.596] } [13:13:14.596] else { [13:13:14.596] if (TRUE) { [13:13:14.596] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:14.596] open = "w") [13:13:14.596] } [13:13:14.596] else { [13:13:14.596] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:14.596] windows = "NUL", "/dev/null"), open = "w") [13:13:14.596] } [13:13:14.596] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:14.596] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:14.596] base::sink(type = "output", split = FALSE) [13:13:14.596] base::close(...future.stdout) [13:13:14.596] }, add = TRUE) [13:13:14.596] } [13:13:14.596] ...future.frame <- base::sys.nframe() [13:13:14.596] ...future.conditions <- base::list() [13:13:14.596] ...future.rng <- base::globalenv()$.Random.seed [13:13:14.596] if (FALSE) { [13:13:14.596] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:14.596] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:14.596] } [13:13:14.596] ...future.result <- base::tryCatch({ [13:13:14.596] base::withCallingHandlers({ [13:13:14.596] ...future.value <- base::withVisible(base::local({ [13:13:14.596] do.call(function(...) { [13:13:14.596] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:14.596] if (!identical(...future.globals.maxSize.org, [13:13:14.596] ...future.globals.maxSize)) { [13:13:14.596] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:14.596] on.exit(options(oopts), add = TRUE) [13:13:14.596] } [13:13:14.596] { [13:13:14.596] lapply(seq_along(...future.elements_ii), [13:13:14.596] FUN = function(jj) { [13:13:14.596] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:14.596] ...future.FUN(...future.X_jj, ...) [13:13:14.596] }) [13:13:14.596] } [13:13:14.596] }, args = future.call.arguments) [13:13:14.596] })) [13:13:14.596] future::FutureResult(value = ...future.value$value, [13:13:14.596] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:14.596] ...future.rng), globalenv = if (FALSE) [13:13:14.596] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:14.596] ...future.globalenv.names)) [13:13:14.596] else NULL, started = ...future.startTime, version = "1.8") [13:13:14.596] }, condition = base::local({ [13:13:14.596] c <- base::c [13:13:14.596] inherits <- base::inherits [13:13:14.596] invokeRestart <- base::invokeRestart [13:13:14.596] length <- base::length [13:13:14.596] list <- base::list [13:13:14.596] seq.int <- base::seq.int [13:13:14.596] signalCondition <- base::signalCondition [13:13:14.596] sys.calls <- base::sys.calls [13:13:14.596] `[[` <- base::`[[` [13:13:14.596] `+` <- base::`+` [13:13:14.596] `<<-` <- base::`<<-` [13:13:14.596] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:14.596] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:14.596] 3L)] [13:13:14.596] } [13:13:14.596] function(cond) { [13:13:14.596] is_error <- inherits(cond, "error") [13:13:14.596] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:14.596] NULL) [13:13:14.596] if (is_error) { [13:13:14.596] sessionInformation <- function() { [13:13:14.596] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:14.596] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:14.596] search = base::search(), system = base::Sys.info()) [13:13:14.596] } [13:13:14.596] ...future.conditions[[length(...future.conditions) + [13:13:14.596] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:14.596] cond$call), session = sessionInformation(), [13:13:14.596] timestamp = base::Sys.time(), signaled = 0L) [13:13:14.596] signalCondition(cond) [13:13:14.596] } [13:13:14.596] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:14.596] "immediateCondition"))) { [13:13:14.596] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:14.596] ...future.conditions[[length(...future.conditions) + [13:13:14.596] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:14.596] if (TRUE && !signal) { [13:13:14.596] muffleCondition <- function (cond, pattern = "^muffle") [13:13:14.596] { [13:13:14.596] inherits <- base::inherits [13:13:14.596] invokeRestart <- base::invokeRestart [13:13:14.596] is.null <- base::is.null [13:13:14.596] muffled <- FALSE [13:13:14.596] if (inherits(cond, "message")) { [13:13:14.596] muffled <- grepl(pattern, "muffleMessage") [13:13:14.596] if (muffled) [13:13:14.596] invokeRestart("muffleMessage") [13:13:14.596] } [13:13:14.596] else if (inherits(cond, "warning")) { [13:13:14.596] muffled <- grepl(pattern, "muffleWarning") [13:13:14.596] if (muffled) [13:13:14.596] invokeRestart("muffleWarning") [13:13:14.596] } [13:13:14.596] else if (inherits(cond, "condition")) { [13:13:14.596] if (!is.null(pattern)) { [13:13:14.596] computeRestarts <- base::computeRestarts [13:13:14.596] grepl <- base::grepl [13:13:14.596] restarts <- computeRestarts(cond) [13:13:14.596] for (restart in restarts) { [13:13:14.596] name <- restart$name [13:13:14.596] if (is.null(name)) [13:13:14.596] next [13:13:14.596] if (!grepl(pattern, name)) [13:13:14.596] next [13:13:14.596] invokeRestart(restart) [13:13:14.596] muffled <- TRUE [13:13:14.596] break [13:13:14.596] } [13:13:14.596] } [13:13:14.596] } [13:13:14.596] invisible(muffled) [13:13:14.596] } [13:13:14.596] muffleCondition(cond, pattern = "^muffle") [13:13:14.596] } [13:13:14.596] } [13:13:14.596] else { [13:13:14.596] if (TRUE) { [13:13:14.596] muffleCondition <- function (cond, pattern = "^muffle") [13:13:14.596] { [13:13:14.596] inherits <- base::inherits [13:13:14.596] invokeRestart <- base::invokeRestart [13:13:14.596] is.null <- base::is.null [13:13:14.596] muffled <- FALSE [13:13:14.596] if (inherits(cond, "message")) { [13:13:14.596] muffled <- grepl(pattern, "muffleMessage") [13:13:14.596] if (muffled) [13:13:14.596] invokeRestart("muffleMessage") [13:13:14.596] } [13:13:14.596] else if (inherits(cond, "warning")) { [13:13:14.596] muffled <- grepl(pattern, "muffleWarning") [13:13:14.596] if (muffled) [13:13:14.596] invokeRestart("muffleWarning") [13:13:14.596] } [13:13:14.596] else if (inherits(cond, "condition")) { [13:13:14.596] if (!is.null(pattern)) { [13:13:14.596] computeRestarts <- base::computeRestarts [13:13:14.596] grepl <- base::grepl [13:13:14.596] restarts <- computeRestarts(cond) [13:13:14.596] for (restart in restarts) { [13:13:14.596] name <- restart$name [13:13:14.596] if (is.null(name)) [13:13:14.596] next [13:13:14.596] if (!grepl(pattern, name)) [13:13:14.596] next [13:13:14.596] invokeRestart(restart) [13:13:14.596] muffled <- TRUE [13:13:14.596] break [13:13:14.596] } [13:13:14.596] } [13:13:14.596] } [13:13:14.596] invisible(muffled) [13:13:14.596] } [13:13:14.596] muffleCondition(cond, pattern = "^muffle") [13:13:14.596] } [13:13:14.596] } [13:13:14.596] } [13:13:14.596] })) [13:13:14.596] }, error = function(ex) { [13:13:14.596] base::structure(base::list(value = NULL, visible = NULL, [13:13:14.596] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:14.596] ...future.rng), started = ...future.startTime, [13:13:14.596] finished = Sys.time(), session_uuid = NA_character_, [13:13:14.596] version = "1.8"), class = "FutureResult") [13:13:14.596] }, finally = { [13:13:14.596] if (!identical(...future.workdir, getwd())) [13:13:14.596] setwd(...future.workdir) [13:13:14.596] { [13:13:14.596] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:14.596] ...future.oldOptions$nwarnings <- NULL [13:13:14.596] } [13:13:14.596] base::options(...future.oldOptions) [13:13:14.596] if (.Platform$OS.type == "windows") { [13:13:14.596] old_names <- names(...future.oldEnvVars) [13:13:14.596] envs <- base::Sys.getenv() [13:13:14.596] names <- names(envs) [13:13:14.596] common <- intersect(names, old_names) [13:13:14.596] added <- setdiff(names, old_names) [13:13:14.596] removed <- setdiff(old_names, names) [13:13:14.596] changed <- common[...future.oldEnvVars[common] != [13:13:14.596] envs[common]] [13:13:14.596] NAMES <- toupper(changed) [13:13:14.596] args <- list() [13:13:14.596] for (kk in seq_along(NAMES)) { [13:13:14.596] name <- changed[[kk]] [13:13:14.596] NAME <- NAMES[[kk]] [13:13:14.596] if (name != NAME && is.element(NAME, old_names)) [13:13:14.596] next [13:13:14.596] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:14.596] } [13:13:14.596] NAMES <- toupper(added) [13:13:14.596] for (kk in seq_along(NAMES)) { [13:13:14.596] name <- added[[kk]] [13:13:14.596] NAME <- NAMES[[kk]] [13:13:14.596] if (name != NAME && is.element(NAME, old_names)) [13:13:14.596] next [13:13:14.596] args[[name]] <- "" [13:13:14.596] } [13:13:14.596] NAMES <- toupper(removed) [13:13:14.596] for (kk in seq_along(NAMES)) { [13:13:14.596] name <- removed[[kk]] [13:13:14.596] NAME <- NAMES[[kk]] [13:13:14.596] if (name != NAME && is.element(NAME, old_names)) [13:13:14.596] next [13:13:14.596] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:14.596] } [13:13:14.596] if (length(args) > 0) [13:13:14.596] base::do.call(base::Sys.setenv, args = args) [13:13:14.596] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:14.596] } [13:13:14.596] else { [13:13:14.596] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:14.596] } [13:13:14.596] { [13:13:14.596] if (base::length(...future.futureOptionsAdded) > [13:13:14.596] 0L) { [13:13:14.596] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:14.596] base::names(opts) <- ...future.futureOptionsAdded [13:13:14.596] base::options(opts) [13:13:14.596] } [13:13:14.596] { [13:13:14.596] { [13:13:14.596] NULL [13:13:14.596] RNGkind("Mersenne-Twister") [13:13:14.596] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:14.596] inherits = FALSE) [13:13:14.596] } [13:13:14.596] options(future.plan = NULL) [13:13:14.596] if (is.na(NA_character_)) [13:13:14.596] Sys.unsetenv("R_FUTURE_PLAN") [13:13:14.596] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:14.596] future::plan(list(function (..., envir = parent.frame()) [13:13:14.596] { [13:13:14.596] future <- SequentialFuture(..., envir = envir) [13:13:14.596] if (!future$lazy) [13:13:14.596] future <- run(future) [13:13:14.596] invisible(future) [13:13:14.596] }), .cleanup = FALSE, .init = FALSE) [13:13:14.596] } [13:13:14.596] } [13:13:14.596] } [13:13:14.596] }) [13:13:14.596] if (TRUE) { [13:13:14.596] base::sink(type = "output", split = FALSE) [13:13:14.596] if (TRUE) { [13:13:14.596] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:14.596] } [13:13:14.596] else { [13:13:14.596] ...future.result["stdout"] <- base::list(NULL) [13:13:14.596] } [13:13:14.596] base::close(...future.stdout) [13:13:14.596] ...future.stdout <- NULL [13:13:14.596] } [13:13:14.596] ...future.result$conditions <- ...future.conditions [13:13:14.596] ...future.result$finished <- base::Sys.time() [13:13:14.596] ...future.result [13:13:14.596] } [13:13:14.600] assign_globals() ... [13:13:14.600] List of 5 [13:13:14.600] $ ...future.FUN :function (object, ...) [13:13:14.600] $ future.call.arguments : list() [13:13:14.600] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:14.600] $ ...future.elements_ii :List of 3 [13:13:14.600] ..$ :'data.frame': 18 obs. of 3 variables: [13:13:14.600] .. ..$ breaks : num [1:18] 26 30 54 25 70 52 51 26 67 27 ... [13:13:14.600] .. ..$ wool : Factor w/ 2 levels "A","B": 1 1 1 1 1 1 1 1 1 2 ... [13:13:14.600] .. ..$ tension: Factor w/ 3 levels "L","M","H": 1 1 1 1 1 1 1 1 1 1 ... [13:13:14.600] ..$ :'data.frame': 18 obs. of 3 variables: [13:13:14.600] .. ..$ breaks : num [1:18] 18 21 29 17 12 18 35 30 36 42 ... [13:13:14.600] .. ..$ wool : Factor w/ 2 levels "A","B": 1 1 1 1 1 1 1 1 1 2 ... [13:13:14.600] .. ..$ tension: Factor w/ 3 levels "L","M","H": 2 2 2 2 2 2 2 2 2 2 ... [13:13:14.600] ..$ :'data.frame': 18 obs. of 3 variables: [13:13:14.600] .. ..$ breaks : num [1:18] 36 21 24 18 10 43 28 15 26 20 ... [13:13:14.600] .. ..$ wool : Factor w/ 2 levels "A","B": 1 1 1 1 1 1 1 1 1 2 ... [13:13:14.600] .. ..$ tension: Factor w/ 3 levels "L","M","H": 3 3 3 3 3 3 3 3 3 3 ... [13:13:14.600] $ ...future.seeds_ii : NULL [13:13:14.600] $ ...future.globals.maxSize: NULL [13:13:14.600] - attr(*, "where")=List of 5 [13:13:14.600] ..$ ...future.FUN : [13:13:14.600] ..$ future.call.arguments : [13:13:14.600] ..$ ...future.elements_ii : [13:13:14.600] ..$ ...future.seeds_ii : [13:13:14.600] ..$ ...future.globals.maxSize: [13:13:14.600] - attr(*, "resolved")= logi FALSE [13:13:14.600] - attr(*, "total_size")= num 1240 [13:13:14.600] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:14.600] - attr(*, "already-done")= logi TRUE [13:13:14.612] - copied '...future.FUN' to environment [13:13:14.612] - copied 'future.call.arguments' to environment [13:13:14.612] - copied '...future.elements_ii' to environment [13:13:14.612] - copied '...future.seeds_ii' to environment [13:13:14.612] - copied '...future.globals.maxSize' to environment [13:13:14.612] assign_globals() ... done [13:13:14.613] plan(): Setting new future strategy stack: [13:13:14.613] List of future strategies: [13:13:14.613] 1. sequential: [13:13:14.613] - args: function (..., envir = parent.frame(), workers = "") [13:13:14.613] - tweaked: FALSE [13:13:14.613] - call: NULL [13:13:14.614] plan(): nbrOfWorkers() = 1 [13:13:14.617] plan(): Setting new future strategy stack: [13:13:14.617] List of future strategies: [13:13:14.617] 1. sequential: [13:13:14.617] - args: function (..., envir = parent.frame(), workers = "") [13:13:14.617] - tweaked: FALSE [13:13:14.617] - call: plan(strategy) [13:13:14.618] plan(): nbrOfWorkers() = 1 [13:13:14.618] SequentialFuture started (and completed) [13:13:14.618] - Launch lazy future ... done [13:13:14.618] run() for 'SequentialFuture' ... done [13:13:14.618] Created future: [13:13:14.619] SequentialFuture: [13:13:14.619] Label: 'future_by-1' [13:13:14.619] Expression: [13:13:14.619] { [13:13:14.619] do.call(function(...) { [13:13:14.619] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:14.619] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:14.619] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:14.619] on.exit(options(oopts), add = TRUE) [13:13:14.619] } [13:13:14.619] { [13:13:14.619] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:14.619] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:14.619] ...future.FUN(...future.X_jj, ...) [13:13:14.619] }) [13:13:14.619] } [13:13:14.619] }, args = future.call.arguments) [13:13:14.619] } [13:13:14.619] Lazy evaluation: FALSE [13:13:14.619] Asynchronous evaluation: FALSE [13:13:14.619] Local evaluation: TRUE [13:13:14.619] Environment: 0x000001868ce33450 [13:13:14.619] Capture standard output: TRUE [13:13:14.619] Capture condition classes: 'condition' (excluding 'nothing') [13:13:14.619] Globals: 5 objects totaling 6.02 KiB (function '...future.FUN' of 1.21 KiB, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 4.80 KiB, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:13:14.619] Packages: [13:13:14.619] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:14.619] Resolved: TRUE [13:13:14.619] Value: 5.37 KiB of class 'list' [13:13:14.619] Early signaling: FALSE [13:13:14.619] Owner process: f0659542-730c-c20a-65b3-84f202449c4d [13:13:14.619] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:14.620] Chunk #1 of 1 ... DONE [13:13:14.620] Launching 1 futures (chunks) ... DONE [13:13:14.620] Resolving 1 futures (chunks) ... [13:13:14.621] resolve() on list ... [13:13:14.621] recursive: 0 [13:13:14.621] length: 1 [13:13:14.621] [13:13:14.621] resolved() for 'SequentialFuture' ... [13:13:14.621] - state: 'finished' [13:13:14.622] - run: TRUE [13:13:14.622] - result: 'FutureResult' [13:13:14.622] resolved() for 'SequentialFuture' ... done [13:13:14.622] Future #1 [13:13:14.622] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:14.623] - nx: 1 [13:13:14.623] - relay: TRUE [13:13:14.623] - stdout: TRUE [13:13:14.623] - signal: TRUE [13:13:14.623] - resignal: FALSE [13:13:14.623] - force: TRUE [13:13:14.624] - relayed: [n=1] FALSE [13:13:14.624] - queued futures: [n=1] FALSE [13:13:14.624] - until=1 [13:13:14.624] - relaying element #1 [13:13:14.624] - relayed: [n=1] TRUE [13:13:14.624] - queued futures: [n=1] TRUE [13:13:14.625] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:14.625] length: 0 (resolved future 1) [13:13:14.625] Relaying remaining futures [13:13:14.625] signalConditionsASAP(NULL, pos=0) ... [13:13:14.625] - nx: 1 [13:13:14.625] - relay: TRUE [13:13:14.626] - stdout: TRUE [13:13:14.626] - signal: TRUE [13:13:14.626] - resignal: FALSE [13:13:14.626] - force: TRUE [13:13:14.626] - relayed: [n=1] TRUE [13:13:14.626] - queued futures: [n=1] TRUE - flush all [13:13:14.627] - relayed: [n=1] TRUE [13:13:14.627] - queued futures: [n=1] TRUE [13:13:14.627] signalConditionsASAP(NULL, pos=0) ... done [13:13:14.627] resolve() on list ... DONE [13:13:14.627] - Number of value chunks collected: 1 [13:13:14.627] Resolving 1 futures (chunks) ... DONE [13:13:14.628] Reducing values from 1 chunks ... [13:13:14.628] - Number of values collected after concatenation: 3 [13:13:14.628] - Number of values expected: 3 [13:13:14.628] Reducing values from 1 chunks ... DONE [13:13:14.628] future_lapply() ... DONE [13:13:14.628] future_by_internal() ... DONE [13:13:14.631] future_by_internal() ... Warning: Specifying the function 'FUN' for future_by() as a character string is deprecated in future.apply (>= 1.10.0) [2022-11-04], because base::by() does not support it. Instead, specify it as a function, e.g. FUN = sqrt and FUN = `[[`. It is deprecated. [13:13:14.632] future_lapply() ... [13:13:14.632] Number of chunks: 1 [13:13:14.632] getGlobalsAndPackagesXApply() ... [13:13:14.633] - future.globals: TRUE [13:13:14.633] getGlobalsAndPackages() ... [13:13:14.633] Searching for globals... [13:13:14.635] - globals found: [2] 'FUN', 'UseMethod' [13:13:14.635] Searching for globals ... DONE [13:13:14.635] Resolving globals: FALSE [13:13:14.636] The total size of the 1 globals is 1.21 KiB (1240 bytes) [13:13:14.636] The total size of the 1 globals exported for future expression ('FUN()') is 1.21 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (1.21 KiB of class 'function') [13:13:14.636] - globals: [1] 'FUN' [13:13:14.637] [13:13:14.637] getGlobalsAndPackages() ... DONE [13:13:14.637] - globals found/used: [n=1] 'FUN' [13:13:14.637] - needed namespaces: [n=0] [13:13:14.637] Finding globals ... DONE [13:13:14.637] - use_args: TRUE [13:13:14.638] - Getting '...' globals ... [13:13:14.638] resolve() on list ... [13:13:14.638] recursive: 0 [13:13:14.638] length: 1 [13:13:14.638] elements: '...' [13:13:14.639] length: 0 (resolved future 1) [13:13:14.639] resolve() on list ... DONE [13:13:14.639] - '...' content: [n=0] [13:13:14.639] List of 1 [13:13:14.639] $ ...: list() [13:13:14.639] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:14.639] - attr(*, "where")=List of 1 [13:13:14.639] ..$ ...: [13:13:14.639] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:14.639] - attr(*, "resolved")= logi TRUE [13:13:14.639] - attr(*, "total_size")= num NA [13:13:14.642] - Getting '...' globals ... DONE [13:13:14.642] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:14.643] List of 2 [13:13:14.643] $ ...future.FUN:function (object, ...) [13:13:14.643] $ ... : list() [13:13:14.643] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:14.643] - attr(*, "where")=List of 2 [13:13:14.643] ..$ ...future.FUN: [13:13:14.643] ..$ ... : [13:13:14.643] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:14.643] - attr(*, "resolved")= logi FALSE [13:13:14.643] - attr(*, "total_size")= num 1240 [13:13:14.646] Packages to be attached in all futures: [n=0] [13:13:14.646] getGlobalsAndPackagesXApply() ... DONE [13:13:14.646] Number of futures (= number of chunks): 1 [13:13:14.646] Launching 1 futures (chunks) ... [13:13:14.647] Chunk #1 of 1 ... [13:13:14.647] - Finding globals in 'X' for chunk #1 ... [13:13:14.647] getGlobalsAndPackages() ... [13:13:14.647] Searching for globals... [13:13:14.648] [13:13:14.648] Searching for globals ... DONE [13:13:14.648] - globals: [0] [13:13:14.648] getGlobalsAndPackages() ... DONE [13:13:14.648] + additional globals found: [n=0] [13:13:14.649] + additional namespaces needed: [n=0] [13:13:14.649] - Finding globals in 'X' for chunk #1 ... DONE [13:13:14.649] - seeds: [13:13:14.649] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:14.649] getGlobalsAndPackages() ... [13:13:14.649] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:14.650] Resolving globals: FALSE [13:13:14.650] Tweak future expression to call with '...' arguments ... [13:13:14.650] { [13:13:14.650] do.call(function(...) { [13:13:14.650] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:14.650] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:14.650] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:14.650] on.exit(options(oopts), add = TRUE) [13:13:14.650] } [13:13:14.650] { [13:13:14.650] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:14.650] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:14.650] ...future.FUN(...future.X_jj, ...) [13:13:14.650] }) [13:13:14.650] } [13:13:14.650] }, args = future.call.arguments) [13:13:14.650] } [13:13:14.650] Tweak future expression to call with '...' arguments ... DONE [13:13:14.651] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:14.651] [13:13:14.651] getGlobalsAndPackages() ... DONE [13:13:14.651] run() for 'Future' ... [13:13:14.652] - state: 'created' [13:13:14.652] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:13:14.652] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:14.652] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:14.653] - Field: 'label' [13:13:14.653] - Field: 'local' [13:13:14.653] - Field: 'owner' [13:13:14.653] - Field: 'envir' [13:13:14.653] - Field: 'packages' [13:13:14.654] - Field: 'gc' [13:13:14.654] - Field: 'conditions' [13:13:14.654] - Field: 'expr' [13:13:14.654] - Field: 'uuid' [13:13:14.654] - Field: 'seed' [13:13:14.654] - Field: 'version' [13:13:14.655] - Field: 'result' [13:13:14.655] - Field: 'asynchronous' [13:13:14.655] - Field: 'calls' [13:13:14.655] - Field: 'globals' [13:13:14.655] - Field: 'stdout' [13:13:14.655] - Field: 'earlySignal' [13:13:14.656] - Field: 'lazy' [13:13:14.656] - Field: 'state' [13:13:14.656] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:14.656] - Launch lazy future ... [13:13:14.656] Packages needed by the future expression (n = 0): [13:13:14.657] Packages needed by future strategies (n = 0): [13:13:14.658] { [13:13:14.658] { [13:13:14.658] { [13:13:14.658] ...future.startTime <- base::Sys.time() [13:13:14.658] { [13:13:14.658] { [13:13:14.658] { [13:13:14.658] base::local({ [13:13:14.658] has_future <- base::requireNamespace("future", [13:13:14.658] quietly = TRUE) [13:13:14.658] if (has_future) { [13:13:14.658] ns <- base::getNamespace("future") [13:13:14.658] version <- ns[[".package"]][["version"]] [13:13:14.658] if (is.null(version)) [13:13:14.658] version <- utils::packageVersion("future") [13:13:14.658] } [13:13:14.658] else { [13:13:14.658] version <- NULL [13:13:14.658] } [13:13:14.658] if (!has_future || version < "1.8.0") { [13:13:14.658] info <- base::c(r_version = base::gsub("R version ", [13:13:14.658] "", base::R.version$version.string), [13:13:14.658] platform = base::sprintf("%s (%s-bit)", [13:13:14.658] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:14.658] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:14.658] "release", "version")], collapse = " "), [13:13:14.658] hostname = base::Sys.info()[["nodename"]]) [13:13:14.658] info <- base::sprintf("%s: %s", base::names(info), [13:13:14.658] info) [13:13:14.658] info <- base::paste(info, collapse = "; ") [13:13:14.658] if (!has_future) { [13:13:14.658] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:14.658] info) [13:13:14.658] } [13:13:14.658] else { [13:13:14.658] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:14.658] info, version) [13:13:14.658] } [13:13:14.658] base::stop(msg) [13:13:14.658] } [13:13:14.658] }) [13:13:14.658] } [13:13:14.658] options(future.plan = NULL) [13:13:14.658] Sys.unsetenv("R_FUTURE_PLAN") [13:13:14.658] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:14.658] } [13:13:14.658] ...future.workdir <- getwd() [13:13:14.658] } [13:13:14.658] ...future.oldOptions <- base::as.list(base::.Options) [13:13:14.658] ...future.oldEnvVars <- base::Sys.getenv() [13:13:14.658] } [13:13:14.658] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:14.658] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:14.658] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:14.658] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:14.658] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:14.658] future.stdout.windows.reencode = NULL, width = 80L) [13:13:14.658] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:14.658] base::names(...future.oldOptions)) [13:13:14.658] } [13:13:14.658] if (FALSE) { [13:13:14.658] } [13:13:14.658] else { [13:13:14.658] if (TRUE) { [13:13:14.658] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:14.658] open = "w") [13:13:14.658] } [13:13:14.658] else { [13:13:14.658] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:14.658] windows = "NUL", "/dev/null"), open = "w") [13:13:14.658] } [13:13:14.658] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:14.658] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:14.658] base::sink(type = "output", split = FALSE) [13:13:14.658] base::close(...future.stdout) [13:13:14.658] }, add = TRUE) [13:13:14.658] } [13:13:14.658] ...future.frame <- base::sys.nframe() [13:13:14.658] ...future.conditions <- base::list() [13:13:14.658] ...future.rng <- base::globalenv()$.Random.seed [13:13:14.658] if (FALSE) { [13:13:14.658] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:14.658] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:14.658] } [13:13:14.658] ...future.result <- base::tryCatch({ [13:13:14.658] base::withCallingHandlers({ [13:13:14.658] ...future.value <- base::withVisible(base::local({ [13:13:14.658] do.call(function(...) { [13:13:14.658] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:14.658] if (!identical(...future.globals.maxSize.org, [13:13:14.658] ...future.globals.maxSize)) { [13:13:14.658] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:14.658] on.exit(options(oopts), add = TRUE) [13:13:14.658] } [13:13:14.658] { [13:13:14.658] lapply(seq_along(...future.elements_ii), [13:13:14.658] FUN = function(jj) { [13:13:14.658] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:14.658] ...future.FUN(...future.X_jj, ...) [13:13:14.658] }) [13:13:14.658] } [13:13:14.658] }, args = future.call.arguments) [13:13:14.658] })) [13:13:14.658] future::FutureResult(value = ...future.value$value, [13:13:14.658] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:14.658] ...future.rng), globalenv = if (FALSE) [13:13:14.658] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:14.658] ...future.globalenv.names)) [13:13:14.658] else NULL, started = ...future.startTime, version = "1.8") [13:13:14.658] }, condition = base::local({ [13:13:14.658] c <- base::c [13:13:14.658] inherits <- base::inherits [13:13:14.658] invokeRestart <- base::invokeRestart [13:13:14.658] length <- base::length [13:13:14.658] list <- base::list [13:13:14.658] seq.int <- base::seq.int [13:13:14.658] signalCondition <- base::signalCondition [13:13:14.658] sys.calls <- base::sys.calls [13:13:14.658] `[[` <- base::`[[` [13:13:14.658] `+` <- base::`+` [13:13:14.658] `<<-` <- base::`<<-` [13:13:14.658] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:14.658] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:14.658] 3L)] [13:13:14.658] } [13:13:14.658] function(cond) { [13:13:14.658] is_error <- inherits(cond, "error") [13:13:14.658] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:14.658] NULL) [13:13:14.658] if (is_error) { [13:13:14.658] sessionInformation <- function() { [13:13:14.658] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:14.658] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:14.658] search = base::search(), system = base::Sys.info()) [13:13:14.658] } [13:13:14.658] ...future.conditions[[length(...future.conditions) + [13:13:14.658] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:14.658] cond$call), session = sessionInformation(), [13:13:14.658] timestamp = base::Sys.time(), signaled = 0L) [13:13:14.658] signalCondition(cond) [13:13:14.658] } [13:13:14.658] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:14.658] "immediateCondition"))) { [13:13:14.658] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:14.658] ...future.conditions[[length(...future.conditions) + [13:13:14.658] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:14.658] if (TRUE && !signal) { [13:13:14.658] muffleCondition <- function (cond, pattern = "^muffle") [13:13:14.658] { [13:13:14.658] inherits <- base::inherits [13:13:14.658] invokeRestart <- base::invokeRestart [13:13:14.658] is.null <- base::is.null [13:13:14.658] muffled <- FALSE [13:13:14.658] if (inherits(cond, "message")) { [13:13:14.658] muffled <- grepl(pattern, "muffleMessage") [13:13:14.658] if (muffled) [13:13:14.658] invokeRestart("muffleMessage") [13:13:14.658] } [13:13:14.658] else if (inherits(cond, "warning")) { [13:13:14.658] muffled <- grepl(pattern, "muffleWarning") [13:13:14.658] if (muffled) [13:13:14.658] invokeRestart("muffleWarning") [13:13:14.658] } [13:13:14.658] else if (inherits(cond, "condition")) { [13:13:14.658] if (!is.null(pattern)) { [13:13:14.658] computeRestarts <- base::computeRestarts [13:13:14.658] grepl <- base::grepl [13:13:14.658] restarts <- computeRestarts(cond) [13:13:14.658] for (restart in restarts) { [13:13:14.658] name <- restart$name [13:13:14.658] if (is.null(name)) [13:13:14.658] next [13:13:14.658] if (!grepl(pattern, name)) [13:13:14.658] next [13:13:14.658] invokeRestart(restart) [13:13:14.658] muffled <- TRUE [13:13:14.658] break [13:13:14.658] } [13:13:14.658] } [13:13:14.658] } [13:13:14.658] invisible(muffled) [13:13:14.658] } [13:13:14.658] muffleCondition(cond, pattern = "^muffle") [13:13:14.658] } [13:13:14.658] } [13:13:14.658] else { [13:13:14.658] if (TRUE) { [13:13:14.658] muffleCondition <- function (cond, pattern = "^muffle") [13:13:14.658] { [13:13:14.658] inherits <- base::inherits [13:13:14.658] invokeRestart <- base::invokeRestart [13:13:14.658] is.null <- base::is.null [13:13:14.658] muffled <- FALSE [13:13:14.658] if (inherits(cond, "message")) { [13:13:14.658] muffled <- grepl(pattern, "muffleMessage") [13:13:14.658] if (muffled) [13:13:14.658] invokeRestart("muffleMessage") [13:13:14.658] } [13:13:14.658] else if (inherits(cond, "warning")) { [13:13:14.658] muffled <- grepl(pattern, "muffleWarning") [13:13:14.658] if (muffled) [13:13:14.658] invokeRestart("muffleWarning") [13:13:14.658] } [13:13:14.658] else if (inherits(cond, "condition")) { [13:13:14.658] if (!is.null(pattern)) { [13:13:14.658] computeRestarts <- base::computeRestarts [13:13:14.658] grepl <- base::grepl [13:13:14.658] restarts <- computeRestarts(cond) [13:13:14.658] for (restart in restarts) { [13:13:14.658] name <- restart$name [13:13:14.658] if (is.null(name)) [13:13:14.658] next [13:13:14.658] if (!grepl(pattern, name)) [13:13:14.658] next [13:13:14.658] invokeRestart(restart) [13:13:14.658] muffled <- TRUE [13:13:14.658] break [13:13:14.658] } [13:13:14.658] } [13:13:14.658] } [13:13:14.658] invisible(muffled) [13:13:14.658] } [13:13:14.658] muffleCondition(cond, pattern = "^muffle") [13:13:14.658] } [13:13:14.658] } [13:13:14.658] } [13:13:14.658] })) [13:13:14.658] }, error = function(ex) { [13:13:14.658] base::structure(base::list(value = NULL, visible = NULL, [13:13:14.658] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:14.658] ...future.rng), started = ...future.startTime, [13:13:14.658] finished = Sys.time(), session_uuid = NA_character_, [13:13:14.658] version = "1.8"), class = "FutureResult") [13:13:14.658] }, finally = { [13:13:14.658] if (!identical(...future.workdir, getwd())) [13:13:14.658] setwd(...future.workdir) [13:13:14.658] { [13:13:14.658] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:14.658] ...future.oldOptions$nwarnings <- NULL [13:13:14.658] } [13:13:14.658] base::options(...future.oldOptions) [13:13:14.658] if (.Platform$OS.type == "windows") { [13:13:14.658] old_names <- names(...future.oldEnvVars) [13:13:14.658] envs <- base::Sys.getenv() [13:13:14.658] names <- names(envs) [13:13:14.658] common <- intersect(names, old_names) [13:13:14.658] added <- setdiff(names, old_names) [13:13:14.658] removed <- setdiff(old_names, names) [13:13:14.658] changed <- common[...future.oldEnvVars[common] != [13:13:14.658] envs[common]] [13:13:14.658] NAMES <- toupper(changed) [13:13:14.658] args <- list() [13:13:14.658] for (kk in seq_along(NAMES)) { [13:13:14.658] name <- changed[[kk]] [13:13:14.658] NAME <- NAMES[[kk]] [13:13:14.658] if (name != NAME && is.element(NAME, old_names)) [13:13:14.658] next [13:13:14.658] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:14.658] } [13:13:14.658] NAMES <- toupper(added) [13:13:14.658] for (kk in seq_along(NAMES)) { [13:13:14.658] name <- added[[kk]] [13:13:14.658] NAME <- NAMES[[kk]] [13:13:14.658] if (name != NAME && is.element(NAME, old_names)) [13:13:14.658] next [13:13:14.658] args[[name]] <- "" [13:13:14.658] } [13:13:14.658] NAMES <- toupper(removed) [13:13:14.658] for (kk in seq_along(NAMES)) { [13:13:14.658] name <- removed[[kk]] [13:13:14.658] NAME <- NAMES[[kk]] [13:13:14.658] if (name != NAME && is.element(NAME, old_names)) [13:13:14.658] next [13:13:14.658] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:14.658] } [13:13:14.658] if (length(args) > 0) [13:13:14.658] base::do.call(base::Sys.setenv, args = args) [13:13:14.658] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:14.658] } [13:13:14.658] else { [13:13:14.658] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:14.658] } [13:13:14.658] { [13:13:14.658] if (base::length(...future.futureOptionsAdded) > [13:13:14.658] 0L) { [13:13:14.658] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:14.658] base::names(opts) <- ...future.futureOptionsAdded [13:13:14.658] base::options(opts) [13:13:14.658] } [13:13:14.658] { [13:13:14.658] { [13:13:14.658] NULL [13:13:14.658] RNGkind("Mersenne-Twister") [13:13:14.658] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:14.658] inherits = FALSE) [13:13:14.658] } [13:13:14.658] options(future.plan = NULL) [13:13:14.658] if (is.na(NA_character_)) [13:13:14.658] Sys.unsetenv("R_FUTURE_PLAN") [13:13:14.658] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:14.658] future::plan(list(function (..., envir = parent.frame()) [13:13:14.658] { [13:13:14.658] future <- SequentialFuture(..., envir = envir) [13:13:14.658] if (!future$lazy) [13:13:14.658] future <- run(future) [13:13:14.658] invisible(future) [13:13:14.658] }), .cleanup = FALSE, .init = FALSE) [13:13:14.658] } [13:13:14.658] } [13:13:14.658] } [13:13:14.658] }) [13:13:14.658] if (TRUE) { [13:13:14.658] base::sink(type = "output", split = FALSE) [13:13:14.658] if (TRUE) { [13:13:14.658] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:14.658] } [13:13:14.658] else { [13:13:14.658] ...future.result["stdout"] <- base::list(NULL) [13:13:14.658] } [13:13:14.658] base::close(...future.stdout) [13:13:14.658] ...future.stdout <- NULL [13:13:14.658] } [13:13:14.658] ...future.result$conditions <- ...future.conditions [13:13:14.658] ...future.result$finished <- base::Sys.time() [13:13:14.658] ...future.result [13:13:14.658] } [13:13:14.662] assign_globals() ... [13:13:14.662] List of 5 [13:13:14.662] $ ...future.FUN :function (object, ...) [13:13:14.662] $ future.call.arguments : list() [13:13:14.662] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:14.662] $ ...future.elements_ii :List of 3 [13:13:14.662] ..$ :'data.frame': 18 obs. of 3 variables: [13:13:14.662] .. ..$ breaks : num [1:18] 26 30 54 25 70 52 51 26 67 27 ... [13:13:14.662] .. ..$ wool : Factor w/ 2 levels "A","B": 1 1 1 1 1 1 1 1 1 2 ... [13:13:14.662] .. ..$ tension: Factor w/ 3 levels "L","M","H": 1 1 1 1 1 1 1 1 1 1 ... [13:13:14.662] ..$ :'data.frame': 18 obs. of 3 variables: [13:13:14.662] .. ..$ breaks : num [1:18] 18 21 29 17 12 18 35 30 36 42 ... [13:13:14.662] .. ..$ wool : Factor w/ 2 levels "A","B": 1 1 1 1 1 1 1 1 1 2 ... [13:13:14.662] .. ..$ tension: Factor w/ 3 levels "L","M","H": 2 2 2 2 2 2 2 2 2 2 ... [13:13:14.662] ..$ :'data.frame': 18 obs. of 3 variables: [13:13:14.662] .. ..$ breaks : num [1:18] 36 21 24 18 10 43 28 15 26 20 ... [13:13:14.662] .. ..$ wool : Factor w/ 2 levels "A","B": 1 1 1 1 1 1 1 1 1 2 ... [13:13:14.662] .. ..$ tension: Factor w/ 3 levels "L","M","H": 3 3 3 3 3 3 3 3 3 3 ... [13:13:14.662] $ ...future.seeds_ii : NULL [13:13:14.662] $ ...future.globals.maxSize: NULL [13:13:14.662] - attr(*, "where")=List of 5 [13:13:14.662] ..$ ...future.FUN : [13:13:14.662] ..$ future.call.arguments : [13:13:14.662] ..$ ...future.elements_ii : [13:13:14.662] ..$ ...future.seeds_ii : [13:13:14.662] ..$ ...future.globals.maxSize: [13:13:14.662] - attr(*, "resolved")= logi FALSE [13:13:14.662] - attr(*, "total_size")= num 1240 [13:13:14.662] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:14.662] - attr(*, "already-done")= logi TRUE [13:13:14.673] - copied '...future.FUN' to environment [13:13:14.673] - copied 'future.call.arguments' to environment [13:13:14.673] - copied '...future.elements_ii' to environment [13:13:14.673] - copied '...future.seeds_ii' to environment [13:13:14.673] - copied '...future.globals.maxSize' to environment [13:13:14.673] assign_globals() ... done [13:13:14.674] plan(): Setting new future strategy stack: [13:13:14.674] List of future strategies: [13:13:14.674] 1. sequential: [13:13:14.674] - args: function (..., envir = parent.frame(), workers = "") [13:13:14.674] - tweaked: FALSE [13:13:14.674] - call: NULL [13:13:14.675] plan(): nbrOfWorkers() = 1 [13:13:14.678] plan(): Setting new future strategy stack: [13:13:14.678] List of future strategies: [13:13:14.678] 1. sequential: [13:13:14.678] - args: function (..., envir = parent.frame(), workers = "") [13:13:14.678] - tweaked: FALSE [13:13:14.678] - call: plan(strategy) [13:13:14.678] plan(): nbrOfWorkers() = 1 [13:13:14.679] SequentialFuture started (and completed) [13:13:14.679] - Launch lazy future ... done [13:13:14.679] run() for 'SequentialFuture' ... done [13:13:14.679] Created future: [13:13:14.679] SequentialFuture: [13:13:14.679] Label: 'future_by-1' [13:13:14.679] Expression: [13:13:14.679] { [13:13:14.679] do.call(function(...) { [13:13:14.679] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:14.679] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:14.679] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:14.679] on.exit(options(oopts), add = TRUE) [13:13:14.679] } [13:13:14.679] { [13:13:14.679] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:14.679] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:14.679] ...future.FUN(...future.X_jj, ...) [13:13:14.679] }) [13:13:14.679] } [13:13:14.679] }, args = future.call.arguments) [13:13:14.679] } [13:13:14.679] Lazy evaluation: FALSE [13:13:14.679] Asynchronous evaluation: FALSE [13:13:14.679] Local evaluation: TRUE [13:13:14.679] Environment: 0x000001868da848b8 [13:13:14.679] Capture standard output: TRUE [13:13:14.679] Capture condition classes: 'condition' (excluding 'nothing') [13:13:14.679] Globals: 5 objects totaling 6.02 KiB (function '...future.FUN' of 1.21 KiB, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 4.80 KiB, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:13:14.679] Packages: [13:13:14.679] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:14.679] Resolved: TRUE [13:13:14.679] Value: 5.37 KiB of class 'list' [13:13:14.679] Early signaling: FALSE [13:13:14.679] Owner process: f0659542-730c-c20a-65b3-84f202449c4d [13:13:14.679] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:14.681] Chunk #1 of 1 ... DONE [13:13:14.681] Launching 1 futures (chunks) ... DONE [13:13:14.681] Resolving 1 futures (chunks) ... [13:13:14.682] resolve() on list ... [13:13:14.682] recursive: 0 [13:13:14.683] length: 1 [13:13:14.683] [13:13:14.683] resolved() for 'SequentialFuture' ... [13:13:14.683] - state: 'finished' [13:13:14.683] - run: TRUE [13:13:14.684] - result: 'FutureResult' [13:13:14.684] resolved() for 'SequentialFuture' ... done [13:13:14.684] Future #1 [13:13:14.684] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:14.684] - nx: 1 [13:13:14.684] - relay: TRUE [13:13:14.685] - stdout: TRUE [13:13:14.685] - signal: TRUE [13:13:14.685] - resignal: FALSE [13:13:14.685] - force: TRUE [13:13:14.685] - relayed: [n=1] FALSE [13:13:14.685] - queued futures: [n=1] FALSE [13:13:14.686] - until=1 [13:13:14.686] - relaying element #1 [13:13:14.686] - relayed: [n=1] TRUE [13:13:14.686] - queued futures: [n=1] TRUE [13:13:14.686] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:14.687] length: 0 (resolved future 1) [13:13:14.687] Relaying remaining futures [13:13:14.687] signalConditionsASAP(NULL, pos=0) ... [13:13:14.687] - nx: 1 [13:13:14.687] - relay: TRUE [13:13:14.687] - stdout: TRUE [13:13:14.687] - signal: TRUE [13:13:14.688] - resignal: FALSE [13:13:14.688] - force: TRUE [13:13:14.688] - relayed: [n=1] TRUE [13:13:14.688] - queued futures: [n=1] TRUE - flush all [13:13:14.688] - relayed: [n=1] TRUE [13:13:14.688] - queued futures: [n=1] TRUE [13:13:14.689] signalConditionsASAP(NULL, pos=0) ... done [13:13:14.689] resolve() on list ... DONE [13:13:14.689] - Number of value chunks collected: 1 [13:13:14.689] Resolving 1 futures (chunks) ... DONE [13:13:14.689] Reducing values from 1 chunks ... [13:13:14.689] - Number of values collected after concatenation: 3 [13:13:14.690] - Number of values expected: 3 [13:13:14.690] Reducing values from 1 chunks ... DONE [13:13:14.690] future_lapply() ... DONE [13:13:14.690] future_by_internal() ... DONE [13:13:14.691] future_by_internal() ... - plan('multisession') ... [13:13:14.692] plan(): Setting new future strategy stack: [13:13:14.692] List of future strategies: [13:13:14.692] 1. multisession: [13:13:14.692] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [13:13:14.692] - tweaked: FALSE [13:13:14.692] - call: plan(strategy) [13:13:14.693] plan(): plan_init() of 'multisession', 'cluster', 'multiprocess', 'future', 'function' ... [13:13:14.693] multisession: [13:13:14.693] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [13:13:14.693] - tweaked: FALSE [13:13:14.693] - call: plan(strategy) [13:13:14.696] getGlobalsAndPackages() ... [13:13:14.696] Not searching for globals [13:13:14.696] - globals: [0] [13:13:14.696] getGlobalsAndPackages() ... DONE [13:13:14.697] Packages needed by the future expression (n = 0): [13:13:14.697] Packages needed by future strategies (n = 0): [13:13:14.697] { [13:13:14.697] { [13:13:14.697] { [13:13:14.697] ...future.startTime <- base::Sys.time() [13:13:14.697] { [13:13:14.697] { [13:13:14.697] { [13:13:14.697] base::local({ [13:13:14.697] has_future <- base::requireNamespace("future", [13:13:14.697] quietly = TRUE) [13:13:14.697] if (has_future) { [13:13:14.697] ns <- base::getNamespace("future") [13:13:14.697] version <- ns[[".package"]][["version"]] [13:13:14.697] if (is.null(version)) [13:13:14.697] version <- utils::packageVersion("future") [13:13:14.697] } [13:13:14.697] else { [13:13:14.697] version <- NULL [13:13:14.697] } [13:13:14.697] if (!has_future || version < "1.8.0") { [13:13:14.697] info <- base::c(r_version = base::gsub("R version ", [13:13:14.697] "", base::R.version$version.string), [13:13:14.697] platform = base::sprintf("%s (%s-bit)", [13:13:14.697] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:14.697] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:14.697] "release", "version")], collapse = " "), [13:13:14.697] hostname = base::Sys.info()[["nodename"]]) [13:13:14.697] info <- base::sprintf("%s: %s", base::names(info), [13:13:14.697] info) [13:13:14.697] info <- base::paste(info, collapse = "; ") [13:13:14.697] if (!has_future) { [13:13:14.697] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:14.697] info) [13:13:14.697] } [13:13:14.697] else { [13:13:14.697] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:14.697] info, version) [13:13:14.697] } [13:13:14.697] base::stop(msg) [13:13:14.697] } [13:13:14.697] }) [13:13:14.697] } [13:13:14.697] options(future.plan = NULL) [13:13:14.697] Sys.unsetenv("R_FUTURE_PLAN") [13:13:14.697] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:14.697] } [13:13:14.697] ...future.workdir <- getwd() [13:13:14.697] } [13:13:14.697] ...future.oldOptions <- base::as.list(base::.Options) [13:13:14.697] ...future.oldEnvVars <- base::Sys.getenv() [13:13:14.697] } [13:13:14.697] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:14.697] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:14.697] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:14.697] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:14.697] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:14.697] future.stdout.windows.reencode = NULL, width = 80L) [13:13:14.697] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:14.697] base::names(...future.oldOptions)) [13:13:14.697] } [13:13:14.697] if (FALSE) { [13:13:14.697] } [13:13:14.697] else { [13:13:14.697] if (TRUE) { [13:13:14.697] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:14.697] open = "w") [13:13:14.697] } [13:13:14.697] else { [13:13:14.697] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:14.697] windows = "NUL", "/dev/null"), open = "w") [13:13:14.697] } [13:13:14.697] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:14.697] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:14.697] base::sink(type = "output", split = FALSE) [13:13:14.697] base::close(...future.stdout) [13:13:14.697] }, add = TRUE) [13:13:14.697] } [13:13:14.697] ...future.frame <- base::sys.nframe() [13:13:14.697] ...future.conditions <- base::list() [13:13:14.697] ...future.rng <- base::globalenv()$.Random.seed [13:13:14.697] if (FALSE) { [13:13:14.697] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:14.697] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:14.697] } [13:13:14.697] ...future.result <- base::tryCatch({ [13:13:14.697] base::withCallingHandlers({ [13:13:14.697] ...future.value <- base::withVisible(base::local(NA)) [13:13:14.697] future::FutureResult(value = ...future.value$value, [13:13:14.697] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:14.697] ...future.rng), globalenv = if (FALSE) [13:13:14.697] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:14.697] ...future.globalenv.names)) [13:13:14.697] else NULL, started = ...future.startTime, version = "1.8") [13:13:14.697] }, condition = base::local({ [13:13:14.697] c <- base::c [13:13:14.697] inherits <- base::inherits [13:13:14.697] invokeRestart <- base::invokeRestart [13:13:14.697] length <- base::length [13:13:14.697] list <- base::list [13:13:14.697] seq.int <- base::seq.int [13:13:14.697] signalCondition <- base::signalCondition [13:13:14.697] sys.calls <- base::sys.calls [13:13:14.697] `[[` <- base::`[[` [13:13:14.697] `+` <- base::`+` [13:13:14.697] `<<-` <- base::`<<-` [13:13:14.697] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:14.697] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:14.697] 3L)] [13:13:14.697] } [13:13:14.697] function(cond) { [13:13:14.697] is_error <- inherits(cond, "error") [13:13:14.697] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:14.697] NULL) [13:13:14.697] if (is_error) { [13:13:14.697] sessionInformation <- function() { [13:13:14.697] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:14.697] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:14.697] search = base::search(), system = base::Sys.info()) [13:13:14.697] } [13:13:14.697] ...future.conditions[[length(...future.conditions) + [13:13:14.697] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:14.697] cond$call), session = sessionInformation(), [13:13:14.697] timestamp = base::Sys.time(), signaled = 0L) [13:13:14.697] signalCondition(cond) [13:13:14.697] } [13:13:14.697] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:14.697] "immediateCondition"))) { [13:13:14.697] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:14.697] ...future.conditions[[length(...future.conditions) + [13:13:14.697] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:14.697] if (TRUE && !signal) { [13:13:14.697] muffleCondition <- function (cond, pattern = "^muffle") [13:13:14.697] { [13:13:14.697] inherits <- base::inherits [13:13:14.697] invokeRestart <- base::invokeRestart [13:13:14.697] is.null <- base::is.null [13:13:14.697] muffled <- FALSE [13:13:14.697] if (inherits(cond, "message")) { [13:13:14.697] muffled <- grepl(pattern, "muffleMessage") [13:13:14.697] if (muffled) [13:13:14.697] invokeRestart("muffleMessage") [13:13:14.697] } [13:13:14.697] else if (inherits(cond, "warning")) { [13:13:14.697] muffled <- grepl(pattern, "muffleWarning") [13:13:14.697] if (muffled) [13:13:14.697] invokeRestart("muffleWarning") [13:13:14.697] } [13:13:14.697] else if (inherits(cond, "condition")) { [13:13:14.697] if (!is.null(pattern)) { [13:13:14.697] computeRestarts <- base::computeRestarts [13:13:14.697] grepl <- base::grepl [13:13:14.697] restarts <- computeRestarts(cond) [13:13:14.697] for (restart in restarts) { [13:13:14.697] name <- restart$name [13:13:14.697] if (is.null(name)) [13:13:14.697] next [13:13:14.697] if (!grepl(pattern, name)) [13:13:14.697] next [13:13:14.697] invokeRestart(restart) [13:13:14.697] muffled <- TRUE [13:13:14.697] break [13:13:14.697] } [13:13:14.697] } [13:13:14.697] } [13:13:14.697] invisible(muffled) [13:13:14.697] } [13:13:14.697] muffleCondition(cond, pattern = "^muffle") [13:13:14.697] } [13:13:14.697] } [13:13:14.697] else { [13:13:14.697] if (TRUE) { [13:13:14.697] muffleCondition <- function (cond, pattern = "^muffle") [13:13:14.697] { [13:13:14.697] inherits <- base::inherits [13:13:14.697] invokeRestart <- base::invokeRestart [13:13:14.697] is.null <- base::is.null [13:13:14.697] muffled <- FALSE [13:13:14.697] if (inherits(cond, "message")) { [13:13:14.697] muffled <- grepl(pattern, "muffleMessage") [13:13:14.697] if (muffled) [13:13:14.697] invokeRestart("muffleMessage") [13:13:14.697] } [13:13:14.697] else if (inherits(cond, "warning")) { [13:13:14.697] muffled <- grepl(pattern, "muffleWarning") [13:13:14.697] if (muffled) [13:13:14.697] invokeRestart("muffleWarning") [13:13:14.697] } [13:13:14.697] else if (inherits(cond, "condition")) { [13:13:14.697] if (!is.null(pattern)) { [13:13:14.697] computeRestarts <- base::computeRestarts [13:13:14.697] grepl <- base::grepl [13:13:14.697] restarts <- computeRestarts(cond) [13:13:14.697] for (restart in restarts) { [13:13:14.697] name <- restart$name [13:13:14.697] if (is.null(name)) [13:13:14.697] next [13:13:14.697] if (!grepl(pattern, name)) [13:13:14.697] next [13:13:14.697] invokeRestart(restart) [13:13:14.697] muffled <- TRUE [13:13:14.697] break [13:13:14.697] } [13:13:14.697] } [13:13:14.697] } [13:13:14.697] invisible(muffled) [13:13:14.697] } [13:13:14.697] muffleCondition(cond, pattern = "^muffle") [13:13:14.697] } [13:13:14.697] } [13:13:14.697] } [13:13:14.697] })) [13:13:14.697] }, error = function(ex) { [13:13:14.697] base::structure(base::list(value = NULL, visible = NULL, [13:13:14.697] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:14.697] ...future.rng), started = ...future.startTime, [13:13:14.697] finished = Sys.time(), session_uuid = NA_character_, [13:13:14.697] version = "1.8"), class = "FutureResult") [13:13:14.697] }, finally = { [13:13:14.697] if (!identical(...future.workdir, getwd())) [13:13:14.697] setwd(...future.workdir) [13:13:14.697] { [13:13:14.697] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:14.697] ...future.oldOptions$nwarnings <- NULL [13:13:14.697] } [13:13:14.697] base::options(...future.oldOptions) [13:13:14.697] if (.Platform$OS.type == "windows") { [13:13:14.697] old_names <- names(...future.oldEnvVars) [13:13:14.697] envs <- base::Sys.getenv() [13:13:14.697] names <- names(envs) [13:13:14.697] common <- intersect(names, old_names) [13:13:14.697] added <- setdiff(names, old_names) [13:13:14.697] removed <- setdiff(old_names, names) [13:13:14.697] changed <- common[...future.oldEnvVars[common] != [13:13:14.697] envs[common]] [13:13:14.697] NAMES <- toupper(changed) [13:13:14.697] args <- list() [13:13:14.697] for (kk in seq_along(NAMES)) { [13:13:14.697] name <- changed[[kk]] [13:13:14.697] NAME <- NAMES[[kk]] [13:13:14.697] if (name != NAME && is.element(NAME, old_names)) [13:13:14.697] next [13:13:14.697] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:14.697] } [13:13:14.697] NAMES <- toupper(added) [13:13:14.697] for (kk in seq_along(NAMES)) { [13:13:14.697] name <- added[[kk]] [13:13:14.697] NAME <- NAMES[[kk]] [13:13:14.697] if (name != NAME && is.element(NAME, old_names)) [13:13:14.697] next [13:13:14.697] args[[name]] <- "" [13:13:14.697] } [13:13:14.697] NAMES <- toupper(removed) [13:13:14.697] for (kk in seq_along(NAMES)) { [13:13:14.697] name <- removed[[kk]] [13:13:14.697] NAME <- NAMES[[kk]] [13:13:14.697] if (name != NAME && is.element(NAME, old_names)) [13:13:14.697] next [13:13:14.697] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:14.697] } [13:13:14.697] if (length(args) > 0) [13:13:14.697] base::do.call(base::Sys.setenv, args = args) [13:13:14.697] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:14.697] } [13:13:14.697] else { [13:13:14.697] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:14.697] } [13:13:14.697] { [13:13:14.697] if (base::length(...future.futureOptionsAdded) > [13:13:14.697] 0L) { [13:13:14.697] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:14.697] base::names(opts) <- ...future.futureOptionsAdded [13:13:14.697] base::options(opts) [13:13:14.697] } [13:13:14.697] { [13:13:14.697] { [13:13:14.697] NULL [13:13:14.697] RNGkind("Mersenne-Twister") [13:13:14.697] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:14.697] inherits = FALSE) [13:13:14.697] } [13:13:14.697] options(future.plan = NULL) [13:13:14.697] if (is.na(NA_character_)) [13:13:14.697] Sys.unsetenv("R_FUTURE_PLAN") [13:13:14.697] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:14.697] future::plan(list(function (..., workers = availableCores(), [13:13:14.697] lazy = FALSE, rscript_libs = .libPaths(), [13:13:14.697] envir = parent.frame()) [13:13:14.697] { [13:13:14.697] if (is.function(workers)) [13:13:14.697] workers <- workers() [13:13:14.697] workers <- structure(as.integer(workers), [13:13:14.697] class = class(workers)) [13:13:14.697] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:14.697] workers >= 1) [13:13:14.697] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:14.697] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:14.697] } [13:13:14.697] future <- MultisessionFuture(..., workers = workers, [13:13:14.697] lazy = lazy, rscript_libs = rscript_libs, [13:13:14.697] envir = envir) [13:13:14.697] if (!future$lazy) [13:13:14.697] future <- run(future) [13:13:14.697] invisible(future) [13:13:14.697] }), .cleanup = FALSE, .init = FALSE) [13:13:14.697] } [13:13:14.697] } [13:13:14.697] } [13:13:14.697] }) [13:13:14.697] if (TRUE) { [13:13:14.697] base::sink(type = "output", split = FALSE) [13:13:14.697] if (TRUE) { [13:13:14.697] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:14.697] } [13:13:14.697] else { [13:13:14.697] ...future.result["stdout"] <- base::list(NULL) [13:13:14.697] } [13:13:14.697] base::close(...future.stdout) [13:13:14.697] ...future.stdout <- NULL [13:13:14.697] } [13:13:14.697] ...future.result$conditions <- ...future.conditions [13:13:14.697] ...future.result$finished <- base::Sys.time() [13:13:14.697] ...future.result [13:13:14.697] } [13:13:14.702] plan(): Setting new future strategy stack: [13:13:14.702] List of future strategies: [13:13:14.702] 1. sequential: [13:13:14.702] - args: function (..., envir = parent.frame(), workers = "") [13:13:14.702] - tweaked: FALSE [13:13:14.702] - call: NULL [13:13:14.702] plan(): nbrOfWorkers() = 1 [13:13:14.704] plan(): Setting new future strategy stack: [13:13:14.704] List of future strategies: [13:13:14.704] 1. multisession: [13:13:14.704] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [13:13:14.704] - tweaked: FALSE [13:13:14.704] - call: plan(strategy) [13:13:14.707] plan(): nbrOfWorkers() = 1 [13:13:14.707] SequentialFuture started (and completed) [13:13:14.707] plan(): plan_init() of 'multisession', 'cluster', 'multiprocess', 'future', 'function' ... DONE [13:13:14.709] plan(): nbrOfWorkers() = 1 [13:13:14.710] future_by_internal() ... [13:13:14.710] future_lapply() ... [13:13:14.713] Number of chunks: 1 [13:13:14.713] getGlobalsAndPackagesXApply() ... [13:13:14.713] - future.globals: TRUE [13:13:14.713] getGlobalsAndPackages() ... [13:13:14.713] Searching for globals... [13:13:14.716] - globals found: [2] 'FUN', 'UseMethod' [13:13:14.716] Searching for globals ... DONE [13:13:14.716] Resolving globals: FALSE [13:13:14.716] The total size of the 1 globals is 1.21 KiB (1240 bytes) [13:13:14.717] The total size of the 1 globals exported for future expression ('FUN()') is 1.21 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (1.21 KiB of class 'function') [13:13:14.717] - globals: [1] 'FUN' [13:13:14.717] [13:13:14.717] getGlobalsAndPackages() ... DONE [13:13:14.718] - globals found/used: [n=1] 'FUN' [13:13:14.718] - needed namespaces: [n=0] [13:13:14.718] Finding globals ... DONE [13:13:14.718] - use_args: TRUE [13:13:14.718] - Getting '...' globals ... [13:13:14.719] resolve() on list ... [13:13:14.719] recursive: 0 [13:13:14.719] length: 1 [13:13:14.719] elements: '...' [13:13:14.719] length: 0 (resolved future 1) [13:13:14.720] resolve() on list ... DONE [13:13:14.720] - '...' content: [n=0] [13:13:14.720] List of 1 [13:13:14.720] $ ...: list() [13:13:14.720] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:14.720] - attr(*, "where")=List of 1 [13:13:14.720] ..$ ...: [13:13:14.720] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:14.720] - attr(*, "resolved")= logi TRUE [13:13:14.720] - attr(*, "total_size")= num NA [13:13:14.723] - Getting '...' globals ... DONE [13:13:14.723] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:14.723] List of 2 [13:13:14.723] $ ...future.FUN:function (object, ...) [13:13:14.723] $ ... : list() [13:13:14.723] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:14.723] - attr(*, "where")=List of 2 [13:13:14.723] ..$ ...future.FUN: [13:13:14.723] ..$ ... : [13:13:14.723] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:14.723] - attr(*, "resolved")= logi FALSE [13:13:14.723] - attr(*, "total_size")= num 1240 [13:13:14.727] Packages to be attached in all futures: [n=0] [13:13:14.727] getGlobalsAndPackagesXApply() ... DONE [13:13:14.727] Number of futures (= number of chunks): 1 [13:13:14.727] Launching 1 futures (chunks) ... [13:13:14.727] Chunk #1 of 1 ... [13:13:14.728] - Finding globals in 'X' for chunk #1 ... [13:13:14.728] getGlobalsAndPackages() ... [13:13:14.728] Searching for globals... [13:13:14.728] [13:13:14.729] Searching for globals ... DONE [13:13:14.729] - globals: [0] [13:13:14.729] getGlobalsAndPackages() ... DONE [13:13:14.729] + additional globals found: [n=0] [13:13:14.729] + additional namespaces needed: [n=0] [13:13:14.729] - Finding globals in 'X' for chunk #1 ... DONE [13:13:14.730] - seeds: [13:13:14.730] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:14.730] getGlobalsAndPackages() ... [13:13:14.730] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:14.730] Resolving globals: FALSE [13:13:14.730] Tweak future expression to call with '...' arguments ... [13:13:14.731] { [13:13:14.731] do.call(function(...) { [13:13:14.731] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:14.731] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:14.731] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:14.731] on.exit(options(oopts), add = TRUE) [13:13:14.731] } [13:13:14.731] { [13:13:14.731] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:14.731] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:14.731] ...future.FUN(...future.X_jj, ...) [13:13:14.731] }) [13:13:14.731] } [13:13:14.731] }, args = future.call.arguments) [13:13:14.731] } [13:13:14.731] Tweak future expression to call with '...' arguments ... DONE [13:13:14.731] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:14.732] [13:13:14.732] getGlobalsAndPackages() ... DONE [13:13:14.732] run() for 'Future' ... [13:13:14.732] - state: 'created' [13:13:14.733] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:14.735] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:14.735] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:14.735] - Field: 'label' [13:13:14.736] - Field: 'local' [13:13:14.736] - Field: 'owner' [13:13:14.736] - Field: 'envir' [13:13:14.736] - Field: 'packages' [13:13:14.736] - Field: 'gc' [13:13:14.736] - Field: 'conditions' [13:13:14.737] - Field: 'expr' [13:13:14.737] - Field: 'uuid' [13:13:14.737] - Field: 'seed' [13:13:14.737] - Field: 'version' [13:13:14.737] - Field: 'result' [13:13:14.737] - Field: 'asynchronous' [13:13:14.738] - Field: 'calls' [13:13:14.738] - Field: 'globals' [13:13:14.738] - Field: 'stdout' [13:13:14.739] - Field: 'earlySignal' [13:13:14.739] - Field: 'lazy' [13:13:14.739] - Field: 'state' [13:13:14.740] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:14.740] - Launch lazy future ... [13:13:14.740] Packages needed by the future expression (n = 0): [13:13:14.740] Packages needed by future strategies (n = 0): [13:13:14.741] { [13:13:14.741] { [13:13:14.741] { [13:13:14.741] ...future.startTime <- base::Sys.time() [13:13:14.741] { [13:13:14.741] { [13:13:14.741] { [13:13:14.741] base::local({ [13:13:14.741] has_future <- base::requireNamespace("future", [13:13:14.741] quietly = TRUE) [13:13:14.741] if (has_future) { [13:13:14.741] ns <- base::getNamespace("future") [13:13:14.741] version <- ns[[".package"]][["version"]] [13:13:14.741] if (is.null(version)) [13:13:14.741] version <- utils::packageVersion("future") [13:13:14.741] } [13:13:14.741] else { [13:13:14.741] version <- NULL [13:13:14.741] } [13:13:14.741] if (!has_future || version < "1.8.0") { [13:13:14.741] info <- base::c(r_version = base::gsub("R version ", [13:13:14.741] "", base::R.version$version.string), [13:13:14.741] platform = base::sprintf("%s (%s-bit)", [13:13:14.741] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:14.741] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:14.741] "release", "version")], collapse = " "), [13:13:14.741] hostname = base::Sys.info()[["nodename"]]) [13:13:14.741] info <- base::sprintf("%s: %s", base::names(info), [13:13:14.741] info) [13:13:14.741] info <- base::paste(info, collapse = "; ") [13:13:14.741] if (!has_future) { [13:13:14.741] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:14.741] info) [13:13:14.741] } [13:13:14.741] else { [13:13:14.741] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:14.741] info, version) [13:13:14.741] } [13:13:14.741] base::stop(msg) [13:13:14.741] } [13:13:14.741] }) [13:13:14.741] } [13:13:14.741] options(future.plan = NULL) [13:13:14.741] Sys.unsetenv("R_FUTURE_PLAN") [13:13:14.741] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:14.741] } [13:13:14.741] ...future.workdir <- getwd() [13:13:14.741] } [13:13:14.741] ...future.oldOptions <- base::as.list(base::.Options) [13:13:14.741] ...future.oldEnvVars <- base::Sys.getenv() [13:13:14.741] } [13:13:14.741] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:14.741] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:14.741] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:14.741] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:14.741] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:14.741] future.stdout.windows.reencode = NULL, width = 80L) [13:13:14.741] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:14.741] base::names(...future.oldOptions)) [13:13:14.741] } [13:13:14.741] if (FALSE) { [13:13:14.741] } [13:13:14.741] else { [13:13:14.741] if (TRUE) { [13:13:14.741] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:14.741] open = "w") [13:13:14.741] } [13:13:14.741] else { [13:13:14.741] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:14.741] windows = "NUL", "/dev/null"), open = "w") [13:13:14.741] } [13:13:14.741] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:14.741] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:14.741] base::sink(type = "output", split = FALSE) [13:13:14.741] base::close(...future.stdout) [13:13:14.741] }, add = TRUE) [13:13:14.741] } [13:13:14.741] ...future.frame <- base::sys.nframe() [13:13:14.741] ...future.conditions <- base::list() [13:13:14.741] ...future.rng <- base::globalenv()$.Random.seed [13:13:14.741] if (FALSE) { [13:13:14.741] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:14.741] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:14.741] } [13:13:14.741] ...future.result <- base::tryCatch({ [13:13:14.741] base::withCallingHandlers({ [13:13:14.741] ...future.value <- base::withVisible(base::local({ [13:13:14.741] do.call(function(...) { [13:13:14.741] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:14.741] if (!identical(...future.globals.maxSize.org, [13:13:14.741] ...future.globals.maxSize)) { [13:13:14.741] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:14.741] on.exit(options(oopts), add = TRUE) [13:13:14.741] } [13:13:14.741] { [13:13:14.741] lapply(seq_along(...future.elements_ii), [13:13:14.741] FUN = function(jj) { [13:13:14.741] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:14.741] ...future.FUN(...future.X_jj, ...) [13:13:14.741] }) [13:13:14.741] } [13:13:14.741] }, args = future.call.arguments) [13:13:14.741] })) [13:13:14.741] future::FutureResult(value = ...future.value$value, [13:13:14.741] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:14.741] ...future.rng), globalenv = if (FALSE) [13:13:14.741] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:14.741] ...future.globalenv.names)) [13:13:14.741] else NULL, started = ...future.startTime, version = "1.8") [13:13:14.741] }, condition = base::local({ [13:13:14.741] c <- base::c [13:13:14.741] inherits <- base::inherits [13:13:14.741] invokeRestart <- base::invokeRestart [13:13:14.741] length <- base::length [13:13:14.741] list <- base::list [13:13:14.741] seq.int <- base::seq.int [13:13:14.741] signalCondition <- base::signalCondition [13:13:14.741] sys.calls <- base::sys.calls [13:13:14.741] `[[` <- base::`[[` [13:13:14.741] `+` <- base::`+` [13:13:14.741] `<<-` <- base::`<<-` [13:13:14.741] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:14.741] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:14.741] 3L)] [13:13:14.741] } [13:13:14.741] function(cond) { [13:13:14.741] is_error <- inherits(cond, "error") [13:13:14.741] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:14.741] NULL) [13:13:14.741] if (is_error) { [13:13:14.741] sessionInformation <- function() { [13:13:14.741] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:14.741] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:14.741] search = base::search(), system = base::Sys.info()) [13:13:14.741] } [13:13:14.741] ...future.conditions[[length(...future.conditions) + [13:13:14.741] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:14.741] cond$call), session = sessionInformation(), [13:13:14.741] timestamp = base::Sys.time(), signaled = 0L) [13:13:14.741] signalCondition(cond) [13:13:14.741] } [13:13:14.741] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:14.741] "immediateCondition"))) { [13:13:14.741] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:14.741] ...future.conditions[[length(...future.conditions) + [13:13:14.741] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:14.741] if (TRUE && !signal) { [13:13:14.741] muffleCondition <- function (cond, pattern = "^muffle") [13:13:14.741] { [13:13:14.741] inherits <- base::inherits [13:13:14.741] invokeRestart <- base::invokeRestart [13:13:14.741] is.null <- base::is.null [13:13:14.741] muffled <- FALSE [13:13:14.741] if (inherits(cond, "message")) { [13:13:14.741] muffled <- grepl(pattern, "muffleMessage") [13:13:14.741] if (muffled) [13:13:14.741] invokeRestart("muffleMessage") [13:13:14.741] } [13:13:14.741] else if (inherits(cond, "warning")) { [13:13:14.741] muffled <- grepl(pattern, "muffleWarning") [13:13:14.741] if (muffled) [13:13:14.741] invokeRestart("muffleWarning") [13:13:14.741] } [13:13:14.741] else if (inherits(cond, "condition")) { [13:13:14.741] if (!is.null(pattern)) { [13:13:14.741] computeRestarts <- base::computeRestarts [13:13:14.741] grepl <- base::grepl [13:13:14.741] restarts <- computeRestarts(cond) [13:13:14.741] for (restart in restarts) { [13:13:14.741] name <- restart$name [13:13:14.741] if (is.null(name)) [13:13:14.741] next [13:13:14.741] if (!grepl(pattern, name)) [13:13:14.741] next [13:13:14.741] invokeRestart(restart) [13:13:14.741] muffled <- TRUE [13:13:14.741] break [13:13:14.741] } [13:13:14.741] } [13:13:14.741] } [13:13:14.741] invisible(muffled) [13:13:14.741] } [13:13:14.741] muffleCondition(cond, pattern = "^muffle") [13:13:14.741] } [13:13:14.741] } [13:13:14.741] else { [13:13:14.741] if (TRUE) { [13:13:14.741] muffleCondition <- function (cond, pattern = "^muffle") [13:13:14.741] { [13:13:14.741] inherits <- base::inherits [13:13:14.741] invokeRestart <- base::invokeRestart [13:13:14.741] is.null <- base::is.null [13:13:14.741] muffled <- FALSE [13:13:14.741] if (inherits(cond, "message")) { [13:13:14.741] muffled <- grepl(pattern, "muffleMessage") [13:13:14.741] if (muffled) [13:13:14.741] invokeRestart("muffleMessage") [13:13:14.741] } [13:13:14.741] else if (inherits(cond, "warning")) { [13:13:14.741] muffled <- grepl(pattern, "muffleWarning") [13:13:14.741] if (muffled) [13:13:14.741] invokeRestart("muffleWarning") [13:13:14.741] } [13:13:14.741] else if (inherits(cond, "condition")) { [13:13:14.741] if (!is.null(pattern)) { [13:13:14.741] computeRestarts <- base::computeRestarts [13:13:14.741] grepl <- base::grepl [13:13:14.741] restarts <- computeRestarts(cond) [13:13:14.741] for (restart in restarts) { [13:13:14.741] name <- restart$name [13:13:14.741] if (is.null(name)) [13:13:14.741] next [13:13:14.741] if (!grepl(pattern, name)) [13:13:14.741] next [13:13:14.741] invokeRestart(restart) [13:13:14.741] muffled <- TRUE [13:13:14.741] break [13:13:14.741] } [13:13:14.741] } [13:13:14.741] } [13:13:14.741] invisible(muffled) [13:13:14.741] } [13:13:14.741] muffleCondition(cond, pattern = "^muffle") [13:13:14.741] } [13:13:14.741] } [13:13:14.741] } [13:13:14.741] })) [13:13:14.741] }, error = function(ex) { [13:13:14.741] base::structure(base::list(value = NULL, visible = NULL, [13:13:14.741] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:14.741] ...future.rng), started = ...future.startTime, [13:13:14.741] finished = Sys.time(), session_uuid = NA_character_, [13:13:14.741] version = "1.8"), class = "FutureResult") [13:13:14.741] }, finally = { [13:13:14.741] if (!identical(...future.workdir, getwd())) [13:13:14.741] setwd(...future.workdir) [13:13:14.741] { [13:13:14.741] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:14.741] ...future.oldOptions$nwarnings <- NULL [13:13:14.741] } [13:13:14.741] base::options(...future.oldOptions) [13:13:14.741] if (.Platform$OS.type == "windows") { [13:13:14.741] old_names <- names(...future.oldEnvVars) [13:13:14.741] envs <- base::Sys.getenv() [13:13:14.741] names <- names(envs) [13:13:14.741] common <- intersect(names, old_names) [13:13:14.741] added <- setdiff(names, old_names) [13:13:14.741] removed <- setdiff(old_names, names) [13:13:14.741] changed <- common[...future.oldEnvVars[common] != [13:13:14.741] envs[common]] [13:13:14.741] NAMES <- toupper(changed) [13:13:14.741] args <- list() [13:13:14.741] for (kk in seq_along(NAMES)) { [13:13:14.741] name <- changed[[kk]] [13:13:14.741] NAME <- NAMES[[kk]] [13:13:14.741] if (name != NAME && is.element(NAME, old_names)) [13:13:14.741] next [13:13:14.741] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:14.741] } [13:13:14.741] NAMES <- toupper(added) [13:13:14.741] for (kk in seq_along(NAMES)) { [13:13:14.741] name <- added[[kk]] [13:13:14.741] NAME <- NAMES[[kk]] [13:13:14.741] if (name != NAME && is.element(NAME, old_names)) [13:13:14.741] next [13:13:14.741] args[[name]] <- "" [13:13:14.741] } [13:13:14.741] NAMES <- toupper(removed) [13:13:14.741] for (kk in seq_along(NAMES)) { [13:13:14.741] name <- removed[[kk]] [13:13:14.741] NAME <- NAMES[[kk]] [13:13:14.741] if (name != NAME && is.element(NAME, old_names)) [13:13:14.741] next [13:13:14.741] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:14.741] } [13:13:14.741] if (length(args) > 0) [13:13:14.741] base::do.call(base::Sys.setenv, args = args) [13:13:14.741] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:14.741] } [13:13:14.741] else { [13:13:14.741] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:14.741] } [13:13:14.741] { [13:13:14.741] if (base::length(...future.futureOptionsAdded) > [13:13:14.741] 0L) { [13:13:14.741] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:14.741] base::names(opts) <- ...future.futureOptionsAdded [13:13:14.741] base::options(opts) [13:13:14.741] } [13:13:14.741] { [13:13:14.741] { [13:13:14.741] NULL [13:13:14.741] RNGkind("Mersenne-Twister") [13:13:14.741] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:14.741] inherits = FALSE) [13:13:14.741] } [13:13:14.741] options(future.plan = NULL) [13:13:14.741] if (is.na(NA_character_)) [13:13:14.741] Sys.unsetenv("R_FUTURE_PLAN") [13:13:14.741] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:14.741] future::plan(list(function (..., workers = availableCores(), [13:13:14.741] lazy = FALSE, rscript_libs = .libPaths(), [13:13:14.741] envir = parent.frame()) [13:13:14.741] { [13:13:14.741] if (is.function(workers)) [13:13:14.741] workers <- workers() [13:13:14.741] workers <- structure(as.integer(workers), [13:13:14.741] class = class(workers)) [13:13:14.741] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:14.741] workers >= 1) [13:13:14.741] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:14.741] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:14.741] } [13:13:14.741] future <- MultisessionFuture(..., workers = workers, [13:13:14.741] lazy = lazy, rscript_libs = rscript_libs, [13:13:14.741] envir = envir) [13:13:14.741] if (!future$lazy) [13:13:14.741] future <- run(future) [13:13:14.741] invisible(future) [13:13:14.741] }), .cleanup = FALSE, .init = FALSE) [13:13:14.741] } [13:13:14.741] } [13:13:14.741] } [13:13:14.741] }) [13:13:14.741] if (TRUE) { [13:13:14.741] base::sink(type = "output", split = FALSE) [13:13:14.741] if (TRUE) { [13:13:14.741] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:14.741] } [13:13:14.741] else { [13:13:14.741] ...future.result["stdout"] <- base::list(NULL) [13:13:14.741] } [13:13:14.741] base::close(...future.stdout) [13:13:14.741] ...future.stdout <- NULL [13:13:14.741] } [13:13:14.741] ...future.result$conditions <- ...future.conditions [13:13:14.741] ...future.result$finished <- base::Sys.time() [13:13:14.741] ...future.result [13:13:14.741] } [13:13:14.745] assign_globals() ... [13:13:14.745] List of 5 [13:13:14.745] $ ...future.FUN :function (object, ...) [13:13:14.745] $ future.call.arguments : list() [13:13:14.745] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:14.745] $ ...future.elements_ii :List of 3 [13:13:14.745] ..$ :'data.frame': 18 obs. of 2 variables: [13:13:14.745] .. ..$ breaks: num [1:18] 26 30 54 25 70 52 51 26 67 27 ... [13:13:14.745] .. ..$ wool : Factor w/ 2 levels "A","B": 1 1 1 1 1 1 1 1 1 2 ... [13:13:14.745] ..$ :'data.frame': 18 obs. of 2 variables: [13:13:14.745] .. ..$ breaks: num [1:18] 18 21 29 17 12 18 35 30 36 42 ... [13:13:14.745] .. ..$ wool : Factor w/ 2 levels "A","B": 1 1 1 1 1 1 1 1 1 2 ... [13:13:14.745] ..$ :'data.frame': 18 obs. of 2 variables: [13:13:14.745] .. ..$ breaks: num [1:18] 36 21 24 18 10 43 28 15 26 20 ... [13:13:14.745] .. ..$ wool : Factor w/ 2 levels "A","B": 1 1 1 1 1 1 1 1 1 2 ... [13:13:14.745] $ ...future.seeds_ii : NULL [13:13:14.745] $ ...future.globals.maxSize: NULL [13:13:14.745] - attr(*, "where")=List of 5 [13:13:14.745] ..$ ...future.FUN : [13:13:14.745] ..$ future.call.arguments : [13:13:14.745] ..$ ...future.elements_ii : [13:13:14.745] ..$ ...future.seeds_ii : [13:13:14.745] ..$ ...future.globals.maxSize: [13:13:14.745] - attr(*, "resolved")= logi FALSE [13:13:14.745] - attr(*, "total_size")= num 1240 [13:13:14.745] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:14.745] - attr(*, "already-done")= logi TRUE [13:13:14.754] - copied '...future.FUN' to environment [13:13:14.754] - copied 'future.call.arguments' to environment [13:13:14.755] - copied '...future.elements_ii' to environment [13:13:14.755] - copied '...future.seeds_ii' to environment [13:13:14.755] - copied '...future.globals.maxSize' to environment [13:13:14.755] assign_globals() ... done [13:13:14.755] plan(): Setting new future strategy stack: [13:13:14.756] List of future strategies: [13:13:14.756] 1. sequential: [13:13:14.756] - args: function (..., envir = parent.frame(), workers = "") [13:13:14.756] - tweaked: FALSE [13:13:14.756] - call: NULL [13:13:14.756] plan(): nbrOfWorkers() = 1 [13:13:14.759] plan(): Setting new future strategy stack: [13:13:14.759] List of future strategies: [13:13:14.759] 1. multisession: [13:13:14.759] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [13:13:14.759] - tweaked: FALSE [13:13:14.759] - call: plan(strategy) [13:13:14.761] plan(): nbrOfWorkers() = 1 [13:13:14.762] SequentialFuture started (and completed) [13:13:14.762] - Launch lazy future ... done [13:13:14.762] run() for 'SequentialFuture' ... done [13:13:14.762] Created future: [13:13:14.762] SequentialFuture: [13:13:14.762] Label: 'future_by-1' [13:13:14.762] Expression: [13:13:14.762] { [13:13:14.762] do.call(function(...) { [13:13:14.762] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:14.762] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:14.762] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:14.762] on.exit(options(oopts), add = TRUE) [13:13:14.762] } [13:13:14.762] { [13:13:14.762] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:14.762] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:14.762] ...future.FUN(...future.X_jj, ...) [13:13:14.762] }) [13:13:14.762] } [13:13:14.762] }, args = future.call.arguments) [13:13:14.762] } [13:13:14.762] Lazy evaluation: FALSE [13:13:14.762] Asynchronous evaluation: FALSE [13:13:14.762] Local evaluation: TRUE [13:13:14.762] Environment: R_GlobalEnv [13:13:14.762] Capture standard output: TRUE [13:13:14.762] Capture condition classes: 'condition' (excluding 'nothing') [13:13:14.762] Globals: 5 objects totaling 3.79 KiB (function '...future.FUN' of 1.21 KiB, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 2.58 KiB, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:13:14.762] Packages: [13:13:14.762] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:14.762] Resolved: TRUE [13:13:14.762] Value: 4.62 KiB of class 'list' [13:13:14.762] Early signaling: FALSE [13:13:14.762] Owner process: f0659542-730c-c20a-65b3-84f202449c4d [13:13:14.762] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:14.764] Chunk #1 of 1 ... DONE [13:13:14.764] Launching 1 futures (chunks) ... DONE [13:13:14.764] Resolving 1 futures (chunks) ... [13:13:14.828] resolve() on list ... [13:13:14.828] recursive: 0 [13:13:14.828] length: 1 [13:13:14.829] [13:13:14.829] resolved() for 'SequentialFuture' ... [13:13:14.829] - state: 'finished' [13:13:14.829] - run: TRUE [13:13:14.829] - result: 'FutureResult' [13:13:14.830] resolved() for 'SequentialFuture' ... done [13:13:14.830] Future #1 [13:13:14.830] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:14.830] - nx: 1 [13:13:14.830] - relay: TRUE [13:13:14.831] - stdout: TRUE [13:13:14.831] - signal: TRUE [13:13:14.831] - resignal: FALSE [13:13:14.831] - force: TRUE [13:13:14.831] - relayed: [n=1] FALSE [13:13:14.831] - queued futures: [n=1] FALSE [13:13:14.832] - until=1 [13:13:14.832] - relaying element #1 [13:13:14.832] - relayed: [n=1] TRUE [13:13:14.832] - queued futures: [n=1] TRUE [13:13:14.832] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:14.833] length: 0 (resolved future 1) [13:13:14.833] Relaying remaining futures [13:13:14.833] signalConditionsASAP(NULL, pos=0) ... [13:13:14.833] - nx: 1 [13:13:14.833] - relay: TRUE [13:13:14.833] - stdout: TRUE [13:13:14.834] - signal: TRUE [13:13:14.834] - resignal: FALSE [13:13:14.834] - force: TRUE [13:13:14.834] - relayed: [n=1] TRUE [13:13:14.834] - queued futures: [n=1] TRUE - flush all [13:13:14.834] - relayed: [n=1] TRUE [13:13:14.835] - queued futures: [n=1] TRUE [13:13:14.835] signalConditionsASAP(NULL, pos=0) ... done [13:13:14.835] resolve() on list ... DONE [13:13:14.835] - Number of value chunks collected: 1 [13:13:14.836] Resolving 1 futures (chunks) ... DONE [13:13:14.836] Reducing values from 1 chunks ... [13:13:14.836] - Number of values collected after concatenation: 3 [13:13:14.836] - Number of values expected: 3 [13:13:14.836] Reducing values from 1 chunks ... DONE [13:13:14.836] future_lapply() ... DONE [13:13:14.837] future_by_internal() ... DONE [13:13:14.837] future_by_internal() ... [13:13:14.838] future_lapply() ... [13:13:14.841] Number of chunks: 1 [13:13:14.841] getGlobalsAndPackagesXApply() ... [13:13:14.841] - future.globals: TRUE [13:13:14.842] getGlobalsAndPackages() ... [13:13:14.842] Searching for globals... [13:13:14.844] - globals found: [2] 'FUN', 'UseMethod' [13:13:14.844] Searching for globals ... DONE [13:13:14.844] Resolving globals: FALSE [13:13:14.845] The total size of the 1 globals is 1.21 KiB (1240 bytes) [13:13:14.845] The total size of the 1 globals exported for future expression ('FUN(digits = 2L)') is 1.21 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (1.21 KiB of class 'function') [13:13:14.846] - globals: [1] 'FUN' [13:13:14.846] [13:13:14.846] getGlobalsAndPackages() ... DONE [13:13:14.846] - globals found/used: [n=1] 'FUN' [13:13:14.846] - needed namespaces: [n=0] [13:13:14.847] Finding globals ... DONE [13:13:14.847] - use_args: TRUE [13:13:14.847] - Getting '...' globals ... [13:13:14.848] resolve() on list ... [13:13:14.848] recursive: 0 [13:13:14.848] length: 1 [13:13:14.848] elements: '...' [13:13:14.848] length: 0 (resolved future 1) [13:13:14.849] resolve() on list ... DONE [13:13:14.849] - '...' content: [n=1] 'digits' [13:13:14.849] List of 1 [13:13:14.849] $ ...:List of 1 [13:13:14.849] ..$ digits: int 2 [13:13:14.849] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:14.849] - attr(*, "where")=List of 1 [13:13:14.849] ..$ ...: [13:13:14.849] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:14.849] - attr(*, "resolved")= logi TRUE [13:13:14.849] - attr(*, "total_size")= num NA [13:13:14.854] - Getting '...' globals ... DONE [13:13:14.854] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:14.854] List of 2 [13:13:14.854] $ ...future.FUN:function (object, ...) [13:13:14.854] $ ... :List of 1 [13:13:14.854] ..$ digits: int 2 [13:13:14.854] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:14.854] - attr(*, "where")=List of 2 [13:13:14.854] ..$ ...future.FUN: [13:13:14.854] ..$ ... : [13:13:14.854] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:14.854] - attr(*, "resolved")= logi FALSE [13:13:14.854] - attr(*, "total_size")= num 1296 [13:13:14.859] Packages to be attached in all futures: [n=0] [13:13:14.860] getGlobalsAndPackagesXApply() ... DONE [13:13:14.860] Number of futures (= number of chunks): 1 [13:13:14.860] Launching 1 futures (chunks) ... [13:13:14.860] Chunk #1 of 1 ... [13:13:14.861] - Finding globals in 'X' for chunk #1 ... [13:13:14.861] getGlobalsAndPackages() ... [13:13:14.861] Searching for globals... [13:13:14.862] [13:13:14.862] Searching for globals ... DONE [13:13:14.862] - globals: [0] [13:13:14.862] getGlobalsAndPackages() ... DONE [13:13:14.862] + additional globals found: [n=0] [13:13:14.863] + additional namespaces needed: [n=0] [13:13:14.863] - Finding globals in 'X' for chunk #1 ... DONE [13:13:14.863] - seeds: [13:13:14.863] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:14.863] getGlobalsAndPackages() ... [13:13:14.864] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:14.864] Resolving globals: FALSE [13:13:14.864] Tweak future expression to call with '...' arguments ... [13:13:14.864] { [13:13:14.864] do.call(function(...) { [13:13:14.864] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:14.864] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:14.864] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:14.864] on.exit(options(oopts), add = TRUE) [13:13:14.864] } [13:13:14.864] { [13:13:14.864] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:14.864] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:14.864] ...future.FUN(...future.X_jj, ...) [13:13:14.864] }) [13:13:14.864] } [13:13:14.864] }, args = future.call.arguments) [13:13:14.864] } [13:13:14.865] Tweak future expression to call with '...' arguments ... DONE [13:13:14.866] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:14.866] [13:13:14.866] getGlobalsAndPackages() ... DONE [13:13:14.866] run() for 'Future' ... [13:13:14.867] - state: 'created' [13:13:14.867] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:14.870] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:14.870] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:14.870] - Field: 'label' [13:13:14.871] - Field: 'local' [13:13:14.871] - Field: 'owner' [13:13:14.871] - Field: 'envir' [13:13:14.871] - Field: 'packages' [13:13:14.871] - Field: 'gc' [13:13:14.872] - Field: 'conditions' [13:13:14.872] - Field: 'expr' [13:13:14.872] - Field: 'uuid' [13:13:14.872] - Field: 'seed' [13:13:14.872] - Field: 'version' [13:13:14.873] - Field: 'result' [13:13:14.873] - Field: 'asynchronous' [13:13:14.873] - Field: 'calls' [13:13:14.873] - Field: 'globals' [13:13:14.873] - Field: 'stdout' [13:13:14.874] - Field: 'earlySignal' [13:13:14.874] - Field: 'lazy' [13:13:14.874] - Field: 'state' [13:13:14.874] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:14.875] - Launch lazy future ... [13:13:14.875] Packages needed by the future expression (n = 0): [13:13:14.875] Packages needed by future strategies (n = 0): [13:13:14.876] { [13:13:14.876] { [13:13:14.876] { [13:13:14.876] ...future.startTime <- base::Sys.time() [13:13:14.876] { [13:13:14.876] { [13:13:14.876] { [13:13:14.876] base::local({ [13:13:14.876] has_future <- base::requireNamespace("future", [13:13:14.876] quietly = TRUE) [13:13:14.876] if (has_future) { [13:13:14.876] ns <- base::getNamespace("future") [13:13:14.876] version <- ns[[".package"]][["version"]] [13:13:14.876] if (is.null(version)) [13:13:14.876] version <- utils::packageVersion("future") [13:13:14.876] } [13:13:14.876] else { [13:13:14.876] version <- NULL [13:13:14.876] } [13:13:14.876] if (!has_future || version < "1.8.0") { [13:13:14.876] info <- base::c(r_version = base::gsub("R version ", [13:13:14.876] "", base::R.version$version.string), [13:13:14.876] platform = base::sprintf("%s (%s-bit)", [13:13:14.876] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:14.876] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:14.876] "release", "version")], collapse = " "), [13:13:14.876] hostname = base::Sys.info()[["nodename"]]) [13:13:14.876] info <- base::sprintf("%s: %s", base::names(info), [13:13:14.876] info) [13:13:14.876] info <- base::paste(info, collapse = "; ") [13:13:14.876] if (!has_future) { [13:13:14.876] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:14.876] info) [13:13:14.876] } [13:13:14.876] else { [13:13:14.876] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:14.876] info, version) [13:13:14.876] } [13:13:14.876] base::stop(msg) [13:13:14.876] } [13:13:14.876] }) [13:13:14.876] } [13:13:14.876] options(future.plan = NULL) [13:13:14.876] Sys.unsetenv("R_FUTURE_PLAN") [13:13:14.876] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:14.876] } [13:13:14.876] ...future.workdir <- getwd() [13:13:14.876] } [13:13:14.876] ...future.oldOptions <- base::as.list(base::.Options) [13:13:14.876] ...future.oldEnvVars <- base::Sys.getenv() [13:13:14.876] } [13:13:14.876] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:14.876] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:14.876] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:14.876] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:14.876] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:14.876] future.stdout.windows.reencode = NULL, width = 80L) [13:13:14.876] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:14.876] base::names(...future.oldOptions)) [13:13:14.876] } [13:13:14.876] if (FALSE) { [13:13:14.876] } [13:13:14.876] else { [13:13:14.876] if (TRUE) { [13:13:14.876] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:14.876] open = "w") [13:13:14.876] } [13:13:14.876] else { [13:13:14.876] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:14.876] windows = "NUL", "/dev/null"), open = "w") [13:13:14.876] } [13:13:14.876] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:14.876] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:14.876] base::sink(type = "output", split = FALSE) [13:13:14.876] base::close(...future.stdout) [13:13:14.876] }, add = TRUE) [13:13:14.876] } [13:13:14.876] ...future.frame <- base::sys.nframe() [13:13:14.876] ...future.conditions <- base::list() [13:13:14.876] ...future.rng <- base::globalenv()$.Random.seed [13:13:14.876] if (FALSE) { [13:13:14.876] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:14.876] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:14.876] } [13:13:14.876] ...future.result <- base::tryCatch({ [13:13:14.876] base::withCallingHandlers({ [13:13:14.876] ...future.value <- base::withVisible(base::local({ [13:13:14.876] do.call(function(...) { [13:13:14.876] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:14.876] if (!identical(...future.globals.maxSize.org, [13:13:14.876] ...future.globals.maxSize)) { [13:13:14.876] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:14.876] on.exit(options(oopts), add = TRUE) [13:13:14.876] } [13:13:14.876] { [13:13:14.876] lapply(seq_along(...future.elements_ii), [13:13:14.876] FUN = function(jj) { [13:13:14.876] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:14.876] ...future.FUN(...future.X_jj, ...) [13:13:14.876] }) [13:13:14.876] } [13:13:14.876] }, args = future.call.arguments) [13:13:14.876] })) [13:13:14.876] future::FutureResult(value = ...future.value$value, [13:13:14.876] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:14.876] ...future.rng), globalenv = if (FALSE) [13:13:14.876] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:14.876] ...future.globalenv.names)) [13:13:14.876] else NULL, started = ...future.startTime, version = "1.8") [13:13:14.876] }, condition = base::local({ [13:13:14.876] c <- base::c [13:13:14.876] inherits <- base::inherits [13:13:14.876] invokeRestart <- base::invokeRestart [13:13:14.876] length <- base::length [13:13:14.876] list <- base::list [13:13:14.876] seq.int <- base::seq.int [13:13:14.876] signalCondition <- base::signalCondition [13:13:14.876] sys.calls <- base::sys.calls [13:13:14.876] `[[` <- base::`[[` [13:13:14.876] `+` <- base::`+` [13:13:14.876] `<<-` <- base::`<<-` [13:13:14.876] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:14.876] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:14.876] 3L)] [13:13:14.876] } [13:13:14.876] function(cond) { [13:13:14.876] is_error <- inherits(cond, "error") [13:13:14.876] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:14.876] NULL) [13:13:14.876] if (is_error) { [13:13:14.876] sessionInformation <- function() { [13:13:14.876] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:14.876] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:14.876] search = base::search(), system = base::Sys.info()) [13:13:14.876] } [13:13:14.876] ...future.conditions[[length(...future.conditions) + [13:13:14.876] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:14.876] cond$call), session = sessionInformation(), [13:13:14.876] timestamp = base::Sys.time(), signaled = 0L) [13:13:14.876] signalCondition(cond) [13:13:14.876] } [13:13:14.876] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:14.876] "immediateCondition"))) { [13:13:14.876] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:14.876] ...future.conditions[[length(...future.conditions) + [13:13:14.876] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:14.876] if (TRUE && !signal) { [13:13:14.876] muffleCondition <- function (cond, pattern = "^muffle") [13:13:14.876] { [13:13:14.876] inherits <- base::inherits [13:13:14.876] invokeRestart <- base::invokeRestart [13:13:14.876] is.null <- base::is.null [13:13:14.876] muffled <- FALSE [13:13:14.876] if (inherits(cond, "message")) { [13:13:14.876] muffled <- grepl(pattern, "muffleMessage") [13:13:14.876] if (muffled) [13:13:14.876] invokeRestart("muffleMessage") [13:13:14.876] } [13:13:14.876] else if (inherits(cond, "warning")) { [13:13:14.876] muffled <- grepl(pattern, "muffleWarning") [13:13:14.876] if (muffled) [13:13:14.876] invokeRestart("muffleWarning") [13:13:14.876] } [13:13:14.876] else if (inherits(cond, "condition")) { [13:13:14.876] if (!is.null(pattern)) { [13:13:14.876] computeRestarts <- base::computeRestarts [13:13:14.876] grepl <- base::grepl [13:13:14.876] restarts <- computeRestarts(cond) [13:13:14.876] for (restart in restarts) { [13:13:14.876] name <- restart$name [13:13:14.876] if (is.null(name)) [13:13:14.876] next [13:13:14.876] if (!grepl(pattern, name)) [13:13:14.876] next [13:13:14.876] invokeRestart(restart) [13:13:14.876] muffled <- TRUE [13:13:14.876] break [13:13:14.876] } [13:13:14.876] } [13:13:14.876] } [13:13:14.876] invisible(muffled) [13:13:14.876] } [13:13:14.876] muffleCondition(cond, pattern = "^muffle") [13:13:14.876] } [13:13:14.876] } [13:13:14.876] else { [13:13:14.876] if (TRUE) { [13:13:14.876] muffleCondition <- function (cond, pattern = "^muffle") [13:13:14.876] { [13:13:14.876] inherits <- base::inherits [13:13:14.876] invokeRestart <- base::invokeRestart [13:13:14.876] is.null <- base::is.null [13:13:14.876] muffled <- FALSE [13:13:14.876] if (inherits(cond, "message")) { [13:13:14.876] muffled <- grepl(pattern, "muffleMessage") [13:13:14.876] if (muffled) [13:13:14.876] invokeRestart("muffleMessage") [13:13:14.876] } [13:13:14.876] else if (inherits(cond, "warning")) { [13:13:14.876] muffled <- grepl(pattern, "muffleWarning") [13:13:14.876] if (muffled) [13:13:14.876] invokeRestart("muffleWarning") [13:13:14.876] } [13:13:14.876] else if (inherits(cond, "condition")) { [13:13:14.876] if (!is.null(pattern)) { [13:13:14.876] computeRestarts <- base::computeRestarts [13:13:14.876] grepl <- base::grepl [13:13:14.876] restarts <- computeRestarts(cond) [13:13:14.876] for (restart in restarts) { [13:13:14.876] name <- restart$name [13:13:14.876] if (is.null(name)) [13:13:14.876] next [13:13:14.876] if (!grepl(pattern, name)) [13:13:14.876] next [13:13:14.876] invokeRestart(restart) [13:13:14.876] muffled <- TRUE [13:13:14.876] break [13:13:14.876] } [13:13:14.876] } [13:13:14.876] } [13:13:14.876] invisible(muffled) [13:13:14.876] } [13:13:14.876] muffleCondition(cond, pattern = "^muffle") [13:13:14.876] } [13:13:14.876] } [13:13:14.876] } [13:13:14.876] })) [13:13:14.876] }, error = function(ex) { [13:13:14.876] base::structure(base::list(value = NULL, visible = NULL, [13:13:14.876] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:14.876] ...future.rng), started = ...future.startTime, [13:13:14.876] finished = Sys.time(), session_uuid = NA_character_, [13:13:14.876] version = "1.8"), class = "FutureResult") [13:13:14.876] }, finally = { [13:13:14.876] if (!identical(...future.workdir, getwd())) [13:13:14.876] setwd(...future.workdir) [13:13:14.876] { [13:13:14.876] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:14.876] ...future.oldOptions$nwarnings <- NULL [13:13:14.876] } [13:13:14.876] base::options(...future.oldOptions) [13:13:14.876] if (.Platform$OS.type == "windows") { [13:13:14.876] old_names <- names(...future.oldEnvVars) [13:13:14.876] envs <- base::Sys.getenv() [13:13:14.876] names <- names(envs) [13:13:14.876] common <- intersect(names, old_names) [13:13:14.876] added <- setdiff(names, old_names) [13:13:14.876] removed <- setdiff(old_names, names) [13:13:14.876] changed <- common[...future.oldEnvVars[common] != [13:13:14.876] envs[common]] [13:13:14.876] NAMES <- toupper(changed) [13:13:14.876] args <- list() [13:13:14.876] for (kk in seq_along(NAMES)) { [13:13:14.876] name <- changed[[kk]] [13:13:14.876] NAME <- NAMES[[kk]] [13:13:14.876] if (name != NAME && is.element(NAME, old_names)) [13:13:14.876] next [13:13:14.876] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:14.876] } [13:13:14.876] NAMES <- toupper(added) [13:13:14.876] for (kk in seq_along(NAMES)) { [13:13:14.876] name <- added[[kk]] [13:13:14.876] NAME <- NAMES[[kk]] [13:13:14.876] if (name != NAME && is.element(NAME, old_names)) [13:13:14.876] next [13:13:14.876] args[[name]] <- "" [13:13:14.876] } [13:13:14.876] NAMES <- toupper(removed) [13:13:14.876] for (kk in seq_along(NAMES)) { [13:13:14.876] name <- removed[[kk]] [13:13:14.876] NAME <- NAMES[[kk]] [13:13:14.876] if (name != NAME && is.element(NAME, old_names)) [13:13:14.876] next [13:13:14.876] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:14.876] } [13:13:14.876] if (length(args) > 0) [13:13:14.876] base::do.call(base::Sys.setenv, args = args) [13:13:14.876] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:14.876] } [13:13:14.876] else { [13:13:14.876] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:14.876] } [13:13:14.876] { [13:13:14.876] if (base::length(...future.futureOptionsAdded) > [13:13:14.876] 0L) { [13:13:14.876] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:14.876] base::names(opts) <- ...future.futureOptionsAdded [13:13:14.876] base::options(opts) [13:13:14.876] } [13:13:14.876] { [13:13:14.876] { [13:13:14.876] NULL [13:13:14.876] RNGkind("Mersenne-Twister") [13:13:14.876] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:14.876] inherits = FALSE) [13:13:14.876] } [13:13:14.876] options(future.plan = NULL) [13:13:14.876] if (is.na(NA_character_)) [13:13:14.876] Sys.unsetenv("R_FUTURE_PLAN") [13:13:14.876] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:14.876] future::plan(list(function (..., workers = availableCores(), [13:13:14.876] lazy = FALSE, rscript_libs = .libPaths(), [13:13:14.876] envir = parent.frame()) [13:13:14.876] { [13:13:14.876] if (is.function(workers)) [13:13:14.876] workers <- workers() [13:13:14.876] workers <- structure(as.integer(workers), [13:13:14.876] class = class(workers)) [13:13:14.876] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:14.876] workers >= 1) [13:13:14.876] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:14.876] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:14.876] } [13:13:14.876] future <- MultisessionFuture(..., workers = workers, [13:13:14.876] lazy = lazy, rscript_libs = rscript_libs, [13:13:14.876] envir = envir) [13:13:14.876] if (!future$lazy) [13:13:14.876] future <- run(future) [13:13:14.876] invisible(future) [13:13:14.876] }), .cleanup = FALSE, .init = FALSE) [13:13:14.876] } [13:13:14.876] } [13:13:14.876] } [13:13:14.876] }) [13:13:14.876] if (TRUE) { [13:13:14.876] base::sink(type = "output", split = FALSE) [13:13:14.876] if (TRUE) { [13:13:14.876] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:14.876] } [13:13:14.876] else { [13:13:14.876] ...future.result["stdout"] <- base::list(NULL) [13:13:14.876] } [13:13:14.876] base::close(...future.stdout) [13:13:14.876] ...future.stdout <- NULL [13:13:14.876] } [13:13:14.876] ...future.result$conditions <- ...future.conditions [13:13:14.876] ...future.result$finished <- base::Sys.time() [13:13:14.876] ...future.result [13:13:14.876] } [13:13:14.880] assign_globals() ... [13:13:14.880] List of 5 [13:13:14.880] $ ...future.FUN :function (object, ...) [13:13:14.880] $ future.call.arguments :List of 1 [13:13:14.880] ..$ digits: int 2 [13:13:14.880] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:14.880] $ ...future.elements_ii :List of 6 [13:13:14.880] ..$ : num [1:9] 26 30 54 25 70 52 51 26 67 [13:13:14.880] ..$ : num [1:9] 27 14 29 19 29 31 41 20 44 [13:13:14.880] ..$ : num [1:9] 18 21 29 17 12 18 35 30 36 [13:13:14.880] ..$ : num [1:9] 42 26 19 16 39 28 21 39 29 [13:13:14.880] ..$ : num [1:9] 36 21 24 18 10 43 28 15 26 [13:13:14.880] ..$ : num [1:9] 20 21 24 17 13 15 15 16 28 [13:13:14.880] $ ...future.seeds_ii : NULL [13:13:14.880] $ ...future.globals.maxSize: NULL [13:13:14.880] - attr(*, "where")=List of 5 [13:13:14.880] ..$ ...future.FUN : [13:13:14.880] ..$ future.call.arguments : [13:13:14.880] ..$ ...future.elements_ii : [13:13:14.880] ..$ ...future.seeds_ii : [13:13:14.880] ..$ ...future.globals.maxSize: [13:13:14.880] - attr(*, "resolved")= logi FALSE [13:13:14.880] - attr(*, "total_size")= num 1296 [13:13:14.880] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:14.880] - attr(*, "already-done")= logi TRUE [13:13:14.890] - copied '...future.FUN' to environment [13:13:14.891] - copied 'future.call.arguments' to environment [13:13:14.891] - copied '...future.elements_ii' to environment [13:13:14.891] - copied '...future.seeds_ii' to environment [13:13:14.891] - copied '...future.globals.maxSize' to environment [13:13:14.891] assign_globals() ... done [13:13:14.892] plan(): Setting new future strategy stack: [13:13:14.892] List of future strategies: [13:13:14.892] 1. sequential: [13:13:14.892] - args: function (..., envir = parent.frame(), workers = "") [13:13:14.892] - tweaked: FALSE [13:13:14.892] - call: NULL [13:13:14.893] plan(): nbrOfWorkers() = 1 [13:13:14.895] plan(): Setting new future strategy stack: [13:13:14.895] List of future strategies: [13:13:14.895] 1. multisession: [13:13:14.895] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [13:13:14.895] - tweaked: FALSE [13:13:14.895] - call: plan(strategy) [13:13:14.898] plan(): nbrOfWorkers() = 1 [13:13:14.898] SequentialFuture started (and completed) [13:13:14.899] - Launch lazy future ... done [13:13:14.899] run() for 'SequentialFuture' ... done [13:13:14.899] Created future: [13:13:14.899] SequentialFuture: [13:13:14.899] Label: 'future_by-1' [13:13:14.899] Expression: [13:13:14.899] { [13:13:14.899] do.call(function(...) { [13:13:14.899] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:14.899] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:14.899] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:14.899] on.exit(options(oopts), add = TRUE) [13:13:14.899] } [13:13:14.899] { [13:13:14.899] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:14.899] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:14.899] ...future.FUN(...future.X_jj, ...) [13:13:14.899] }) [13:13:14.899] } [13:13:14.899] }, args = future.call.arguments) [13:13:14.899] } [13:13:14.899] Lazy evaluation: FALSE [13:13:14.899] Asynchronous evaluation: FALSE [13:13:14.899] Local evaluation: TRUE [13:13:14.899] Environment: R_GlobalEnv [13:13:14.899] Capture standard output: TRUE [13:13:14.899] Capture condition classes: 'condition' (excluding 'nothing') [13:13:14.899] Globals: 5 objects totaling 2.30 KiB (function '...future.FUN' of 1.21 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 1.03 KiB, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:13:14.899] Packages: [13:13:14.899] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:14.899] Resolved: TRUE [13:13:14.899] Value: 5.48 KiB of class 'list' [13:13:14.899] Early signaling: FALSE [13:13:14.899] Owner process: f0659542-730c-c20a-65b3-84f202449c4d [13:13:14.899] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:14.901] Chunk #1 of 1 ... DONE [13:13:14.901] Launching 1 futures (chunks) ... DONE [13:13:14.901] Resolving 1 futures (chunks) ... [13:13:14.902] resolve() on list ... [13:13:14.902] recursive: 0 [13:13:14.902] length: 1 [13:13:14.902] [13:13:14.902] resolved() for 'SequentialFuture' ... [13:13:14.903] - state: 'finished' [13:13:14.903] - run: TRUE [13:13:14.903] - result: 'FutureResult' [13:13:14.903] resolved() for 'SequentialFuture' ... done [13:13:14.903] Future #1 [13:13:14.904] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:14.904] - nx: 1 [13:13:14.904] - relay: TRUE [13:13:14.904] - stdout: TRUE [13:13:14.904] - signal: TRUE [13:13:14.905] - resignal: FALSE [13:13:14.905] - force: TRUE [13:13:14.905] - relayed: [n=1] FALSE [13:13:14.905] - queued futures: [n=1] FALSE [13:13:14.905] - until=1 [13:13:14.906] - relaying element #1 [13:13:14.906] - relayed: [n=1] TRUE [13:13:14.906] - queued futures: [n=1] TRUE [13:13:14.906] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:14.906] length: 0 (resolved future 1) [13:13:14.907] Relaying remaining futures [13:13:14.907] signalConditionsASAP(NULL, pos=0) ... [13:13:14.907] - nx: 1 [13:13:14.907] - relay: TRUE [13:13:14.907] - stdout: TRUE [13:13:14.907] - signal: TRUE [13:13:14.908] - resignal: FALSE [13:13:14.908] - force: TRUE [13:13:14.908] - relayed: [n=1] TRUE [13:13:14.908] - queued futures: [n=1] TRUE - flush all [13:13:14.908] - relayed: [n=1] TRUE [13:13:14.909] - queued futures: [n=1] TRUE [13:13:14.909] signalConditionsASAP(NULL, pos=0) ... done [13:13:14.909] resolve() on list ... DONE [13:13:14.909] - Number of value chunks collected: 1 [13:13:14.909] Resolving 1 futures (chunks) ... DONE [13:13:14.910] Reducing values from 1 chunks ... [13:13:14.910] - Number of values collected after concatenation: 6 [13:13:14.910] - Number of values expected: 6 [13:13:14.910] Reducing values from 1 chunks ... DONE [13:13:14.910] future_lapply() ... DONE [13:13:14.911] future_by_internal() ... DONE [13:13:14.912] future_by_internal() ... [13:13:14.913] future_lapply() ... [13:13:14.916] Number of chunks: 1 [13:13:14.917] getGlobalsAndPackagesXApply() ... [13:13:14.917] - future.globals: TRUE [13:13:14.917] getGlobalsAndPackages() ... [13:13:14.917] Searching for globals... [13:13:14.919] - globals found: [6] 'FUN', '{', 'lm', '~', 'breaks', 'wool' [13:13:14.920] Searching for globals ... DONE [13:13:14.920] Resolving globals: FALSE [13:13:14.921] The total size of the 1 globals is 5.20 KiB (5328 bytes) [13:13:14.921] The total size of the 1 globals exported for future expression ('FUN(singular.ok = FALSE)') is 5.20 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (5.20 KiB of class 'function') [13:13:14.921] - globals: [1] 'FUN' [13:13:14.922] - packages: [1] 'stats' [13:13:14.922] getGlobalsAndPackages() ... DONE [13:13:14.922] - globals found/used: [n=1] 'FUN' [13:13:14.922] - needed namespaces: [n=1] 'stats' [13:13:14.922] Finding globals ... DONE [13:13:14.923] - use_args: TRUE [13:13:14.923] - Getting '...' globals ... [13:13:14.923] resolve() on list ... [13:13:14.923] recursive: 0 [13:13:14.924] length: 1 [13:13:14.924] elements: '...' [13:13:14.924] length: 0 (resolved future 1) [13:13:14.924] resolve() on list ... DONE [13:13:14.924] - '...' content: [n=1] 'singular.ok' [13:13:14.925] List of 1 [13:13:14.925] $ ...:List of 1 [13:13:14.925] ..$ singular.ok: logi FALSE [13:13:14.925] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:14.925] - attr(*, "where")=List of 1 [13:13:14.925] ..$ ...: [13:13:14.925] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:14.925] - attr(*, "resolved")= logi TRUE [13:13:14.925] - attr(*, "total_size")= num NA [13:13:14.929] - Getting '...' globals ... DONE [13:13:14.929] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:14.930] List of 2 [13:13:14.930] $ ...future.FUN:function (x, ...) [13:13:14.930] $ ... :List of 1 [13:13:14.930] ..$ singular.ok: logi FALSE [13:13:14.930] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:14.930] - attr(*, "where")=List of 2 [13:13:14.930] ..$ ...future.FUN: [13:13:14.930] ..$ ... : [13:13:14.930] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:14.930] - attr(*, "resolved")= logi FALSE [13:13:14.930] - attr(*, "total_size")= num 5384 [13:13:14.935] Packages to be attached in all futures: [n=1] 'stats' [13:13:14.935] getGlobalsAndPackagesXApply() ... DONE [13:13:14.936] Number of futures (= number of chunks): 1 [13:13:14.936] Launching 1 futures (chunks) ... [13:13:14.936] Chunk #1 of 1 ... [13:13:14.936] - Finding globals in 'X' for chunk #1 ... [13:13:14.936] getGlobalsAndPackages() ... [13:13:14.937] Searching for globals... [13:13:14.937] [13:13:14.938] Searching for globals ... DONE [13:13:14.938] - globals: [0] [13:13:14.938] getGlobalsAndPackages() ... DONE [13:13:14.938] + additional globals found: [n=0] [13:13:14.938] + additional namespaces needed: [n=0] [13:13:14.939] - Finding globals in 'X' for chunk #1 ... DONE [13:13:14.939] - seeds: [13:13:14.939] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:14.939] getGlobalsAndPackages() ... [13:13:14.939] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:14.940] Resolving globals: FALSE [13:13:14.940] Tweak future expression to call with '...' arguments ... [13:13:14.940] { [13:13:14.940] do.call(function(...) { [13:13:14.940] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:14.940] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:14.940] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:14.940] on.exit(options(oopts), add = TRUE) [13:13:14.940] } [13:13:14.940] { [13:13:14.940] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:14.940] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:14.940] ...future.FUN(...future.X_jj, ...) [13:13:14.940] }) [13:13:14.940] } [13:13:14.940] }, args = future.call.arguments) [13:13:14.940] } [13:13:14.940] Tweak future expression to call with '...' arguments ... DONE [13:13:14.941] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:14.941] [13:13:14.941] getGlobalsAndPackages() ... DONE [13:13:14.942] run() for 'Future' ... [13:13:14.942] - state: 'created' [13:13:14.942] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:14.945] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:14.945] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:14.946] - Field: 'label' [13:13:14.946] - Field: 'local' [13:13:14.946] - Field: 'owner' [13:13:14.946] - Field: 'envir' [13:13:14.946] - Field: 'packages' [13:13:14.947] - Field: 'gc' [13:13:14.947] - Field: 'conditions' [13:13:14.947] - Field: 'expr' [13:13:14.947] - Field: 'uuid' [13:13:14.947] - Field: 'seed' [13:13:14.948] - Field: 'version' [13:13:14.948] - Field: 'result' [13:13:14.948] - Field: 'asynchronous' [13:13:14.948] - Field: 'calls' [13:13:14.948] - Field: 'globals' [13:13:14.949] - Field: 'stdout' [13:13:14.949] - Field: 'earlySignal' [13:13:14.949] - Field: 'lazy' [13:13:14.949] - Field: 'state' [13:13:14.949] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:14.950] - Launch lazy future ... [13:13:14.950] Packages needed by the future expression (n = 1): 'stats' [13:13:14.950] Packages needed by future strategies (n = 0): [13:13:14.951] { [13:13:14.951] { [13:13:14.951] { [13:13:14.951] ...future.startTime <- base::Sys.time() [13:13:14.951] { [13:13:14.951] { [13:13:14.951] { [13:13:14.951] { [13:13:14.951] base::local({ [13:13:14.951] has_future <- base::requireNamespace("future", [13:13:14.951] quietly = TRUE) [13:13:14.951] if (has_future) { [13:13:14.951] ns <- base::getNamespace("future") [13:13:14.951] version <- ns[[".package"]][["version"]] [13:13:14.951] if (is.null(version)) [13:13:14.951] version <- utils::packageVersion("future") [13:13:14.951] } [13:13:14.951] else { [13:13:14.951] version <- NULL [13:13:14.951] } [13:13:14.951] if (!has_future || version < "1.8.0") { [13:13:14.951] info <- base::c(r_version = base::gsub("R version ", [13:13:14.951] "", base::R.version$version.string), [13:13:14.951] platform = base::sprintf("%s (%s-bit)", [13:13:14.951] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:14.951] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:14.951] "release", "version")], collapse = " "), [13:13:14.951] hostname = base::Sys.info()[["nodename"]]) [13:13:14.951] info <- base::sprintf("%s: %s", base::names(info), [13:13:14.951] info) [13:13:14.951] info <- base::paste(info, collapse = "; ") [13:13:14.951] if (!has_future) { [13:13:14.951] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:14.951] info) [13:13:14.951] } [13:13:14.951] else { [13:13:14.951] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:14.951] info, version) [13:13:14.951] } [13:13:14.951] base::stop(msg) [13:13:14.951] } [13:13:14.951] }) [13:13:14.951] } [13:13:14.951] base::local({ [13:13:14.951] for (pkg in "stats") { [13:13:14.951] base::loadNamespace(pkg) [13:13:14.951] base::library(pkg, character.only = TRUE) [13:13:14.951] } [13:13:14.951] }) [13:13:14.951] } [13:13:14.951] options(future.plan = NULL) [13:13:14.951] Sys.unsetenv("R_FUTURE_PLAN") [13:13:14.951] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:14.951] } [13:13:14.951] ...future.workdir <- getwd() [13:13:14.951] } [13:13:14.951] ...future.oldOptions <- base::as.list(base::.Options) [13:13:14.951] ...future.oldEnvVars <- base::Sys.getenv() [13:13:14.951] } [13:13:14.951] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:14.951] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:14.951] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:14.951] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:14.951] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:14.951] future.stdout.windows.reencode = NULL, width = 80L) [13:13:14.951] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:14.951] base::names(...future.oldOptions)) [13:13:14.951] } [13:13:14.951] if (FALSE) { [13:13:14.951] } [13:13:14.951] else { [13:13:14.951] if (TRUE) { [13:13:14.951] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:14.951] open = "w") [13:13:14.951] } [13:13:14.951] else { [13:13:14.951] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:14.951] windows = "NUL", "/dev/null"), open = "w") [13:13:14.951] } [13:13:14.951] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:14.951] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:14.951] base::sink(type = "output", split = FALSE) [13:13:14.951] base::close(...future.stdout) [13:13:14.951] }, add = TRUE) [13:13:14.951] } [13:13:14.951] ...future.frame <- base::sys.nframe() [13:13:14.951] ...future.conditions <- base::list() [13:13:14.951] ...future.rng <- base::globalenv()$.Random.seed [13:13:14.951] if (FALSE) { [13:13:14.951] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:14.951] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:14.951] } [13:13:14.951] ...future.result <- base::tryCatch({ [13:13:14.951] base::withCallingHandlers({ [13:13:14.951] ...future.value <- base::withVisible(base::local({ [13:13:14.951] do.call(function(...) { [13:13:14.951] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:14.951] if (!identical(...future.globals.maxSize.org, [13:13:14.951] ...future.globals.maxSize)) { [13:13:14.951] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:14.951] on.exit(options(oopts), add = TRUE) [13:13:14.951] } [13:13:14.951] { [13:13:14.951] lapply(seq_along(...future.elements_ii), [13:13:14.951] FUN = function(jj) { [13:13:14.951] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:14.951] ...future.FUN(...future.X_jj, ...) [13:13:14.951] }) [13:13:14.951] } [13:13:14.951] }, args = future.call.arguments) [13:13:14.951] })) [13:13:14.951] future::FutureResult(value = ...future.value$value, [13:13:14.951] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:14.951] ...future.rng), globalenv = if (FALSE) [13:13:14.951] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:14.951] ...future.globalenv.names)) [13:13:14.951] else NULL, started = ...future.startTime, version = "1.8") [13:13:14.951] }, condition = base::local({ [13:13:14.951] c <- base::c [13:13:14.951] inherits <- base::inherits [13:13:14.951] invokeRestart <- base::invokeRestart [13:13:14.951] length <- base::length [13:13:14.951] list <- base::list [13:13:14.951] seq.int <- base::seq.int [13:13:14.951] signalCondition <- base::signalCondition [13:13:14.951] sys.calls <- base::sys.calls [13:13:14.951] `[[` <- base::`[[` [13:13:14.951] `+` <- base::`+` [13:13:14.951] `<<-` <- base::`<<-` [13:13:14.951] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:14.951] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:14.951] 3L)] [13:13:14.951] } [13:13:14.951] function(cond) { [13:13:14.951] is_error <- inherits(cond, "error") [13:13:14.951] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:14.951] NULL) [13:13:14.951] if (is_error) { [13:13:14.951] sessionInformation <- function() { [13:13:14.951] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:14.951] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:14.951] search = base::search(), system = base::Sys.info()) [13:13:14.951] } [13:13:14.951] ...future.conditions[[length(...future.conditions) + [13:13:14.951] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:14.951] cond$call), session = sessionInformation(), [13:13:14.951] timestamp = base::Sys.time(), signaled = 0L) [13:13:14.951] signalCondition(cond) [13:13:14.951] } [13:13:14.951] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:14.951] "immediateCondition"))) { [13:13:14.951] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:14.951] ...future.conditions[[length(...future.conditions) + [13:13:14.951] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:14.951] if (TRUE && !signal) { [13:13:14.951] muffleCondition <- function (cond, pattern = "^muffle") [13:13:14.951] { [13:13:14.951] inherits <- base::inherits [13:13:14.951] invokeRestart <- base::invokeRestart [13:13:14.951] is.null <- base::is.null [13:13:14.951] muffled <- FALSE [13:13:14.951] if (inherits(cond, "message")) { [13:13:14.951] muffled <- grepl(pattern, "muffleMessage") [13:13:14.951] if (muffled) [13:13:14.951] invokeRestart("muffleMessage") [13:13:14.951] } [13:13:14.951] else if (inherits(cond, "warning")) { [13:13:14.951] muffled <- grepl(pattern, "muffleWarning") [13:13:14.951] if (muffled) [13:13:14.951] invokeRestart("muffleWarning") [13:13:14.951] } [13:13:14.951] else if (inherits(cond, "condition")) { [13:13:14.951] if (!is.null(pattern)) { [13:13:14.951] computeRestarts <- base::computeRestarts [13:13:14.951] grepl <- base::grepl [13:13:14.951] restarts <- computeRestarts(cond) [13:13:14.951] for (restart in restarts) { [13:13:14.951] name <- restart$name [13:13:14.951] if (is.null(name)) [13:13:14.951] next [13:13:14.951] if (!grepl(pattern, name)) [13:13:14.951] next [13:13:14.951] invokeRestart(restart) [13:13:14.951] muffled <- TRUE [13:13:14.951] break [13:13:14.951] } [13:13:14.951] } [13:13:14.951] } [13:13:14.951] invisible(muffled) [13:13:14.951] } [13:13:14.951] muffleCondition(cond, pattern = "^muffle") [13:13:14.951] } [13:13:14.951] } [13:13:14.951] else { [13:13:14.951] if (TRUE) { [13:13:14.951] muffleCondition <- function (cond, pattern = "^muffle") [13:13:14.951] { [13:13:14.951] inherits <- base::inherits [13:13:14.951] invokeRestart <- base::invokeRestart [13:13:14.951] is.null <- base::is.null [13:13:14.951] muffled <- FALSE [13:13:14.951] if (inherits(cond, "message")) { [13:13:14.951] muffled <- grepl(pattern, "muffleMessage") [13:13:14.951] if (muffled) [13:13:14.951] invokeRestart("muffleMessage") [13:13:14.951] } [13:13:14.951] else if (inherits(cond, "warning")) { [13:13:14.951] muffled <- grepl(pattern, "muffleWarning") [13:13:14.951] if (muffled) [13:13:14.951] invokeRestart("muffleWarning") [13:13:14.951] } [13:13:14.951] else if (inherits(cond, "condition")) { [13:13:14.951] if (!is.null(pattern)) { [13:13:14.951] computeRestarts <- base::computeRestarts [13:13:14.951] grepl <- base::grepl [13:13:14.951] restarts <- computeRestarts(cond) [13:13:14.951] for (restart in restarts) { [13:13:14.951] name <- restart$name [13:13:14.951] if (is.null(name)) [13:13:14.951] next [13:13:14.951] if (!grepl(pattern, name)) [13:13:14.951] next [13:13:14.951] invokeRestart(restart) [13:13:14.951] muffled <- TRUE [13:13:14.951] break [13:13:14.951] } [13:13:14.951] } [13:13:14.951] } [13:13:14.951] invisible(muffled) [13:13:14.951] } [13:13:14.951] muffleCondition(cond, pattern = "^muffle") [13:13:14.951] } [13:13:14.951] } [13:13:14.951] } [13:13:14.951] })) [13:13:14.951] }, error = function(ex) { [13:13:14.951] base::structure(base::list(value = NULL, visible = NULL, [13:13:14.951] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:14.951] ...future.rng), started = ...future.startTime, [13:13:14.951] finished = Sys.time(), session_uuid = NA_character_, [13:13:14.951] version = "1.8"), class = "FutureResult") [13:13:14.951] }, finally = { [13:13:14.951] if (!identical(...future.workdir, getwd())) [13:13:14.951] setwd(...future.workdir) [13:13:14.951] { [13:13:14.951] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:14.951] ...future.oldOptions$nwarnings <- NULL [13:13:14.951] } [13:13:14.951] base::options(...future.oldOptions) [13:13:14.951] if (.Platform$OS.type == "windows") { [13:13:14.951] old_names <- names(...future.oldEnvVars) [13:13:14.951] envs <- base::Sys.getenv() [13:13:14.951] names <- names(envs) [13:13:14.951] common <- intersect(names, old_names) [13:13:14.951] added <- setdiff(names, old_names) [13:13:14.951] removed <- setdiff(old_names, names) [13:13:14.951] changed <- common[...future.oldEnvVars[common] != [13:13:14.951] envs[common]] [13:13:14.951] NAMES <- toupper(changed) [13:13:14.951] args <- list() [13:13:14.951] for (kk in seq_along(NAMES)) { [13:13:14.951] name <- changed[[kk]] [13:13:14.951] NAME <- NAMES[[kk]] [13:13:14.951] if (name != NAME && is.element(NAME, old_names)) [13:13:14.951] next [13:13:14.951] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:14.951] } [13:13:14.951] NAMES <- toupper(added) [13:13:14.951] for (kk in seq_along(NAMES)) { [13:13:14.951] name <- added[[kk]] [13:13:14.951] NAME <- NAMES[[kk]] [13:13:14.951] if (name != NAME && is.element(NAME, old_names)) [13:13:14.951] next [13:13:14.951] args[[name]] <- "" [13:13:14.951] } [13:13:14.951] NAMES <- toupper(removed) [13:13:14.951] for (kk in seq_along(NAMES)) { [13:13:14.951] name <- removed[[kk]] [13:13:14.951] NAME <- NAMES[[kk]] [13:13:14.951] if (name != NAME && is.element(NAME, old_names)) [13:13:14.951] next [13:13:14.951] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:14.951] } [13:13:14.951] if (length(args) > 0) [13:13:14.951] base::do.call(base::Sys.setenv, args = args) [13:13:14.951] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:14.951] } [13:13:14.951] else { [13:13:14.951] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:14.951] } [13:13:14.951] { [13:13:14.951] if (base::length(...future.futureOptionsAdded) > [13:13:14.951] 0L) { [13:13:14.951] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:14.951] base::names(opts) <- ...future.futureOptionsAdded [13:13:14.951] base::options(opts) [13:13:14.951] } [13:13:14.951] { [13:13:14.951] { [13:13:14.951] NULL [13:13:14.951] RNGkind("Mersenne-Twister") [13:13:14.951] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:14.951] inherits = FALSE) [13:13:14.951] } [13:13:14.951] options(future.plan = NULL) [13:13:14.951] if (is.na(NA_character_)) [13:13:14.951] Sys.unsetenv("R_FUTURE_PLAN") [13:13:14.951] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:14.951] future::plan(list(function (..., workers = availableCores(), [13:13:14.951] lazy = FALSE, rscript_libs = .libPaths(), [13:13:14.951] envir = parent.frame()) [13:13:14.951] { [13:13:14.951] if (is.function(workers)) [13:13:14.951] workers <- workers() [13:13:14.951] workers <- structure(as.integer(workers), [13:13:14.951] class = class(workers)) [13:13:14.951] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:14.951] workers >= 1) [13:13:14.951] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:14.951] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:14.951] } [13:13:14.951] future <- MultisessionFuture(..., workers = workers, [13:13:14.951] lazy = lazy, rscript_libs = rscript_libs, [13:13:14.951] envir = envir) [13:13:14.951] if (!future$lazy) [13:13:14.951] future <- run(future) [13:13:14.951] invisible(future) [13:13:14.951] }), .cleanup = FALSE, .init = FALSE) [13:13:14.951] } [13:13:14.951] } [13:13:14.951] } [13:13:14.951] }) [13:13:14.951] if (TRUE) { [13:13:14.951] base::sink(type = "output", split = FALSE) [13:13:14.951] if (TRUE) { [13:13:14.951] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:14.951] } [13:13:14.951] else { [13:13:14.951] ...future.result["stdout"] <- base::list(NULL) [13:13:14.951] } [13:13:14.951] base::close(...future.stdout) [13:13:14.951] ...future.stdout <- NULL [13:13:14.951] } [13:13:14.951] ...future.result$conditions <- ...future.conditions [13:13:14.951] ...future.result$finished <- base::Sys.time() [13:13:14.951] ...future.result [13:13:14.951] } [13:13:14.955] assign_globals() ... [13:13:14.956] List of 5 [13:13:14.956] $ ...future.FUN :function (x, ...) [13:13:14.956] $ future.call.arguments :List of 1 [13:13:14.956] ..$ singular.ok: logi FALSE [13:13:14.956] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:14.956] $ ...future.elements_ii :List of 3 [13:13:14.956] ..$ :'data.frame': 18 obs. of 3 variables: [13:13:14.956] .. ..$ breaks : num [1:18] 26 30 54 25 70 52 51 26 67 27 ... [13:13:14.956] .. ..$ wool : Factor w/ 2 levels "A","B": 1 1 1 1 1 1 1 1 1 2 ... [13:13:14.956] .. ..$ tension: Factor w/ 3 levels "L","M","H": 1 1 1 1 1 1 1 1 1 1 ... [13:13:14.956] ..$ :'data.frame': 18 obs. of 3 variables: [13:13:14.956] .. ..$ breaks : num [1:18] 18 21 29 17 12 18 35 30 36 42 ... [13:13:14.956] .. ..$ wool : Factor w/ 2 levels "A","B": 1 1 1 1 1 1 1 1 1 2 ... [13:13:14.956] .. ..$ tension: Factor w/ 3 levels "L","M","H": 2 2 2 2 2 2 2 2 2 2 ... [13:13:14.956] ..$ :'data.frame': 18 obs. of 3 variables: [13:13:14.956] .. ..$ breaks : num [1:18] 36 21 24 18 10 43 28 15 26 20 ... [13:13:14.956] .. ..$ wool : Factor w/ 2 levels "A","B": 1 1 1 1 1 1 1 1 1 2 ... [13:13:14.956] .. ..$ tension: Factor w/ 3 levels "L","M","H": 3 3 3 3 3 3 3 3 3 3 ... [13:13:14.956] $ ...future.seeds_ii : NULL [13:13:14.956] $ ...future.globals.maxSize: NULL [13:13:14.956] - attr(*, "where")=List of 5 [13:13:14.956] ..$ ...future.FUN : [13:13:14.956] ..$ future.call.arguments : [13:13:14.956] ..$ ...future.elements_ii : [13:13:14.956] ..$ ...future.seeds_ii : [13:13:14.956] ..$ ...future.globals.maxSize: [13:13:14.956] - attr(*, "resolved")= logi FALSE [13:13:14.956] - attr(*, "total_size")= num 5384 [13:13:14.956] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:14.956] - attr(*, "already-done")= logi TRUE [13:13:14.969] - reassign environment for '...future.FUN' [13:13:14.969] - copied '...future.FUN' to environment [13:13:14.969] - copied 'future.call.arguments' to environment [13:13:14.970] - copied '...future.elements_ii' to environment [13:13:14.970] - copied '...future.seeds_ii' to environment [13:13:14.970] - copied '...future.globals.maxSize' to environment [13:13:14.974] assign_globals() ... done [13:13:14.974] plan(): Setting new future strategy stack: [13:13:14.975] List of future strategies: [13:13:14.975] 1. sequential: [13:13:14.975] - args: function (..., envir = parent.frame(), workers = "") [13:13:14.975] - tweaked: FALSE [13:13:14.975] - call: NULL [13:13:14.975] plan(): nbrOfWorkers() = 1 [13:13:14.980] plan(): Setting new future strategy stack: [13:13:14.980] List of future strategies: [13:13:14.980] 1. multisession: [13:13:14.980] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [13:13:14.980] - tweaked: FALSE [13:13:14.980] - call: plan(strategy) [13:13:14.983] plan(): nbrOfWorkers() = 1 [13:13:14.984] SequentialFuture started (and completed) [13:13:14.984] - Launch lazy future ... done [13:13:14.984] run() for 'SequentialFuture' ... done [13:13:14.984] Created future: [13:13:14.985] SequentialFuture: [13:13:14.985] Label: 'future_by-1' [13:13:14.985] Expression: [13:13:14.985] { [13:13:14.985] do.call(function(...) { [13:13:14.985] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:14.985] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:14.985] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:14.985] on.exit(options(oopts), add = TRUE) [13:13:14.985] } [13:13:14.985] { [13:13:14.985] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:14.985] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:14.985] ...future.FUN(...future.X_jj, ...) [13:13:14.985] }) [13:13:14.985] } [13:13:14.985] }, args = future.call.arguments) [13:13:14.985] } [13:13:14.985] Lazy evaluation: FALSE [13:13:14.985] Asynchronous evaluation: FALSE [13:13:14.985] Local evaluation: TRUE [13:13:14.985] Environment: R_GlobalEnv [13:13:14.985] Capture standard output: TRUE [13:13:14.985] Capture condition classes: 'condition' (excluding 'nothing') [13:13:14.985] Globals: 5 objects totaling 10.06 KiB (function '...future.FUN' of 5.20 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 4.80 KiB, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:13:14.985] Packages: 1 packages ('stats') [13:13:14.985] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:14.985] Resolved: TRUE [13:13:14.985] Value: 26.06 KiB of class 'list' [13:13:14.985] Early signaling: FALSE [13:13:14.985] Owner process: f0659542-730c-c20a-65b3-84f202449c4d [13:13:14.985] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:14.987] Chunk #1 of 1 ... DONE [13:13:14.987] Launching 1 futures (chunks) ... DONE [13:13:14.988] Resolving 1 futures (chunks) ... [13:13:14.988] resolve() on list ... [13:13:14.988] recursive: 0 [13:13:14.988] length: 1 [13:13:14.989] [13:13:14.989] resolved() for 'SequentialFuture' ... [13:13:14.989] - state: 'finished' [13:13:14.989] - run: TRUE [13:13:14.989] - result: 'FutureResult' [13:13:14.990] resolved() for 'SequentialFuture' ... done [13:13:14.990] Future #1 [13:13:14.990] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:14.990] - nx: 1 [13:13:14.991] - relay: TRUE [13:13:14.991] - stdout: TRUE [13:13:14.991] - signal: TRUE [13:13:14.991] - resignal: FALSE [13:13:14.991] - force: TRUE [13:13:14.991] - relayed: [n=1] FALSE [13:13:14.992] - queued futures: [n=1] FALSE [13:13:14.992] - until=1 [13:13:14.992] - relaying element #1 [13:13:14.993] - relayed: [n=1] TRUE [13:13:14.993] - queued futures: [n=1] TRUE [13:13:14.993] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:14.993] length: 0 (resolved future 1) [13:13:14.993] Relaying remaining futures [13:13:14.994] signalConditionsASAP(NULL, pos=0) ... [13:13:14.994] - nx: 1 [13:13:14.994] - relay: TRUE [13:13:14.994] - stdout: TRUE [13:13:14.994] - signal: TRUE [13:13:14.995] - resignal: FALSE [13:13:14.995] - force: TRUE [13:13:14.995] - relayed: [n=1] TRUE [13:13:14.995] - queued futures: [n=1] TRUE - flush all [13:13:14.996] - relayed: [n=1] TRUE [13:13:14.996] - queued futures: [n=1] TRUE [13:13:14.996] signalConditionsASAP(NULL, pos=0) ... done [13:13:14.996] resolve() on list ... DONE [13:13:14.997] - Number of value chunks collected: 1 [13:13:14.997] Resolving 1 futures (chunks) ... DONE [13:13:14.997] Reducing values from 1 chunks ... [13:13:14.997] - Number of values collected after concatenation: 3 [13:13:14.997] - Number of values expected: 3 [13:13:14.998] Reducing values from 1 chunks ... DONE [13:13:14.998] future_lapply() ... DONE [13:13:14.998] future_by_internal() ... DONE [13:13:15.005] future_by_internal() ... [13:13:15.006] future_lapply() ... [13:13:15.009] Number of chunks: 1 [13:13:15.010] getGlobalsAndPackagesXApply() ... [13:13:15.010] - future.globals: TRUE [13:13:15.010] getGlobalsAndPackages() ... [13:13:15.010] Searching for globals... [13:13:15.013] - globals found: [6] 'FUN', '{', 'lm', '~', 'breaks', 'wool' [13:13:15.013] Searching for globals ... DONE [13:13:15.013] Resolving globals: FALSE [13:13:15.014] The total size of the 3 globals is 2.27 KiB (2320 bytes) [13:13:15.015] The total size of the 3 globals exported for future expression ('FUN()') is 2.27 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There are three globals: 'FUN' (1.04 KiB of class 'function'), 'wool' (776 bytes of class 'numeric') and 'breaks' (480 bytes of class 'numeric') [13:13:15.015] - globals: [3] 'FUN', 'breaks', 'wool' [13:13:15.015] - packages: [1] 'stats' [13:13:15.015] getGlobalsAndPackages() ... DONE [13:13:15.015] - globals found/used: [n=3] 'FUN', 'breaks', 'wool' [13:13:15.016] - needed namespaces: [n=1] 'stats' [13:13:15.016] Finding globals ... DONE [13:13:15.016] - use_args: TRUE [13:13:15.016] - Getting '...' globals ... [13:13:15.017] resolve() on list ... [13:13:15.017] recursive: 0 [13:13:15.017] length: 1 [13:13:15.017] elements: '...' [13:13:15.017] length: 0 (resolved future 1) [13:13:15.018] resolve() on list ... DONE [13:13:15.018] - '...' content: [n=0] [13:13:15.018] List of 1 [13:13:15.018] $ ...: list() [13:13:15.018] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:15.018] - attr(*, "where")=List of 1 [13:13:15.018] ..$ ...: [13:13:15.018] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:15.018] - attr(*, "resolved")= logi TRUE [13:13:15.018] - attr(*, "total_size")= num NA [13:13:15.021] - Getting '...' globals ... DONE [13:13:15.021] Globals to be used in all futures (chunks): [n=4] '...future.FUN', 'breaks', 'wool', '...' [13:13:15.021] List of 4 [13:13:15.021] $ ...future.FUN:function (x) [13:13:15.021] $ breaks : num [1:54] 26 30 54 25 70 52 51 26 67 18 ... [13:13:15.021] $ wool : Factor w/ 2 levels "A","B": 1 1 1 1 1 1 1 1 1 1 ... [13:13:15.021] $ ... : list() [13:13:15.021] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:15.021] - attr(*, "where")=List of 4 [13:13:15.021] ..$ ...future.FUN: [13:13:15.021] ..$ breaks : [13:13:15.021] ..$ wool : [13:13:15.021] ..$ ... : [13:13:15.021] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:15.021] - attr(*, "resolved")= logi FALSE [13:13:15.021] - attr(*, "total_size")= num 2320 [13:13:15.026] Packages to be attached in all futures: [n=1] 'stats' [13:13:15.026] getGlobalsAndPackagesXApply() ... DONE [13:13:15.027] Number of futures (= number of chunks): 1 [13:13:15.027] Launching 1 futures (chunks) ... [13:13:15.027] Chunk #1 of 1 ... [13:13:15.027] - Finding globals in 'X' for chunk #1 ... [13:13:15.027] getGlobalsAndPackages() ... [13:13:15.028] Searching for globals... [13:13:15.028] [13:13:15.028] Searching for globals ... DONE [13:13:15.029] - globals: [0] [13:13:15.029] getGlobalsAndPackages() ... DONE [13:13:15.029] + additional globals found: [n=0] [13:13:15.029] + additional namespaces needed: [n=0] [13:13:15.029] - Finding globals in 'X' for chunk #1 ... DONE [13:13:15.029] - seeds: [13:13:15.030] - All globals exported: [n=7] '...future.FUN', 'breaks', 'wool', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:15.030] getGlobalsAndPackages() ... [13:13:15.030] - globals passed as-is: [7] '...future.FUN', 'breaks', 'wool', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:15.030] Resolving globals: FALSE [13:13:15.030] Tweak future expression to call with '...' arguments ... [13:13:15.031] { [13:13:15.031] do.call(function(...) { [13:13:15.031] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:15.031] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:15.031] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:15.031] on.exit(options(oopts), add = TRUE) [13:13:15.031] } [13:13:15.031] { [13:13:15.031] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:15.031] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:15.031] ...future.FUN(...future.X_jj, ...) [13:13:15.031] }) [13:13:15.031] } [13:13:15.031] }, args = future.call.arguments) [13:13:15.031] } [13:13:15.031] Tweak future expression to call with '...' arguments ... DONE [13:13:15.032] - globals: [7] '...future.FUN', 'breaks', 'wool', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:15.032] [13:13:15.032] getGlobalsAndPackages() ... DONE [13:13:15.032] run() for 'Future' ... [13:13:15.032] - state: 'created' [13:13:15.033] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:15.035] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:15.035] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:15.036] - Field: 'label' [13:13:15.036] - Field: 'local' [13:13:15.036] - Field: 'owner' [13:13:15.036] - Field: 'envir' [13:13:15.036] - Field: 'packages' [13:13:15.037] - Field: 'gc' [13:13:15.037] - Field: 'conditions' [13:13:15.037] - Field: 'expr' [13:13:15.037] - Field: 'uuid' [13:13:15.037] - Field: 'seed' [13:13:15.037] - Field: 'version' [13:13:15.038] - Field: 'result' [13:13:15.038] - Field: 'asynchronous' [13:13:15.038] - Field: 'calls' [13:13:15.038] - Field: 'globals' [13:13:15.038] - Field: 'stdout' [13:13:15.039] - Field: 'earlySignal' [13:13:15.039] - Field: 'lazy' [13:13:15.039] - Field: 'state' [13:13:15.039] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:15.039] - Launch lazy future ... [13:13:15.040] Packages needed by the future expression (n = 1): 'stats' [13:13:15.040] Packages needed by future strategies (n = 0): [13:13:15.041] { [13:13:15.041] { [13:13:15.041] { [13:13:15.041] ...future.startTime <- base::Sys.time() [13:13:15.041] { [13:13:15.041] { [13:13:15.041] { [13:13:15.041] { [13:13:15.041] base::local({ [13:13:15.041] has_future <- base::requireNamespace("future", [13:13:15.041] quietly = TRUE) [13:13:15.041] if (has_future) { [13:13:15.041] ns <- base::getNamespace("future") [13:13:15.041] version <- ns[[".package"]][["version"]] [13:13:15.041] if (is.null(version)) [13:13:15.041] version <- utils::packageVersion("future") [13:13:15.041] } [13:13:15.041] else { [13:13:15.041] version <- NULL [13:13:15.041] } [13:13:15.041] if (!has_future || version < "1.8.0") { [13:13:15.041] info <- base::c(r_version = base::gsub("R version ", [13:13:15.041] "", base::R.version$version.string), [13:13:15.041] platform = base::sprintf("%s (%s-bit)", [13:13:15.041] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:15.041] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:15.041] "release", "version")], collapse = " "), [13:13:15.041] hostname = base::Sys.info()[["nodename"]]) [13:13:15.041] info <- base::sprintf("%s: %s", base::names(info), [13:13:15.041] info) [13:13:15.041] info <- base::paste(info, collapse = "; ") [13:13:15.041] if (!has_future) { [13:13:15.041] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:15.041] info) [13:13:15.041] } [13:13:15.041] else { [13:13:15.041] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:15.041] info, version) [13:13:15.041] } [13:13:15.041] base::stop(msg) [13:13:15.041] } [13:13:15.041] }) [13:13:15.041] } [13:13:15.041] base::local({ [13:13:15.041] for (pkg in "stats") { [13:13:15.041] base::loadNamespace(pkg) [13:13:15.041] base::library(pkg, character.only = TRUE) [13:13:15.041] } [13:13:15.041] }) [13:13:15.041] } [13:13:15.041] options(future.plan = NULL) [13:13:15.041] Sys.unsetenv("R_FUTURE_PLAN") [13:13:15.041] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:15.041] } [13:13:15.041] ...future.workdir <- getwd() [13:13:15.041] } [13:13:15.041] ...future.oldOptions <- base::as.list(base::.Options) [13:13:15.041] ...future.oldEnvVars <- base::Sys.getenv() [13:13:15.041] } [13:13:15.041] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:15.041] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:15.041] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:15.041] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:15.041] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:15.041] future.stdout.windows.reencode = NULL, width = 80L) [13:13:15.041] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:15.041] base::names(...future.oldOptions)) [13:13:15.041] } [13:13:15.041] if (FALSE) { [13:13:15.041] } [13:13:15.041] else { [13:13:15.041] if (TRUE) { [13:13:15.041] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:15.041] open = "w") [13:13:15.041] } [13:13:15.041] else { [13:13:15.041] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:15.041] windows = "NUL", "/dev/null"), open = "w") [13:13:15.041] } [13:13:15.041] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:15.041] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:15.041] base::sink(type = "output", split = FALSE) [13:13:15.041] base::close(...future.stdout) [13:13:15.041] }, add = TRUE) [13:13:15.041] } [13:13:15.041] ...future.frame <- base::sys.nframe() [13:13:15.041] ...future.conditions <- base::list() [13:13:15.041] ...future.rng <- base::globalenv()$.Random.seed [13:13:15.041] if (FALSE) { [13:13:15.041] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:15.041] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:15.041] } [13:13:15.041] ...future.result <- base::tryCatch({ [13:13:15.041] base::withCallingHandlers({ [13:13:15.041] ...future.value <- base::withVisible(base::local({ [13:13:15.041] do.call(function(...) { [13:13:15.041] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:15.041] if (!identical(...future.globals.maxSize.org, [13:13:15.041] ...future.globals.maxSize)) { [13:13:15.041] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:15.041] on.exit(options(oopts), add = TRUE) [13:13:15.041] } [13:13:15.041] { [13:13:15.041] lapply(seq_along(...future.elements_ii), [13:13:15.041] FUN = function(jj) { [13:13:15.041] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:15.041] ...future.FUN(...future.X_jj, ...) [13:13:15.041] }) [13:13:15.041] } [13:13:15.041] }, args = future.call.arguments) [13:13:15.041] })) [13:13:15.041] future::FutureResult(value = ...future.value$value, [13:13:15.041] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:15.041] ...future.rng), globalenv = if (FALSE) [13:13:15.041] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:15.041] ...future.globalenv.names)) [13:13:15.041] else NULL, started = ...future.startTime, version = "1.8") [13:13:15.041] }, condition = base::local({ [13:13:15.041] c <- base::c [13:13:15.041] inherits <- base::inherits [13:13:15.041] invokeRestart <- base::invokeRestart [13:13:15.041] length <- base::length [13:13:15.041] list <- base::list [13:13:15.041] seq.int <- base::seq.int [13:13:15.041] signalCondition <- base::signalCondition [13:13:15.041] sys.calls <- base::sys.calls [13:13:15.041] `[[` <- base::`[[` [13:13:15.041] `+` <- base::`+` [13:13:15.041] `<<-` <- base::`<<-` [13:13:15.041] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:15.041] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:15.041] 3L)] [13:13:15.041] } [13:13:15.041] function(cond) { [13:13:15.041] is_error <- inherits(cond, "error") [13:13:15.041] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:15.041] NULL) [13:13:15.041] if (is_error) { [13:13:15.041] sessionInformation <- function() { [13:13:15.041] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:15.041] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:15.041] search = base::search(), system = base::Sys.info()) [13:13:15.041] } [13:13:15.041] ...future.conditions[[length(...future.conditions) + [13:13:15.041] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:15.041] cond$call), session = sessionInformation(), [13:13:15.041] timestamp = base::Sys.time(), signaled = 0L) [13:13:15.041] signalCondition(cond) [13:13:15.041] } [13:13:15.041] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:15.041] "immediateCondition"))) { [13:13:15.041] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:15.041] ...future.conditions[[length(...future.conditions) + [13:13:15.041] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:15.041] if (TRUE && !signal) { [13:13:15.041] muffleCondition <- function (cond, pattern = "^muffle") [13:13:15.041] { [13:13:15.041] inherits <- base::inherits [13:13:15.041] invokeRestart <- base::invokeRestart [13:13:15.041] is.null <- base::is.null [13:13:15.041] muffled <- FALSE [13:13:15.041] if (inherits(cond, "message")) { [13:13:15.041] muffled <- grepl(pattern, "muffleMessage") [13:13:15.041] if (muffled) [13:13:15.041] invokeRestart("muffleMessage") [13:13:15.041] } [13:13:15.041] else if (inherits(cond, "warning")) { [13:13:15.041] muffled <- grepl(pattern, "muffleWarning") [13:13:15.041] if (muffled) [13:13:15.041] invokeRestart("muffleWarning") [13:13:15.041] } [13:13:15.041] else if (inherits(cond, "condition")) { [13:13:15.041] if (!is.null(pattern)) { [13:13:15.041] computeRestarts <- base::computeRestarts [13:13:15.041] grepl <- base::grepl [13:13:15.041] restarts <- computeRestarts(cond) [13:13:15.041] for (restart in restarts) { [13:13:15.041] name <- restart$name [13:13:15.041] if (is.null(name)) [13:13:15.041] next [13:13:15.041] if (!grepl(pattern, name)) [13:13:15.041] next [13:13:15.041] invokeRestart(restart) [13:13:15.041] muffled <- TRUE [13:13:15.041] break [13:13:15.041] } [13:13:15.041] } [13:13:15.041] } [13:13:15.041] invisible(muffled) [13:13:15.041] } [13:13:15.041] muffleCondition(cond, pattern = "^muffle") [13:13:15.041] } [13:13:15.041] } [13:13:15.041] else { [13:13:15.041] if (TRUE) { [13:13:15.041] muffleCondition <- function (cond, pattern = "^muffle") [13:13:15.041] { [13:13:15.041] inherits <- base::inherits [13:13:15.041] invokeRestart <- base::invokeRestart [13:13:15.041] is.null <- base::is.null [13:13:15.041] muffled <- FALSE [13:13:15.041] if (inherits(cond, "message")) { [13:13:15.041] muffled <- grepl(pattern, "muffleMessage") [13:13:15.041] if (muffled) [13:13:15.041] invokeRestart("muffleMessage") [13:13:15.041] } [13:13:15.041] else if (inherits(cond, "warning")) { [13:13:15.041] muffled <- grepl(pattern, "muffleWarning") [13:13:15.041] if (muffled) [13:13:15.041] invokeRestart("muffleWarning") [13:13:15.041] } [13:13:15.041] else if (inherits(cond, "condition")) { [13:13:15.041] if (!is.null(pattern)) { [13:13:15.041] computeRestarts <- base::computeRestarts [13:13:15.041] grepl <- base::grepl [13:13:15.041] restarts <- computeRestarts(cond) [13:13:15.041] for (restart in restarts) { [13:13:15.041] name <- restart$name [13:13:15.041] if (is.null(name)) [13:13:15.041] next [13:13:15.041] if (!grepl(pattern, name)) [13:13:15.041] next [13:13:15.041] invokeRestart(restart) [13:13:15.041] muffled <- TRUE [13:13:15.041] break [13:13:15.041] } [13:13:15.041] } [13:13:15.041] } [13:13:15.041] invisible(muffled) [13:13:15.041] } [13:13:15.041] muffleCondition(cond, pattern = "^muffle") [13:13:15.041] } [13:13:15.041] } [13:13:15.041] } [13:13:15.041] })) [13:13:15.041] }, error = function(ex) { [13:13:15.041] base::structure(base::list(value = NULL, visible = NULL, [13:13:15.041] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:15.041] ...future.rng), started = ...future.startTime, [13:13:15.041] finished = Sys.time(), session_uuid = NA_character_, [13:13:15.041] version = "1.8"), class = "FutureResult") [13:13:15.041] }, finally = { [13:13:15.041] if (!identical(...future.workdir, getwd())) [13:13:15.041] setwd(...future.workdir) [13:13:15.041] { [13:13:15.041] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:15.041] ...future.oldOptions$nwarnings <- NULL [13:13:15.041] } [13:13:15.041] base::options(...future.oldOptions) [13:13:15.041] if (.Platform$OS.type == "windows") { [13:13:15.041] old_names <- names(...future.oldEnvVars) [13:13:15.041] envs <- base::Sys.getenv() [13:13:15.041] names <- names(envs) [13:13:15.041] common <- intersect(names, old_names) [13:13:15.041] added <- setdiff(names, old_names) [13:13:15.041] removed <- setdiff(old_names, names) [13:13:15.041] changed <- common[...future.oldEnvVars[common] != [13:13:15.041] envs[common]] [13:13:15.041] NAMES <- toupper(changed) [13:13:15.041] args <- list() [13:13:15.041] for (kk in seq_along(NAMES)) { [13:13:15.041] name <- changed[[kk]] [13:13:15.041] NAME <- NAMES[[kk]] [13:13:15.041] if (name != NAME && is.element(NAME, old_names)) [13:13:15.041] next [13:13:15.041] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:15.041] } [13:13:15.041] NAMES <- toupper(added) [13:13:15.041] for (kk in seq_along(NAMES)) { [13:13:15.041] name <- added[[kk]] [13:13:15.041] NAME <- NAMES[[kk]] [13:13:15.041] if (name != NAME && is.element(NAME, old_names)) [13:13:15.041] next [13:13:15.041] args[[name]] <- "" [13:13:15.041] } [13:13:15.041] NAMES <- toupper(removed) [13:13:15.041] for (kk in seq_along(NAMES)) { [13:13:15.041] name <- removed[[kk]] [13:13:15.041] NAME <- NAMES[[kk]] [13:13:15.041] if (name != NAME && is.element(NAME, old_names)) [13:13:15.041] next [13:13:15.041] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:15.041] } [13:13:15.041] if (length(args) > 0) [13:13:15.041] base::do.call(base::Sys.setenv, args = args) [13:13:15.041] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:15.041] } [13:13:15.041] else { [13:13:15.041] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:15.041] } [13:13:15.041] { [13:13:15.041] if (base::length(...future.futureOptionsAdded) > [13:13:15.041] 0L) { [13:13:15.041] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:15.041] base::names(opts) <- ...future.futureOptionsAdded [13:13:15.041] base::options(opts) [13:13:15.041] } [13:13:15.041] { [13:13:15.041] { [13:13:15.041] NULL [13:13:15.041] RNGkind("Mersenne-Twister") [13:13:15.041] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:15.041] inherits = FALSE) [13:13:15.041] } [13:13:15.041] options(future.plan = NULL) [13:13:15.041] if (is.na(NA_character_)) [13:13:15.041] Sys.unsetenv("R_FUTURE_PLAN") [13:13:15.041] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:15.041] future::plan(list(function (..., workers = availableCores(), [13:13:15.041] lazy = FALSE, rscript_libs = .libPaths(), [13:13:15.041] envir = parent.frame()) [13:13:15.041] { [13:13:15.041] if (is.function(workers)) [13:13:15.041] workers <- workers() [13:13:15.041] workers <- structure(as.integer(workers), [13:13:15.041] class = class(workers)) [13:13:15.041] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:15.041] workers >= 1) [13:13:15.041] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:15.041] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:15.041] } [13:13:15.041] future <- MultisessionFuture(..., workers = workers, [13:13:15.041] lazy = lazy, rscript_libs = rscript_libs, [13:13:15.041] envir = envir) [13:13:15.041] if (!future$lazy) [13:13:15.041] future <- run(future) [13:13:15.041] invisible(future) [13:13:15.041] }), .cleanup = FALSE, .init = FALSE) [13:13:15.041] } [13:13:15.041] } [13:13:15.041] } [13:13:15.041] }) [13:13:15.041] if (TRUE) { [13:13:15.041] base::sink(type = "output", split = FALSE) [13:13:15.041] if (TRUE) { [13:13:15.041] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:15.041] } [13:13:15.041] else { [13:13:15.041] ...future.result["stdout"] <- base::list(NULL) [13:13:15.041] } [13:13:15.041] base::close(...future.stdout) [13:13:15.041] ...future.stdout <- NULL [13:13:15.041] } [13:13:15.041] ...future.result$conditions <- ...future.conditions [13:13:15.041] ...future.result$finished <- base::Sys.time() [13:13:15.041] ...future.result [13:13:15.041] } [13:13:15.045] assign_globals() ... [13:13:15.045] List of 7 [13:13:15.045] $ ...future.FUN :function (x) [13:13:15.045] $ breaks : num [1:54] 26 30 54 25 70 52 51 26 67 18 ... [13:13:15.045] $ wool : Factor w/ 2 levels "A","B": 1 1 1 1 1 1 1 1 1 1 ... [13:13:15.045] $ future.call.arguments : list() [13:13:15.045] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:15.045] $ ...future.elements_ii :List of 3 [13:13:15.045] ..$ :'data.frame': 18 obs. of 3 variables: [13:13:15.045] .. ..$ breaks : num [1:18] 26 30 54 25 70 52 51 26 67 27 ... [13:13:15.045] .. ..$ wool : Factor w/ 2 levels "A","B": 1 1 1 1 1 1 1 1 1 2 ... [13:13:15.045] .. ..$ tension: Factor w/ 3 levels "L","M","H": 1 1 1 1 1 1 1 1 1 1 ... [13:13:15.045] ..$ :'data.frame': 18 obs. of 3 variables: [13:13:15.045] .. ..$ breaks : num [1:18] 18 21 29 17 12 18 35 30 36 42 ... [13:13:15.045] .. ..$ wool : Factor w/ 2 levels "A","B": 1 1 1 1 1 1 1 1 1 2 ... [13:13:15.045] .. ..$ tension: Factor w/ 3 levels "L","M","H": 2 2 2 2 2 2 2 2 2 2 ... [13:13:15.045] ..$ :'data.frame': 18 obs. of 3 variables: [13:13:15.045] .. ..$ breaks : num [1:18] 36 21 24 18 10 43 28 15 26 20 ... [13:13:15.045] .. ..$ wool : Factor w/ 2 levels "A","B": 1 1 1 1 1 1 1 1 1 2 ... [13:13:15.045] .. ..$ tension: Factor w/ 3 levels "L","M","H": 3 3 3 3 3 3 3 3 3 3 ... [13:13:15.045] $ ...future.seeds_ii : NULL [13:13:15.045] $ ...future.globals.maxSize: NULL [13:13:15.045] - attr(*, "where")=List of 7 [13:13:15.045] ..$ ...future.FUN : [13:13:15.045] ..$ breaks : [13:13:15.045] ..$ wool : [13:13:15.045] ..$ future.call.arguments : [13:13:15.045] ..$ ...future.elements_ii : [13:13:15.045] ..$ ...future.seeds_ii : [13:13:15.045] ..$ ...future.globals.maxSize: [13:13:15.045] - attr(*, "resolved")= logi FALSE [13:13:15.045] - attr(*, "total_size")= num 2320 [13:13:15.045] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:15.045] - attr(*, "already-done")= logi TRUE [13:13:15.057] - reassign environment for '...future.FUN' [13:13:15.057] - copied '...future.FUN' to environment [13:13:15.057] - copied 'breaks' to environment [13:13:15.057] - copied 'wool' to environment [13:13:15.058] - copied 'future.call.arguments' to environment [13:13:15.058] - copied '...future.elements_ii' to environment [13:13:15.058] - copied '...future.seeds_ii' to environment [13:13:15.058] - copied '...future.globals.maxSize' to environment [13:13:15.058] assign_globals() ... done [13:13:15.059] plan(): Setting new future strategy stack: [13:13:15.059] List of future strategies: [13:13:15.059] 1. sequential: [13:13:15.059] - args: function (..., envir = parent.frame(), workers = "") [13:13:15.059] - tweaked: FALSE [13:13:15.059] - call: NULL [13:13:15.060] plan(): nbrOfWorkers() = 1 [13:13:15.064] plan(): Setting new future strategy stack: [13:13:15.064] List of future strategies: [13:13:15.064] 1. multisession: [13:13:15.064] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [13:13:15.064] - tweaked: FALSE [13:13:15.064] - call: plan(strategy) [13:13:15.066] plan(): nbrOfWorkers() = 1 [13:13:15.067] SequentialFuture started (and completed) [13:13:15.067] - Launch lazy future ... done [13:13:15.067] run() for 'SequentialFuture' ... done [13:13:15.067] Created future: [13:13:15.067] SequentialFuture: [13:13:15.067] Label: 'future_by-1' [13:13:15.067] Expression: [13:13:15.067] { [13:13:15.067] do.call(function(...) { [13:13:15.067] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:15.067] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:15.067] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:15.067] on.exit(options(oopts), add = TRUE) [13:13:15.067] } [13:13:15.067] { [13:13:15.067] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:15.067] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:15.067] ...future.FUN(...future.X_jj, ...) [13:13:15.067] }) [13:13:15.067] } [13:13:15.067] }, args = future.call.arguments) [13:13:15.067] } [13:13:15.067] Lazy evaluation: FALSE [13:13:15.067] Asynchronous evaluation: FALSE [13:13:15.067] Local evaluation: TRUE [13:13:15.067] Environment: 0x000001868ba6fbf8 [13:13:15.067] Capture standard output: TRUE [13:13:15.067] Capture condition classes: 'condition' (excluding 'nothing') [13:13:15.067] Globals: 7 objects totaling 7.07 KiB (function '...future.FUN' of 1.04 KiB, numeric 'breaks' of 480 bytes, factor 'wool' of 776 bytes, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 4.80 KiB, ...) [13:13:15.067] Packages: 1 packages ('stats') [13:13:15.067] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:15.067] Resolved: TRUE [13:13:15.067] Value: 25.57 KiB of class 'list' [13:13:15.067] Early signaling: FALSE [13:13:15.067] Owner process: f0659542-730c-c20a-65b3-84f202449c4d [13:13:15.067] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:15.070] Chunk #1 of 1 ... DONE [13:13:15.070] Launching 1 futures (chunks) ... DONE [13:13:15.070] Resolving 1 futures (chunks) ... [13:13:15.070] resolve() on list ... [13:13:15.070] recursive: 0 [13:13:15.070] length: 1 [13:13:15.071] [13:13:15.071] resolved() for 'SequentialFuture' ... [13:13:15.071] - state: 'finished' [13:13:15.071] - run: TRUE [13:13:15.071] - result: 'FutureResult' [13:13:15.072] resolved() for 'SequentialFuture' ... done [13:13:15.072] Future #1 [13:13:15.072] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:15.072] - nx: 1 [13:13:15.072] - relay: TRUE [13:13:15.073] - stdout: TRUE [13:13:15.073] - signal: TRUE [13:13:15.073] - resignal: FALSE [13:13:15.073] - force: TRUE [13:13:15.073] - relayed: [n=1] FALSE [13:13:15.073] - queued futures: [n=1] FALSE [13:13:15.074] - until=1 [13:13:15.074] - relaying element #1 [13:13:15.074] - relayed: [n=1] TRUE [13:13:15.074] - queued futures: [n=1] TRUE [13:13:15.074] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:15.075] length: 0 (resolved future 1) [13:13:15.075] Relaying remaining futures [13:13:15.075] signalConditionsASAP(NULL, pos=0) ... [13:13:15.075] - nx: 1 [13:13:15.075] - relay: TRUE [13:13:15.075] - stdout: TRUE [13:13:15.075] - signal: TRUE [13:13:15.076] - resignal: FALSE [13:13:15.076] - force: TRUE [13:13:15.076] - relayed: [n=1] TRUE [13:13:15.076] - queued futures: [n=1] TRUE - flush all [13:13:15.076] - relayed: [n=1] TRUE [13:13:15.076] - queued futures: [n=1] TRUE [13:13:15.077] signalConditionsASAP(NULL, pos=0) ... done [13:13:15.077] resolve() on list ... DONE [13:13:15.077] - Number of value chunks collected: 1 [13:13:15.077] Resolving 1 futures (chunks) ... DONE [13:13:15.077] Reducing values from 1 chunks ... [13:13:15.078] - Number of values collected after concatenation: 3 [13:13:15.078] - Number of values expected: 3 [13:13:15.078] Reducing values from 1 chunks ... DONE [13:13:15.078] future_lapply() ... DONE [13:13:15.078] future_by_internal() ... DONE [13:13:15.079] future_by_internal() ... [13:13:15.079] future_lapply() ... [13:13:15.082] Number of chunks: 1 [13:13:15.082] getGlobalsAndPackagesXApply() ... [13:13:15.082] - future.globals: TRUE [13:13:15.082] getGlobalsAndPackages() ... [13:13:15.082] Searching for globals... [13:13:15.084] - globals found: [2] 'FUN', 'UseMethod' [13:13:15.084] Searching for globals ... DONE [13:13:15.084] Resolving globals: FALSE [13:13:15.085] The total size of the 1 globals is 1.21 KiB (1240 bytes) [13:13:15.085] The total size of the 1 globals exported for future expression ('FUN()') is 1.21 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (1.21 KiB of class 'function') [13:13:15.085] - globals: [1] 'FUN' [13:13:15.085] [13:13:15.086] getGlobalsAndPackages() ... DONE [13:13:15.086] - globals found/used: [n=1] 'FUN' [13:13:15.086] - needed namespaces: [n=0] [13:13:15.086] Finding globals ... DONE [13:13:15.086] - use_args: TRUE [13:13:15.087] - Getting '...' globals ... [13:13:15.087] resolve() on list ... [13:13:15.087] recursive: 0 [13:13:15.087] length: 1 [13:13:15.087] elements: '...' [13:13:15.088] length: 0 (resolved future 1) [13:13:15.088] resolve() on list ... DONE [13:13:15.088] - '...' content: [n=0] [13:13:15.088] List of 1 [13:13:15.088] $ ...: list() [13:13:15.088] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:15.088] - attr(*, "where")=List of 1 [13:13:15.088] ..$ ...: [13:13:15.088] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:15.088] - attr(*, "resolved")= logi TRUE [13:13:15.088] - attr(*, "total_size")= num NA [13:13:15.091] - Getting '...' globals ... DONE [13:13:15.091] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:15.092] List of 2 [13:13:15.092] $ ...future.FUN:function (object, ...) [13:13:15.092] $ ... : list() [13:13:15.092] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:15.092] - attr(*, "where")=List of 2 [13:13:15.092] ..$ ...future.FUN: [13:13:15.092] ..$ ... : [13:13:15.092] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:15.092] - attr(*, "resolved")= logi FALSE [13:13:15.092] - attr(*, "total_size")= num 1240 [13:13:15.095] Packages to be attached in all futures: [n=0] [13:13:15.095] getGlobalsAndPackagesXApply() ... DONE [13:13:15.095] Number of futures (= number of chunks): 1 [13:13:15.096] Launching 1 futures (chunks) ... [13:13:15.099] Chunk #1 of 1 ... [13:13:15.099] - Finding globals in 'X' for chunk #1 ... [13:13:15.099] getGlobalsAndPackages() ... [13:13:15.099] Searching for globals... [13:13:15.100] [13:13:15.100] Searching for globals ... DONE [13:13:15.100] - globals: [0] [13:13:15.100] getGlobalsAndPackages() ... DONE [13:13:15.101] + additional globals found: [n=0] [13:13:15.101] + additional namespaces needed: [n=0] [13:13:15.101] - Finding globals in 'X' for chunk #1 ... DONE [13:13:15.101] - seeds: [13:13:15.101] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:15.102] getGlobalsAndPackages() ... [13:13:15.102] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:15.102] Resolving globals: FALSE [13:13:15.102] Tweak future expression to call with '...' arguments ... [13:13:15.102] { [13:13:15.102] do.call(function(...) { [13:13:15.102] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:15.102] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:15.102] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:15.102] on.exit(options(oopts), add = TRUE) [13:13:15.102] } [13:13:15.102] { [13:13:15.102] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:15.102] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:15.102] ...future.FUN(...future.X_jj, ...) [13:13:15.102] }) [13:13:15.102] } [13:13:15.102] }, args = future.call.arguments) [13:13:15.102] } [13:13:15.103] Tweak future expression to call with '...' arguments ... DONE [13:13:15.103] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:15.104] [13:13:15.104] getGlobalsAndPackages() ... DONE [13:13:15.104] run() for 'Future' ... [13:13:15.104] - state: 'created' [13:13:15.105] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:15.107] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:15.108] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:15.108] - Field: 'label' [13:13:15.108] - Field: 'local' [13:13:15.108] - Field: 'owner' [13:13:15.108] - Field: 'envir' [13:13:15.109] - Field: 'packages' [13:13:15.109] - Field: 'gc' [13:13:15.109] - Field: 'conditions' [13:13:15.109] - Field: 'expr' [13:13:15.109] - Field: 'uuid' [13:13:15.110] - Field: 'seed' [13:13:15.110] - Field: 'version' [13:13:15.110] - Field: 'result' [13:13:15.110] - Field: 'asynchronous' [13:13:15.111] - Field: 'calls' [13:13:15.111] - Field: 'globals' [13:13:15.111] - Field: 'stdout' [13:13:15.111] - Field: 'earlySignal' [13:13:15.111] - Field: 'lazy' [13:13:15.112] - Field: 'state' [13:13:15.112] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:15.112] - Launch lazy future ... [13:13:15.112] Packages needed by the future expression (n = 0): [13:13:15.113] Packages needed by future strategies (n = 0): [13:13:15.114] { [13:13:15.114] { [13:13:15.114] { [13:13:15.114] ...future.startTime <- base::Sys.time() [13:13:15.114] { [13:13:15.114] { [13:13:15.114] { [13:13:15.114] base::local({ [13:13:15.114] has_future <- base::requireNamespace("future", [13:13:15.114] quietly = TRUE) [13:13:15.114] if (has_future) { [13:13:15.114] ns <- base::getNamespace("future") [13:13:15.114] version <- ns[[".package"]][["version"]] [13:13:15.114] if (is.null(version)) [13:13:15.114] version <- utils::packageVersion("future") [13:13:15.114] } [13:13:15.114] else { [13:13:15.114] version <- NULL [13:13:15.114] } [13:13:15.114] if (!has_future || version < "1.8.0") { [13:13:15.114] info <- base::c(r_version = base::gsub("R version ", [13:13:15.114] "", base::R.version$version.string), [13:13:15.114] platform = base::sprintf("%s (%s-bit)", [13:13:15.114] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:15.114] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:15.114] "release", "version")], collapse = " "), [13:13:15.114] hostname = base::Sys.info()[["nodename"]]) [13:13:15.114] info <- base::sprintf("%s: %s", base::names(info), [13:13:15.114] info) [13:13:15.114] info <- base::paste(info, collapse = "; ") [13:13:15.114] if (!has_future) { [13:13:15.114] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:15.114] info) [13:13:15.114] } [13:13:15.114] else { [13:13:15.114] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:15.114] info, version) [13:13:15.114] } [13:13:15.114] base::stop(msg) [13:13:15.114] } [13:13:15.114] }) [13:13:15.114] } [13:13:15.114] options(future.plan = NULL) [13:13:15.114] Sys.unsetenv("R_FUTURE_PLAN") [13:13:15.114] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:15.114] } [13:13:15.114] ...future.workdir <- getwd() [13:13:15.114] } [13:13:15.114] ...future.oldOptions <- base::as.list(base::.Options) [13:13:15.114] ...future.oldEnvVars <- base::Sys.getenv() [13:13:15.114] } [13:13:15.114] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:15.114] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:15.114] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:15.114] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:15.114] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:15.114] future.stdout.windows.reencode = NULL, width = 80L) [13:13:15.114] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:15.114] base::names(...future.oldOptions)) [13:13:15.114] } [13:13:15.114] if (FALSE) { [13:13:15.114] } [13:13:15.114] else { [13:13:15.114] if (TRUE) { [13:13:15.114] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:15.114] open = "w") [13:13:15.114] } [13:13:15.114] else { [13:13:15.114] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:15.114] windows = "NUL", "/dev/null"), open = "w") [13:13:15.114] } [13:13:15.114] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:15.114] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:15.114] base::sink(type = "output", split = FALSE) [13:13:15.114] base::close(...future.stdout) [13:13:15.114] }, add = TRUE) [13:13:15.114] } [13:13:15.114] ...future.frame <- base::sys.nframe() [13:13:15.114] ...future.conditions <- base::list() [13:13:15.114] ...future.rng <- base::globalenv()$.Random.seed [13:13:15.114] if (FALSE) { [13:13:15.114] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:15.114] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:15.114] } [13:13:15.114] ...future.result <- base::tryCatch({ [13:13:15.114] base::withCallingHandlers({ [13:13:15.114] ...future.value <- base::withVisible(base::local({ [13:13:15.114] do.call(function(...) { [13:13:15.114] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:15.114] if (!identical(...future.globals.maxSize.org, [13:13:15.114] ...future.globals.maxSize)) { [13:13:15.114] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:15.114] on.exit(options(oopts), add = TRUE) [13:13:15.114] } [13:13:15.114] { [13:13:15.114] lapply(seq_along(...future.elements_ii), [13:13:15.114] FUN = function(jj) { [13:13:15.114] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:15.114] ...future.FUN(...future.X_jj, ...) [13:13:15.114] }) [13:13:15.114] } [13:13:15.114] }, args = future.call.arguments) [13:13:15.114] })) [13:13:15.114] future::FutureResult(value = ...future.value$value, [13:13:15.114] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:15.114] ...future.rng), globalenv = if (FALSE) [13:13:15.114] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:15.114] ...future.globalenv.names)) [13:13:15.114] else NULL, started = ...future.startTime, version = "1.8") [13:13:15.114] }, condition = base::local({ [13:13:15.114] c <- base::c [13:13:15.114] inherits <- base::inherits [13:13:15.114] invokeRestart <- base::invokeRestart [13:13:15.114] length <- base::length [13:13:15.114] list <- base::list [13:13:15.114] seq.int <- base::seq.int [13:13:15.114] signalCondition <- base::signalCondition [13:13:15.114] sys.calls <- base::sys.calls [13:13:15.114] `[[` <- base::`[[` [13:13:15.114] `+` <- base::`+` [13:13:15.114] `<<-` <- base::`<<-` [13:13:15.114] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:15.114] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:15.114] 3L)] [13:13:15.114] } [13:13:15.114] function(cond) { [13:13:15.114] is_error <- inherits(cond, "error") [13:13:15.114] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:15.114] NULL) [13:13:15.114] if (is_error) { [13:13:15.114] sessionInformation <- function() { [13:13:15.114] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:15.114] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:15.114] search = base::search(), system = base::Sys.info()) [13:13:15.114] } [13:13:15.114] ...future.conditions[[length(...future.conditions) + [13:13:15.114] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:15.114] cond$call), session = sessionInformation(), [13:13:15.114] timestamp = base::Sys.time(), signaled = 0L) [13:13:15.114] signalCondition(cond) [13:13:15.114] } [13:13:15.114] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:15.114] "immediateCondition"))) { [13:13:15.114] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:15.114] ...future.conditions[[length(...future.conditions) + [13:13:15.114] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:15.114] if (TRUE && !signal) { [13:13:15.114] muffleCondition <- function (cond, pattern = "^muffle") [13:13:15.114] { [13:13:15.114] inherits <- base::inherits [13:13:15.114] invokeRestart <- base::invokeRestart [13:13:15.114] is.null <- base::is.null [13:13:15.114] muffled <- FALSE [13:13:15.114] if (inherits(cond, "message")) { [13:13:15.114] muffled <- grepl(pattern, "muffleMessage") [13:13:15.114] if (muffled) [13:13:15.114] invokeRestart("muffleMessage") [13:13:15.114] } [13:13:15.114] else if (inherits(cond, "warning")) { [13:13:15.114] muffled <- grepl(pattern, "muffleWarning") [13:13:15.114] if (muffled) [13:13:15.114] invokeRestart("muffleWarning") [13:13:15.114] } [13:13:15.114] else if (inherits(cond, "condition")) { [13:13:15.114] if (!is.null(pattern)) { [13:13:15.114] computeRestarts <- base::computeRestarts [13:13:15.114] grepl <- base::grepl [13:13:15.114] restarts <- computeRestarts(cond) [13:13:15.114] for (restart in restarts) { [13:13:15.114] name <- restart$name [13:13:15.114] if (is.null(name)) [13:13:15.114] next [13:13:15.114] if (!grepl(pattern, name)) [13:13:15.114] next [13:13:15.114] invokeRestart(restart) [13:13:15.114] muffled <- TRUE [13:13:15.114] break [13:13:15.114] } [13:13:15.114] } [13:13:15.114] } [13:13:15.114] invisible(muffled) [13:13:15.114] } [13:13:15.114] muffleCondition(cond, pattern = "^muffle") [13:13:15.114] } [13:13:15.114] } [13:13:15.114] else { [13:13:15.114] if (TRUE) { [13:13:15.114] muffleCondition <- function (cond, pattern = "^muffle") [13:13:15.114] { [13:13:15.114] inherits <- base::inherits [13:13:15.114] invokeRestart <- base::invokeRestart [13:13:15.114] is.null <- base::is.null [13:13:15.114] muffled <- FALSE [13:13:15.114] if (inherits(cond, "message")) { [13:13:15.114] muffled <- grepl(pattern, "muffleMessage") [13:13:15.114] if (muffled) [13:13:15.114] invokeRestart("muffleMessage") [13:13:15.114] } [13:13:15.114] else if (inherits(cond, "warning")) { [13:13:15.114] muffled <- grepl(pattern, "muffleWarning") [13:13:15.114] if (muffled) [13:13:15.114] invokeRestart("muffleWarning") [13:13:15.114] } [13:13:15.114] else if (inherits(cond, "condition")) { [13:13:15.114] if (!is.null(pattern)) { [13:13:15.114] computeRestarts <- base::computeRestarts [13:13:15.114] grepl <- base::grepl [13:13:15.114] restarts <- computeRestarts(cond) [13:13:15.114] for (restart in restarts) { [13:13:15.114] name <- restart$name [13:13:15.114] if (is.null(name)) [13:13:15.114] next [13:13:15.114] if (!grepl(pattern, name)) [13:13:15.114] next [13:13:15.114] invokeRestart(restart) [13:13:15.114] muffled <- TRUE [13:13:15.114] break [13:13:15.114] } [13:13:15.114] } [13:13:15.114] } [13:13:15.114] invisible(muffled) [13:13:15.114] } [13:13:15.114] muffleCondition(cond, pattern = "^muffle") [13:13:15.114] } [13:13:15.114] } [13:13:15.114] } [13:13:15.114] })) [13:13:15.114] }, error = function(ex) { [13:13:15.114] base::structure(base::list(value = NULL, visible = NULL, [13:13:15.114] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:15.114] ...future.rng), started = ...future.startTime, [13:13:15.114] finished = Sys.time(), session_uuid = NA_character_, [13:13:15.114] version = "1.8"), class = "FutureResult") [13:13:15.114] }, finally = { [13:13:15.114] if (!identical(...future.workdir, getwd())) [13:13:15.114] setwd(...future.workdir) [13:13:15.114] { [13:13:15.114] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:15.114] ...future.oldOptions$nwarnings <- NULL [13:13:15.114] } [13:13:15.114] base::options(...future.oldOptions) [13:13:15.114] if (.Platform$OS.type == "windows") { [13:13:15.114] old_names <- names(...future.oldEnvVars) [13:13:15.114] envs <- base::Sys.getenv() [13:13:15.114] names <- names(envs) [13:13:15.114] common <- intersect(names, old_names) [13:13:15.114] added <- setdiff(names, old_names) [13:13:15.114] removed <- setdiff(old_names, names) [13:13:15.114] changed <- common[...future.oldEnvVars[common] != [13:13:15.114] envs[common]] [13:13:15.114] NAMES <- toupper(changed) [13:13:15.114] args <- list() [13:13:15.114] for (kk in seq_along(NAMES)) { [13:13:15.114] name <- changed[[kk]] [13:13:15.114] NAME <- NAMES[[kk]] [13:13:15.114] if (name != NAME && is.element(NAME, old_names)) [13:13:15.114] next [13:13:15.114] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:15.114] } [13:13:15.114] NAMES <- toupper(added) [13:13:15.114] for (kk in seq_along(NAMES)) { [13:13:15.114] name <- added[[kk]] [13:13:15.114] NAME <- NAMES[[kk]] [13:13:15.114] if (name != NAME && is.element(NAME, old_names)) [13:13:15.114] next [13:13:15.114] args[[name]] <- "" [13:13:15.114] } [13:13:15.114] NAMES <- toupper(removed) [13:13:15.114] for (kk in seq_along(NAMES)) { [13:13:15.114] name <- removed[[kk]] [13:13:15.114] NAME <- NAMES[[kk]] [13:13:15.114] if (name != NAME && is.element(NAME, old_names)) [13:13:15.114] next [13:13:15.114] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:15.114] } [13:13:15.114] if (length(args) > 0) [13:13:15.114] base::do.call(base::Sys.setenv, args = args) [13:13:15.114] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:15.114] } [13:13:15.114] else { [13:13:15.114] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:15.114] } [13:13:15.114] { [13:13:15.114] if (base::length(...future.futureOptionsAdded) > [13:13:15.114] 0L) { [13:13:15.114] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:15.114] base::names(opts) <- ...future.futureOptionsAdded [13:13:15.114] base::options(opts) [13:13:15.114] } [13:13:15.114] { [13:13:15.114] { [13:13:15.114] NULL [13:13:15.114] RNGkind("Mersenne-Twister") [13:13:15.114] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:15.114] inherits = FALSE) [13:13:15.114] } [13:13:15.114] options(future.plan = NULL) [13:13:15.114] if (is.na(NA_character_)) [13:13:15.114] Sys.unsetenv("R_FUTURE_PLAN") [13:13:15.114] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:15.114] future::plan(list(function (..., workers = availableCores(), [13:13:15.114] lazy = FALSE, rscript_libs = .libPaths(), [13:13:15.114] envir = parent.frame()) [13:13:15.114] { [13:13:15.114] if (is.function(workers)) [13:13:15.114] workers <- workers() [13:13:15.114] workers <- structure(as.integer(workers), [13:13:15.114] class = class(workers)) [13:13:15.114] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:15.114] workers >= 1) [13:13:15.114] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:15.114] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:15.114] } [13:13:15.114] future <- MultisessionFuture(..., workers = workers, [13:13:15.114] lazy = lazy, rscript_libs = rscript_libs, [13:13:15.114] envir = envir) [13:13:15.114] if (!future$lazy) [13:13:15.114] future <- run(future) [13:13:15.114] invisible(future) [13:13:15.114] }), .cleanup = FALSE, .init = FALSE) [13:13:15.114] } [13:13:15.114] } [13:13:15.114] } [13:13:15.114] }) [13:13:15.114] if (TRUE) { [13:13:15.114] base::sink(type = "output", split = FALSE) [13:13:15.114] if (TRUE) { [13:13:15.114] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:15.114] } [13:13:15.114] else { [13:13:15.114] ...future.result["stdout"] <- base::list(NULL) [13:13:15.114] } [13:13:15.114] base::close(...future.stdout) [13:13:15.114] ...future.stdout <- NULL [13:13:15.114] } [13:13:15.114] ...future.result$conditions <- ...future.conditions [13:13:15.114] ...future.result$finished <- base::Sys.time() [13:13:15.114] ...future.result [13:13:15.114] } [13:13:15.118] assign_globals() ... [13:13:15.118] List of 5 [13:13:15.118] $ ...future.FUN :function (object, ...) [13:13:15.118] $ future.call.arguments : list() [13:13:15.118] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:15.118] $ ...future.elements_ii :List of 3 [13:13:15.118] ..$ :'data.frame': 18 obs. of 3 variables: [13:13:15.118] .. ..$ breaks : num [1:18] 26 30 54 25 70 52 51 26 67 27 ... [13:13:15.118] .. ..$ wool : Factor w/ 2 levels "A","B": 1 1 1 1 1 1 1 1 1 2 ... [13:13:15.118] .. ..$ tension: Factor w/ 3 levels "L","M","H": 1 1 1 1 1 1 1 1 1 1 ... [13:13:15.118] ..$ :'data.frame': 18 obs. of 3 variables: [13:13:15.118] .. ..$ breaks : num [1:18] 18 21 29 17 12 18 35 30 36 42 ... [13:13:15.118] .. ..$ wool : Factor w/ 2 levels "A","B": 1 1 1 1 1 1 1 1 1 2 ... [13:13:15.118] .. ..$ tension: Factor w/ 3 levels "L","M","H": 2 2 2 2 2 2 2 2 2 2 ... [13:13:15.118] ..$ :'data.frame': 18 obs. of 3 variables: [13:13:15.118] .. ..$ breaks : num [1:18] 36 21 24 18 10 43 28 15 26 20 ... [13:13:15.118] .. ..$ wool : Factor w/ 2 levels "A","B": 1 1 1 1 1 1 1 1 1 2 ... [13:13:15.118] .. ..$ tension: Factor w/ 3 levels "L","M","H": 3 3 3 3 3 3 3 3 3 3 ... [13:13:15.118] $ ...future.seeds_ii : NULL [13:13:15.118] $ ...future.globals.maxSize: NULL [13:13:15.118] - attr(*, "where")=List of 5 [13:13:15.118] ..$ ...future.FUN : [13:13:15.118] ..$ future.call.arguments : [13:13:15.118] ..$ ...future.elements_ii : [13:13:15.118] ..$ ...future.seeds_ii : [13:13:15.118] ..$ ...future.globals.maxSize: [13:13:15.118] - attr(*, "resolved")= logi FALSE [13:13:15.118] - attr(*, "total_size")= num 1240 [13:13:15.118] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:15.118] - attr(*, "already-done")= logi TRUE [13:13:15.132] - copied '...future.FUN' to environment [13:13:15.132] - copied 'future.call.arguments' to environment [13:13:15.132] - copied '...future.elements_ii' to environment [13:13:15.133] - copied '...future.seeds_ii' to environment [13:13:15.133] - copied '...future.globals.maxSize' to environment [13:13:15.133] assign_globals() ... done [13:13:15.134] plan(): Setting new future strategy stack: [13:13:15.134] List of future strategies: [13:13:15.134] 1. sequential: [13:13:15.134] - args: function (..., envir = parent.frame(), workers = "") [13:13:15.134] - tweaked: FALSE [13:13:15.134] - call: NULL [13:13:15.135] plan(): nbrOfWorkers() = 1 [13:13:15.139] plan(): Setting new future strategy stack: [13:13:15.139] List of future strategies: [13:13:15.139] 1. multisession: [13:13:15.139] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [13:13:15.139] - tweaked: FALSE [13:13:15.139] - call: plan(strategy) [13:13:15.142] plan(): nbrOfWorkers() = 1 [13:13:15.142] SequentialFuture started (and completed) [13:13:15.142] - Launch lazy future ... done [13:13:15.143] run() for 'SequentialFuture' ... done [13:13:15.143] Created future: [13:13:15.143] SequentialFuture: [13:13:15.143] Label: 'future_by-1' [13:13:15.143] Expression: [13:13:15.143] { [13:13:15.143] do.call(function(...) { [13:13:15.143] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:15.143] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:15.143] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:15.143] on.exit(options(oopts), add = TRUE) [13:13:15.143] } [13:13:15.143] { [13:13:15.143] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:15.143] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:15.143] ...future.FUN(...future.X_jj, ...) [13:13:15.143] }) [13:13:15.143] } [13:13:15.143] }, args = future.call.arguments) [13:13:15.143] } [13:13:15.143] Lazy evaluation: FALSE [13:13:15.143] Asynchronous evaluation: FALSE [13:13:15.143] Local evaluation: TRUE [13:13:15.143] Environment: 0x000001869124f630 [13:13:15.143] Capture standard output: TRUE [13:13:15.143] Capture condition classes: 'condition' (excluding 'nothing') [13:13:15.143] Globals: 5 objects totaling 6.02 KiB (function '...future.FUN' of 1.21 KiB, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 4.80 KiB, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:13:15.143] Packages: [13:13:15.143] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:15.143] Resolved: TRUE [13:13:15.143] Value: 5.37 KiB of class 'list' [13:13:15.143] Early signaling: FALSE [13:13:15.143] Owner process: f0659542-730c-c20a-65b3-84f202449c4d [13:13:15.143] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:15.145] Chunk #1 of 1 ... DONE [13:13:15.145] Launching 1 futures (chunks) ... DONE [13:13:15.145] Resolving 1 futures (chunks) ... [13:13:15.145] resolve() on list ... [13:13:15.145] recursive: 0 [13:13:15.146] length: 1 [13:13:15.146] [13:13:15.146] resolved() for 'SequentialFuture' ... [13:13:15.146] - state: 'finished' [13:13:15.146] - run: TRUE [13:13:15.147] - result: 'FutureResult' [13:13:15.147] resolved() for 'SequentialFuture' ... done [13:13:15.147] Future #1 [13:13:15.147] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:15.147] - nx: 1 [13:13:15.148] - relay: TRUE [13:13:15.148] - stdout: TRUE [13:13:15.148] - signal: TRUE [13:13:15.148] - resignal: FALSE [13:13:15.148] - force: TRUE [13:13:15.148] - relayed: [n=1] FALSE [13:13:15.148] - queued futures: [n=1] FALSE [13:13:15.149] - until=1 [13:13:15.149] - relaying element #1 [13:13:15.149] - relayed: [n=1] TRUE [13:13:15.149] - queued futures: [n=1] TRUE [13:13:15.149] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:15.150] length: 0 (resolved future 1) [13:13:15.150] Relaying remaining futures [13:13:15.150] signalConditionsASAP(NULL, pos=0) ... [13:13:15.150] - nx: 1 [13:13:15.150] - relay: TRUE [13:13:15.150] - stdout: TRUE [13:13:15.151] - signal: TRUE [13:13:15.151] - resignal: FALSE [13:13:15.151] - force: TRUE [13:13:15.151] - relayed: [n=1] TRUE [13:13:15.151] - queued futures: [n=1] TRUE - flush all [13:13:15.151] - relayed: [n=1] TRUE [13:13:15.152] - queued futures: [n=1] TRUE [13:13:15.152] signalConditionsASAP(NULL, pos=0) ... done [13:13:15.152] resolve() on list ... DONE [13:13:15.152] - Number of value chunks collected: 1 [13:13:15.152] Resolving 1 futures (chunks) ... DONE [13:13:15.152] Reducing values from 1 chunks ... [13:13:15.153] - Number of values collected after concatenation: 3 [13:13:15.153] - Number of values expected: 3 [13:13:15.153] Reducing values from 1 chunks ... DONE [13:13:15.153] future_lapply() ... DONE [13:13:15.153] future_by_internal() ... DONE [13:13:15.154] future_by_internal() ... Warning: Specifying the function 'FUN' for future_by() as a character string is deprecated in future.apply (>= 1.10.0) [2022-11-04], because base::by() does not support it. Instead, specify it as a function, e.g. FUN = sqrt and FUN = `[[`. It is deprecated. [13:13:15.155] future_lapply() ... [13:13:15.158] Number of chunks: 1 [13:13:15.158] getGlobalsAndPackagesXApply() ... [13:13:15.158] - future.globals: TRUE [13:13:15.158] getGlobalsAndPackages() ... [13:13:15.158] Searching for globals... [13:13:15.160] - globals found: [2] 'FUN', 'UseMethod' [13:13:15.160] Searching for globals ... DONE [13:13:15.160] Resolving globals: FALSE [13:13:15.161] The total size of the 1 globals is 1.21 KiB (1240 bytes) [13:13:15.161] The total size of the 1 globals exported for future expression ('FUN()') is 1.21 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (1.21 KiB of class 'function') [13:13:15.161] - globals: [1] 'FUN' [13:13:15.161] [13:13:15.162] getGlobalsAndPackages() ... DONE [13:13:15.162] - globals found/used: [n=1] 'FUN' [13:13:15.162] - needed namespaces: [n=0] [13:13:15.162] Finding globals ... DONE [13:13:15.162] - use_args: TRUE [13:13:15.162] - Getting '...' globals ... [13:13:15.163] resolve() on list ... [13:13:15.163] recursive: 0 [13:13:15.163] length: 1 [13:13:15.163] elements: '...' [13:13:15.163] length: 0 (resolved future 1) [13:13:15.164] resolve() on list ... DONE [13:13:15.164] - '...' content: [n=0] [13:13:15.164] List of 1 [13:13:15.164] $ ...: list() [13:13:15.164] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:15.164] - attr(*, "where")=List of 1 [13:13:15.164] ..$ ...: [13:13:15.164] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:15.164] - attr(*, "resolved")= logi TRUE [13:13:15.164] - attr(*, "total_size")= num NA [13:13:15.167] - Getting '...' globals ... DONE [13:13:15.167] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:15.167] List of 2 [13:13:15.167] $ ...future.FUN:function (object, ...) [13:13:15.167] $ ... : list() [13:13:15.167] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:15.167] - attr(*, "where")=List of 2 [13:13:15.167] ..$ ...future.FUN: [13:13:15.167] ..$ ... : [13:13:15.167] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:15.167] - attr(*, "resolved")= logi FALSE [13:13:15.167] - attr(*, "total_size")= num 1240 [13:13:15.171] Packages to be attached in all futures: [n=0] [13:13:15.171] getGlobalsAndPackagesXApply() ... DONE [13:13:15.171] Number of futures (= number of chunks): 1 [13:13:15.171] Launching 1 futures (chunks) ... [13:13:15.172] Chunk #1 of 1 ... [13:13:15.172] - Finding globals in 'X' for chunk #1 ... [13:13:15.172] getGlobalsAndPackages() ... [13:13:15.172] Searching for globals... [13:13:15.173] [13:13:15.173] Searching for globals ... DONE [13:13:15.173] - globals: [0] [13:13:15.173] getGlobalsAndPackages() ... DONE [13:13:15.173] + additional globals found: [n=0] [13:13:15.173] + additional namespaces needed: [n=0] [13:13:15.174] - Finding globals in 'X' for chunk #1 ... DONE [13:13:15.174] - seeds: [13:13:15.174] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:15.174] getGlobalsAndPackages() ... [13:13:15.174] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:15.174] Resolving globals: FALSE [13:13:15.175] Tweak future expression to call with '...' arguments ... [13:13:15.175] { [13:13:15.175] do.call(function(...) { [13:13:15.175] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:15.175] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:15.175] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:15.175] on.exit(options(oopts), add = TRUE) [13:13:15.175] } [13:13:15.175] { [13:13:15.175] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:15.175] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:15.175] ...future.FUN(...future.X_jj, ...) [13:13:15.175] }) [13:13:15.175] } [13:13:15.175] }, args = future.call.arguments) [13:13:15.175] } [13:13:15.175] Tweak future expression to call with '...' arguments ... DONE [13:13:15.176] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:15.176] [13:13:15.176] getGlobalsAndPackages() ... DONE [13:13:15.176] run() for 'Future' ... [13:13:15.177] - state: 'created' [13:13:15.177] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:15.179] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:15.179] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:15.180] - Field: 'label' [13:13:15.180] - Field: 'local' [13:13:15.180] - Field: 'owner' [13:13:15.180] - Field: 'envir' [13:13:15.180] - Field: 'packages' [13:13:15.181] - Field: 'gc' [13:13:15.181] - Field: 'conditions' [13:13:15.181] - Field: 'expr' [13:13:15.181] - Field: 'uuid' [13:13:15.181] - Field: 'seed' [13:13:15.181] - Field: 'version' [13:13:15.182] - Field: 'result' [13:13:15.182] - Field: 'asynchronous' [13:13:15.182] - Field: 'calls' [13:13:15.182] - Field: 'globals' [13:13:15.182] - Field: 'stdout' [13:13:15.183] - Field: 'earlySignal' [13:13:15.183] - Field: 'lazy' [13:13:15.183] - Field: 'state' [13:13:15.183] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:15.183] - Launch lazy future ... [13:13:15.183] Packages needed by the future expression (n = 0): [13:13:15.184] Packages needed by future strategies (n = 0): [13:13:15.184] { [13:13:15.184] { [13:13:15.184] { [13:13:15.184] ...future.startTime <- base::Sys.time() [13:13:15.184] { [13:13:15.184] { [13:13:15.184] { [13:13:15.184] base::local({ [13:13:15.184] has_future <- base::requireNamespace("future", [13:13:15.184] quietly = TRUE) [13:13:15.184] if (has_future) { [13:13:15.184] ns <- base::getNamespace("future") [13:13:15.184] version <- ns[[".package"]][["version"]] [13:13:15.184] if (is.null(version)) [13:13:15.184] version <- utils::packageVersion("future") [13:13:15.184] } [13:13:15.184] else { [13:13:15.184] version <- NULL [13:13:15.184] } [13:13:15.184] if (!has_future || version < "1.8.0") { [13:13:15.184] info <- base::c(r_version = base::gsub("R version ", [13:13:15.184] "", base::R.version$version.string), [13:13:15.184] platform = base::sprintf("%s (%s-bit)", [13:13:15.184] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:15.184] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:15.184] "release", "version")], collapse = " "), [13:13:15.184] hostname = base::Sys.info()[["nodename"]]) [13:13:15.184] info <- base::sprintf("%s: %s", base::names(info), [13:13:15.184] info) [13:13:15.184] info <- base::paste(info, collapse = "; ") [13:13:15.184] if (!has_future) { [13:13:15.184] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:15.184] info) [13:13:15.184] } [13:13:15.184] else { [13:13:15.184] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:15.184] info, version) [13:13:15.184] } [13:13:15.184] base::stop(msg) [13:13:15.184] } [13:13:15.184] }) [13:13:15.184] } [13:13:15.184] options(future.plan = NULL) [13:13:15.184] Sys.unsetenv("R_FUTURE_PLAN") [13:13:15.184] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:15.184] } [13:13:15.184] ...future.workdir <- getwd() [13:13:15.184] } [13:13:15.184] ...future.oldOptions <- base::as.list(base::.Options) [13:13:15.184] ...future.oldEnvVars <- base::Sys.getenv() [13:13:15.184] } [13:13:15.184] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:15.184] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:15.184] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:15.184] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:15.184] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:15.184] future.stdout.windows.reencode = NULL, width = 80L) [13:13:15.184] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:15.184] base::names(...future.oldOptions)) [13:13:15.184] } [13:13:15.184] if (FALSE) { [13:13:15.184] } [13:13:15.184] else { [13:13:15.184] if (TRUE) { [13:13:15.184] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:15.184] open = "w") [13:13:15.184] } [13:13:15.184] else { [13:13:15.184] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:15.184] windows = "NUL", "/dev/null"), open = "w") [13:13:15.184] } [13:13:15.184] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:15.184] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:15.184] base::sink(type = "output", split = FALSE) [13:13:15.184] base::close(...future.stdout) [13:13:15.184] }, add = TRUE) [13:13:15.184] } [13:13:15.184] ...future.frame <- base::sys.nframe() [13:13:15.184] ...future.conditions <- base::list() [13:13:15.184] ...future.rng <- base::globalenv()$.Random.seed [13:13:15.184] if (FALSE) { [13:13:15.184] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:15.184] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:15.184] } [13:13:15.184] ...future.result <- base::tryCatch({ [13:13:15.184] base::withCallingHandlers({ [13:13:15.184] ...future.value <- base::withVisible(base::local({ [13:13:15.184] do.call(function(...) { [13:13:15.184] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:15.184] if (!identical(...future.globals.maxSize.org, [13:13:15.184] ...future.globals.maxSize)) { [13:13:15.184] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:15.184] on.exit(options(oopts), add = TRUE) [13:13:15.184] } [13:13:15.184] { [13:13:15.184] lapply(seq_along(...future.elements_ii), [13:13:15.184] FUN = function(jj) { [13:13:15.184] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:15.184] ...future.FUN(...future.X_jj, ...) [13:13:15.184] }) [13:13:15.184] } [13:13:15.184] }, args = future.call.arguments) [13:13:15.184] })) [13:13:15.184] future::FutureResult(value = ...future.value$value, [13:13:15.184] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:15.184] ...future.rng), globalenv = if (FALSE) [13:13:15.184] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:15.184] ...future.globalenv.names)) [13:13:15.184] else NULL, started = ...future.startTime, version = "1.8") [13:13:15.184] }, condition = base::local({ [13:13:15.184] c <- base::c [13:13:15.184] inherits <- base::inherits [13:13:15.184] invokeRestart <- base::invokeRestart [13:13:15.184] length <- base::length [13:13:15.184] list <- base::list [13:13:15.184] seq.int <- base::seq.int [13:13:15.184] signalCondition <- base::signalCondition [13:13:15.184] sys.calls <- base::sys.calls [13:13:15.184] `[[` <- base::`[[` [13:13:15.184] `+` <- base::`+` [13:13:15.184] `<<-` <- base::`<<-` [13:13:15.184] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:15.184] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:15.184] 3L)] [13:13:15.184] } [13:13:15.184] function(cond) { [13:13:15.184] is_error <- inherits(cond, "error") [13:13:15.184] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:15.184] NULL) [13:13:15.184] if (is_error) { [13:13:15.184] sessionInformation <- function() { [13:13:15.184] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:15.184] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:15.184] search = base::search(), system = base::Sys.info()) [13:13:15.184] } [13:13:15.184] ...future.conditions[[length(...future.conditions) + [13:13:15.184] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:15.184] cond$call), session = sessionInformation(), [13:13:15.184] timestamp = base::Sys.time(), signaled = 0L) [13:13:15.184] signalCondition(cond) [13:13:15.184] } [13:13:15.184] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:15.184] "immediateCondition"))) { [13:13:15.184] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:15.184] ...future.conditions[[length(...future.conditions) + [13:13:15.184] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:15.184] if (TRUE && !signal) { [13:13:15.184] muffleCondition <- function (cond, pattern = "^muffle") [13:13:15.184] { [13:13:15.184] inherits <- base::inherits [13:13:15.184] invokeRestart <- base::invokeRestart [13:13:15.184] is.null <- base::is.null [13:13:15.184] muffled <- FALSE [13:13:15.184] if (inherits(cond, "message")) { [13:13:15.184] muffled <- grepl(pattern, "muffleMessage") [13:13:15.184] if (muffled) [13:13:15.184] invokeRestart("muffleMessage") [13:13:15.184] } [13:13:15.184] else if (inherits(cond, "warning")) { [13:13:15.184] muffled <- grepl(pattern, "muffleWarning") [13:13:15.184] if (muffled) [13:13:15.184] invokeRestart("muffleWarning") [13:13:15.184] } [13:13:15.184] else if (inherits(cond, "condition")) { [13:13:15.184] if (!is.null(pattern)) { [13:13:15.184] computeRestarts <- base::computeRestarts [13:13:15.184] grepl <- base::grepl [13:13:15.184] restarts <- computeRestarts(cond) [13:13:15.184] for (restart in restarts) { [13:13:15.184] name <- restart$name [13:13:15.184] if (is.null(name)) [13:13:15.184] next [13:13:15.184] if (!grepl(pattern, name)) [13:13:15.184] next [13:13:15.184] invokeRestart(restart) [13:13:15.184] muffled <- TRUE [13:13:15.184] break [13:13:15.184] } [13:13:15.184] } [13:13:15.184] } [13:13:15.184] invisible(muffled) [13:13:15.184] } [13:13:15.184] muffleCondition(cond, pattern = "^muffle") [13:13:15.184] } [13:13:15.184] } [13:13:15.184] else { [13:13:15.184] if (TRUE) { [13:13:15.184] muffleCondition <- function (cond, pattern = "^muffle") [13:13:15.184] { [13:13:15.184] inherits <- base::inherits [13:13:15.184] invokeRestart <- base::invokeRestart [13:13:15.184] is.null <- base::is.null [13:13:15.184] muffled <- FALSE [13:13:15.184] if (inherits(cond, "message")) { [13:13:15.184] muffled <- grepl(pattern, "muffleMessage") [13:13:15.184] if (muffled) [13:13:15.184] invokeRestart("muffleMessage") [13:13:15.184] } [13:13:15.184] else if (inherits(cond, "warning")) { [13:13:15.184] muffled <- grepl(pattern, "muffleWarning") [13:13:15.184] if (muffled) [13:13:15.184] invokeRestart("muffleWarning") [13:13:15.184] } [13:13:15.184] else if (inherits(cond, "condition")) { [13:13:15.184] if (!is.null(pattern)) { [13:13:15.184] computeRestarts <- base::computeRestarts [13:13:15.184] grepl <- base::grepl [13:13:15.184] restarts <- computeRestarts(cond) [13:13:15.184] for (restart in restarts) { [13:13:15.184] name <- restart$name [13:13:15.184] if (is.null(name)) [13:13:15.184] next [13:13:15.184] if (!grepl(pattern, name)) [13:13:15.184] next [13:13:15.184] invokeRestart(restart) [13:13:15.184] muffled <- TRUE [13:13:15.184] break [13:13:15.184] } [13:13:15.184] } [13:13:15.184] } [13:13:15.184] invisible(muffled) [13:13:15.184] } [13:13:15.184] muffleCondition(cond, pattern = "^muffle") [13:13:15.184] } [13:13:15.184] } [13:13:15.184] } [13:13:15.184] })) [13:13:15.184] }, error = function(ex) { [13:13:15.184] base::structure(base::list(value = NULL, visible = NULL, [13:13:15.184] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:15.184] ...future.rng), started = ...future.startTime, [13:13:15.184] finished = Sys.time(), session_uuid = NA_character_, [13:13:15.184] version = "1.8"), class = "FutureResult") [13:13:15.184] }, finally = { [13:13:15.184] if (!identical(...future.workdir, getwd())) [13:13:15.184] setwd(...future.workdir) [13:13:15.184] { [13:13:15.184] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:15.184] ...future.oldOptions$nwarnings <- NULL [13:13:15.184] } [13:13:15.184] base::options(...future.oldOptions) [13:13:15.184] if (.Platform$OS.type == "windows") { [13:13:15.184] old_names <- names(...future.oldEnvVars) [13:13:15.184] envs <- base::Sys.getenv() [13:13:15.184] names <- names(envs) [13:13:15.184] common <- intersect(names, old_names) [13:13:15.184] added <- setdiff(names, old_names) [13:13:15.184] removed <- setdiff(old_names, names) [13:13:15.184] changed <- common[...future.oldEnvVars[common] != [13:13:15.184] envs[common]] [13:13:15.184] NAMES <- toupper(changed) [13:13:15.184] args <- list() [13:13:15.184] for (kk in seq_along(NAMES)) { [13:13:15.184] name <- changed[[kk]] [13:13:15.184] NAME <- NAMES[[kk]] [13:13:15.184] if (name != NAME && is.element(NAME, old_names)) [13:13:15.184] next [13:13:15.184] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:15.184] } [13:13:15.184] NAMES <- toupper(added) [13:13:15.184] for (kk in seq_along(NAMES)) { [13:13:15.184] name <- added[[kk]] [13:13:15.184] NAME <- NAMES[[kk]] [13:13:15.184] if (name != NAME && is.element(NAME, old_names)) [13:13:15.184] next [13:13:15.184] args[[name]] <- "" [13:13:15.184] } [13:13:15.184] NAMES <- toupper(removed) [13:13:15.184] for (kk in seq_along(NAMES)) { [13:13:15.184] name <- removed[[kk]] [13:13:15.184] NAME <- NAMES[[kk]] [13:13:15.184] if (name != NAME && is.element(NAME, old_names)) [13:13:15.184] next [13:13:15.184] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:15.184] } [13:13:15.184] if (length(args) > 0) [13:13:15.184] base::do.call(base::Sys.setenv, args = args) [13:13:15.184] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:15.184] } [13:13:15.184] else { [13:13:15.184] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:15.184] } [13:13:15.184] { [13:13:15.184] if (base::length(...future.futureOptionsAdded) > [13:13:15.184] 0L) { [13:13:15.184] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:15.184] base::names(opts) <- ...future.futureOptionsAdded [13:13:15.184] base::options(opts) [13:13:15.184] } [13:13:15.184] { [13:13:15.184] { [13:13:15.184] NULL [13:13:15.184] RNGkind("Mersenne-Twister") [13:13:15.184] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:15.184] inherits = FALSE) [13:13:15.184] } [13:13:15.184] options(future.plan = NULL) [13:13:15.184] if (is.na(NA_character_)) [13:13:15.184] Sys.unsetenv("R_FUTURE_PLAN") [13:13:15.184] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:15.184] future::plan(list(function (..., workers = availableCores(), [13:13:15.184] lazy = FALSE, rscript_libs = .libPaths(), [13:13:15.184] envir = parent.frame()) [13:13:15.184] { [13:13:15.184] if (is.function(workers)) [13:13:15.184] workers <- workers() [13:13:15.184] workers <- structure(as.integer(workers), [13:13:15.184] class = class(workers)) [13:13:15.184] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:15.184] workers >= 1) [13:13:15.184] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:15.184] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:15.184] } [13:13:15.184] future <- MultisessionFuture(..., workers = workers, [13:13:15.184] lazy = lazy, rscript_libs = rscript_libs, [13:13:15.184] envir = envir) [13:13:15.184] if (!future$lazy) [13:13:15.184] future <- run(future) [13:13:15.184] invisible(future) [13:13:15.184] }), .cleanup = FALSE, .init = FALSE) [13:13:15.184] } [13:13:15.184] } [13:13:15.184] } [13:13:15.184] }) [13:13:15.184] if (TRUE) { [13:13:15.184] base::sink(type = "output", split = FALSE) [13:13:15.184] if (TRUE) { [13:13:15.184] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:15.184] } [13:13:15.184] else { [13:13:15.184] ...future.result["stdout"] <- base::list(NULL) [13:13:15.184] } [13:13:15.184] base::close(...future.stdout) [13:13:15.184] ...future.stdout <- NULL [13:13:15.184] } [13:13:15.184] ...future.result$conditions <- ...future.conditions [13:13:15.184] ...future.result$finished <- base::Sys.time() [13:13:15.184] ...future.result [13:13:15.184] } [13:13:15.188] assign_globals() ... [13:13:15.189] List of 5 [13:13:15.189] $ ...future.FUN :function (object, ...) [13:13:15.189] $ future.call.arguments : list() [13:13:15.189] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:15.189] $ ...future.elements_ii :List of 3 [13:13:15.189] ..$ :'data.frame': 18 obs. of 3 variables: [13:13:15.189] .. ..$ breaks : num [1:18] 26 30 54 25 70 52 51 26 67 27 ... [13:13:15.189] .. ..$ wool : Factor w/ 2 levels "A","B": 1 1 1 1 1 1 1 1 1 2 ... [13:13:15.189] .. ..$ tension: Factor w/ 3 levels "L","M","H": 1 1 1 1 1 1 1 1 1 1 ... [13:13:15.189] ..$ :'data.frame': 18 obs. of 3 variables: [13:13:15.189] .. ..$ breaks : num [1:18] 18 21 29 17 12 18 35 30 36 42 ... [13:13:15.189] .. ..$ wool : Factor w/ 2 levels "A","B": 1 1 1 1 1 1 1 1 1 2 ... [13:13:15.189] .. ..$ tension: Factor w/ 3 levels "L","M","H": 2 2 2 2 2 2 2 2 2 2 ... [13:13:15.189] ..$ :'data.frame': 18 obs. of 3 variables: [13:13:15.189] .. ..$ breaks : num [1:18] 36 21 24 18 10 43 28 15 26 20 ... [13:13:15.189] .. ..$ wool : Factor w/ 2 levels "A","B": 1 1 1 1 1 1 1 1 1 2 ... [13:13:15.189] .. ..$ tension: Factor w/ 3 levels "L","M","H": 3 3 3 3 3 3 3 3 3 3 ... [13:13:15.189] $ ...future.seeds_ii : NULL [13:13:15.189] $ ...future.globals.maxSize: NULL [13:13:15.189] - attr(*, "where")=List of 5 [13:13:15.189] ..$ ...future.FUN : [13:13:15.189] ..$ future.call.arguments : [13:13:15.189] ..$ ...future.elements_ii : [13:13:15.189] ..$ ...future.seeds_ii : [13:13:15.189] ..$ ...future.globals.maxSize: [13:13:15.189] - attr(*, "resolved")= logi FALSE [13:13:15.189] - attr(*, "total_size")= num 1240 [13:13:15.189] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:15.189] - attr(*, "already-done")= logi TRUE [13:13:15.199] - copied '...future.FUN' to environment [13:13:15.199] - copied 'future.call.arguments' to environment [13:13:15.199] - copied '...future.elements_ii' to environment [13:13:15.200] - copied '...future.seeds_ii' to environment [13:13:15.200] - copied '...future.globals.maxSize' to environment [13:13:15.200] assign_globals() ... done [13:13:15.200] plan(): Setting new future strategy stack: [13:13:15.200] List of future strategies: [13:13:15.200] 1. sequential: [13:13:15.200] - args: function (..., envir = parent.frame(), workers = "") [13:13:15.200] - tweaked: FALSE [13:13:15.200] - call: NULL [13:13:15.201] plan(): nbrOfWorkers() = 1 [13:13:15.204] plan(): Setting new future strategy stack: [13:13:15.204] List of future strategies: [13:13:15.204] 1. multisession: [13:13:15.204] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [13:13:15.204] - tweaked: FALSE [13:13:15.204] - call: plan(strategy) [13:13:15.207] plan(): nbrOfWorkers() = 1 [13:13:15.207] SequentialFuture started (and completed) [13:13:15.207] - Launch lazy future ... done [13:13:15.208] run() for 'SequentialFuture' ... done [13:13:15.208] Created future: [13:13:15.208] SequentialFuture: [13:13:15.208] Label: 'future_by-1' [13:13:15.208] Expression: [13:13:15.208] { [13:13:15.208] do.call(function(...) { [13:13:15.208] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:15.208] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:15.208] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:15.208] on.exit(options(oopts), add = TRUE) [13:13:15.208] } [13:13:15.208] { [13:13:15.208] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:15.208] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:15.208] ...future.FUN(...future.X_jj, ...) [13:13:15.208] }) [13:13:15.208] } [13:13:15.208] }, args = future.call.arguments) [13:13:15.208] } [13:13:15.208] Lazy evaluation: FALSE [13:13:15.208] Asynchronous evaluation: FALSE [13:13:15.208] Local evaluation: TRUE [13:13:15.208] Environment: 0x000001868ecbe378 [13:13:15.208] Capture standard output: TRUE [13:13:15.208] Capture condition classes: 'condition' (excluding 'nothing') [13:13:15.208] Globals: 5 objects totaling 6.02 KiB (function '...future.FUN' of 1.21 KiB, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 4.80 KiB, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:13:15.208] Packages: [13:13:15.208] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:15.208] Resolved: TRUE [13:13:15.208] Value: 5.37 KiB of class 'list' [13:13:15.208] Early signaling: FALSE [13:13:15.208] Owner process: f0659542-730c-c20a-65b3-84f202449c4d [13:13:15.208] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:15.210] Chunk #1 of 1 ... DONE [13:13:15.210] Launching 1 futures (chunks) ... DONE [13:13:15.210] Resolving 1 futures (chunks) ... [13:13:15.210] resolve() on list ... [13:13:15.210] recursive: 0 [13:13:15.211] length: 1 [13:13:15.211] [13:13:15.211] resolved() for 'SequentialFuture' ... [13:13:15.211] - state: 'finished' [13:13:15.211] - run: TRUE [13:13:15.212] - result: 'FutureResult' [13:13:15.212] resolved() for 'SequentialFuture' ... done [13:13:15.212] Future #1 [13:13:15.212] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:15.212] - nx: 1 [13:13:15.213] - relay: TRUE [13:13:15.213] - stdout: TRUE [13:13:15.213] - signal: TRUE [13:13:15.213] - resignal: FALSE [13:13:15.213] - force: TRUE [13:13:15.213] - relayed: [n=1] FALSE [13:13:15.213] - queued futures: [n=1] FALSE [13:13:15.214] - until=1 [13:13:15.214] - relaying element #1 [13:13:15.214] - relayed: [n=1] TRUE [13:13:15.214] - queued futures: [n=1] TRUE [13:13:15.214] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:15.215] length: 0 (resolved future 1) [13:13:15.215] Relaying remaining futures [13:13:15.215] signalConditionsASAP(NULL, pos=0) ... [13:13:15.215] - nx: 1 [13:13:15.215] - relay: TRUE [13:13:15.215] - stdout: TRUE [13:13:15.216] - signal: TRUE [13:13:15.216] - resignal: FALSE [13:13:15.216] - force: TRUE [13:13:15.216] - relayed: [n=1] TRUE [13:13:15.216] - queued futures: [n=1] TRUE - flush all [13:13:15.216] - relayed: [n=1] TRUE [13:13:15.217] - queued futures: [n=1] TRUE [13:13:15.217] signalConditionsASAP(NULL, pos=0) ... done [13:13:15.217] resolve() on list ... DONE [13:13:15.217] - Number of value chunks collected: 1 [13:13:15.217] Resolving 1 futures (chunks) ... DONE [13:13:15.217] Reducing values from 1 chunks ... [13:13:15.218] - Number of values collected after concatenation: 3 [13:13:15.218] - Number of values expected: 3 [13:13:15.218] Reducing values from 1 chunks ... DONE [13:13:15.218] future_lapply() ... DONE [13:13:15.218] future_by_internal() ... DONE [13:13:15.219] future_by_internal() ... Testing with 1 cores ... DONE Testing with 2 cores ... - plan('sequential') ... [13:13:15.220] plan(): Setting new future strategy stack: [13:13:15.221] List of future strategies: [13:13:15.221] 1. sequential: [13:13:15.221] - args: function (..., envir = parent.frame(), workers = "") [13:13:15.221] - tweaked: FALSE [13:13:15.221] - call: plan(strategy) [13:13:15.221] plan(): nbrOfWorkers() = 1 [13:13:15.221] future_by_internal() ... [13:13:15.222] future_lapply() ... [13:13:15.223] Number of chunks: 1 [13:13:15.223] getGlobalsAndPackagesXApply() ... [13:13:15.223] - future.globals: TRUE [13:13:15.223] getGlobalsAndPackages() ... [13:13:15.223] Searching for globals... [13:13:15.225] - globals found: [2] 'FUN', 'UseMethod' [13:13:15.225] Searching for globals ... DONE [13:13:15.225] Resolving globals: FALSE [13:13:15.226] The total size of the 1 globals is 1.21 KiB (1240 bytes) [13:13:15.226] The total size of the 1 globals exported for future expression ('FUN()') is 1.21 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (1.21 KiB of class 'function') [13:13:15.226] - globals: [1] 'FUN' [13:13:15.226] [13:13:15.227] getGlobalsAndPackages() ... DONE [13:13:15.227] - globals found/used: [n=1] 'FUN' [13:13:15.227] - needed namespaces: [n=0] [13:13:15.227] Finding globals ... DONE [13:13:15.227] - use_args: TRUE [13:13:15.227] - Getting '...' globals ... [13:13:15.234] resolve() on list ... [13:13:15.234] recursive: 0 [13:13:15.234] length: 1 [13:13:15.235] elements: '...' [13:13:15.235] length: 0 (resolved future 1) [13:13:15.235] resolve() on list ... DONE [13:13:15.235] - '...' content: [n=0] [13:13:15.235] List of 1 [13:13:15.235] $ ...: list() [13:13:15.235] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:15.235] - attr(*, "where")=List of 1 [13:13:15.235] ..$ ...: [13:13:15.235] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:15.235] - attr(*, "resolved")= logi TRUE [13:13:15.235] - attr(*, "total_size")= num NA [13:13:15.239] - Getting '...' globals ... DONE [13:13:15.239] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:15.239] List of 2 [13:13:15.239] $ ...future.FUN:function (object, ...) [13:13:15.239] $ ... : list() [13:13:15.239] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:15.239] - attr(*, "where")=List of 2 [13:13:15.239] ..$ ...future.FUN: [13:13:15.239] ..$ ... : [13:13:15.239] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:15.239] - attr(*, "resolved")= logi FALSE [13:13:15.239] - attr(*, "total_size")= num 1240 [13:13:15.243] Packages to be attached in all futures: [n=0] [13:13:15.244] getGlobalsAndPackagesXApply() ... DONE [13:13:15.244] Number of futures (= number of chunks): 1 [13:13:15.244] Launching 1 futures (chunks) ... [13:13:15.244] Chunk #1 of 1 ... [13:13:15.245] - Finding globals in 'X' for chunk #1 ... [13:13:15.245] getGlobalsAndPackages() ... [13:13:15.245] Searching for globals... [13:13:15.246] [13:13:15.246] Searching for globals ... DONE [13:13:15.246] - globals: [0] [13:13:15.246] getGlobalsAndPackages() ... DONE [13:13:15.247] + additional globals found: [n=0] [13:13:15.247] + additional namespaces needed: [n=0] [13:13:15.247] - Finding globals in 'X' for chunk #1 ... DONE [13:13:15.247] - seeds: [13:13:15.248] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:15.248] getGlobalsAndPackages() ... [13:13:15.248] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:15.248] Resolving globals: FALSE [13:13:15.248] Tweak future expression to call with '...' arguments ... [13:13:15.249] { [13:13:15.249] do.call(function(...) { [13:13:15.249] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:15.249] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:15.249] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:15.249] on.exit(options(oopts), add = TRUE) [13:13:15.249] } [13:13:15.249] { [13:13:15.249] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:15.249] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:15.249] ...future.FUN(...future.X_jj, ...) [13:13:15.249] }) [13:13:15.249] } [13:13:15.249] }, args = future.call.arguments) [13:13:15.249] } [13:13:15.249] Tweak future expression to call with '...' arguments ... DONE [13:13:15.250] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:15.250] [13:13:15.250] getGlobalsAndPackages() ... DONE [13:13:15.251] run() for 'Future' ... [13:13:15.251] - state: 'created' [13:13:15.251] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:13:15.252] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:15.252] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:15.252] - Field: 'label' [13:13:15.252] - Field: 'local' [13:13:15.253] - Field: 'owner' [13:13:15.253] - Field: 'envir' [13:13:15.253] - Field: 'packages' [13:13:15.253] - Field: 'gc' [13:13:15.253] - Field: 'conditions' [13:13:15.254] - Field: 'expr' [13:13:15.254] - Field: 'uuid' [13:13:15.254] - Field: 'seed' [13:13:15.254] - Field: 'version' [13:13:15.255] - Field: 'result' [13:13:15.255] - Field: 'asynchronous' [13:13:15.255] - Field: 'calls' [13:13:15.255] - Field: 'globals' [13:13:15.255] - Field: 'stdout' [13:13:15.256] - Field: 'earlySignal' [13:13:15.256] - Field: 'lazy' [13:13:15.256] - Field: 'state' [13:13:15.256] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:15.257] - Launch lazy future ... [13:13:15.257] Packages needed by the future expression (n = 0): [13:13:15.257] Packages needed by future strategies (n = 0): [13:13:15.258] { [13:13:15.258] { [13:13:15.258] { [13:13:15.258] ...future.startTime <- base::Sys.time() [13:13:15.258] { [13:13:15.258] { [13:13:15.258] { [13:13:15.258] base::local({ [13:13:15.258] has_future <- base::requireNamespace("future", [13:13:15.258] quietly = TRUE) [13:13:15.258] if (has_future) { [13:13:15.258] ns <- base::getNamespace("future") [13:13:15.258] version <- ns[[".package"]][["version"]] [13:13:15.258] if (is.null(version)) [13:13:15.258] version <- utils::packageVersion("future") [13:13:15.258] } [13:13:15.258] else { [13:13:15.258] version <- NULL [13:13:15.258] } [13:13:15.258] if (!has_future || version < "1.8.0") { [13:13:15.258] info <- base::c(r_version = base::gsub("R version ", [13:13:15.258] "", base::R.version$version.string), [13:13:15.258] platform = base::sprintf("%s (%s-bit)", [13:13:15.258] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:15.258] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:15.258] "release", "version")], collapse = " "), [13:13:15.258] hostname = base::Sys.info()[["nodename"]]) [13:13:15.258] info <- base::sprintf("%s: %s", base::names(info), [13:13:15.258] info) [13:13:15.258] info <- base::paste(info, collapse = "; ") [13:13:15.258] if (!has_future) { [13:13:15.258] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:15.258] info) [13:13:15.258] } [13:13:15.258] else { [13:13:15.258] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:15.258] info, version) [13:13:15.258] } [13:13:15.258] base::stop(msg) [13:13:15.258] } [13:13:15.258] }) [13:13:15.258] } [13:13:15.258] options(future.plan = NULL) [13:13:15.258] Sys.unsetenv("R_FUTURE_PLAN") [13:13:15.258] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:15.258] } [13:13:15.258] ...future.workdir <- getwd() [13:13:15.258] } [13:13:15.258] ...future.oldOptions <- base::as.list(base::.Options) [13:13:15.258] ...future.oldEnvVars <- base::Sys.getenv() [13:13:15.258] } [13:13:15.258] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:15.258] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:15.258] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:15.258] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:15.258] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:15.258] future.stdout.windows.reencode = NULL, width = 80L) [13:13:15.258] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:15.258] base::names(...future.oldOptions)) [13:13:15.258] } [13:13:15.258] if (FALSE) { [13:13:15.258] } [13:13:15.258] else { [13:13:15.258] if (TRUE) { [13:13:15.258] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:15.258] open = "w") [13:13:15.258] } [13:13:15.258] else { [13:13:15.258] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:15.258] windows = "NUL", "/dev/null"), open = "w") [13:13:15.258] } [13:13:15.258] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:15.258] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:15.258] base::sink(type = "output", split = FALSE) [13:13:15.258] base::close(...future.stdout) [13:13:15.258] }, add = TRUE) [13:13:15.258] } [13:13:15.258] ...future.frame <- base::sys.nframe() [13:13:15.258] ...future.conditions <- base::list() [13:13:15.258] ...future.rng <- base::globalenv()$.Random.seed [13:13:15.258] if (FALSE) { [13:13:15.258] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:15.258] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:15.258] } [13:13:15.258] ...future.result <- base::tryCatch({ [13:13:15.258] base::withCallingHandlers({ [13:13:15.258] ...future.value <- base::withVisible(base::local({ [13:13:15.258] do.call(function(...) { [13:13:15.258] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:15.258] if (!identical(...future.globals.maxSize.org, [13:13:15.258] ...future.globals.maxSize)) { [13:13:15.258] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:15.258] on.exit(options(oopts), add = TRUE) [13:13:15.258] } [13:13:15.258] { [13:13:15.258] lapply(seq_along(...future.elements_ii), [13:13:15.258] FUN = function(jj) { [13:13:15.258] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:15.258] ...future.FUN(...future.X_jj, ...) [13:13:15.258] }) [13:13:15.258] } [13:13:15.258] }, args = future.call.arguments) [13:13:15.258] })) [13:13:15.258] future::FutureResult(value = ...future.value$value, [13:13:15.258] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:15.258] ...future.rng), globalenv = if (FALSE) [13:13:15.258] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:15.258] ...future.globalenv.names)) [13:13:15.258] else NULL, started = ...future.startTime, version = "1.8") [13:13:15.258] }, condition = base::local({ [13:13:15.258] c <- base::c [13:13:15.258] inherits <- base::inherits [13:13:15.258] invokeRestart <- base::invokeRestart [13:13:15.258] length <- base::length [13:13:15.258] list <- base::list [13:13:15.258] seq.int <- base::seq.int [13:13:15.258] signalCondition <- base::signalCondition [13:13:15.258] sys.calls <- base::sys.calls [13:13:15.258] `[[` <- base::`[[` [13:13:15.258] `+` <- base::`+` [13:13:15.258] `<<-` <- base::`<<-` [13:13:15.258] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:15.258] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:15.258] 3L)] [13:13:15.258] } [13:13:15.258] function(cond) { [13:13:15.258] is_error <- inherits(cond, "error") [13:13:15.258] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:15.258] NULL) [13:13:15.258] if (is_error) { [13:13:15.258] sessionInformation <- function() { [13:13:15.258] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:15.258] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:15.258] search = base::search(), system = base::Sys.info()) [13:13:15.258] } [13:13:15.258] ...future.conditions[[length(...future.conditions) + [13:13:15.258] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:15.258] cond$call), session = sessionInformation(), [13:13:15.258] timestamp = base::Sys.time(), signaled = 0L) [13:13:15.258] signalCondition(cond) [13:13:15.258] } [13:13:15.258] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:15.258] "immediateCondition"))) { [13:13:15.258] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:15.258] ...future.conditions[[length(...future.conditions) + [13:13:15.258] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:15.258] if (TRUE && !signal) { [13:13:15.258] muffleCondition <- function (cond, pattern = "^muffle") [13:13:15.258] { [13:13:15.258] inherits <- base::inherits [13:13:15.258] invokeRestart <- base::invokeRestart [13:13:15.258] is.null <- base::is.null [13:13:15.258] muffled <- FALSE [13:13:15.258] if (inherits(cond, "message")) { [13:13:15.258] muffled <- grepl(pattern, "muffleMessage") [13:13:15.258] if (muffled) [13:13:15.258] invokeRestart("muffleMessage") [13:13:15.258] } [13:13:15.258] else if (inherits(cond, "warning")) { [13:13:15.258] muffled <- grepl(pattern, "muffleWarning") [13:13:15.258] if (muffled) [13:13:15.258] invokeRestart("muffleWarning") [13:13:15.258] } [13:13:15.258] else if (inherits(cond, "condition")) { [13:13:15.258] if (!is.null(pattern)) { [13:13:15.258] computeRestarts <- base::computeRestarts [13:13:15.258] grepl <- base::grepl [13:13:15.258] restarts <- computeRestarts(cond) [13:13:15.258] for (restart in restarts) { [13:13:15.258] name <- restart$name [13:13:15.258] if (is.null(name)) [13:13:15.258] next [13:13:15.258] if (!grepl(pattern, name)) [13:13:15.258] next [13:13:15.258] invokeRestart(restart) [13:13:15.258] muffled <- TRUE [13:13:15.258] break [13:13:15.258] } [13:13:15.258] } [13:13:15.258] } [13:13:15.258] invisible(muffled) [13:13:15.258] } [13:13:15.258] muffleCondition(cond, pattern = "^muffle") [13:13:15.258] } [13:13:15.258] } [13:13:15.258] else { [13:13:15.258] if (TRUE) { [13:13:15.258] muffleCondition <- function (cond, pattern = "^muffle") [13:13:15.258] { [13:13:15.258] inherits <- base::inherits [13:13:15.258] invokeRestart <- base::invokeRestart [13:13:15.258] is.null <- base::is.null [13:13:15.258] muffled <- FALSE [13:13:15.258] if (inherits(cond, "message")) { [13:13:15.258] muffled <- grepl(pattern, "muffleMessage") [13:13:15.258] if (muffled) [13:13:15.258] invokeRestart("muffleMessage") [13:13:15.258] } [13:13:15.258] else if (inherits(cond, "warning")) { [13:13:15.258] muffled <- grepl(pattern, "muffleWarning") [13:13:15.258] if (muffled) [13:13:15.258] invokeRestart("muffleWarning") [13:13:15.258] } [13:13:15.258] else if (inherits(cond, "condition")) { [13:13:15.258] if (!is.null(pattern)) { [13:13:15.258] computeRestarts <- base::computeRestarts [13:13:15.258] grepl <- base::grepl [13:13:15.258] restarts <- computeRestarts(cond) [13:13:15.258] for (restart in restarts) { [13:13:15.258] name <- restart$name [13:13:15.258] if (is.null(name)) [13:13:15.258] next [13:13:15.258] if (!grepl(pattern, name)) [13:13:15.258] next [13:13:15.258] invokeRestart(restart) [13:13:15.258] muffled <- TRUE [13:13:15.258] break [13:13:15.258] } [13:13:15.258] } [13:13:15.258] } [13:13:15.258] invisible(muffled) [13:13:15.258] } [13:13:15.258] muffleCondition(cond, pattern = "^muffle") [13:13:15.258] } [13:13:15.258] } [13:13:15.258] } [13:13:15.258] })) [13:13:15.258] }, error = function(ex) { [13:13:15.258] base::structure(base::list(value = NULL, visible = NULL, [13:13:15.258] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:15.258] ...future.rng), started = ...future.startTime, [13:13:15.258] finished = Sys.time(), session_uuid = NA_character_, [13:13:15.258] version = "1.8"), class = "FutureResult") [13:13:15.258] }, finally = { [13:13:15.258] if (!identical(...future.workdir, getwd())) [13:13:15.258] setwd(...future.workdir) [13:13:15.258] { [13:13:15.258] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:15.258] ...future.oldOptions$nwarnings <- NULL [13:13:15.258] } [13:13:15.258] base::options(...future.oldOptions) [13:13:15.258] if (.Platform$OS.type == "windows") { [13:13:15.258] old_names <- names(...future.oldEnvVars) [13:13:15.258] envs <- base::Sys.getenv() [13:13:15.258] names <- names(envs) [13:13:15.258] common <- intersect(names, old_names) [13:13:15.258] added <- setdiff(names, old_names) [13:13:15.258] removed <- setdiff(old_names, names) [13:13:15.258] changed <- common[...future.oldEnvVars[common] != [13:13:15.258] envs[common]] [13:13:15.258] NAMES <- toupper(changed) [13:13:15.258] args <- list() [13:13:15.258] for (kk in seq_along(NAMES)) { [13:13:15.258] name <- changed[[kk]] [13:13:15.258] NAME <- NAMES[[kk]] [13:13:15.258] if (name != NAME && is.element(NAME, old_names)) [13:13:15.258] next [13:13:15.258] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:15.258] } [13:13:15.258] NAMES <- toupper(added) [13:13:15.258] for (kk in seq_along(NAMES)) { [13:13:15.258] name <- added[[kk]] [13:13:15.258] NAME <- NAMES[[kk]] [13:13:15.258] if (name != NAME && is.element(NAME, old_names)) [13:13:15.258] next [13:13:15.258] args[[name]] <- "" [13:13:15.258] } [13:13:15.258] NAMES <- toupper(removed) [13:13:15.258] for (kk in seq_along(NAMES)) { [13:13:15.258] name <- removed[[kk]] [13:13:15.258] NAME <- NAMES[[kk]] [13:13:15.258] if (name != NAME && is.element(NAME, old_names)) [13:13:15.258] next [13:13:15.258] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:15.258] } [13:13:15.258] if (length(args) > 0) [13:13:15.258] base::do.call(base::Sys.setenv, args = args) [13:13:15.258] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:15.258] } [13:13:15.258] else { [13:13:15.258] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:15.258] } [13:13:15.258] { [13:13:15.258] if (base::length(...future.futureOptionsAdded) > [13:13:15.258] 0L) { [13:13:15.258] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:15.258] base::names(opts) <- ...future.futureOptionsAdded [13:13:15.258] base::options(opts) [13:13:15.258] } [13:13:15.258] { [13:13:15.258] { [13:13:15.258] NULL [13:13:15.258] RNGkind("Mersenne-Twister") [13:13:15.258] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:15.258] inherits = FALSE) [13:13:15.258] } [13:13:15.258] options(future.plan = NULL) [13:13:15.258] if (is.na(NA_character_)) [13:13:15.258] Sys.unsetenv("R_FUTURE_PLAN") [13:13:15.258] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:15.258] future::plan(list(function (..., envir = parent.frame()) [13:13:15.258] { [13:13:15.258] future <- SequentialFuture(..., envir = envir) [13:13:15.258] if (!future$lazy) [13:13:15.258] future <- run(future) [13:13:15.258] invisible(future) [13:13:15.258] }), .cleanup = FALSE, .init = FALSE) [13:13:15.258] } [13:13:15.258] } [13:13:15.258] } [13:13:15.258] }) [13:13:15.258] if (TRUE) { [13:13:15.258] base::sink(type = "output", split = FALSE) [13:13:15.258] if (TRUE) { [13:13:15.258] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:15.258] } [13:13:15.258] else { [13:13:15.258] ...future.result["stdout"] <- base::list(NULL) [13:13:15.258] } [13:13:15.258] base::close(...future.stdout) [13:13:15.258] ...future.stdout <- NULL [13:13:15.258] } [13:13:15.258] ...future.result$conditions <- ...future.conditions [13:13:15.258] ...future.result$finished <- base::Sys.time() [13:13:15.258] ...future.result [13:13:15.258] } [13:13:15.262] assign_globals() ... [13:13:15.262] List of 5 [13:13:15.262] $ ...future.FUN :function (object, ...) [13:13:15.262] $ future.call.arguments : list() [13:13:15.262] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:15.262] $ ...future.elements_ii :List of 3 [13:13:15.262] ..$ :'data.frame': 18 obs. of 2 variables: [13:13:15.262] .. ..$ breaks: num [1:18] 26 30 54 25 70 52 51 26 67 27 ... [13:13:15.262] .. ..$ wool : Factor w/ 2 levels "A","B": 1 1 1 1 1 1 1 1 1 2 ... [13:13:15.262] ..$ :'data.frame': 18 obs. of 2 variables: [13:13:15.262] .. ..$ breaks: num [1:18] 18 21 29 17 12 18 35 30 36 42 ... [13:13:15.262] .. ..$ wool : Factor w/ 2 levels "A","B": 1 1 1 1 1 1 1 1 1 2 ... [13:13:15.262] ..$ :'data.frame': 18 obs. of 2 variables: [13:13:15.262] .. ..$ breaks: num [1:18] 36 21 24 18 10 43 28 15 26 20 ... [13:13:15.262] .. ..$ wool : Factor w/ 2 levels "A","B": 1 1 1 1 1 1 1 1 1 2 ... [13:13:15.262] $ ...future.seeds_ii : NULL [13:13:15.262] $ ...future.globals.maxSize: NULL [13:13:15.262] - attr(*, "where")=List of 5 [13:13:15.262] ..$ ...future.FUN : [13:13:15.262] ..$ future.call.arguments : [13:13:15.262] ..$ ...future.elements_ii : [13:13:15.262] ..$ ...future.seeds_ii : [13:13:15.262] ..$ ...future.globals.maxSize: [13:13:15.262] - attr(*, "resolved")= logi FALSE [13:13:15.262] - attr(*, "total_size")= num 1240 [13:13:15.262] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:15.262] - attr(*, "already-done")= logi TRUE [13:13:15.274] - copied '...future.FUN' to environment [13:13:15.274] - copied 'future.call.arguments' to environment [13:13:15.275] - copied '...future.elements_ii' to environment [13:13:15.275] - copied '...future.seeds_ii' to environment [13:13:15.275] - copied '...future.globals.maxSize' to environment [13:13:15.275] assign_globals() ... done [13:13:15.275] plan(): Setting new future strategy stack: [13:13:15.276] List of future strategies: [13:13:15.276] 1. sequential: [13:13:15.276] - args: function (..., envir = parent.frame(), workers = "") [13:13:15.276] - tweaked: FALSE [13:13:15.276] - call: NULL [13:13:15.276] plan(): nbrOfWorkers() = 1 [13:13:15.279] plan(): Setting new future strategy stack: [13:13:15.279] List of future strategies: [13:13:15.279] 1. sequential: [13:13:15.279] - args: function (..., envir = parent.frame(), workers = "") [13:13:15.279] - tweaked: FALSE [13:13:15.279] - call: plan(strategy) [13:13:15.280] plan(): nbrOfWorkers() = 1 [13:13:15.280] SequentialFuture started (and completed) [13:13:15.280] - Launch lazy future ... done [13:13:15.281] run() for 'SequentialFuture' ... done [13:13:15.281] Created future: [13:13:15.281] SequentialFuture: [13:13:15.281] Label: 'future_by-1' [13:13:15.281] Expression: [13:13:15.281] { [13:13:15.281] do.call(function(...) { [13:13:15.281] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:15.281] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:15.281] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:15.281] on.exit(options(oopts), add = TRUE) [13:13:15.281] } [13:13:15.281] { [13:13:15.281] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:15.281] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:15.281] ...future.FUN(...future.X_jj, ...) [13:13:15.281] }) [13:13:15.281] } [13:13:15.281] }, args = future.call.arguments) [13:13:15.281] } [13:13:15.281] Lazy evaluation: FALSE [13:13:15.281] Asynchronous evaluation: FALSE [13:13:15.281] Local evaluation: TRUE [13:13:15.281] Environment: R_GlobalEnv [13:13:15.281] Capture standard output: TRUE [13:13:15.281] Capture condition classes: 'condition' (excluding 'nothing') [13:13:15.281] Globals: 5 objects totaling 3.79 KiB (function '...future.FUN' of 1.21 KiB, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 2.58 KiB, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:13:15.281] Packages: [13:13:15.281] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:15.281] Resolved: TRUE [13:13:15.281] Value: 4.62 KiB of class 'list' [13:13:15.281] Early signaling: FALSE [13:13:15.281] Owner process: f0659542-730c-c20a-65b3-84f202449c4d [13:13:15.281] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:15.283] Chunk #1 of 1 ... DONE [13:13:15.283] Launching 1 futures (chunks) ... DONE [13:13:15.283] Resolving 1 futures (chunks) ... [13:13:15.283] resolve() on list ... [13:13:15.284] recursive: 0 [13:13:15.284] length: 1 [13:13:15.284] [13:13:15.284] resolved() for 'SequentialFuture' ... [13:13:15.284] - state: 'finished' [13:13:15.284] - run: TRUE [13:13:15.285] - result: 'FutureResult' [13:13:15.285] resolved() for 'SequentialFuture' ... done [13:13:15.285] Future #1 [13:13:15.285] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:15.286] - nx: 1 [13:13:15.286] - relay: TRUE [13:13:15.286] - stdout: TRUE [13:13:15.286] - signal: TRUE [13:13:15.286] - resignal: FALSE [13:13:15.286] - force: TRUE [13:13:15.286] - relayed: [n=1] FALSE [13:13:15.287] - queued futures: [n=1] FALSE [13:13:15.287] - until=1 [13:13:15.287] - relaying element #1 [13:13:15.287] - relayed: [n=1] TRUE [13:13:15.288] - queued futures: [n=1] TRUE [13:13:15.288] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:15.288] length: 0 (resolved future 1) [13:13:15.288] Relaying remaining futures [13:13:15.288] signalConditionsASAP(NULL, pos=0) ... [13:13:15.288] - nx: 1 [13:13:15.289] - relay: TRUE [13:13:15.289] - stdout: TRUE [13:13:15.289] - signal: TRUE [13:13:15.289] - resignal: FALSE [13:13:15.289] - force: TRUE [13:13:15.289] - relayed: [n=1] TRUE [13:13:15.289] - queued futures: [n=1] TRUE - flush all [13:13:15.290] - relayed: [n=1] TRUE [13:13:15.290] - queued futures: [n=1] TRUE [13:13:15.290] signalConditionsASAP(NULL, pos=0) ... done [13:13:15.290] resolve() on list ... DONE [13:13:15.291] - Number of value chunks collected: 1 [13:13:15.291] Resolving 1 futures (chunks) ... DONE [13:13:15.291] Reducing values from 1 chunks ... [13:13:15.291] - Number of values collected after concatenation: 3 [13:13:15.291] - Number of values expected: 3 [13:13:15.291] Reducing values from 1 chunks ... DONE [13:13:15.292] future_lapply() ... DONE [13:13:15.292] future_by_internal() ... DONE [13:13:15.292] future_by_internal() ... [13:13:15.293] future_lapply() ... [13:13:15.293] Number of chunks: 1 [13:13:15.293] getGlobalsAndPackagesXApply() ... [13:13:15.294] - future.globals: TRUE [13:13:15.294] getGlobalsAndPackages() ... [13:13:15.294] Searching for globals... [13:13:15.295] - globals found: [2] 'FUN', 'UseMethod' [13:13:15.296] Searching for globals ... DONE [13:13:15.296] Resolving globals: FALSE [13:13:15.296] The total size of the 1 globals is 1.21 KiB (1240 bytes) [13:13:15.297] The total size of the 1 globals exported for future expression ('FUN(digits = 2L)') is 1.21 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (1.21 KiB of class 'function') [13:13:15.297] - globals: [1] 'FUN' [13:13:15.297] [13:13:15.297] getGlobalsAndPackages() ... DONE [13:13:15.297] - globals found/used: [n=1] 'FUN' [13:13:15.298] - needed namespaces: [n=0] [13:13:15.298] Finding globals ... DONE [13:13:15.298] - use_args: TRUE [13:13:15.298] - Getting '...' globals ... [13:13:15.299] resolve() on list ... [13:13:15.299] recursive: 0 [13:13:15.299] length: 1 [13:13:15.299] elements: '...' [13:13:15.299] length: 0 (resolved future 1) [13:13:15.299] resolve() on list ... DONE [13:13:15.300] - '...' content: [n=1] 'digits' [13:13:15.300] List of 1 [13:13:15.300] $ ...:List of 1 [13:13:15.300] ..$ digits: int 2 [13:13:15.300] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:15.300] - attr(*, "where")=List of 1 [13:13:15.300] ..$ ...: [13:13:15.300] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:15.300] - attr(*, "resolved")= logi TRUE [13:13:15.300] - attr(*, "total_size")= num NA [13:13:15.304] - Getting '...' globals ... DONE [13:13:15.304] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:15.304] List of 2 [13:13:15.304] $ ...future.FUN:function (object, ...) [13:13:15.304] $ ... :List of 1 [13:13:15.304] ..$ digits: int 2 [13:13:15.304] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:15.304] - attr(*, "where")=List of 2 [13:13:15.304] ..$ ...future.FUN: [13:13:15.304] ..$ ... : [13:13:15.304] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:15.304] - attr(*, "resolved")= logi FALSE [13:13:15.304] - attr(*, "total_size")= num 1296 [13:13:15.308] Packages to be attached in all futures: [n=0] [13:13:15.308] getGlobalsAndPackagesXApply() ... DONE [13:13:15.308] Number of futures (= number of chunks): 1 [13:13:15.309] Launching 1 futures (chunks) ... [13:13:15.309] Chunk #1 of 1 ... [13:13:15.309] - Finding globals in 'X' for chunk #1 ... [13:13:15.309] getGlobalsAndPackages() ... [13:13:15.309] Searching for globals... [13:13:15.310] [13:13:15.310] Searching for globals ... DONE [13:13:15.310] - globals: [0] [13:13:15.310] getGlobalsAndPackages() ... DONE [13:13:15.310] + additional globals found: [n=0] [13:13:15.311] + additional namespaces needed: [n=0] [13:13:15.311] - Finding globals in 'X' for chunk #1 ... DONE [13:13:15.311] - seeds: [13:13:15.311] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:15.311] getGlobalsAndPackages() ... [13:13:15.311] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:15.312] Resolving globals: FALSE [13:13:15.312] Tweak future expression to call with '...' arguments ... [13:13:15.312] { [13:13:15.312] do.call(function(...) { [13:13:15.312] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:15.312] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:15.312] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:15.312] on.exit(options(oopts), add = TRUE) [13:13:15.312] } [13:13:15.312] { [13:13:15.312] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:15.312] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:15.312] ...future.FUN(...future.X_jj, ...) [13:13:15.312] }) [13:13:15.312] } [13:13:15.312] }, args = future.call.arguments) [13:13:15.312] } [13:13:15.313] Tweak future expression to call with '...' arguments ... DONE [13:13:15.313] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:15.313] [13:13:15.313] getGlobalsAndPackages() ... DONE [13:13:15.314] run() for 'Future' ... [13:13:15.314] - state: 'created' [13:13:15.314] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:13:15.315] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:15.315] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:15.315] - Field: 'label' [13:13:15.315] - Field: 'local' [13:13:15.315] - Field: 'owner' [13:13:15.315] - Field: 'envir' [13:13:15.316] - Field: 'packages' [13:13:15.316] - Field: 'gc' [13:13:15.316] - Field: 'conditions' [13:13:15.316] - Field: 'expr' [13:13:15.316] - Field: 'uuid' [13:13:15.317] - Field: 'seed' [13:13:15.317] - Field: 'version' [13:13:15.317] - Field: 'result' [13:13:15.317] - Field: 'asynchronous' [13:13:15.317] - Field: 'calls' [13:13:15.318] - Field: 'globals' [13:13:15.318] - Field: 'stdout' [13:13:15.318] - Field: 'earlySignal' [13:13:15.318] - Field: 'lazy' [13:13:15.318] - Field: 'state' [13:13:15.318] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:15.319] - Launch lazy future ... [13:13:15.319] Packages needed by the future expression (n = 0): [13:13:15.319] Packages needed by future strategies (n = 0): [13:13:15.320] { [13:13:15.320] { [13:13:15.320] { [13:13:15.320] ...future.startTime <- base::Sys.time() [13:13:15.320] { [13:13:15.320] { [13:13:15.320] { [13:13:15.320] base::local({ [13:13:15.320] has_future <- base::requireNamespace("future", [13:13:15.320] quietly = TRUE) [13:13:15.320] if (has_future) { [13:13:15.320] ns <- base::getNamespace("future") [13:13:15.320] version <- ns[[".package"]][["version"]] [13:13:15.320] if (is.null(version)) [13:13:15.320] version <- utils::packageVersion("future") [13:13:15.320] } [13:13:15.320] else { [13:13:15.320] version <- NULL [13:13:15.320] } [13:13:15.320] if (!has_future || version < "1.8.0") { [13:13:15.320] info <- base::c(r_version = base::gsub("R version ", [13:13:15.320] "", base::R.version$version.string), [13:13:15.320] platform = base::sprintf("%s (%s-bit)", [13:13:15.320] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:15.320] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:15.320] "release", "version")], collapse = " "), [13:13:15.320] hostname = base::Sys.info()[["nodename"]]) [13:13:15.320] info <- base::sprintf("%s: %s", base::names(info), [13:13:15.320] info) [13:13:15.320] info <- base::paste(info, collapse = "; ") [13:13:15.320] if (!has_future) { [13:13:15.320] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:15.320] info) [13:13:15.320] } [13:13:15.320] else { [13:13:15.320] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:15.320] info, version) [13:13:15.320] } [13:13:15.320] base::stop(msg) [13:13:15.320] } [13:13:15.320] }) [13:13:15.320] } [13:13:15.320] options(future.plan = NULL) [13:13:15.320] Sys.unsetenv("R_FUTURE_PLAN") [13:13:15.320] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:15.320] } [13:13:15.320] ...future.workdir <- getwd() [13:13:15.320] } [13:13:15.320] ...future.oldOptions <- base::as.list(base::.Options) [13:13:15.320] ...future.oldEnvVars <- base::Sys.getenv() [13:13:15.320] } [13:13:15.320] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:15.320] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:15.320] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:15.320] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:15.320] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:15.320] future.stdout.windows.reencode = NULL, width = 80L) [13:13:15.320] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:15.320] base::names(...future.oldOptions)) [13:13:15.320] } [13:13:15.320] if (FALSE) { [13:13:15.320] } [13:13:15.320] else { [13:13:15.320] if (TRUE) { [13:13:15.320] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:15.320] open = "w") [13:13:15.320] } [13:13:15.320] else { [13:13:15.320] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:15.320] windows = "NUL", "/dev/null"), open = "w") [13:13:15.320] } [13:13:15.320] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:15.320] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:15.320] base::sink(type = "output", split = FALSE) [13:13:15.320] base::close(...future.stdout) [13:13:15.320] }, add = TRUE) [13:13:15.320] } [13:13:15.320] ...future.frame <- base::sys.nframe() [13:13:15.320] ...future.conditions <- base::list() [13:13:15.320] ...future.rng <- base::globalenv()$.Random.seed [13:13:15.320] if (FALSE) { [13:13:15.320] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:15.320] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:15.320] } [13:13:15.320] ...future.result <- base::tryCatch({ [13:13:15.320] base::withCallingHandlers({ [13:13:15.320] ...future.value <- base::withVisible(base::local({ [13:13:15.320] do.call(function(...) { [13:13:15.320] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:15.320] if (!identical(...future.globals.maxSize.org, [13:13:15.320] ...future.globals.maxSize)) { [13:13:15.320] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:15.320] on.exit(options(oopts), add = TRUE) [13:13:15.320] } [13:13:15.320] { [13:13:15.320] lapply(seq_along(...future.elements_ii), [13:13:15.320] FUN = function(jj) { [13:13:15.320] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:15.320] ...future.FUN(...future.X_jj, ...) [13:13:15.320] }) [13:13:15.320] } [13:13:15.320] }, args = future.call.arguments) [13:13:15.320] })) [13:13:15.320] future::FutureResult(value = ...future.value$value, [13:13:15.320] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:15.320] ...future.rng), globalenv = if (FALSE) [13:13:15.320] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:15.320] ...future.globalenv.names)) [13:13:15.320] else NULL, started = ...future.startTime, version = "1.8") [13:13:15.320] }, condition = base::local({ [13:13:15.320] c <- base::c [13:13:15.320] inherits <- base::inherits [13:13:15.320] invokeRestart <- base::invokeRestart [13:13:15.320] length <- base::length [13:13:15.320] list <- base::list [13:13:15.320] seq.int <- base::seq.int [13:13:15.320] signalCondition <- base::signalCondition [13:13:15.320] sys.calls <- base::sys.calls [13:13:15.320] `[[` <- base::`[[` [13:13:15.320] `+` <- base::`+` [13:13:15.320] `<<-` <- base::`<<-` [13:13:15.320] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:15.320] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:15.320] 3L)] [13:13:15.320] } [13:13:15.320] function(cond) { [13:13:15.320] is_error <- inherits(cond, "error") [13:13:15.320] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:15.320] NULL) [13:13:15.320] if (is_error) { [13:13:15.320] sessionInformation <- function() { [13:13:15.320] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:15.320] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:15.320] search = base::search(), system = base::Sys.info()) [13:13:15.320] } [13:13:15.320] ...future.conditions[[length(...future.conditions) + [13:13:15.320] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:15.320] cond$call), session = sessionInformation(), [13:13:15.320] timestamp = base::Sys.time(), signaled = 0L) [13:13:15.320] signalCondition(cond) [13:13:15.320] } [13:13:15.320] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:15.320] "immediateCondition"))) { [13:13:15.320] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:15.320] ...future.conditions[[length(...future.conditions) + [13:13:15.320] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:15.320] if (TRUE && !signal) { [13:13:15.320] muffleCondition <- function (cond, pattern = "^muffle") [13:13:15.320] { [13:13:15.320] inherits <- base::inherits [13:13:15.320] invokeRestart <- base::invokeRestart [13:13:15.320] is.null <- base::is.null [13:13:15.320] muffled <- FALSE [13:13:15.320] if (inherits(cond, "message")) { [13:13:15.320] muffled <- grepl(pattern, "muffleMessage") [13:13:15.320] if (muffled) [13:13:15.320] invokeRestart("muffleMessage") [13:13:15.320] } [13:13:15.320] else if (inherits(cond, "warning")) { [13:13:15.320] muffled <- grepl(pattern, "muffleWarning") [13:13:15.320] if (muffled) [13:13:15.320] invokeRestart("muffleWarning") [13:13:15.320] } [13:13:15.320] else if (inherits(cond, "condition")) { [13:13:15.320] if (!is.null(pattern)) { [13:13:15.320] computeRestarts <- base::computeRestarts [13:13:15.320] grepl <- base::grepl [13:13:15.320] restarts <- computeRestarts(cond) [13:13:15.320] for (restart in restarts) { [13:13:15.320] name <- restart$name [13:13:15.320] if (is.null(name)) [13:13:15.320] next [13:13:15.320] if (!grepl(pattern, name)) [13:13:15.320] next [13:13:15.320] invokeRestart(restart) [13:13:15.320] muffled <- TRUE [13:13:15.320] break [13:13:15.320] } [13:13:15.320] } [13:13:15.320] } [13:13:15.320] invisible(muffled) [13:13:15.320] } [13:13:15.320] muffleCondition(cond, pattern = "^muffle") [13:13:15.320] } [13:13:15.320] } [13:13:15.320] else { [13:13:15.320] if (TRUE) { [13:13:15.320] muffleCondition <- function (cond, pattern = "^muffle") [13:13:15.320] { [13:13:15.320] inherits <- base::inherits [13:13:15.320] invokeRestart <- base::invokeRestart [13:13:15.320] is.null <- base::is.null [13:13:15.320] muffled <- FALSE [13:13:15.320] if (inherits(cond, "message")) { [13:13:15.320] muffled <- grepl(pattern, "muffleMessage") [13:13:15.320] if (muffled) [13:13:15.320] invokeRestart("muffleMessage") [13:13:15.320] } [13:13:15.320] else if (inherits(cond, "warning")) { [13:13:15.320] muffled <- grepl(pattern, "muffleWarning") [13:13:15.320] if (muffled) [13:13:15.320] invokeRestart("muffleWarning") [13:13:15.320] } [13:13:15.320] else if (inherits(cond, "condition")) { [13:13:15.320] if (!is.null(pattern)) { [13:13:15.320] computeRestarts <- base::computeRestarts [13:13:15.320] grepl <- base::grepl [13:13:15.320] restarts <- computeRestarts(cond) [13:13:15.320] for (restart in restarts) { [13:13:15.320] name <- restart$name [13:13:15.320] if (is.null(name)) [13:13:15.320] next [13:13:15.320] if (!grepl(pattern, name)) [13:13:15.320] next [13:13:15.320] invokeRestart(restart) [13:13:15.320] muffled <- TRUE [13:13:15.320] break [13:13:15.320] } [13:13:15.320] } [13:13:15.320] } [13:13:15.320] invisible(muffled) [13:13:15.320] } [13:13:15.320] muffleCondition(cond, pattern = "^muffle") [13:13:15.320] } [13:13:15.320] } [13:13:15.320] } [13:13:15.320] })) [13:13:15.320] }, error = function(ex) { [13:13:15.320] base::structure(base::list(value = NULL, visible = NULL, [13:13:15.320] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:15.320] ...future.rng), started = ...future.startTime, [13:13:15.320] finished = Sys.time(), session_uuid = NA_character_, [13:13:15.320] version = "1.8"), class = "FutureResult") [13:13:15.320] }, finally = { [13:13:15.320] if (!identical(...future.workdir, getwd())) [13:13:15.320] setwd(...future.workdir) [13:13:15.320] { [13:13:15.320] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:15.320] ...future.oldOptions$nwarnings <- NULL [13:13:15.320] } [13:13:15.320] base::options(...future.oldOptions) [13:13:15.320] if (.Platform$OS.type == "windows") { [13:13:15.320] old_names <- names(...future.oldEnvVars) [13:13:15.320] envs <- base::Sys.getenv() [13:13:15.320] names <- names(envs) [13:13:15.320] common <- intersect(names, old_names) [13:13:15.320] added <- setdiff(names, old_names) [13:13:15.320] removed <- setdiff(old_names, names) [13:13:15.320] changed <- common[...future.oldEnvVars[common] != [13:13:15.320] envs[common]] [13:13:15.320] NAMES <- toupper(changed) [13:13:15.320] args <- list() [13:13:15.320] for (kk in seq_along(NAMES)) { [13:13:15.320] name <- changed[[kk]] [13:13:15.320] NAME <- NAMES[[kk]] [13:13:15.320] if (name != NAME && is.element(NAME, old_names)) [13:13:15.320] next [13:13:15.320] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:15.320] } [13:13:15.320] NAMES <- toupper(added) [13:13:15.320] for (kk in seq_along(NAMES)) { [13:13:15.320] name <- added[[kk]] [13:13:15.320] NAME <- NAMES[[kk]] [13:13:15.320] if (name != NAME && is.element(NAME, old_names)) [13:13:15.320] next [13:13:15.320] args[[name]] <- "" [13:13:15.320] } [13:13:15.320] NAMES <- toupper(removed) [13:13:15.320] for (kk in seq_along(NAMES)) { [13:13:15.320] name <- removed[[kk]] [13:13:15.320] NAME <- NAMES[[kk]] [13:13:15.320] if (name != NAME && is.element(NAME, old_names)) [13:13:15.320] next [13:13:15.320] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:15.320] } [13:13:15.320] if (length(args) > 0) [13:13:15.320] base::do.call(base::Sys.setenv, args = args) [13:13:15.320] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:15.320] } [13:13:15.320] else { [13:13:15.320] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:15.320] } [13:13:15.320] { [13:13:15.320] if (base::length(...future.futureOptionsAdded) > [13:13:15.320] 0L) { [13:13:15.320] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:15.320] base::names(opts) <- ...future.futureOptionsAdded [13:13:15.320] base::options(opts) [13:13:15.320] } [13:13:15.320] { [13:13:15.320] { [13:13:15.320] NULL [13:13:15.320] RNGkind("Mersenne-Twister") [13:13:15.320] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:15.320] inherits = FALSE) [13:13:15.320] } [13:13:15.320] options(future.plan = NULL) [13:13:15.320] if (is.na(NA_character_)) [13:13:15.320] Sys.unsetenv("R_FUTURE_PLAN") [13:13:15.320] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:15.320] future::plan(list(function (..., envir = parent.frame()) [13:13:15.320] { [13:13:15.320] future <- SequentialFuture(..., envir = envir) [13:13:15.320] if (!future$lazy) [13:13:15.320] future <- run(future) [13:13:15.320] invisible(future) [13:13:15.320] }), .cleanup = FALSE, .init = FALSE) [13:13:15.320] } [13:13:15.320] } [13:13:15.320] } [13:13:15.320] }) [13:13:15.320] if (TRUE) { [13:13:15.320] base::sink(type = "output", split = FALSE) [13:13:15.320] if (TRUE) { [13:13:15.320] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:15.320] } [13:13:15.320] else { [13:13:15.320] ...future.result["stdout"] <- base::list(NULL) [13:13:15.320] } [13:13:15.320] base::close(...future.stdout) [13:13:15.320] ...future.stdout <- NULL [13:13:15.320] } [13:13:15.320] ...future.result$conditions <- ...future.conditions [13:13:15.320] ...future.result$finished <- base::Sys.time() [13:13:15.320] ...future.result [13:13:15.320] } [13:13:15.324] assign_globals() ... [13:13:15.324] List of 5 [13:13:15.324] $ ...future.FUN :function (object, ...) [13:13:15.324] $ future.call.arguments :List of 1 [13:13:15.324] ..$ digits: int 2 [13:13:15.324] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:15.324] $ ...future.elements_ii :List of 6 [13:13:15.324] ..$ : num [1:9] 26 30 54 25 70 52 51 26 67 [13:13:15.324] ..$ : num [1:9] 27 14 29 19 29 31 41 20 44 [13:13:15.324] ..$ : num [1:9] 18 21 29 17 12 18 35 30 36 [13:13:15.324] ..$ : num [1:9] 42 26 19 16 39 28 21 39 29 [13:13:15.324] ..$ : num [1:9] 36 21 24 18 10 43 28 15 26 [13:13:15.324] ..$ : num [1:9] 20 21 24 17 13 15 15 16 28 [13:13:15.324] $ ...future.seeds_ii : NULL [13:13:15.324] $ ...future.globals.maxSize: NULL [13:13:15.324] - attr(*, "where")=List of 5 [13:13:15.324] ..$ ...future.FUN : [13:13:15.324] ..$ future.call.arguments : [13:13:15.324] ..$ ...future.elements_ii : [13:13:15.324] ..$ ...future.seeds_ii : [13:13:15.324] ..$ ...future.globals.maxSize: [13:13:15.324] - attr(*, "resolved")= logi FALSE [13:13:15.324] - attr(*, "total_size")= num 1296 [13:13:15.324] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:15.324] - attr(*, "already-done")= logi TRUE [13:13:15.333] - copied '...future.FUN' to environment [13:13:15.333] - copied 'future.call.arguments' to environment [13:13:15.333] - copied '...future.elements_ii' to environment [13:13:15.333] - copied '...future.seeds_ii' to environment [13:13:15.333] - copied '...future.globals.maxSize' to environment [13:13:15.333] assign_globals() ... done [13:13:15.334] plan(): Setting new future strategy stack: [13:13:15.334] List of future strategies: [13:13:15.334] 1. sequential: [13:13:15.334] - args: function (..., envir = parent.frame(), workers = "") [13:13:15.334] - tweaked: FALSE [13:13:15.334] - call: NULL [13:13:15.335] plan(): nbrOfWorkers() = 1 [13:13:15.337] plan(): Setting new future strategy stack: [13:13:15.337] List of future strategies: [13:13:15.337] 1. sequential: [13:13:15.337] - args: function (..., envir = parent.frame(), workers = "") [13:13:15.337] - tweaked: FALSE [13:13:15.337] - call: plan(strategy) [13:13:15.338] plan(): nbrOfWorkers() = 1 [13:13:15.338] SequentialFuture started (and completed) [13:13:15.338] - Launch lazy future ... done [13:13:15.338] run() for 'SequentialFuture' ... done [13:13:15.338] Created future: [13:13:15.339] SequentialFuture: [13:13:15.339] Label: 'future_by-1' [13:13:15.339] Expression: [13:13:15.339] { [13:13:15.339] do.call(function(...) { [13:13:15.339] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:15.339] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:15.339] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:15.339] on.exit(options(oopts), add = TRUE) [13:13:15.339] } [13:13:15.339] { [13:13:15.339] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:15.339] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:15.339] ...future.FUN(...future.X_jj, ...) [13:13:15.339] }) [13:13:15.339] } [13:13:15.339] }, args = future.call.arguments) [13:13:15.339] } [13:13:15.339] Lazy evaluation: FALSE [13:13:15.339] Asynchronous evaluation: FALSE [13:13:15.339] Local evaluation: TRUE [13:13:15.339] Environment: R_GlobalEnv [13:13:15.339] Capture standard output: TRUE [13:13:15.339] Capture condition classes: 'condition' (excluding 'nothing') [13:13:15.339] Globals: 5 objects totaling 2.30 KiB (function '...future.FUN' of 1.21 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 1.03 KiB, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:13:15.339] Packages: [13:13:15.339] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:15.339] Resolved: TRUE [13:13:15.339] Value: 5.48 KiB of class 'list' [13:13:15.339] Early signaling: FALSE [13:13:15.339] Owner process: f0659542-730c-c20a-65b3-84f202449c4d [13:13:15.339] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:15.340] Chunk #1 of 1 ... DONE [13:13:15.340] Launching 1 futures (chunks) ... DONE [13:13:15.340] Resolving 1 futures (chunks) ... [13:13:15.341] resolve() on list ... [13:13:15.341] recursive: 0 [13:13:15.341] length: 1 [13:13:15.341] [13:13:15.341] resolved() for 'SequentialFuture' ... [13:13:15.341] - state: 'finished' [13:13:15.342] - run: TRUE [13:13:15.342] - result: 'FutureResult' [13:13:15.342] resolved() for 'SequentialFuture' ... done [13:13:15.342] Future #1 [13:13:15.342] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:15.343] - nx: 1 [13:13:15.343] - relay: TRUE [13:13:15.343] - stdout: TRUE [13:13:15.343] - signal: TRUE [13:13:15.343] - resignal: FALSE [13:13:15.343] - force: TRUE [13:13:15.344] - relayed: [n=1] FALSE [13:13:15.344] - queued futures: [n=1] FALSE [13:13:15.344] - until=1 [13:13:15.344] - relaying element #1 [13:13:15.344] - relayed: [n=1] TRUE [13:13:15.344] - queued futures: [n=1] TRUE [13:13:15.345] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:15.345] length: 0 (resolved future 1) [13:13:15.345] Relaying remaining futures [13:13:15.345] signalConditionsASAP(NULL, pos=0) ... [13:13:15.345] - nx: 1 [13:13:15.345] - relay: TRUE [13:13:15.346] - stdout: TRUE [13:13:15.346] - signal: TRUE [13:13:15.346] - resignal: FALSE [13:13:15.346] - force: TRUE [13:13:15.346] - relayed: [n=1] TRUE [13:13:15.346] - queued futures: [n=1] TRUE - flush all [13:13:15.347] - relayed: [n=1] TRUE [13:13:15.347] - queued futures: [n=1] TRUE [13:13:15.347] signalConditionsASAP(NULL, pos=0) ... done [13:13:15.347] resolve() on list ... DONE [13:13:15.347] - Number of value chunks collected: 1 [13:13:15.348] Resolving 1 futures (chunks) ... DONE [13:13:15.348] Reducing values from 1 chunks ... [13:13:15.348] - Number of values collected after concatenation: 6 [13:13:15.348] - Number of values expected: 6 [13:13:15.348] Reducing values from 1 chunks ... DONE [13:13:15.348] future_lapply() ... DONE [13:13:15.349] future_by_internal() ... DONE [13:13:15.350] future_by_internal() ... [13:13:15.351] future_lapply() ... [13:13:15.352] Number of chunks: 1 [13:13:15.352] getGlobalsAndPackagesXApply() ... [13:13:15.352] - future.globals: TRUE [13:13:15.352] getGlobalsAndPackages() ... [13:13:15.352] Searching for globals... [13:13:15.355] - globals found: [6] 'FUN', '{', 'lm', '~', 'breaks', 'wool' [13:13:15.355] Searching for globals ... DONE [13:13:15.355] Resolving globals: FALSE [13:13:15.356] The total size of the 1 globals is 5.20 KiB (5328 bytes) [13:13:15.356] The total size of the 1 globals exported for future expression ('FUN(singular.ok = FALSE)') is 5.20 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (5.20 KiB of class 'function') [13:13:15.356] - globals: [1] 'FUN' [13:13:15.356] - packages: [1] 'stats' [13:13:15.357] getGlobalsAndPackages() ... DONE [13:13:15.357] - globals found/used: [n=1] 'FUN' [13:13:15.357] - needed namespaces: [n=1] 'stats' [13:13:15.357] Finding globals ... DONE [13:13:15.357] - use_args: TRUE [13:13:15.358] - Getting '...' globals ... [13:13:15.358] resolve() on list ... [13:13:15.358] recursive: 0 [13:13:15.358] length: 1 [13:13:15.359] elements: '...' [13:13:15.359] length: 0 (resolved future 1) [13:13:15.359] resolve() on list ... DONE [13:13:15.359] - '...' content: [n=1] 'singular.ok' [13:13:15.359] List of 1 [13:13:15.359] $ ...:List of 1 [13:13:15.359] ..$ singular.ok: logi FALSE [13:13:15.359] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:15.359] - attr(*, "where")=List of 1 [13:13:15.359] ..$ ...: [13:13:15.359] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:15.359] - attr(*, "resolved")= logi TRUE [13:13:15.359] - attr(*, "total_size")= num NA [13:13:15.367] - Getting '...' globals ... DONE [13:13:15.367] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:15.367] List of 2 [13:13:15.367] $ ...future.FUN:function (x, ...) [13:13:15.367] $ ... :List of 1 [13:13:15.367] ..$ singular.ok: logi FALSE [13:13:15.367] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:15.367] - attr(*, "where")=List of 2 [13:13:15.367] ..$ ...future.FUN: [13:13:15.367] ..$ ... : [13:13:15.367] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:15.367] - attr(*, "resolved")= logi FALSE [13:13:15.367] - attr(*, "total_size")= num 5384 [13:13:15.372] Packages to be attached in all futures: [n=1] 'stats' [13:13:15.372] getGlobalsAndPackagesXApply() ... DONE [13:13:15.373] Number of futures (= number of chunks): 1 [13:13:15.373] Launching 1 futures (chunks) ... [13:13:15.373] Chunk #1 of 1 ... [13:13:15.373] - Finding globals in 'X' for chunk #1 ... [13:13:15.374] getGlobalsAndPackages() ... [13:13:15.374] Searching for globals... [13:13:15.375] [13:13:15.375] Searching for globals ... DONE [13:13:15.375] - globals: [0] [13:13:15.375] getGlobalsAndPackages() ... DONE [13:13:15.375] + additional globals found: [n=0] [13:13:15.376] + additional namespaces needed: [n=0] [13:13:15.376] - Finding globals in 'X' for chunk #1 ... DONE [13:13:15.376] - seeds: [13:13:15.376] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:15.377] getGlobalsAndPackages() ... [13:13:15.377] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:15.377] Resolving globals: FALSE [13:13:15.377] Tweak future expression to call with '...' arguments ... [13:13:15.377] { [13:13:15.377] do.call(function(...) { [13:13:15.377] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:15.377] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:15.377] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:15.377] on.exit(options(oopts), add = TRUE) [13:13:15.377] } [13:13:15.377] { [13:13:15.377] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:15.377] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:15.377] ...future.FUN(...future.X_jj, ...) [13:13:15.377] }) [13:13:15.377] } [13:13:15.377] }, args = future.call.arguments) [13:13:15.377] } [13:13:15.378] Tweak future expression to call with '...' arguments ... DONE [13:13:15.379] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:15.379] [13:13:15.379] getGlobalsAndPackages() ... DONE [13:13:15.380] run() for 'Future' ... [13:13:15.380] - state: 'created' [13:13:15.380] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:13:15.380] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:15.381] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:15.381] - Field: 'label' [13:13:15.381] - Field: 'local' [13:13:15.381] - Field: 'owner' [13:13:15.382] - Field: 'envir' [13:13:15.382] - Field: 'packages' [13:13:15.382] - Field: 'gc' [13:13:15.382] - Field: 'conditions' [13:13:15.382] - Field: 'expr' [13:13:15.383] - Field: 'uuid' [13:13:15.383] - Field: 'seed' [13:13:15.383] - Field: 'version' [13:13:15.383] - Field: 'result' [13:13:15.384] - Field: 'asynchronous' [13:13:15.384] - Field: 'calls' [13:13:15.384] - Field: 'globals' [13:13:15.384] - Field: 'stdout' [13:13:15.385] - Field: 'earlySignal' [13:13:15.385] - Field: 'lazy' [13:13:15.385] - Field: 'state' [13:13:15.385] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:15.386] - Launch lazy future ... [13:13:15.386] Packages needed by the future expression (n = 1): 'stats' [13:13:15.386] Packages needed by future strategies (n = 0): [13:13:15.387] { [13:13:15.387] { [13:13:15.387] { [13:13:15.387] ...future.startTime <- base::Sys.time() [13:13:15.387] { [13:13:15.387] { [13:13:15.387] { [13:13:15.387] { [13:13:15.387] base::local({ [13:13:15.387] has_future <- base::requireNamespace("future", [13:13:15.387] quietly = TRUE) [13:13:15.387] if (has_future) { [13:13:15.387] ns <- base::getNamespace("future") [13:13:15.387] version <- ns[[".package"]][["version"]] [13:13:15.387] if (is.null(version)) [13:13:15.387] version <- utils::packageVersion("future") [13:13:15.387] } [13:13:15.387] else { [13:13:15.387] version <- NULL [13:13:15.387] } [13:13:15.387] if (!has_future || version < "1.8.0") { [13:13:15.387] info <- base::c(r_version = base::gsub("R version ", [13:13:15.387] "", base::R.version$version.string), [13:13:15.387] platform = base::sprintf("%s (%s-bit)", [13:13:15.387] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:15.387] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:15.387] "release", "version")], collapse = " "), [13:13:15.387] hostname = base::Sys.info()[["nodename"]]) [13:13:15.387] info <- base::sprintf("%s: %s", base::names(info), [13:13:15.387] info) [13:13:15.387] info <- base::paste(info, collapse = "; ") [13:13:15.387] if (!has_future) { [13:13:15.387] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:15.387] info) [13:13:15.387] } [13:13:15.387] else { [13:13:15.387] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:15.387] info, version) [13:13:15.387] } [13:13:15.387] base::stop(msg) [13:13:15.387] } [13:13:15.387] }) [13:13:15.387] } [13:13:15.387] base::local({ [13:13:15.387] for (pkg in "stats") { [13:13:15.387] base::loadNamespace(pkg) [13:13:15.387] base::library(pkg, character.only = TRUE) [13:13:15.387] } [13:13:15.387] }) [13:13:15.387] } [13:13:15.387] options(future.plan = NULL) [13:13:15.387] Sys.unsetenv("R_FUTURE_PLAN") [13:13:15.387] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:15.387] } [13:13:15.387] ...future.workdir <- getwd() [13:13:15.387] } [13:13:15.387] ...future.oldOptions <- base::as.list(base::.Options) [13:13:15.387] ...future.oldEnvVars <- base::Sys.getenv() [13:13:15.387] } [13:13:15.387] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:15.387] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:15.387] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:15.387] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:15.387] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:15.387] future.stdout.windows.reencode = NULL, width = 80L) [13:13:15.387] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:15.387] base::names(...future.oldOptions)) [13:13:15.387] } [13:13:15.387] if (FALSE) { [13:13:15.387] } [13:13:15.387] else { [13:13:15.387] if (TRUE) { [13:13:15.387] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:15.387] open = "w") [13:13:15.387] } [13:13:15.387] else { [13:13:15.387] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:15.387] windows = "NUL", "/dev/null"), open = "w") [13:13:15.387] } [13:13:15.387] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:15.387] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:15.387] base::sink(type = "output", split = FALSE) [13:13:15.387] base::close(...future.stdout) [13:13:15.387] }, add = TRUE) [13:13:15.387] } [13:13:15.387] ...future.frame <- base::sys.nframe() [13:13:15.387] ...future.conditions <- base::list() [13:13:15.387] ...future.rng <- base::globalenv()$.Random.seed [13:13:15.387] if (FALSE) { [13:13:15.387] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:15.387] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:15.387] } [13:13:15.387] ...future.result <- base::tryCatch({ [13:13:15.387] base::withCallingHandlers({ [13:13:15.387] ...future.value <- base::withVisible(base::local({ [13:13:15.387] do.call(function(...) { [13:13:15.387] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:15.387] if (!identical(...future.globals.maxSize.org, [13:13:15.387] ...future.globals.maxSize)) { [13:13:15.387] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:15.387] on.exit(options(oopts), add = TRUE) [13:13:15.387] } [13:13:15.387] { [13:13:15.387] lapply(seq_along(...future.elements_ii), [13:13:15.387] FUN = function(jj) { [13:13:15.387] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:15.387] ...future.FUN(...future.X_jj, ...) [13:13:15.387] }) [13:13:15.387] } [13:13:15.387] }, args = future.call.arguments) [13:13:15.387] })) [13:13:15.387] future::FutureResult(value = ...future.value$value, [13:13:15.387] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:15.387] ...future.rng), globalenv = if (FALSE) [13:13:15.387] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:15.387] ...future.globalenv.names)) [13:13:15.387] else NULL, started = ...future.startTime, version = "1.8") [13:13:15.387] }, condition = base::local({ [13:13:15.387] c <- base::c [13:13:15.387] inherits <- base::inherits [13:13:15.387] invokeRestart <- base::invokeRestart [13:13:15.387] length <- base::length [13:13:15.387] list <- base::list [13:13:15.387] seq.int <- base::seq.int [13:13:15.387] signalCondition <- base::signalCondition [13:13:15.387] sys.calls <- base::sys.calls [13:13:15.387] `[[` <- base::`[[` [13:13:15.387] `+` <- base::`+` [13:13:15.387] `<<-` <- base::`<<-` [13:13:15.387] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:15.387] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:15.387] 3L)] [13:13:15.387] } [13:13:15.387] function(cond) { [13:13:15.387] is_error <- inherits(cond, "error") [13:13:15.387] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:15.387] NULL) [13:13:15.387] if (is_error) { [13:13:15.387] sessionInformation <- function() { [13:13:15.387] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:15.387] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:15.387] search = base::search(), system = base::Sys.info()) [13:13:15.387] } [13:13:15.387] ...future.conditions[[length(...future.conditions) + [13:13:15.387] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:15.387] cond$call), session = sessionInformation(), [13:13:15.387] timestamp = base::Sys.time(), signaled = 0L) [13:13:15.387] signalCondition(cond) [13:13:15.387] } [13:13:15.387] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:15.387] "immediateCondition"))) { [13:13:15.387] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:15.387] ...future.conditions[[length(...future.conditions) + [13:13:15.387] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:15.387] if (TRUE && !signal) { [13:13:15.387] muffleCondition <- function (cond, pattern = "^muffle") [13:13:15.387] { [13:13:15.387] inherits <- base::inherits [13:13:15.387] invokeRestart <- base::invokeRestart [13:13:15.387] is.null <- base::is.null [13:13:15.387] muffled <- FALSE [13:13:15.387] if (inherits(cond, "message")) { [13:13:15.387] muffled <- grepl(pattern, "muffleMessage") [13:13:15.387] if (muffled) [13:13:15.387] invokeRestart("muffleMessage") [13:13:15.387] } [13:13:15.387] else if (inherits(cond, "warning")) { [13:13:15.387] muffled <- grepl(pattern, "muffleWarning") [13:13:15.387] if (muffled) [13:13:15.387] invokeRestart("muffleWarning") [13:13:15.387] } [13:13:15.387] else if (inherits(cond, "condition")) { [13:13:15.387] if (!is.null(pattern)) { [13:13:15.387] computeRestarts <- base::computeRestarts [13:13:15.387] grepl <- base::grepl [13:13:15.387] restarts <- computeRestarts(cond) [13:13:15.387] for (restart in restarts) { [13:13:15.387] name <- restart$name [13:13:15.387] if (is.null(name)) [13:13:15.387] next [13:13:15.387] if (!grepl(pattern, name)) [13:13:15.387] next [13:13:15.387] invokeRestart(restart) [13:13:15.387] muffled <- TRUE [13:13:15.387] break [13:13:15.387] } [13:13:15.387] } [13:13:15.387] } [13:13:15.387] invisible(muffled) [13:13:15.387] } [13:13:15.387] muffleCondition(cond, pattern = "^muffle") [13:13:15.387] } [13:13:15.387] } [13:13:15.387] else { [13:13:15.387] if (TRUE) { [13:13:15.387] muffleCondition <- function (cond, pattern = "^muffle") [13:13:15.387] { [13:13:15.387] inherits <- base::inherits [13:13:15.387] invokeRestart <- base::invokeRestart [13:13:15.387] is.null <- base::is.null [13:13:15.387] muffled <- FALSE [13:13:15.387] if (inherits(cond, "message")) { [13:13:15.387] muffled <- grepl(pattern, "muffleMessage") [13:13:15.387] if (muffled) [13:13:15.387] invokeRestart("muffleMessage") [13:13:15.387] } [13:13:15.387] else if (inherits(cond, "warning")) { [13:13:15.387] muffled <- grepl(pattern, "muffleWarning") [13:13:15.387] if (muffled) [13:13:15.387] invokeRestart("muffleWarning") [13:13:15.387] } [13:13:15.387] else if (inherits(cond, "condition")) { [13:13:15.387] if (!is.null(pattern)) { [13:13:15.387] computeRestarts <- base::computeRestarts [13:13:15.387] grepl <- base::grepl [13:13:15.387] restarts <- computeRestarts(cond) [13:13:15.387] for (restart in restarts) { [13:13:15.387] name <- restart$name [13:13:15.387] if (is.null(name)) [13:13:15.387] next [13:13:15.387] if (!grepl(pattern, name)) [13:13:15.387] next [13:13:15.387] invokeRestart(restart) [13:13:15.387] muffled <- TRUE [13:13:15.387] break [13:13:15.387] } [13:13:15.387] } [13:13:15.387] } [13:13:15.387] invisible(muffled) [13:13:15.387] } [13:13:15.387] muffleCondition(cond, pattern = "^muffle") [13:13:15.387] } [13:13:15.387] } [13:13:15.387] } [13:13:15.387] })) [13:13:15.387] }, error = function(ex) { [13:13:15.387] base::structure(base::list(value = NULL, visible = NULL, [13:13:15.387] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:15.387] ...future.rng), started = ...future.startTime, [13:13:15.387] finished = Sys.time(), session_uuid = NA_character_, [13:13:15.387] version = "1.8"), class = "FutureResult") [13:13:15.387] }, finally = { [13:13:15.387] if (!identical(...future.workdir, getwd())) [13:13:15.387] setwd(...future.workdir) [13:13:15.387] { [13:13:15.387] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:15.387] ...future.oldOptions$nwarnings <- NULL [13:13:15.387] } [13:13:15.387] base::options(...future.oldOptions) [13:13:15.387] if (.Platform$OS.type == "windows") { [13:13:15.387] old_names <- names(...future.oldEnvVars) [13:13:15.387] envs <- base::Sys.getenv() [13:13:15.387] names <- names(envs) [13:13:15.387] common <- intersect(names, old_names) [13:13:15.387] added <- setdiff(names, old_names) [13:13:15.387] removed <- setdiff(old_names, names) [13:13:15.387] changed <- common[...future.oldEnvVars[common] != [13:13:15.387] envs[common]] [13:13:15.387] NAMES <- toupper(changed) [13:13:15.387] args <- list() [13:13:15.387] for (kk in seq_along(NAMES)) { [13:13:15.387] name <- changed[[kk]] [13:13:15.387] NAME <- NAMES[[kk]] [13:13:15.387] if (name != NAME && is.element(NAME, old_names)) [13:13:15.387] next [13:13:15.387] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:15.387] } [13:13:15.387] NAMES <- toupper(added) [13:13:15.387] for (kk in seq_along(NAMES)) { [13:13:15.387] name <- added[[kk]] [13:13:15.387] NAME <- NAMES[[kk]] [13:13:15.387] if (name != NAME && is.element(NAME, old_names)) [13:13:15.387] next [13:13:15.387] args[[name]] <- "" [13:13:15.387] } [13:13:15.387] NAMES <- toupper(removed) [13:13:15.387] for (kk in seq_along(NAMES)) { [13:13:15.387] name <- removed[[kk]] [13:13:15.387] NAME <- NAMES[[kk]] [13:13:15.387] if (name != NAME && is.element(NAME, old_names)) [13:13:15.387] next [13:13:15.387] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:15.387] } [13:13:15.387] if (length(args) > 0) [13:13:15.387] base::do.call(base::Sys.setenv, args = args) [13:13:15.387] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:15.387] } [13:13:15.387] else { [13:13:15.387] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:15.387] } [13:13:15.387] { [13:13:15.387] if (base::length(...future.futureOptionsAdded) > [13:13:15.387] 0L) { [13:13:15.387] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:15.387] base::names(opts) <- ...future.futureOptionsAdded [13:13:15.387] base::options(opts) [13:13:15.387] } [13:13:15.387] { [13:13:15.387] { [13:13:15.387] NULL [13:13:15.387] RNGkind("Mersenne-Twister") [13:13:15.387] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:15.387] inherits = FALSE) [13:13:15.387] } [13:13:15.387] options(future.plan = NULL) [13:13:15.387] if (is.na(NA_character_)) [13:13:15.387] Sys.unsetenv("R_FUTURE_PLAN") [13:13:15.387] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:15.387] future::plan(list(function (..., envir = parent.frame()) [13:13:15.387] { [13:13:15.387] future <- SequentialFuture(..., envir = envir) [13:13:15.387] if (!future$lazy) [13:13:15.387] future <- run(future) [13:13:15.387] invisible(future) [13:13:15.387] }), .cleanup = FALSE, .init = FALSE) [13:13:15.387] } [13:13:15.387] } [13:13:15.387] } [13:13:15.387] }) [13:13:15.387] if (TRUE) { [13:13:15.387] base::sink(type = "output", split = FALSE) [13:13:15.387] if (TRUE) { [13:13:15.387] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:15.387] } [13:13:15.387] else { [13:13:15.387] ...future.result["stdout"] <- base::list(NULL) [13:13:15.387] } [13:13:15.387] base::close(...future.stdout) [13:13:15.387] ...future.stdout <- NULL [13:13:15.387] } [13:13:15.387] ...future.result$conditions <- ...future.conditions [13:13:15.387] ...future.result$finished <- base::Sys.time() [13:13:15.387] ...future.result [13:13:15.387] } [13:13:15.391] assign_globals() ... [13:13:15.392] List of 5 [13:13:15.392] $ ...future.FUN :function (x, ...) [13:13:15.392] $ future.call.arguments :List of 1 [13:13:15.392] ..$ singular.ok: logi FALSE [13:13:15.392] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:15.392] $ ...future.elements_ii :List of 3 [13:13:15.392] ..$ :'data.frame': 18 obs. of 3 variables: [13:13:15.392] .. ..$ breaks : num [1:18] 26 30 54 25 70 52 51 26 67 27 ... [13:13:15.392] .. ..$ wool : Factor w/ 2 levels "A","B": 1 1 1 1 1 1 1 1 1 2 ... [13:13:15.392] .. ..$ tension: Factor w/ 3 levels "L","M","H": 1 1 1 1 1 1 1 1 1 1 ... [13:13:15.392] ..$ :'data.frame': 18 obs. of 3 variables: [13:13:15.392] .. ..$ breaks : num [1:18] 18 21 29 17 12 18 35 30 36 42 ... [13:13:15.392] .. ..$ wool : Factor w/ 2 levels "A","B": 1 1 1 1 1 1 1 1 1 2 ... [13:13:15.392] .. ..$ tension: Factor w/ 3 levels "L","M","H": 2 2 2 2 2 2 2 2 2 2 ... [13:13:15.392] ..$ :'data.frame': 18 obs. of 3 variables: [13:13:15.392] .. ..$ breaks : num [1:18] 36 21 24 18 10 43 28 15 26 20 ... [13:13:15.392] .. ..$ wool : Factor w/ 2 levels "A","B": 1 1 1 1 1 1 1 1 1 2 ... [13:13:15.392] .. ..$ tension: Factor w/ 3 levels "L","M","H": 3 3 3 3 3 3 3 3 3 3 ... [13:13:15.392] $ ...future.seeds_ii : NULL [13:13:15.392] $ ...future.globals.maxSize: NULL [13:13:15.392] - attr(*, "where")=List of 5 [13:13:15.392] ..$ ...future.FUN : [13:13:15.392] ..$ future.call.arguments : [13:13:15.392] ..$ ...future.elements_ii : [13:13:15.392] ..$ ...future.seeds_ii : [13:13:15.392] ..$ ...future.globals.maxSize: [13:13:15.392] - attr(*, "resolved")= logi FALSE [13:13:15.392] - attr(*, "total_size")= num 5384 [13:13:15.392] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:15.392] - attr(*, "already-done")= logi TRUE [13:13:15.406] - reassign environment for '...future.FUN' [13:13:15.406] - copied '...future.FUN' to environment [13:13:15.406] - copied 'future.call.arguments' to environment [13:13:15.406] - copied '...future.elements_ii' to environment [13:13:15.406] - copied '...future.seeds_ii' to environment [13:13:15.407] - copied '...future.globals.maxSize' to environment [13:13:15.407] assign_globals() ... done [13:13:15.407] plan(): Setting new future strategy stack: [13:13:15.408] List of future strategies: [13:13:15.408] 1. sequential: [13:13:15.408] - args: function (..., envir = parent.frame(), workers = "") [13:13:15.408] - tweaked: FALSE [13:13:15.408] - call: NULL [13:13:15.408] plan(): nbrOfWorkers() = 1 [13:13:15.412] plan(): Setting new future strategy stack: [13:13:15.413] List of future strategies: [13:13:15.413] 1. sequential: [13:13:15.413] - args: function (..., envir = parent.frame(), workers = "") [13:13:15.413] - tweaked: FALSE [13:13:15.413] - call: plan(strategy) [13:13:15.413] plan(): nbrOfWorkers() = 1 [13:13:15.414] SequentialFuture started (and completed) [13:13:15.414] - Launch lazy future ... done [13:13:15.414] run() for 'SequentialFuture' ... done [13:13:15.414] Created future: [13:13:15.414] SequentialFuture: [13:13:15.414] Label: 'future_by-1' [13:13:15.414] Expression: [13:13:15.414] { [13:13:15.414] do.call(function(...) { [13:13:15.414] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:15.414] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:15.414] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:15.414] on.exit(options(oopts), add = TRUE) [13:13:15.414] } [13:13:15.414] { [13:13:15.414] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:15.414] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:15.414] ...future.FUN(...future.X_jj, ...) [13:13:15.414] }) [13:13:15.414] } [13:13:15.414] }, args = future.call.arguments) [13:13:15.414] } [13:13:15.414] Lazy evaluation: FALSE [13:13:15.414] Asynchronous evaluation: FALSE [13:13:15.414] Local evaluation: TRUE [13:13:15.414] Environment: R_GlobalEnv [13:13:15.414] Capture standard output: TRUE [13:13:15.414] Capture condition classes: 'condition' (excluding 'nothing') [13:13:15.414] Globals: 5 objects totaling 10.06 KiB (function '...future.FUN' of 5.20 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 4.80 KiB, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:13:15.414] Packages: 1 packages ('stats') [13:13:15.414] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:15.414] Resolved: TRUE [13:13:15.414] Value: 26.06 KiB of class 'list' [13:13:15.414] Early signaling: FALSE [13:13:15.414] Owner process: f0659542-730c-c20a-65b3-84f202449c4d [13:13:15.414] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:15.416] Chunk #1 of 1 ... DONE [13:13:15.416] Launching 1 futures (chunks) ... DONE [13:13:15.417] Resolving 1 futures (chunks) ... [13:13:15.417] resolve() on list ... [13:13:15.417] recursive: 0 [13:13:15.417] length: 1 [13:13:15.417] [13:13:15.417] resolved() for 'SequentialFuture' ... [13:13:15.418] - state: 'finished' [13:13:15.418] - run: TRUE [13:13:15.418] - result: 'FutureResult' [13:13:15.418] resolved() for 'SequentialFuture' ... done [13:13:15.418] Future #1 [13:13:15.419] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:15.419] - nx: 1 [13:13:15.419] - relay: TRUE [13:13:15.419] - stdout: TRUE [13:13:15.419] - signal: TRUE [13:13:15.419] - resignal: FALSE [13:13:15.420] - force: TRUE [13:13:15.420] - relayed: [n=1] FALSE [13:13:15.420] - queued futures: [n=1] FALSE [13:13:15.420] - until=1 [13:13:15.420] - relaying element #1 [13:13:15.421] - relayed: [n=1] TRUE [13:13:15.421] - queued futures: [n=1] TRUE [13:13:15.421] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:15.421] length: 0 (resolved future 1) [13:13:15.421] Relaying remaining futures [13:13:15.421] signalConditionsASAP(NULL, pos=0) ... [13:13:15.422] - nx: 1 [13:13:15.422] - relay: TRUE [13:13:15.422] - stdout: TRUE [13:13:15.422] - signal: TRUE [13:13:15.422] - resignal: FALSE [13:13:15.422] - force: TRUE [13:13:15.423] - relayed: [n=1] TRUE [13:13:15.423] - queued futures: [n=1] TRUE - flush all [13:13:15.423] - relayed: [n=1] TRUE [13:13:15.423] - queued futures: [n=1] TRUE [13:13:15.423] signalConditionsASAP(NULL, pos=0) ... done [13:13:15.423] resolve() on list ... DONE [13:13:15.424] - Number of value chunks collected: 1 [13:13:15.424] Resolving 1 futures (chunks) ... DONE [13:13:15.424] Reducing values from 1 chunks ... [13:13:15.424] - Number of values collected after concatenation: 3 [13:13:15.424] - Number of values expected: 3 [13:13:15.424] Reducing values from 1 chunks ... DONE [13:13:15.425] future_lapply() ... DONE [13:13:15.425] future_by_internal() ... DONE [13:13:15.430] future_by_internal() ... [13:13:15.430] future_lapply() ... [13:13:15.431] Number of chunks: 1 [13:13:15.431] getGlobalsAndPackagesXApply() ... [13:13:15.432] - future.globals: TRUE [13:13:15.432] getGlobalsAndPackages() ... [13:13:15.432] Searching for globals... [13:13:15.434] - globals found: [6] 'FUN', '{', 'lm', '~', 'breaks', 'wool' [13:13:15.434] Searching for globals ... DONE [13:13:15.435] Resolving globals: FALSE [13:13:15.435] The total size of the 3 globals is 2.27 KiB (2320 bytes) [13:13:15.436] The total size of the 3 globals exported for future expression ('FUN()') is 2.27 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There are three globals: 'FUN' (1.04 KiB of class 'function'), 'wool' (776 bytes of class 'numeric') and 'breaks' (480 bytes of class 'numeric') [13:13:15.436] - globals: [3] 'FUN', 'breaks', 'wool' [13:13:15.436] - packages: [1] 'stats' [13:13:15.436] getGlobalsAndPackages() ... DONE [13:13:15.436] - globals found/used: [n=3] 'FUN', 'breaks', 'wool' [13:13:15.437] - needed namespaces: [n=1] 'stats' [13:13:15.437] Finding globals ... DONE [13:13:15.437] - use_args: TRUE [13:13:15.437] - Getting '...' globals ... [13:13:15.438] resolve() on list ... [13:13:15.438] recursive: 0 [13:13:15.438] length: 1 [13:13:15.438] elements: '...' [13:13:15.438] length: 0 (resolved future 1) [13:13:15.438] resolve() on list ... DONE [13:13:15.439] - '...' content: [n=0] [13:13:15.439] List of 1 [13:13:15.439] $ ...: list() [13:13:15.439] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:15.439] - attr(*, "where")=List of 1 [13:13:15.439] ..$ ...: [13:13:15.439] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:15.439] - attr(*, "resolved")= logi TRUE [13:13:15.439] - attr(*, "total_size")= num NA [13:13:15.442] - Getting '...' globals ... DONE [13:13:15.442] Globals to be used in all futures (chunks): [n=4] '...future.FUN', 'breaks', 'wool', '...' [13:13:15.442] List of 4 [13:13:15.442] $ ...future.FUN:function (x) [13:13:15.442] $ breaks : num [1:54] 26 30 54 25 70 52 51 26 67 18 ... [13:13:15.442] $ wool : Factor w/ 2 levels "A","B": 1 1 1 1 1 1 1 1 1 1 ... [13:13:15.442] $ ... : list() [13:13:15.442] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:15.442] - attr(*, "where")=List of 4 [13:13:15.442] ..$ ...future.FUN: [13:13:15.442] ..$ breaks : [13:13:15.442] ..$ wool : [13:13:15.442] ..$ ... : [13:13:15.442] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:15.442] - attr(*, "resolved")= logi FALSE [13:13:15.442] - attr(*, "total_size")= num 2320 [13:13:15.447] Packages to be attached in all futures: [n=1] 'stats' [13:13:15.447] getGlobalsAndPackagesXApply() ... DONE [13:13:15.447] Number of futures (= number of chunks): 1 [13:13:15.448] Launching 1 futures (chunks) ... [13:13:15.448] Chunk #1 of 1 ... [13:13:15.448] - Finding globals in 'X' for chunk #1 ... [13:13:15.448] getGlobalsAndPackages() ... [13:13:15.448] Searching for globals... [13:13:15.449] [13:13:15.449] Searching for globals ... DONE [13:13:15.449] - globals: [0] [13:13:15.449] getGlobalsAndPackages() ... DONE [13:13:15.449] + additional globals found: [n=0] [13:13:15.450] + additional namespaces needed: [n=0] [13:13:15.450] - Finding globals in 'X' for chunk #1 ... DONE [13:13:15.450] - seeds: [13:13:15.450] - All globals exported: [n=7] '...future.FUN', 'breaks', 'wool', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:15.450] getGlobalsAndPackages() ... [13:13:15.450] - globals passed as-is: [7] '...future.FUN', 'breaks', 'wool', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:15.451] Resolving globals: FALSE [13:13:15.451] Tweak future expression to call with '...' arguments ... [13:13:15.451] { [13:13:15.451] do.call(function(...) { [13:13:15.451] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:15.451] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:15.451] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:15.451] on.exit(options(oopts), add = TRUE) [13:13:15.451] } [13:13:15.451] { [13:13:15.451] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:15.451] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:15.451] ...future.FUN(...future.X_jj, ...) [13:13:15.451] }) [13:13:15.451] } [13:13:15.451] }, args = future.call.arguments) [13:13:15.451] } [13:13:15.451] Tweak future expression to call with '...' arguments ... DONE [13:13:15.452] - globals: [7] '...future.FUN', 'breaks', 'wool', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:15.452] [13:13:15.452] getGlobalsAndPackages() ... DONE [13:13:15.453] run() for 'Future' ... [13:13:15.453] - state: 'created' [13:13:15.453] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:13:15.454] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:15.454] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:15.454] - Field: 'label' [13:13:15.454] - Field: 'local' [13:13:15.454] - Field: 'owner' [13:13:15.455] - Field: 'envir' [13:13:15.455] - Field: 'packages' [13:13:15.455] - Field: 'gc' [13:13:15.455] - Field: 'conditions' [13:13:15.455] - Field: 'expr' [13:13:15.455] - Field: 'uuid' [13:13:15.456] - Field: 'seed' [13:13:15.456] - Field: 'version' [13:13:15.456] - Field: 'result' [13:13:15.456] - Field: 'asynchronous' [13:13:15.456] - Field: 'calls' [13:13:15.456] - Field: 'globals' [13:13:15.457] - Field: 'stdout' [13:13:15.457] - Field: 'earlySignal' [13:13:15.457] - Field: 'lazy' [13:13:15.457] - Field: 'state' [13:13:15.457] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:15.457] - Launch lazy future ... [13:13:15.458] Packages needed by the future expression (n = 1): 'stats' [13:13:15.458] Packages needed by future strategies (n = 0): [13:13:15.459] { [13:13:15.459] { [13:13:15.459] { [13:13:15.459] ...future.startTime <- base::Sys.time() [13:13:15.459] { [13:13:15.459] { [13:13:15.459] { [13:13:15.459] { [13:13:15.459] base::local({ [13:13:15.459] has_future <- base::requireNamespace("future", [13:13:15.459] quietly = TRUE) [13:13:15.459] if (has_future) { [13:13:15.459] ns <- base::getNamespace("future") [13:13:15.459] version <- ns[[".package"]][["version"]] [13:13:15.459] if (is.null(version)) [13:13:15.459] version <- utils::packageVersion("future") [13:13:15.459] } [13:13:15.459] else { [13:13:15.459] version <- NULL [13:13:15.459] } [13:13:15.459] if (!has_future || version < "1.8.0") { [13:13:15.459] info <- base::c(r_version = base::gsub("R version ", [13:13:15.459] "", base::R.version$version.string), [13:13:15.459] platform = base::sprintf("%s (%s-bit)", [13:13:15.459] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:15.459] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:15.459] "release", "version")], collapse = " "), [13:13:15.459] hostname = base::Sys.info()[["nodename"]]) [13:13:15.459] info <- base::sprintf("%s: %s", base::names(info), [13:13:15.459] info) [13:13:15.459] info <- base::paste(info, collapse = "; ") [13:13:15.459] if (!has_future) { [13:13:15.459] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:15.459] info) [13:13:15.459] } [13:13:15.459] else { [13:13:15.459] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:15.459] info, version) [13:13:15.459] } [13:13:15.459] base::stop(msg) [13:13:15.459] } [13:13:15.459] }) [13:13:15.459] } [13:13:15.459] base::local({ [13:13:15.459] for (pkg in "stats") { [13:13:15.459] base::loadNamespace(pkg) [13:13:15.459] base::library(pkg, character.only = TRUE) [13:13:15.459] } [13:13:15.459] }) [13:13:15.459] } [13:13:15.459] options(future.plan = NULL) [13:13:15.459] Sys.unsetenv("R_FUTURE_PLAN") [13:13:15.459] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:15.459] } [13:13:15.459] ...future.workdir <- getwd() [13:13:15.459] } [13:13:15.459] ...future.oldOptions <- base::as.list(base::.Options) [13:13:15.459] ...future.oldEnvVars <- base::Sys.getenv() [13:13:15.459] } [13:13:15.459] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:15.459] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:15.459] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:15.459] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:15.459] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:15.459] future.stdout.windows.reencode = NULL, width = 80L) [13:13:15.459] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:15.459] base::names(...future.oldOptions)) [13:13:15.459] } [13:13:15.459] if (FALSE) { [13:13:15.459] } [13:13:15.459] else { [13:13:15.459] if (TRUE) { [13:13:15.459] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:15.459] open = "w") [13:13:15.459] } [13:13:15.459] else { [13:13:15.459] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:15.459] windows = "NUL", "/dev/null"), open = "w") [13:13:15.459] } [13:13:15.459] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:15.459] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:15.459] base::sink(type = "output", split = FALSE) [13:13:15.459] base::close(...future.stdout) [13:13:15.459] }, add = TRUE) [13:13:15.459] } [13:13:15.459] ...future.frame <- base::sys.nframe() [13:13:15.459] ...future.conditions <- base::list() [13:13:15.459] ...future.rng <- base::globalenv()$.Random.seed [13:13:15.459] if (FALSE) { [13:13:15.459] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:15.459] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:15.459] } [13:13:15.459] ...future.result <- base::tryCatch({ [13:13:15.459] base::withCallingHandlers({ [13:13:15.459] ...future.value <- base::withVisible(base::local({ [13:13:15.459] do.call(function(...) { [13:13:15.459] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:15.459] if (!identical(...future.globals.maxSize.org, [13:13:15.459] ...future.globals.maxSize)) { [13:13:15.459] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:15.459] on.exit(options(oopts), add = TRUE) [13:13:15.459] } [13:13:15.459] { [13:13:15.459] lapply(seq_along(...future.elements_ii), [13:13:15.459] FUN = function(jj) { [13:13:15.459] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:15.459] ...future.FUN(...future.X_jj, ...) [13:13:15.459] }) [13:13:15.459] } [13:13:15.459] }, args = future.call.arguments) [13:13:15.459] })) [13:13:15.459] future::FutureResult(value = ...future.value$value, [13:13:15.459] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:15.459] ...future.rng), globalenv = if (FALSE) [13:13:15.459] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:15.459] ...future.globalenv.names)) [13:13:15.459] else NULL, started = ...future.startTime, version = "1.8") [13:13:15.459] }, condition = base::local({ [13:13:15.459] c <- base::c [13:13:15.459] inherits <- base::inherits [13:13:15.459] invokeRestart <- base::invokeRestart [13:13:15.459] length <- base::length [13:13:15.459] list <- base::list [13:13:15.459] seq.int <- base::seq.int [13:13:15.459] signalCondition <- base::signalCondition [13:13:15.459] sys.calls <- base::sys.calls [13:13:15.459] `[[` <- base::`[[` [13:13:15.459] `+` <- base::`+` [13:13:15.459] `<<-` <- base::`<<-` [13:13:15.459] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:15.459] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:15.459] 3L)] [13:13:15.459] } [13:13:15.459] function(cond) { [13:13:15.459] is_error <- inherits(cond, "error") [13:13:15.459] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:15.459] NULL) [13:13:15.459] if (is_error) { [13:13:15.459] sessionInformation <- function() { [13:13:15.459] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:15.459] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:15.459] search = base::search(), system = base::Sys.info()) [13:13:15.459] } [13:13:15.459] ...future.conditions[[length(...future.conditions) + [13:13:15.459] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:15.459] cond$call), session = sessionInformation(), [13:13:15.459] timestamp = base::Sys.time(), signaled = 0L) [13:13:15.459] signalCondition(cond) [13:13:15.459] } [13:13:15.459] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:15.459] "immediateCondition"))) { [13:13:15.459] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:15.459] ...future.conditions[[length(...future.conditions) + [13:13:15.459] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:15.459] if (TRUE && !signal) { [13:13:15.459] muffleCondition <- function (cond, pattern = "^muffle") [13:13:15.459] { [13:13:15.459] inherits <- base::inherits [13:13:15.459] invokeRestart <- base::invokeRestart [13:13:15.459] is.null <- base::is.null [13:13:15.459] muffled <- FALSE [13:13:15.459] if (inherits(cond, "message")) { [13:13:15.459] muffled <- grepl(pattern, "muffleMessage") [13:13:15.459] if (muffled) [13:13:15.459] invokeRestart("muffleMessage") [13:13:15.459] } [13:13:15.459] else if (inherits(cond, "warning")) { [13:13:15.459] muffled <- grepl(pattern, "muffleWarning") [13:13:15.459] if (muffled) [13:13:15.459] invokeRestart("muffleWarning") [13:13:15.459] } [13:13:15.459] else if (inherits(cond, "condition")) { [13:13:15.459] if (!is.null(pattern)) { [13:13:15.459] computeRestarts <- base::computeRestarts [13:13:15.459] grepl <- base::grepl [13:13:15.459] restarts <- computeRestarts(cond) [13:13:15.459] for (restart in restarts) { [13:13:15.459] name <- restart$name [13:13:15.459] if (is.null(name)) [13:13:15.459] next [13:13:15.459] if (!grepl(pattern, name)) [13:13:15.459] next [13:13:15.459] invokeRestart(restart) [13:13:15.459] muffled <- TRUE [13:13:15.459] break [13:13:15.459] } [13:13:15.459] } [13:13:15.459] } [13:13:15.459] invisible(muffled) [13:13:15.459] } [13:13:15.459] muffleCondition(cond, pattern = "^muffle") [13:13:15.459] } [13:13:15.459] } [13:13:15.459] else { [13:13:15.459] if (TRUE) { [13:13:15.459] muffleCondition <- function (cond, pattern = "^muffle") [13:13:15.459] { [13:13:15.459] inherits <- base::inherits [13:13:15.459] invokeRestart <- base::invokeRestart [13:13:15.459] is.null <- base::is.null [13:13:15.459] muffled <- FALSE [13:13:15.459] if (inherits(cond, "message")) { [13:13:15.459] muffled <- grepl(pattern, "muffleMessage") [13:13:15.459] if (muffled) [13:13:15.459] invokeRestart("muffleMessage") [13:13:15.459] } [13:13:15.459] else if (inherits(cond, "warning")) { [13:13:15.459] muffled <- grepl(pattern, "muffleWarning") [13:13:15.459] if (muffled) [13:13:15.459] invokeRestart("muffleWarning") [13:13:15.459] } [13:13:15.459] else if (inherits(cond, "condition")) { [13:13:15.459] if (!is.null(pattern)) { [13:13:15.459] computeRestarts <- base::computeRestarts [13:13:15.459] grepl <- base::grepl [13:13:15.459] restarts <- computeRestarts(cond) [13:13:15.459] for (restart in restarts) { [13:13:15.459] name <- restart$name [13:13:15.459] if (is.null(name)) [13:13:15.459] next [13:13:15.459] if (!grepl(pattern, name)) [13:13:15.459] next [13:13:15.459] invokeRestart(restart) [13:13:15.459] muffled <- TRUE [13:13:15.459] break [13:13:15.459] } [13:13:15.459] } [13:13:15.459] } [13:13:15.459] invisible(muffled) [13:13:15.459] } [13:13:15.459] muffleCondition(cond, pattern = "^muffle") [13:13:15.459] } [13:13:15.459] } [13:13:15.459] } [13:13:15.459] })) [13:13:15.459] }, error = function(ex) { [13:13:15.459] base::structure(base::list(value = NULL, visible = NULL, [13:13:15.459] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:15.459] ...future.rng), started = ...future.startTime, [13:13:15.459] finished = Sys.time(), session_uuid = NA_character_, [13:13:15.459] version = "1.8"), class = "FutureResult") [13:13:15.459] }, finally = { [13:13:15.459] if (!identical(...future.workdir, getwd())) [13:13:15.459] setwd(...future.workdir) [13:13:15.459] { [13:13:15.459] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:15.459] ...future.oldOptions$nwarnings <- NULL [13:13:15.459] } [13:13:15.459] base::options(...future.oldOptions) [13:13:15.459] if (.Platform$OS.type == "windows") { [13:13:15.459] old_names <- names(...future.oldEnvVars) [13:13:15.459] envs <- base::Sys.getenv() [13:13:15.459] names <- names(envs) [13:13:15.459] common <- intersect(names, old_names) [13:13:15.459] added <- setdiff(names, old_names) [13:13:15.459] removed <- setdiff(old_names, names) [13:13:15.459] changed <- common[...future.oldEnvVars[common] != [13:13:15.459] envs[common]] [13:13:15.459] NAMES <- toupper(changed) [13:13:15.459] args <- list() [13:13:15.459] for (kk in seq_along(NAMES)) { [13:13:15.459] name <- changed[[kk]] [13:13:15.459] NAME <- NAMES[[kk]] [13:13:15.459] if (name != NAME && is.element(NAME, old_names)) [13:13:15.459] next [13:13:15.459] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:15.459] } [13:13:15.459] NAMES <- toupper(added) [13:13:15.459] for (kk in seq_along(NAMES)) { [13:13:15.459] name <- added[[kk]] [13:13:15.459] NAME <- NAMES[[kk]] [13:13:15.459] if (name != NAME && is.element(NAME, old_names)) [13:13:15.459] next [13:13:15.459] args[[name]] <- "" [13:13:15.459] } [13:13:15.459] NAMES <- toupper(removed) [13:13:15.459] for (kk in seq_along(NAMES)) { [13:13:15.459] name <- removed[[kk]] [13:13:15.459] NAME <- NAMES[[kk]] [13:13:15.459] if (name != NAME && is.element(NAME, old_names)) [13:13:15.459] next [13:13:15.459] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:15.459] } [13:13:15.459] if (length(args) > 0) [13:13:15.459] base::do.call(base::Sys.setenv, args = args) [13:13:15.459] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:15.459] } [13:13:15.459] else { [13:13:15.459] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:15.459] } [13:13:15.459] { [13:13:15.459] if (base::length(...future.futureOptionsAdded) > [13:13:15.459] 0L) { [13:13:15.459] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:15.459] base::names(opts) <- ...future.futureOptionsAdded [13:13:15.459] base::options(opts) [13:13:15.459] } [13:13:15.459] { [13:13:15.459] { [13:13:15.459] NULL [13:13:15.459] RNGkind("Mersenne-Twister") [13:13:15.459] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:15.459] inherits = FALSE) [13:13:15.459] } [13:13:15.459] options(future.plan = NULL) [13:13:15.459] if (is.na(NA_character_)) [13:13:15.459] Sys.unsetenv("R_FUTURE_PLAN") [13:13:15.459] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:15.459] future::plan(list(function (..., envir = parent.frame()) [13:13:15.459] { [13:13:15.459] future <- SequentialFuture(..., envir = envir) [13:13:15.459] if (!future$lazy) [13:13:15.459] future <- run(future) [13:13:15.459] invisible(future) [13:13:15.459] }), .cleanup = FALSE, .init = FALSE) [13:13:15.459] } [13:13:15.459] } [13:13:15.459] } [13:13:15.459] }) [13:13:15.459] if (TRUE) { [13:13:15.459] base::sink(type = "output", split = FALSE) [13:13:15.459] if (TRUE) { [13:13:15.459] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:15.459] } [13:13:15.459] else { [13:13:15.459] ...future.result["stdout"] <- base::list(NULL) [13:13:15.459] } [13:13:15.459] base::close(...future.stdout) [13:13:15.459] ...future.stdout <- NULL [13:13:15.459] } [13:13:15.459] ...future.result$conditions <- ...future.conditions [13:13:15.459] ...future.result$finished <- base::Sys.time() [13:13:15.459] ...future.result [13:13:15.459] } [13:13:15.463] assign_globals() ... [13:13:15.463] List of 7 [13:13:15.463] $ ...future.FUN :function (x) [13:13:15.463] $ breaks : num [1:54] 26 30 54 25 70 52 51 26 67 18 ... [13:13:15.463] $ wool : Factor w/ 2 levels "A","B": 1 1 1 1 1 1 1 1 1 1 ... [13:13:15.463] $ future.call.arguments : list() [13:13:15.463] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:15.463] $ ...future.elements_ii :List of 3 [13:13:15.463] ..$ :'data.frame': 18 obs. of 3 variables: [13:13:15.463] .. ..$ breaks : num [1:18] 26 30 54 25 70 52 51 26 67 27 ... [13:13:15.463] .. ..$ wool : Factor w/ 2 levels "A","B": 1 1 1 1 1 1 1 1 1 2 ... [13:13:15.463] .. ..$ tension: Factor w/ 3 levels "L","M","H": 1 1 1 1 1 1 1 1 1 1 ... [13:13:15.463] ..$ :'data.frame': 18 obs. of 3 variables: [13:13:15.463] .. ..$ breaks : num [1:18] 18 21 29 17 12 18 35 30 36 42 ... [13:13:15.463] .. ..$ wool : Factor w/ 2 levels "A","B": 1 1 1 1 1 1 1 1 1 2 ... [13:13:15.463] .. ..$ tension: Factor w/ 3 levels "L","M","H": 2 2 2 2 2 2 2 2 2 2 ... [13:13:15.463] ..$ :'data.frame': 18 obs. of 3 variables: [13:13:15.463] .. ..$ breaks : num [1:18] 36 21 24 18 10 43 28 15 26 20 ... [13:13:15.463] .. ..$ wool : Factor w/ 2 levels "A","B": 1 1 1 1 1 1 1 1 1 2 ... [13:13:15.463] .. ..$ tension: Factor w/ 3 levels "L","M","H": 3 3 3 3 3 3 3 3 3 3 ... [13:13:15.463] $ ...future.seeds_ii : NULL [13:13:15.463] $ ...future.globals.maxSize: NULL [13:13:15.463] - attr(*, "where")=List of 7 [13:13:15.463] ..$ ...future.FUN : [13:13:15.463] ..$ breaks : [13:13:15.463] ..$ wool : [13:13:15.463] ..$ future.call.arguments : [13:13:15.463] ..$ ...future.elements_ii : [13:13:15.463] ..$ ...future.seeds_ii : [13:13:15.463] ..$ ...future.globals.maxSize: [13:13:15.463] - attr(*, "resolved")= logi FALSE [13:13:15.463] - attr(*, "total_size")= num 2320 [13:13:15.463] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:15.463] - attr(*, "already-done")= logi TRUE [13:13:15.475] - reassign environment for '...future.FUN' [13:13:15.475] - copied '...future.FUN' to environment [13:13:15.475] - copied 'breaks' to environment [13:13:15.475] - copied 'wool' to environment [13:13:15.476] - copied 'future.call.arguments' to environment [13:13:15.476] - copied '...future.elements_ii' to environment [13:13:15.476] - copied '...future.seeds_ii' to environment [13:13:15.476] - copied '...future.globals.maxSize' to environment [13:13:15.476] assign_globals() ... done [13:13:15.477] plan(): Setting new future strategy stack: [13:13:15.477] List of future strategies: [13:13:15.477] 1. sequential: [13:13:15.477] - args: function (..., envir = parent.frame(), workers = "") [13:13:15.477] - tweaked: FALSE [13:13:15.477] - call: NULL [13:13:15.478] plan(): nbrOfWorkers() = 1 [13:13:15.485] plan(): Setting new future strategy stack: [13:13:15.485] List of future strategies: [13:13:15.485] 1. sequential: [13:13:15.485] - args: function (..., envir = parent.frame(), workers = "") [13:13:15.485] - tweaked: FALSE [13:13:15.485] - call: plan(strategy) [13:13:15.486] plan(): nbrOfWorkers() = 1 [13:13:15.486] SequentialFuture started (and completed) [13:13:15.486] - Launch lazy future ... done [13:13:15.486] run() for 'SequentialFuture' ... done [13:13:15.486] Created future: [13:13:15.487] SequentialFuture: [13:13:15.487] Label: 'future_by-1' [13:13:15.487] Expression: [13:13:15.487] { [13:13:15.487] do.call(function(...) { [13:13:15.487] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:15.487] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:15.487] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:15.487] on.exit(options(oopts), add = TRUE) [13:13:15.487] } [13:13:15.487] { [13:13:15.487] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:15.487] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:15.487] ...future.FUN(...future.X_jj, ...) [13:13:15.487] }) [13:13:15.487] } [13:13:15.487] }, args = future.call.arguments) [13:13:15.487] } [13:13:15.487] Lazy evaluation: FALSE [13:13:15.487] Asynchronous evaluation: FALSE [13:13:15.487] Local evaluation: TRUE [13:13:15.487] Environment: 0x000001868ea48990 [13:13:15.487] Capture standard output: TRUE [13:13:15.487] Capture condition classes: 'condition' (excluding 'nothing') [13:13:15.487] Globals: 7 objects totaling 7.07 KiB (function '...future.FUN' of 1.04 KiB, numeric 'breaks' of 480 bytes, factor 'wool' of 776 bytes, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 4.80 KiB, ...) [13:13:15.487] Packages: 1 packages ('stats') [13:13:15.487] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:15.487] Resolved: TRUE [13:13:15.487] Value: 25.57 KiB of class 'list' [13:13:15.487] Early signaling: FALSE [13:13:15.487] Owner process: f0659542-730c-c20a-65b3-84f202449c4d [13:13:15.487] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:15.489] Chunk #1 of 1 ... DONE [13:13:15.489] Launching 1 futures (chunks) ... DONE [13:13:15.489] Resolving 1 futures (chunks) ... [13:13:15.489] resolve() on list ... [13:13:15.490] recursive: 0 [13:13:15.490] length: 1 [13:13:15.490] [13:13:15.490] resolved() for 'SequentialFuture' ... [13:13:15.490] - state: 'finished' [13:13:15.491] - run: TRUE [13:13:15.491] - result: 'FutureResult' [13:13:15.491] resolved() for 'SequentialFuture' ... done [13:13:15.491] Future #1 [13:13:15.492] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:15.492] - nx: 1 [13:13:15.492] - relay: TRUE [13:13:15.492] - stdout: TRUE [13:13:15.492] - signal: TRUE [13:13:15.492] - resignal: FALSE [13:13:15.493] - force: TRUE [13:13:15.493] - relayed: [n=1] FALSE [13:13:15.493] - queued futures: [n=1] FALSE [13:13:15.493] - until=1 [13:13:15.493] - relaying element #1 [13:13:15.494] - relayed: [n=1] TRUE [13:13:15.494] - queued futures: [n=1] TRUE [13:13:15.494] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:15.494] length: 0 (resolved future 1) [13:13:15.494] Relaying remaining futures [13:13:15.495] signalConditionsASAP(NULL, pos=0) ... [13:13:15.495] - nx: 1 [13:13:15.495] - relay: TRUE [13:13:15.495] - stdout: TRUE [13:13:15.495] - signal: TRUE [13:13:15.496] - resignal: FALSE [13:13:15.496] - force: TRUE [13:13:15.496] - relayed: [n=1] TRUE [13:13:15.496] - queued futures: [n=1] TRUE - flush all [13:13:15.496] - relayed: [n=1] TRUE [13:13:15.497] - queued futures: [n=1] TRUE [13:13:15.497] signalConditionsASAP(NULL, pos=0) ... done [13:13:15.497] resolve() on list ... DONE [13:13:15.497] - Number of value chunks collected: 1 [13:13:15.498] Resolving 1 futures (chunks) ... DONE [13:13:15.498] Reducing values from 1 chunks ... [13:13:15.498] - Number of values collected after concatenation: 3 [13:13:15.498] - Number of values expected: 3 [13:13:15.498] Reducing values from 1 chunks ... DONE [13:13:15.499] future_lapply() ... DONE [13:13:15.499] future_by_internal() ... DONE [13:13:15.499] future_by_internal() ... [13:13:15.500] future_lapply() ... [13:13:15.501] Number of chunks: 1 [13:13:15.501] getGlobalsAndPackagesXApply() ... [13:13:15.501] - future.globals: TRUE [13:13:15.501] getGlobalsAndPackages() ... [13:13:15.502] Searching for globals... [13:13:15.503] - globals found: [2] 'FUN', 'UseMethod' [13:13:15.504] Searching for globals ... DONE [13:13:15.504] Resolving globals: FALSE [13:13:15.504] The total size of the 1 globals is 1.21 KiB (1240 bytes) [13:13:15.505] The total size of the 1 globals exported for future expression ('FUN()') is 1.21 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (1.21 KiB of class 'function') [13:13:15.505] - globals: [1] 'FUN' [13:13:15.505] [13:13:15.506] getGlobalsAndPackages() ... DONE [13:13:15.506] - globals found/used: [n=1] 'FUN' [13:13:15.506] - needed namespaces: [n=0] [13:13:15.506] Finding globals ... DONE [13:13:15.506] - use_args: TRUE [13:13:15.507] - Getting '...' globals ... [13:13:15.507] resolve() on list ... [13:13:15.507] recursive: 0 [13:13:15.508] length: 1 [13:13:15.508] elements: '...' [13:13:15.508] length: 0 (resolved future 1) [13:13:15.508] resolve() on list ... DONE [13:13:15.508] - '...' content: [n=0] [13:13:15.509] List of 1 [13:13:15.509] $ ...: list() [13:13:15.509] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:15.509] - attr(*, "where")=List of 1 [13:13:15.509] ..$ ...: [13:13:15.509] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:15.509] - attr(*, "resolved")= logi TRUE [13:13:15.509] - attr(*, "total_size")= num NA [13:13:15.512] - Getting '...' globals ... DONE [13:13:15.513] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:15.513] List of 2 [13:13:15.513] $ ...future.FUN:function (object, ...) [13:13:15.513] $ ... : list() [13:13:15.513] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:15.513] - attr(*, "where")=List of 2 [13:13:15.513] ..$ ...future.FUN: [13:13:15.513] ..$ ... : [13:13:15.513] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:15.513] - attr(*, "resolved")= logi FALSE [13:13:15.513] - attr(*, "total_size")= num 1240 [13:13:15.517] Packages to be attached in all futures: [n=0] [13:13:15.517] getGlobalsAndPackagesXApply() ... DONE [13:13:15.518] Number of futures (= number of chunks): 1 [13:13:15.518] Launching 1 futures (chunks) ... [13:13:15.518] Chunk #1 of 1 ... [13:13:15.518] - Finding globals in 'X' for chunk #1 ... [13:13:15.519] getGlobalsAndPackages() ... [13:13:15.519] Searching for globals... [13:13:15.520] [13:13:15.520] Searching for globals ... DONE [13:13:15.520] - globals: [0] [13:13:15.520] getGlobalsAndPackages() ... DONE [13:13:15.520] + additional globals found: [n=0] [13:13:15.521] + additional namespaces needed: [n=0] [13:13:15.521] - Finding globals in 'X' for chunk #1 ... DONE [13:13:15.521] - seeds: [13:13:15.521] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:15.521] getGlobalsAndPackages() ... [13:13:15.521] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:15.522] Resolving globals: FALSE [13:13:15.522] Tweak future expression to call with '...' arguments ... [13:13:15.522] { [13:13:15.522] do.call(function(...) { [13:13:15.522] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:15.522] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:15.522] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:15.522] on.exit(options(oopts), add = TRUE) [13:13:15.522] } [13:13:15.522] { [13:13:15.522] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:15.522] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:15.522] ...future.FUN(...future.X_jj, ...) [13:13:15.522] }) [13:13:15.522] } [13:13:15.522] }, args = future.call.arguments) [13:13:15.522] } [13:13:15.523] Tweak future expression to call with '...' arguments ... DONE [13:13:15.523] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:15.523] [13:13:15.523] getGlobalsAndPackages() ... DONE [13:13:15.524] run() for 'Future' ... [13:13:15.524] - state: 'created' [13:13:15.524] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:13:15.525] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:15.525] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:15.525] - Field: 'label' [13:13:15.525] - Field: 'local' [13:13:15.526] - Field: 'owner' [13:13:15.526] - Field: 'envir' [13:13:15.526] - Field: 'packages' [13:13:15.526] - Field: 'gc' [13:13:15.526] - Field: 'conditions' [13:13:15.526] - Field: 'expr' [13:13:15.527] - Field: 'uuid' [13:13:15.527] - Field: 'seed' [13:13:15.527] - Field: 'version' [13:13:15.527] - Field: 'result' [13:13:15.527] - Field: 'asynchronous' [13:13:15.528] - Field: 'calls' [13:13:15.528] - Field: 'globals' [13:13:15.528] - Field: 'stdout' [13:13:15.528] - Field: 'earlySignal' [13:13:15.528] - Field: 'lazy' [13:13:15.529] - Field: 'state' [13:13:15.529] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:15.529] - Launch lazy future ... [13:13:15.529] Packages needed by the future expression (n = 0): [13:13:15.529] Packages needed by future strategies (n = 0): [13:13:15.530] { [13:13:15.530] { [13:13:15.530] { [13:13:15.530] ...future.startTime <- base::Sys.time() [13:13:15.530] { [13:13:15.530] { [13:13:15.530] { [13:13:15.530] base::local({ [13:13:15.530] has_future <- base::requireNamespace("future", [13:13:15.530] quietly = TRUE) [13:13:15.530] if (has_future) { [13:13:15.530] ns <- base::getNamespace("future") [13:13:15.530] version <- ns[[".package"]][["version"]] [13:13:15.530] if (is.null(version)) [13:13:15.530] version <- utils::packageVersion("future") [13:13:15.530] } [13:13:15.530] else { [13:13:15.530] version <- NULL [13:13:15.530] } [13:13:15.530] if (!has_future || version < "1.8.0") { [13:13:15.530] info <- base::c(r_version = base::gsub("R version ", [13:13:15.530] "", base::R.version$version.string), [13:13:15.530] platform = base::sprintf("%s (%s-bit)", [13:13:15.530] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:15.530] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:15.530] "release", "version")], collapse = " "), [13:13:15.530] hostname = base::Sys.info()[["nodename"]]) [13:13:15.530] info <- base::sprintf("%s: %s", base::names(info), [13:13:15.530] info) [13:13:15.530] info <- base::paste(info, collapse = "; ") [13:13:15.530] if (!has_future) { [13:13:15.530] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:15.530] info) [13:13:15.530] } [13:13:15.530] else { [13:13:15.530] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:15.530] info, version) [13:13:15.530] } [13:13:15.530] base::stop(msg) [13:13:15.530] } [13:13:15.530] }) [13:13:15.530] } [13:13:15.530] options(future.plan = NULL) [13:13:15.530] Sys.unsetenv("R_FUTURE_PLAN") [13:13:15.530] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:15.530] } [13:13:15.530] ...future.workdir <- getwd() [13:13:15.530] } [13:13:15.530] ...future.oldOptions <- base::as.list(base::.Options) [13:13:15.530] ...future.oldEnvVars <- base::Sys.getenv() [13:13:15.530] } [13:13:15.530] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:15.530] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:15.530] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:15.530] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:15.530] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:15.530] future.stdout.windows.reencode = NULL, width = 80L) [13:13:15.530] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:15.530] base::names(...future.oldOptions)) [13:13:15.530] } [13:13:15.530] if (FALSE) { [13:13:15.530] } [13:13:15.530] else { [13:13:15.530] if (TRUE) { [13:13:15.530] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:15.530] open = "w") [13:13:15.530] } [13:13:15.530] else { [13:13:15.530] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:15.530] windows = "NUL", "/dev/null"), open = "w") [13:13:15.530] } [13:13:15.530] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:15.530] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:15.530] base::sink(type = "output", split = FALSE) [13:13:15.530] base::close(...future.stdout) [13:13:15.530] }, add = TRUE) [13:13:15.530] } [13:13:15.530] ...future.frame <- base::sys.nframe() [13:13:15.530] ...future.conditions <- base::list() [13:13:15.530] ...future.rng <- base::globalenv()$.Random.seed [13:13:15.530] if (FALSE) { [13:13:15.530] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:15.530] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:15.530] } [13:13:15.530] ...future.result <- base::tryCatch({ [13:13:15.530] base::withCallingHandlers({ [13:13:15.530] ...future.value <- base::withVisible(base::local({ [13:13:15.530] do.call(function(...) { [13:13:15.530] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:15.530] if (!identical(...future.globals.maxSize.org, [13:13:15.530] ...future.globals.maxSize)) { [13:13:15.530] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:15.530] on.exit(options(oopts), add = TRUE) [13:13:15.530] } [13:13:15.530] { [13:13:15.530] lapply(seq_along(...future.elements_ii), [13:13:15.530] FUN = function(jj) { [13:13:15.530] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:15.530] ...future.FUN(...future.X_jj, ...) [13:13:15.530] }) [13:13:15.530] } [13:13:15.530] }, args = future.call.arguments) [13:13:15.530] })) [13:13:15.530] future::FutureResult(value = ...future.value$value, [13:13:15.530] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:15.530] ...future.rng), globalenv = if (FALSE) [13:13:15.530] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:15.530] ...future.globalenv.names)) [13:13:15.530] else NULL, started = ...future.startTime, version = "1.8") [13:13:15.530] }, condition = base::local({ [13:13:15.530] c <- base::c [13:13:15.530] inherits <- base::inherits [13:13:15.530] invokeRestart <- base::invokeRestart [13:13:15.530] length <- base::length [13:13:15.530] list <- base::list [13:13:15.530] seq.int <- base::seq.int [13:13:15.530] signalCondition <- base::signalCondition [13:13:15.530] sys.calls <- base::sys.calls [13:13:15.530] `[[` <- base::`[[` [13:13:15.530] `+` <- base::`+` [13:13:15.530] `<<-` <- base::`<<-` [13:13:15.530] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:15.530] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:15.530] 3L)] [13:13:15.530] } [13:13:15.530] function(cond) { [13:13:15.530] is_error <- inherits(cond, "error") [13:13:15.530] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:15.530] NULL) [13:13:15.530] if (is_error) { [13:13:15.530] sessionInformation <- function() { [13:13:15.530] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:15.530] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:15.530] search = base::search(), system = base::Sys.info()) [13:13:15.530] } [13:13:15.530] ...future.conditions[[length(...future.conditions) + [13:13:15.530] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:15.530] cond$call), session = sessionInformation(), [13:13:15.530] timestamp = base::Sys.time(), signaled = 0L) [13:13:15.530] signalCondition(cond) [13:13:15.530] } [13:13:15.530] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:15.530] "immediateCondition"))) { [13:13:15.530] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:15.530] ...future.conditions[[length(...future.conditions) + [13:13:15.530] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:15.530] if (TRUE && !signal) { [13:13:15.530] muffleCondition <- function (cond, pattern = "^muffle") [13:13:15.530] { [13:13:15.530] inherits <- base::inherits [13:13:15.530] invokeRestart <- base::invokeRestart [13:13:15.530] is.null <- base::is.null [13:13:15.530] muffled <- FALSE [13:13:15.530] if (inherits(cond, "message")) { [13:13:15.530] muffled <- grepl(pattern, "muffleMessage") [13:13:15.530] if (muffled) [13:13:15.530] invokeRestart("muffleMessage") [13:13:15.530] } [13:13:15.530] else if (inherits(cond, "warning")) { [13:13:15.530] muffled <- grepl(pattern, "muffleWarning") [13:13:15.530] if (muffled) [13:13:15.530] invokeRestart("muffleWarning") [13:13:15.530] } [13:13:15.530] else if (inherits(cond, "condition")) { [13:13:15.530] if (!is.null(pattern)) { [13:13:15.530] computeRestarts <- base::computeRestarts [13:13:15.530] grepl <- base::grepl [13:13:15.530] restarts <- computeRestarts(cond) [13:13:15.530] for (restart in restarts) { [13:13:15.530] name <- restart$name [13:13:15.530] if (is.null(name)) [13:13:15.530] next [13:13:15.530] if (!grepl(pattern, name)) [13:13:15.530] next [13:13:15.530] invokeRestart(restart) [13:13:15.530] muffled <- TRUE [13:13:15.530] break [13:13:15.530] } [13:13:15.530] } [13:13:15.530] } [13:13:15.530] invisible(muffled) [13:13:15.530] } [13:13:15.530] muffleCondition(cond, pattern = "^muffle") [13:13:15.530] } [13:13:15.530] } [13:13:15.530] else { [13:13:15.530] if (TRUE) { [13:13:15.530] muffleCondition <- function (cond, pattern = "^muffle") [13:13:15.530] { [13:13:15.530] inherits <- base::inherits [13:13:15.530] invokeRestart <- base::invokeRestart [13:13:15.530] is.null <- base::is.null [13:13:15.530] muffled <- FALSE [13:13:15.530] if (inherits(cond, "message")) { [13:13:15.530] muffled <- grepl(pattern, "muffleMessage") [13:13:15.530] if (muffled) [13:13:15.530] invokeRestart("muffleMessage") [13:13:15.530] } [13:13:15.530] else if (inherits(cond, "warning")) { [13:13:15.530] muffled <- grepl(pattern, "muffleWarning") [13:13:15.530] if (muffled) [13:13:15.530] invokeRestart("muffleWarning") [13:13:15.530] } [13:13:15.530] else if (inherits(cond, "condition")) { [13:13:15.530] if (!is.null(pattern)) { [13:13:15.530] computeRestarts <- base::computeRestarts [13:13:15.530] grepl <- base::grepl [13:13:15.530] restarts <- computeRestarts(cond) [13:13:15.530] for (restart in restarts) { [13:13:15.530] name <- restart$name [13:13:15.530] if (is.null(name)) [13:13:15.530] next [13:13:15.530] if (!grepl(pattern, name)) [13:13:15.530] next [13:13:15.530] invokeRestart(restart) [13:13:15.530] muffled <- TRUE [13:13:15.530] break [13:13:15.530] } [13:13:15.530] } [13:13:15.530] } [13:13:15.530] invisible(muffled) [13:13:15.530] } [13:13:15.530] muffleCondition(cond, pattern = "^muffle") [13:13:15.530] } [13:13:15.530] } [13:13:15.530] } [13:13:15.530] })) [13:13:15.530] }, error = function(ex) { [13:13:15.530] base::structure(base::list(value = NULL, visible = NULL, [13:13:15.530] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:15.530] ...future.rng), started = ...future.startTime, [13:13:15.530] finished = Sys.time(), session_uuid = NA_character_, [13:13:15.530] version = "1.8"), class = "FutureResult") [13:13:15.530] }, finally = { [13:13:15.530] if (!identical(...future.workdir, getwd())) [13:13:15.530] setwd(...future.workdir) [13:13:15.530] { [13:13:15.530] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:15.530] ...future.oldOptions$nwarnings <- NULL [13:13:15.530] } [13:13:15.530] base::options(...future.oldOptions) [13:13:15.530] if (.Platform$OS.type == "windows") { [13:13:15.530] old_names <- names(...future.oldEnvVars) [13:13:15.530] envs <- base::Sys.getenv() [13:13:15.530] names <- names(envs) [13:13:15.530] common <- intersect(names, old_names) [13:13:15.530] added <- setdiff(names, old_names) [13:13:15.530] removed <- setdiff(old_names, names) [13:13:15.530] changed <- common[...future.oldEnvVars[common] != [13:13:15.530] envs[common]] [13:13:15.530] NAMES <- toupper(changed) [13:13:15.530] args <- list() [13:13:15.530] for (kk in seq_along(NAMES)) { [13:13:15.530] name <- changed[[kk]] [13:13:15.530] NAME <- NAMES[[kk]] [13:13:15.530] if (name != NAME && is.element(NAME, old_names)) [13:13:15.530] next [13:13:15.530] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:15.530] } [13:13:15.530] NAMES <- toupper(added) [13:13:15.530] for (kk in seq_along(NAMES)) { [13:13:15.530] name <- added[[kk]] [13:13:15.530] NAME <- NAMES[[kk]] [13:13:15.530] if (name != NAME && is.element(NAME, old_names)) [13:13:15.530] next [13:13:15.530] args[[name]] <- "" [13:13:15.530] } [13:13:15.530] NAMES <- toupper(removed) [13:13:15.530] for (kk in seq_along(NAMES)) { [13:13:15.530] name <- removed[[kk]] [13:13:15.530] NAME <- NAMES[[kk]] [13:13:15.530] if (name != NAME && is.element(NAME, old_names)) [13:13:15.530] next [13:13:15.530] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:15.530] } [13:13:15.530] if (length(args) > 0) [13:13:15.530] base::do.call(base::Sys.setenv, args = args) [13:13:15.530] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:15.530] } [13:13:15.530] else { [13:13:15.530] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:15.530] } [13:13:15.530] { [13:13:15.530] if (base::length(...future.futureOptionsAdded) > [13:13:15.530] 0L) { [13:13:15.530] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:15.530] base::names(opts) <- ...future.futureOptionsAdded [13:13:15.530] base::options(opts) [13:13:15.530] } [13:13:15.530] { [13:13:15.530] { [13:13:15.530] NULL [13:13:15.530] RNGkind("Mersenne-Twister") [13:13:15.530] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:15.530] inherits = FALSE) [13:13:15.530] } [13:13:15.530] options(future.plan = NULL) [13:13:15.530] if (is.na(NA_character_)) [13:13:15.530] Sys.unsetenv("R_FUTURE_PLAN") [13:13:15.530] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:15.530] future::plan(list(function (..., envir = parent.frame()) [13:13:15.530] { [13:13:15.530] future <- SequentialFuture(..., envir = envir) [13:13:15.530] if (!future$lazy) [13:13:15.530] future <- run(future) [13:13:15.530] invisible(future) [13:13:15.530] }), .cleanup = FALSE, .init = FALSE) [13:13:15.530] } [13:13:15.530] } [13:13:15.530] } [13:13:15.530] }) [13:13:15.530] if (TRUE) { [13:13:15.530] base::sink(type = "output", split = FALSE) [13:13:15.530] if (TRUE) { [13:13:15.530] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:15.530] } [13:13:15.530] else { [13:13:15.530] ...future.result["stdout"] <- base::list(NULL) [13:13:15.530] } [13:13:15.530] base::close(...future.stdout) [13:13:15.530] ...future.stdout <- NULL [13:13:15.530] } [13:13:15.530] ...future.result$conditions <- ...future.conditions [13:13:15.530] ...future.result$finished <- base::Sys.time() [13:13:15.530] ...future.result [13:13:15.530] } [13:13:15.534] assign_globals() ... [13:13:15.534] List of 5 [13:13:15.534] $ ...future.FUN :function (object, ...) [13:13:15.534] $ future.call.arguments : list() [13:13:15.534] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:15.534] $ ...future.elements_ii :List of 3 [13:13:15.534] ..$ :'data.frame': 18 obs. of 3 variables: [13:13:15.534] .. ..$ breaks : num [1:18] 26 30 54 25 70 52 51 26 67 27 ... [13:13:15.534] .. ..$ wool : Factor w/ 2 levels "A","B": 1 1 1 1 1 1 1 1 1 2 ... [13:13:15.534] .. ..$ tension: Factor w/ 3 levels "L","M","H": 1 1 1 1 1 1 1 1 1 1 ... [13:13:15.534] ..$ :'data.frame': 18 obs. of 3 variables: [13:13:15.534] .. ..$ breaks : num [1:18] 18 21 29 17 12 18 35 30 36 42 ... [13:13:15.534] .. ..$ wool : Factor w/ 2 levels "A","B": 1 1 1 1 1 1 1 1 1 2 ... [13:13:15.534] .. ..$ tension: Factor w/ 3 levels "L","M","H": 2 2 2 2 2 2 2 2 2 2 ... [13:13:15.534] ..$ :'data.frame': 18 obs. of 3 variables: [13:13:15.534] .. ..$ breaks : num [1:18] 36 21 24 18 10 43 28 15 26 20 ... [13:13:15.534] .. ..$ wool : Factor w/ 2 levels "A","B": 1 1 1 1 1 1 1 1 1 2 ... [13:13:15.534] .. ..$ tension: Factor w/ 3 levels "L","M","H": 3 3 3 3 3 3 3 3 3 3 ... [13:13:15.534] $ ...future.seeds_ii : NULL [13:13:15.534] $ ...future.globals.maxSize: NULL [13:13:15.534] - attr(*, "where")=List of 5 [13:13:15.534] ..$ ...future.FUN : [13:13:15.534] ..$ future.call.arguments : [13:13:15.534] ..$ ...future.elements_ii : [13:13:15.534] ..$ ...future.seeds_ii : [13:13:15.534] ..$ ...future.globals.maxSize: [13:13:15.534] - attr(*, "resolved")= logi FALSE [13:13:15.534] - attr(*, "total_size")= num 1240 [13:13:15.534] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:15.534] - attr(*, "already-done")= logi TRUE [13:13:15.545] - copied '...future.FUN' to environment [13:13:15.545] - copied 'future.call.arguments' to environment [13:13:15.545] - copied '...future.elements_ii' to environment [13:13:15.545] - copied '...future.seeds_ii' to environment [13:13:15.545] - copied '...future.globals.maxSize' to environment [13:13:15.546] assign_globals() ... done [13:13:15.546] plan(): Setting new future strategy stack: [13:13:15.546] List of future strategies: [13:13:15.546] 1. sequential: [13:13:15.546] - args: function (..., envir = parent.frame(), workers = "") [13:13:15.546] - tweaked: FALSE [13:13:15.546] - call: NULL [13:13:15.547] plan(): nbrOfWorkers() = 1 [13:13:15.550] plan(): Setting new future strategy stack: [13:13:15.550] List of future strategies: [13:13:15.550] 1. sequential: [13:13:15.550] - args: function (..., envir = parent.frame(), workers = "") [13:13:15.550] - tweaked: FALSE [13:13:15.550] - call: plan(strategy) [13:13:15.551] plan(): nbrOfWorkers() = 1 [13:13:15.551] SequentialFuture started (and completed) [13:13:15.551] - Launch lazy future ... done [13:13:15.551] run() for 'SequentialFuture' ... done [13:13:15.552] Created future: [13:13:15.552] SequentialFuture: [13:13:15.552] Label: 'future_by-1' [13:13:15.552] Expression: [13:13:15.552] { [13:13:15.552] do.call(function(...) { [13:13:15.552] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:15.552] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:15.552] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:15.552] on.exit(options(oopts), add = TRUE) [13:13:15.552] } [13:13:15.552] { [13:13:15.552] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:15.552] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:15.552] ...future.FUN(...future.X_jj, ...) [13:13:15.552] }) [13:13:15.552] } [13:13:15.552] }, args = future.call.arguments) [13:13:15.552] } [13:13:15.552] Lazy evaluation: FALSE [13:13:15.552] Asynchronous evaluation: FALSE [13:13:15.552] Local evaluation: TRUE [13:13:15.552] Environment: 0x000001868da848f0 [13:13:15.552] Capture standard output: TRUE [13:13:15.552] Capture condition classes: 'condition' (excluding 'nothing') [13:13:15.552] Globals: 5 objects totaling 6.02 KiB (function '...future.FUN' of 1.21 KiB, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 4.80 KiB, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:13:15.552] Packages: [13:13:15.552] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:15.552] Resolved: TRUE [13:13:15.552] Value: 5.37 KiB of class 'list' [13:13:15.552] Early signaling: FALSE [13:13:15.552] Owner process: f0659542-730c-c20a-65b3-84f202449c4d [13:13:15.552] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:15.554] Chunk #1 of 1 ... DONE [13:13:15.554] Launching 1 futures (chunks) ... DONE [13:13:15.554] Resolving 1 futures (chunks) ... [13:13:15.554] resolve() on list ... [13:13:15.554] recursive: 0 [13:13:15.554] length: 1 [13:13:15.555] [13:13:15.555] resolved() for 'SequentialFuture' ... [13:13:15.555] - state: 'finished' [13:13:15.555] - run: TRUE [13:13:15.555] - result: 'FutureResult' [13:13:15.556] resolved() for 'SequentialFuture' ... done [13:13:15.556] Future #1 [13:13:15.556] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:15.556] - nx: 1 [13:13:15.556] - relay: TRUE [13:13:15.556] - stdout: TRUE [13:13:15.557] - signal: TRUE [13:13:15.557] - resignal: FALSE [13:13:15.557] - force: TRUE [13:13:15.557] - relayed: [n=1] FALSE [13:13:15.557] - queued futures: [n=1] FALSE [13:13:15.557] - until=1 [13:13:15.558] - relaying element #1 [13:13:15.558] - relayed: [n=1] TRUE [13:13:15.558] - queued futures: [n=1] TRUE [13:13:15.558] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:15.558] length: 0 (resolved future 1) [13:13:15.558] Relaying remaining futures [13:13:15.559] signalConditionsASAP(NULL, pos=0) ... [13:13:15.559] - nx: 1 [13:13:15.559] - relay: TRUE [13:13:15.559] - stdout: TRUE [13:13:15.559] - signal: TRUE [13:13:15.559] - resignal: FALSE [13:13:15.560] - force: TRUE [13:13:15.560] - relayed: [n=1] TRUE [13:13:15.560] - queued futures: [n=1] TRUE - flush all [13:13:15.560] - relayed: [n=1] TRUE [13:13:15.560] - queued futures: [n=1] TRUE [13:13:15.560] signalConditionsASAP(NULL, pos=0) ... done [13:13:15.561] resolve() on list ... DONE [13:13:15.561] - Number of value chunks collected: 1 [13:13:15.561] Resolving 1 futures (chunks) ... DONE [13:13:15.561] Reducing values from 1 chunks ... [13:13:15.561] - Number of values collected after concatenation: 3 [13:13:15.561] - Number of values expected: 3 [13:13:15.562] Reducing values from 1 chunks ... DONE [13:13:15.562] future_lapply() ... DONE [13:13:15.562] future_by_internal() ... DONE [13:13:15.563] future_by_internal() ... Warning: Specifying the function 'FUN' for future_by() as a character string is deprecated in future.apply (>= 1.10.0) [2022-11-04], because base::by() does not support it. Instead, specify it as a function, e.g. FUN = sqrt and FUN = `[[`. It is deprecated. [13:13:15.564] future_lapply() ... [13:13:15.564] Number of chunks: 1 [13:13:15.564] getGlobalsAndPackagesXApply() ... [13:13:15.565] - future.globals: TRUE [13:13:15.565] getGlobalsAndPackages() ... [13:13:15.565] Searching for globals... [13:13:15.566] - globals found: [2] 'FUN', 'UseMethod' [13:13:15.566] Searching for globals ... DONE [13:13:15.567] Resolving globals: FALSE [13:13:15.567] The total size of the 1 globals is 1.21 KiB (1240 bytes) [13:13:15.567] The total size of the 1 globals exported for future expression ('FUN()') is 1.21 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (1.21 KiB of class 'function') [13:13:15.568] - globals: [1] 'FUN' [13:13:15.568] [13:13:15.568] getGlobalsAndPackages() ... DONE [13:13:15.568] - globals found/used: [n=1] 'FUN' [13:13:15.568] - needed namespaces: [n=0] [13:13:15.568] Finding globals ... DONE [13:13:15.569] - use_args: TRUE [13:13:15.569] - Getting '...' globals ... [13:13:15.569] resolve() on list ... [13:13:15.569] recursive: 0 [13:13:15.570] length: 1 [13:13:15.570] elements: '...' [13:13:15.570] length: 0 (resolved future 1) [13:13:15.570] resolve() on list ... DONE [13:13:15.570] - '...' content: [n=0] [13:13:15.570] List of 1 [13:13:15.570] $ ...: list() [13:13:15.570] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:15.570] - attr(*, "where")=List of 1 [13:13:15.570] ..$ ...: [13:13:15.570] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:15.570] - attr(*, "resolved")= logi TRUE [13:13:15.570] - attr(*, "total_size")= num NA [13:13:15.573] - Getting '...' globals ... DONE [13:13:15.574] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:15.574] List of 2 [13:13:15.574] $ ...future.FUN:function (object, ...) [13:13:15.574] $ ... : list() [13:13:15.574] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:15.574] - attr(*, "where")=List of 2 [13:13:15.574] ..$ ...future.FUN: [13:13:15.574] ..$ ... : [13:13:15.574] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:15.574] - attr(*, "resolved")= logi FALSE [13:13:15.574] - attr(*, "total_size")= num 1240 [13:13:15.577] Packages to be attached in all futures: [n=0] [13:13:15.577] getGlobalsAndPackagesXApply() ... DONE [13:13:15.578] Number of futures (= number of chunks): 1 [13:13:15.578] Launching 1 futures (chunks) ... [13:13:15.578] Chunk #1 of 1 ... [13:13:15.578] - Finding globals in 'X' for chunk #1 ... [13:13:15.578] getGlobalsAndPackages() ... [13:13:15.579] Searching for globals... [13:13:15.579] [13:13:15.579] Searching for globals ... DONE [13:13:15.579] - globals: [0] [13:13:15.580] getGlobalsAndPackages() ... DONE [13:13:15.580] + additional globals found: [n=0] [13:13:15.580] + additional namespaces needed: [n=0] [13:13:15.580] - Finding globals in 'X' for chunk #1 ... DONE [13:13:15.580] - seeds: [13:13:15.580] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:15.581] getGlobalsAndPackages() ... [13:13:15.581] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:15.581] Resolving globals: FALSE [13:13:15.581] Tweak future expression to call with '...' arguments ... [13:13:15.581] { [13:13:15.581] do.call(function(...) { [13:13:15.581] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:15.581] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:15.581] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:15.581] on.exit(options(oopts), add = TRUE) [13:13:15.581] } [13:13:15.581] { [13:13:15.581] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:15.581] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:15.581] ...future.FUN(...future.X_jj, ...) [13:13:15.581] }) [13:13:15.581] } [13:13:15.581] }, args = future.call.arguments) [13:13:15.581] } [13:13:15.582] Tweak future expression to call with '...' arguments ... DONE [13:13:15.582] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:15.582] [13:13:15.583] getGlobalsAndPackages() ... DONE [13:13:15.583] run() for 'Future' ... [13:13:15.583] - state: 'created' [13:13:15.583] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:13:15.584] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:15.584] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:15.584] - Field: 'label' [13:13:15.584] - Field: 'local' [13:13:15.585] - Field: 'owner' [13:13:15.585] - Field: 'envir' [13:13:15.585] - Field: 'packages' [13:13:15.585] - Field: 'gc' [13:13:15.585] - Field: 'conditions' [13:13:15.585] - Field: 'expr' [13:13:15.586] - Field: 'uuid' [13:13:15.586] - Field: 'seed' [13:13:15.586] - Field: 'version' [13:13:15.586] - Field: 'result' [13:13:15.586] - Field: 'asynchronous' [13:13:15.586] - Field: 'calls' [13:13:15.587] - Field: 'globals' [13:13:15.587] - Field: 'stdout' [13:13:15.587] - Field: 'earlySignal' [13:13:15.587] - Field: 'lazy' [13:13:15.587] - Field: 'state' [13:13:15.587] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:15.588] - Launch lazy future ... [13:13:15.588] Packages needed by the future expression (n = 0): [13:13:15.588] Packages needed by future strategies (n = 0): [13:13:15.589] { [13:13:15.589] { [13:13:15.589] { [13:13:15.589] ...future.startTime <- base::Sys.time() [13:13:15.589] { [13:13:15.589] { [13:13:15.589] { [13:13:15.589] base::local({ [13:13:15.589] has_future <- base::requireNamespace("future", [13:13:15.589] quietly = TRUE) [13:13:15.589] if (has_future) { [13:13:15.589] ns <- base::getNamespace("future") [13:13:15.589] version <- ns[[".package"]][["version"]] [13:13:15.589] if (is.null(version)) [13:13:15.589] version <- utils::packageVersion("future") [13:13:15.589] } [13:13:15.589] else { [13:13:15.589] version <- NULL [13:13:15.589] } [13:13:15.589] if (!has_future || version < "1.8.0") { [13:13:15.589] info <- base::c(r_version = base::gsub("R version ", [13:13:15.589] "", base::R.version$version.string), [13:13:15.589] platform = base::sprintf("%s (%s-bit)", [13:13:15.589] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:15.589] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:15.589] "release", "version")], collapse = " "), [13:13:15.589] hostname = base::Sys.info()[["nodename"]]) [13:13:15.589] info <- base::sprintf("%s: %s", base::names(info), [13:13:15.589] info) [13:13:15.589] info <- base::paste(info, collapse = "; ") [13:13:15.589] if (!has_future) { [13:13:15.589] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:15.589] info) [13:13:15.589] } [13:13:15.589] else { [13:13:15.589] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:15.589] info, version) [13:13:15.589] } [13:13:15.589] base::stop(msg) [13:13:15.589] } [13:13:15.589] }) [13:13:15.589] } [13:13:15.589] options(future.plan = NULL) [13:13:15.589] Sys.unsetenv("R_FUTURE_PLAN") [13:13:15.589] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:15.589] } [13:13:15.589] ...future.workdir <- getwd() [13:13:15.589] } [13:13:15.589] ...future.oldOptions <- base::as.list(base::.Options) [13:13:15.589] ...future.oldEnvVars <- base::Sys.getenv() [13:13:15.589] } [13:13:15.589] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:15.589] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:15.589] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:15.589] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:15.589] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:15.589] future.stdout.windows.reencode = NULL, width = 80L) [13:13:15.589] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:15.589] base::names(...future.oldOptions)) [13:13:15.589] } [13:13:15.589] if (FALSE) { [13:13:15.589] } [13:13:15.589] else { [13:13:15.589] if (TRUE) { [13:13:15.589] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:15.589] open = "w") [13:13:15.589] } [13:13:15.589] else { [13:13:15.589] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:15.589] windows = "NUL", "/dev/null"), open = "w") [13:13:15.589] } [13:13:15.589] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:15.589] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:15.589] base::sink(type = "output", split = FALSE) [13:13:15.589] base::close(...future.stdout) [13:13:15.589] }, add = TRUE) [13:13:15.589] } [13:13:15.589] ...future.frame <- base::sys.nframe() [13:13:15.589] ...future.conditions <- base::list() [13:13:15.589] ...future.rng <- base::globalenv()$.Random.seed [13:13:15.589] if (FALSE) { [13:13:15.589] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:15.589] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:15.589] } [13:13:15.589] ...future.result <- base::tryCatch({ [13:13:15.589] base::withCallingHandlers({ [13:13:15.589] ...future.value <- base::withVisible(base::local({ [13:13:15.589] do.call(function(...) { [13:13:15.589] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:15.589] if (!identical(...future.globals.maxSize.org, [13:13:15.589] ...future.globals.maxSize)) { [13:13:15.589] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:15.589] on.exit(options(oopts), add = TRUE) [13:13:15.589] } [13:13:15.589] { [13:13:15.589] lapply(seq_along(...future.elements_ii), [13:13:15.589] FUN = function(jj) { [13:13:15.589] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:15.589] ...future.FUN(...future.X_jj, ...) [13:13:15.589] }) [13:13:15.589] } [13:13:15.589] }, args = future.call.arguments) [13:13:15.589] })) [13:13:15.589] future::FutureResult(value = ...future.value$value, [13:13:15.589] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:15.589] ...future.rng), globalenv = if (FALSE) [13:13:15.589] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:15.589] ...future.globalenv.names)) [13:13:15.589] else NULL, started = ...future.startTime, version = "1.8") [13:13:15.589] }, condition = base::local({ [13:13:15.589] c <- base::c [13:13:15.589] inherits <- base::inherits [13:13:15.589] invokeRestart <- base::invokeRestart [13:13:15.589] length <- base::length [13:13:15.589] list <- base::list [13:13:15.589] seq.int <- base::seq.int [13:13:15.589] signalCondition <- base::signalCondition [13:13:15.589] sys.calls <- base::sys.calls [13:13:15.589] `[[` <- base::`[[` [13:13:15.589] `+` <- base::`+` [13:13:15.589] `<<-` <- base::`<<-` [13:13:15.589] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:15.589] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:15.589] 3L)] [13:13:15.589] } [13:13:15.589] function(cond) { [13:13:15.589] is_error <- inherits(cond, "error") [13:13:15.589] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:15.589] NULL) [13:13:15.589] if (is_error) { [13:13:15.589] sessionInformation <- function() { [13:13:15.589] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:15.589] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:15.589] search = base::search(), system = base::Sys.info()) [13:13:15.589] } [13:13:15.589] ...future.conditions[[length(...future.conditions) + [13:13:15.589] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:15.589] cond$call), session = sessionInformation(), [13:13:15.589] timestamp = base::Sys.time(), signaled = 0L) [13:13:15.589] signalCondition(cond) [13:13:15.589] } [13:13:15.589] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:15.589] "immediateCondition"))) { [13:13:15.589] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:15.589] ...future.conditions[[length(...future.conditions) + [13:13:15.589] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:15.589] if (TRUE && !signal) { [13:13:15.589] muffleCondition <- function (cond, pattern = "^muffle") [13:13:15.589] { [13:13:15.589] inherits <- base::inherits [13:13:15.589] invokeRestart <- base::invokeRestart [13:13:15.589] is.null <- base::is.null [13:13:15.589] muffled <- FALSE [13:13:15.589] if (inherits(cond, "message")) { [13:13:15.589] muffled <- grepl(pattern, "muffleMessage") [13:13:15.589] if (muffled) [13:13:15.589] invokeRestart("muffleMessage") [13:13:15.589] } [13:13:15.589] else if (inherits(cond, "warning")) { [13:13:15.589] muffled <- grepl(pattern, "muffleWarning") [13:13:15.589] if (muffled) [13:13:15.589] invokeRestart("muffleWarning") [13:13:15.589] } [13:13:15.589] else if (inherits(cond, "condition")) { [13:13:15.589] if (!is.null(pattern)) { [13:13:15.589] computeRestarts <- base::computeRestarts [13:13:15.589] grepl <- base::grepl [13:13:15.589] restarts <- computeRestarts(cond) [13:13:15.589] for (restart in restarts) { [13:13:15.589] name <- restart$name [13:13:15.589] if (is.null(name)) [13:13:15.589] next [13:13:15.589] if (!grepl(pattern, name)) [13:13:15.589] next [13:13:15.589] invokeRestart(restart) [13:13:15.589] muffled <- TRUE [13:13:15.589] break [13:13:15.589] } [13:13:15.589] } [13:13:15.589] } [13:13:15.589] invisible(muffled) [13:13:15.589] } [13:13:15.589] muffleCondition(cond, pattern = "^muffle") [13:13:15.589] } [13:13:15.589] } [13:13:15.589] else { [13:13:15.589] if (TRUE) { [13:13:15.589] muffleCondition <- function (cond, pattern = "^muffle") [13:13:15.589] { [13:13:15.589] inherits <- base::inherits [13:13:15.589] invokeRestart <- base::invokeRestart [13:13:15.589] is.null <- base::is.null [13:13:15.589] muffled <- FALSE [13:13:15.589] if (inherits(cond, "message")) { [13:13:15.589] muffled <- grepl(pattern, "muffleMessage") [13:13:15.589] if (muffled) [13:13:15.589] invokeRestart("muffleMessage") [13:13:15.589] } [13:13:15.589] else if (inherits(cond, "warning")) { [13:13:15.589] muffled <- grepl(pattern, "muffleWarning") [13:13:15.589] if (muffled) [13:13:15.589] invokeRestart("muffleWarning") [13:13:15.589] } [13:13:15.589] else if (inherits(cond, "condition")) { [13:13:15.589] if (!is.null(pattern)) { [13:13:15.589] computeRestarts <- base::computeRestarts [13:13:15.589] grepl <- base::grepl [13:13:15.589] restarts <- computeRestarts(cond) [13:13:15.589] for (restart in restarts) { [13:13:15.589] name <- restart$name [13:13:15.589] if (is.null(name)) [13:13:15.589] next [13:13:15.589] if (!grepl(pattern, name)) [13:13:15.589] next [13:13:15.589] invokeRestart(restart) [13:13:15.589] muffled <- TRUE [13:13:15.589] break [13:13:15.589] } [13:13:15.589] } [13:13:15.589] } [13:13:15.589] invisible(muffled) [13:13:15.589] } [13:13:15.589] muffleCondition(cond, pattern = "^muffle") [13:13:15.589] } [13:13:15.589] } [13:13:15.589] } [13:13:15.589] })) [13:13:15.589] }, error = function(ex) { [13:13:15.589] base::structure(base::list(value = NULL, visible = NULL, [13:13:15.589] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:15.589] ...future.rng), started = ...future.startTime, [13:13:15.589] finished = Sys.time(), session_uuid = NA_character_, [13:13:15.589] version = "1.8"), class = "FutureResult") [13:13:15.589] }, finally = { [13:13:15.589] if (!identical(...future.workdir, getwd())) [13:13:15.589] setwd(...future.workdir) [13:13:15.589] { [13:13:15.589] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:15.589] ...future.oldOptions$nwarnings <- NULL [13:13:15.589] } [13:13:15.589] base::options(...future.oldOptions) [13:13:15.589] if (.Platform$OS.type == "windows") { [13:13:15.589] old_names <- names(...future.oldEnvVars) [13:13:15.589] envs <- base::Sys.getenv() [13:13:15.589] names <- names(envs) [13:13:15.589] common <- intersect(names, old_names) [13:13:15.589] added <- setdiff(names, old_names) [13:13:15.589] removed <- setdiff(old_names, names) [13:13:15.589] changed <- common[...future.oldEnvVars[common] != [13:13:15.589] envs[common]] [13:13:15.589] NAMES <- toupper(changed) [13:13:15.589] args <- list() [13:13:15.589] for (kk in seq_along(NAMES)) { [13:13:15.589] name <- changed[[kk]] [13:13:15.589] NAME <- NAMES[[kk]] [13:13:15.589] if (name != NAME && is.element(NAME, old_names)) [13:13:15.589] next [13:13:15.589] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:15.589] } [13:13:15.589] NAMES <- toupper(added) [13:13:15.589] for (kk in seq_along(NAMES)) { [13:13:15.589] name <- added[[kk]] [13:13:15.589] NAME <- NAMES[[kk]] [13:13:15.589] if (name != NAME && is.element(NAME, old_names)) [13:13:15.589] next [13:13:15.589] args[[name]] <- "" [13:13:15.589] } [13:13:15.589] NAMES <- toupper(removed) [13:13:15.589] for (kk in seq_along(NAMES)) { [13:13:15.589] name <- removed[[kk]] [13:13:15.589] NAME <- NAMES[[kk]] [13:13:15.589] if (name != NAME && is.element(NAME, old_names)) [13:13:15.589] next [13:13:15.589] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:15.589] } [13:13:15.589] if (length(args) > 0) [13:13:15.589] base::do.call(base::Sys.setenv, args = args) [13:13:15.589] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:15.589] } [13:13:15.589] else { [13:13:15.589] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:15.589] } [13:13:15.589] { [13:13:15.589] if (base::length(...future.futureOptionsAdded) > [13:13:15.589] 0L) { [13:13:15.589] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:15.589] base::names(opts) <- ...future.futureOptionsAdded [13:13:15.589] base::options(opts) [13:13:15.589] } [13:13:15.589] { [13:13:15.589] { [13:13:15.589] NULL [13:13:15.589] RNGkind("Mersenne-Twister") [13:13:15.589] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:15.589] inherits = FALSE) [13:13:15.589] } [13:13:15.589] options(future.plan = NULL) [13:13:15.589] if (is.na(NA_character_)) [13:13:15.589] Sys.unsetenv("R_FUTURE_PLAN") [13:13:15.589] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:15.589] future::plan(list(function (..., envir = parent.frame()) [13:13:15.589] { [13:13:15.589] future <- SequentialFuture(..., envir = envir) [13:13:15.589] if (!future$lazy) [13:13:15.589] future <- run(future) [13:13:15.589] invisible(future) [13:13:15.589] }), .cleanup = FALSE, .init = FALSE) [13:13:15.589] } [13:13:15.589] } [13:13:15.589] } [13:13:15.589] }) [13:13:15.589] if (TRUE) { [13:13:15.589] base::sink(type = "output", split = FALSE) [13:13:15.589] if (TRUE) { [13:13:15.589] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:15.589] } [13:13:15.589] else { [13:13:15.589] ...future.result["stdout"] <- base::list(NULL) [13:13:15.589] } [13:13:15.589] base::close(...future.stdout) [13:13:15.589] ...future.stdout <- NULL [13:13:15.589] } [13:13:15.589] ...future.result$conditions <- ...future.conditions [13:13:15.589] ...future.result$finished <- base::Sys.time() [13:13:15.589] ...future.result [13:13:15.589] } [13:13:15.593] assign_globals() ... [13:13:15.593] List of 5 [13:13:15.593] $ ...future.FUN :function (object, ...) [13:13:15.593] $ future.call.arguments : list() [13:13:15.593] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:15.593] $ ...future.elements_ii :List of 3 [13:13:15.593] ..$ :'data.frame': 18 obs. of 3 variables: [13:13:15.593] .. ..$ breaks : num [1:18] 26 30 54 25 70 52 51 26 67 27 ... [13:13:15.593] .. ..$ wool : Factor w/ 2 levels "A","B": 1 1 1 1 1 1 1 1 1 2 ... [13:13:15.593] .. ..$ tension: Factor w/ 3 levels "L","M","H": 1 1 1 1 1 1 1 1 1 1 ... [13:13:15.593] ..$ :'data.frame': 18 obs. of 3 variables: [13:13:15.593] .. ..$ breaks : num [1:18] 18 21 29 17 12 18 35 30 36 42 ... [13:13:15.593] .. ..$ wool : Factor w/ 2 levels "A","B": 1 1 1 1 1 1 1 1 1 2 ... [13:13:15.593] .. ..$ tension: Factor w/ 3 levels "L","M","H": 2 2 2 2 2 2 2 2 2 2 ... [13:13:15.593] ..$ :'data.frame': 18 obs. of 3 variables: [13:13:15.593] .. ..$ breaks : num [1:18] 36 21 24 18 10 43 28 15 26 20 ... [13:13:15.593] .. ..$ wool : Factor w/ 2 levels "A","B": 1 1 1 1 1 1 1 1 1 2 ... [13:13:15.593] .. ..$ tension: Factor w/ 3 levels "L","M","H": 3 3 3 3 3 3 3 3 3 3 ... [13:13:15.593] $ ...future.seeds_ii : NULL [13:13:15.593] $ ...future.globals.maxSize: NULL [13:13:15.593] - attr(*, "where")=List of 5 [13:13:15.593] ..$ ...future.FUN : [13:13:15.593] ..$ future.call.arguments : [13:13:15.593] ..$ ...future.elements_ii : [13:13:15.593] ..$ ...future.seeds_ii : [13:13:15.593] ..$ ...future.globals.maxSize: [13:13:15.593] - attr(*, "resolved")= logi FALSE [13:13:15.593] - attr(*, "total_size")= num 1240 [13:13:15.593] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:15.593] - attr(*, "already-done")= logi TRUE [13:13:15.603] - copied '...future.FUN' to environment [13:13:15.606] - copied 'future.call.arguments' to environment [13:13:15.607] - copied '...future.elements_ii' to environment [13:13:15.607] - copied '...future.seeds_ii' to environment [13:13:15.607] - copied '...future.globals.maxSize' to environment [13:13:15.607] assign_globals() ... done [13:13:15.608] plan(): Setting new future strategy stack: [13:13:15.608] List of future strategies: [13:13:15.608] 1. sequential: [13:13:15.608] - args: function (..., envir = parent.frame(), workers = "") [13:13:15.608] - tweaked: FALSE [13:13:15.608] - call: NULL [13:13:15.609] plan(): nbrOfWorkers() = 1 [13:13:15.612] plan(): Setting new future strategy stack: [13:13:15.612] List of future strategies: [13:13:15.612] 1. sequential: [13:13:15.612] - args: function (..., envir = parent.frame(), workers = "") [13:13:15.612] - tweaked: FALSE [13:13:15.612] - call: plan(strategy) [13:13:15.613] plan(): nbrOfWorkers() = 1 [13:13:15.613] SequentialFuture started (and completed) [13:13:15.613] - Launch lazy future ... done [13:13:15.613] run() for 'SequentialFuture' ... done [13:13:15.614] Created future: [13:13:15.614] SequentialFuture: [13:13:15.614] Label: 'future_by-1' [13:13:15.614] Expression: [13:13:15.614] { [13:13:15.614] do.call(function(...) { [13:13:15.614] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:15.614] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:15.614] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:15.614] on.exit(options(oopts), add = TRUE) [13:13:15.614] } [13:13:15.614] { [13:13:15.614] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:15.614] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:15.614] ...future.FUN(...future.X_jj, ...) [13:13:15.614] }) [13:13:15.614] } [13:13:15.614] }, args = future.call.arguments) [13:13:15.614] } [13:13:15.614] Lazy evaluation: FALSE [13:13:15.614] Asynchronous evaluation: FALSE [13:13:15.614] Local evaluation: TRUE [13:13:15.614] Environment: 0x0000018690fc08b8 [13:13:15.614] Capture standard output: TRUE [13:13:15.614] Capture condition classes: 'condition' (excluding 'nothing') [13:13:15.614] Globals: 5 objects totaling 6.02 KiB (function '...future.FUN' of 1.21 KiB, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 4.80 KiB, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:13:15.614] Packages: [13:13:15.614] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:15.614] Resolved: TRUE [13:13:15.614] Value: 5.37 KiB of class 'list' [13:13:15.614] Early signaling: FALSE [13:13:15.614] Owner process: f0659542-730c-c20a-65b3-84f202449c4d [13:13:15.614] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:15.616] Chunk #1 of 1 ... DONE [13:13:15.616] Launching 1 futures (chunks) ... DONE [13:13:15.616] Resolving 1 futures (chunks) ... [13:13:15.616] resolve() on list ... [13:13:15.616] recursive: 0 [13:13:15.617] length: 1 [13:13:15.617] [13:13:15.617] resolved() for 'SequentialFuture' ... [13:13:15.617] - state: 'finished' [13:13:15.617] - run: TRUE [13:13:15.618] - result: 'FutureResult' [13:13:15.618] resolved() for 'SequentialFuture' ... done [13:13:15.618] Future #1 [13:13:15.618] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:15.619] - nx: 1 [13:13:15.619] - relay: TRUE [13:13:15.619] - stdout: TRUE [13:13:15.619] - signal: TRUE [13:13:15.619] - resignal: FALSE [13:13:15.620] - force: TRUE [13:13:15.620] - relayed: [n=1] FALSE [13:13:15.620] - queued futures: [n=1] FALSE [13:13:15.620] - until=1 [13:13:15.620] - relaying element #1 [13:13:15.621] - relayed: [n=1] TRUE [13:13:15.621] - queued futures: [n=1] TRUE [13:13:15.621] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:15.621] length: 0 (resolved future 1) [13:13:15.622] Relaying remaining futures [13:13:15.622] signalConditionsASAP(NULL, pos=0) ... [13:13:15.622] - nx: 1 [13:13:15.622] - relay: TRUE [13:13:15.622] - stdout: TRUE [13:13:15.623] - signal: TRUE [13:13:15.623] - resignal: FALSE [13:13:15.623] - force: TRUE [13:13:15.623] - relayed: [n=1] TRUE [13:13:15.623] - queued futures: [n=1] TRUE - flush all [13:13:15.624] - relayed: [n=1] TRUE [13:13:15.624] - queued futures: [n=1] TRUE [13:13:15.624] signalConditionsASAP(NULL, pos=0) ... done [13:13:15.624] resolve() on list ... DONE [13:13:15.625] - Number of value chunks collected: 1 [13:13:15.625] Resolving 1 futures (chunks) ... DONE [13:13:15.625] Reducing values from 1 chunks ... [13:13:15.625] - Number of values collected after concatenation: 3 [13:13:15.625] - Number of values expected: 3 [13:13:15.625] Reducing values from 1 chunks ... DONE [13:13:15.626] future_lapply() ... DONE [13:13:15.626] future_by_internal() ... DONE [13:13:15.627] future_by_internal() ... - plan('multisession') ... [13:13:15.628] plan(): Setting new future strategy stack: [13:13:15.628] List of future strategies: [13:13:15.628] 1. multisession: [13:13:15.628] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [13:13:15.628] - tweaked: FALSE [13:13:15.628] - call: plan(strategy) [13:13:15.629] plan(): plan_init() of 'multisession', 'cluster', 'multiprocess', 'future', 'function' ... [13:13:15.629] multisession: [13:13:15.629] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [13:13:15.629] - tweaked: FALSE [13:13:15.629] - call: plan(strategy) [13:13:15.634] getGlobalsAndPackages() ... [13:13:15.635] Not searching for globals [13:13:15.635] - globals: [0] [13:13:15.635] getGlobalsAndPackages() ... DONE [13:13:15.636] [local output] makeClusterPSOCK() ... [13:13:15.700] [local output] Workers: [n = 2] 'localhost', 'localhost' [13:13:15.706] [local output] Base port: 32388 [13:13:15.706] [local output] Getting setup options for 2 cluster nodes ... [13:13:15.706] [local output] - Node 1 of 2 ... [13:13:15.707] [local output] localMachine=TRUE => revtunnel=FALSE [13:13:15.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/RtmpgTcWoh/worker.rank=1.parallelly.parent=4404.11342e607f57.pid\")), silent = TRUE)" -e "file.exists(\"D:/temp/RtmpgTcWoh/worker.rank=1.parallelly.parent=4404.11342e607f57.pid\")"' [13:13:16.155] - Possible to infer worker's PID: TRUE [13:13:16.156] [local output] Rscript port: 32388 [13:13:16.156] [local output] - Node 2 of 2 ... [13:13:16.157] [local output] localMachine=TRUE => revtunnel=FALSE [13:13:16.158] [local output] Rscript port: 32388 [13:13:16.158] [local output] Getting setup options for 2 cluster nodes ... done [13:13:16.159] [local output] - Parallel setup requested for some PSOCK nodes [13:13:16.159] [local output] Setting up PSOCK nodes in parallel [13:13:16.160] List of 36 [13:13:16.160] $ worker : chr "localhost" [13:13:16.160] ..- attr(*, "localhost")= logi TRUE [13:13:16.160] $ master : chr "localhost" [13:13:16.160] $ port : int 32388 [13:13:16.160] $ connectTimeout : num 120 [13:13:16.160] $ timeout : num 120 [13:13:16.160] $ rscript : chr "\"D:/RCompile/recent/R/bin/x64/Rscript\"" [13:13:16.160] $ homogeneous : logi TRUE [13:13:16.160] $ rscript_args : chr "--default-packages=datasets,utils,grDevices,graphics,stats,methods -e \"#label=future_by.R:4404:CRANWIN3:CRAN\""| __truncated__ [13:13:16.160] $ rscript_envs : NULL [13:13:16.160] $ rscript_libs : chr [1:2] "D:/temp/RtmpKkFYYg/RLIBS_20dc214b714b" "D:/RCompile/recent/R/library" [13:13:16.160] $ rscript_startup : NULL [13:13:16.160] $ rscript_sh : chr "cmd" [13:13:16.160] $ default_packages: chr [1:6] "datasets" "utils" "grDevices" "graphics" ... [13:13:16.160] $ methods : logi TRUE [13:13:16.160] $ socketOptions : chr "no-delay" [13:13:16.160] $ useXDR : logi FALSE [13:13:16.160] $ outfile : chr "/dev/null" [13:13:16.160] $ renice : int NA [13:13:16.160] $ rshcmd : NULL [13:13:16.160] $ user : chr(0) [13:13:16.160] $ revtunnel : logi FALSE [13:13:16.160] $ rshlogfile : NULL [13:13:16.160] $ rshopts : chr(0) [13:13:16.160] $ rank : int 1 [13:13:16.160] $ manual : logi FALSE [13:13:16.160] $ dryrun : logi FALSE [13:13:16.160] $ quiet : logi FALSE [13:13:16.160] $ setup_strategy : chr "parallel" [13:13:16.160] $ local_cmd : chr "\"D:/RCompile/recent/R/bin/x64/Rscript\" --default-packages=datasets,utils,grDevices,graphics,stats,methods -e "| __truncated__ [13:13:16.160] $ pidfile : chr "D:/temp/RtmpgTcWoh/worker.rank=1.parallelly.parent=4404.11342e607f57.pid" [13:13:16.160] $ rshcmd_label : NULL [13:13:16.160] $ rsh_call : NULL [13:13:16.160] $ cmd : chr "\"D:/RCompile/recent/R/bin/x64/Rscript\" --default-packages=datasets,utils,grDevices,graphics,stats,methods -e "| __truncated__ [13:13:16.160] $ localMachine : logi TRUE [13:13:16.160] $ make_fcn :function (worker = getOption2("parallelly.localhost.hostname", "localhost"), [13:13:16.160] master = NULL, port, connectTimeout = getOption2("parallelly.makeNodePSOCK.connectTimeout", [13:13:16.160] 2 * 60), timeout = getOption2("parallelly.makeNodePSOCK.timeout", [13:13:16.160] 30 * 24 * 60 * 60), rscript = NULL, homogeneous = NULL, rscript_args = NULL, [13:13:16.160] rscript_envs = NULL, rscript_libs = NULL, rscript_startup = NULL, rscript_sh = c("auto", [13:13:16.160] "cmd", "sh"), default_packages = c("datasets", "utils", "grDevices", [13:13:16.160] "graphics", "stats", if (methods) "methods"), methods = TRUE, socketOptions = getOption2("parallelly.makeNodePSOCK.socketOptions", [13:13:16.160] "no-delay"), useXDR = getOption2("parallelly.makeNodePSOCK.useXDR", [13:13:16.160] FALSE), outfile = "/dev/null", renice = NA_integer_, rshcmd = getOption2("parallelly.makeNodePSOCK.rshcmd", [13:13:16.160] NULL), user = NULL, revtunnel = NA, rshlogfile = NULL, rshopts = getOption2("parallelly.makeNodePSOCK.rshopts", [13:13:16.160] NULL), rank = 1L, manual = FALSE, dryrun = FALSE, quiet = FALSE, [13:13:16.160] setup_strategy = getOption2("parallelly.makeNodePSOCK.setup_strategy", [13:13:16.160] "parallel"), action = c("launch", "options"), verbose = FALSE) [13:13:16.160] $ arguments :List of 28 [13:13:16.160] ..$ worker : chr "localhost" [13:13:16.160] ..$ master : NULL [13:13:16.160] ..$ port : int 32388 [13:13:16.160] ..$ connectTimeout : num 120 [13:13:16.160] ..$ timeout : num 120 [13:13:16.160] ..$ rscript : NULL [13:13:16.160] ..$ homogeneous : NULL [13:13:16.160] ..$ rscript_args : NULL [13:13:16.160] ..$ rscript_envs : NULL [13:13:16.160] ..$ rscript_libs : chr [1:2] "D:/temp/RtmpKkFYYg/RLIBS_20dc214b714b" "D:/RCompile/recent/R/library" [13:13:16.160] ..$ rscript_startup : NULL [13:13:16.160] ..$ rscript_sh : chr [1:3] "auto" "cmd" "sh" [13:13:16.160] ..$ default_packages: chr [1:6] "datasets" "utils" "grDevices" "graphics" ... [13:13:16.160] ..$ methods : logi TRUE [13:13:16.160] ..$ socketOptions : chr "no-delay" [13:13:16.160] ..$ useXDR : logi FALSE [13:13:16.160] ..$ outfile : chr "/dev/null" [13:13:16.160] ..$ renice : int NA [13:13:16.160] ..$ rshcmd : NULL [13:13:16.160] ..$ user : NULL [13:13:16.160] ..$ revtunnel : logi NA [13:13:16.160] ..$ rshlogfile : NULL [13:13:16.160] ..$ rshopts : NULL [13:13:16.160] ..$ rank : int 1 [13:13:16.160] ..$ manual : logi FALSE [13:13:16.160] ..$ dryrun : logi FALSE [13:13:16.160] ..$ quiet : logi FALSE [13:13:16.160] ..$ setup_strategy : chr "parallel" [13:13:16.160] - attr(*, "class")= chr [1:2] "makeNodePSOCKOptions" "makeNodeOptions" [13:13:16.181] [local output] System call to launch all workers: [13:13:16.181] [local output] "D:/RCompile/recent/R/bin/x64/Rscript" --default-packages=datasets,utils,grDevices,graphics,stats,methods -e "#label=future_by.R:4404:CRANWIN3:CRAN" -e "try(suppressWarnings(cat(Sys.getpid(),file=\"D:/temp/RtmpgTcWoh/worker.rank=1.parallelly.parent=4404.11342e607f57.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=32388 OUT=/dev/null TIMEOUT=120 XDR=FALSE SETUPTIMEOUT=120 SETUPSTRATEGY=parallel [13:13:16.181] [local output] Starting PSOCK main server [13:13:16.186] [local output] Workers launched [13:13:16.187] [local output] Waiting for workers to connect back [13:13:16.187] - [local output] 0 workers out of 2 ready [13:13:16.354] - [local output] 0 workers out of 2 ready [13:13:16.355] - [local output] 1 workers out of 2 ready [13:13:16.378] - [local output] 1 workers out of 2 ready [13:13:16.390] - [local output] 2 workers out of 2 ready [13:13:16.391] [local output] Launching of workers completed [13:13:16.391] [local output] Collecting session information from workers [13:13:16.392] [local output] - Worker #1 of 2 [13:13:16.393] [local output] - Worker #2 of 2 [13:13:16.393] [local output] makeClusterPSOCK() ... done [13:13:16.405] Packages needed by the future expression (n = 0): [13:13:16.406] Packages needed by future strategies (n = 0): [13:13:16.406] { [13:13:16.406] { [13:13:16.406] { [13:13:16.406] ...future.startTime <- base::Sys.time() [13:13:16.406] { [13:13:16.406] { [13:13:16.406] { [13:13:16.406] { [13:13:16.406] base::local({ [13:13:16.406] has_future <- base::requireNamespace("future", [13:13:16.406] quietly = TRUE) [13:13:16.406] if (has_future) { [13:13:16.406] ns <- base::getNamespace("future") [13:13:16.406] version <- ns[[".package"]][["version"]] [13:13:16.406] if (is.null(version)) [13:13:16.406] version <- utils::packageVersion("future") [13:13:16.406] } [13:13:16.406] else { [13:13:16.406] version <- NULL [13:13:16.406] } [13:13:16.406] if (!has_future || version < "1.8.0") { [13:13:16.406] info <- base::c(r_version = base::gsub("R version ", [13:13:16.406] "", base::R.version$version.string), [13:13:16.406] platform = base::sprintf("%s (%s-bit)", [13:13:16.406] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:16.406] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:16.406] "release", "version")], collapse = " "), [13:13:16.406] hostname = base::Sys.info()[["nodename"]]) [13:13:16.406] info <- base::sprintf("%s: %s", base::names(info), [13:13:16.406] info) [13:13:16.406] info <- base::paste(info, collapse = "; ") [13:13:16.406] if (!has_future) { [13:13:16.406] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:16.406] info) [13:13:16.406] } [13:13:16.406] else { [13:13:16.406] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:16.406] info, version) [13:13:16.406] } [13:13:16.406] base::stop(msg) [13:13:16.406] } [13:13:16.406] }) [13:13:16.406] } [13:13:16.406] ...future.mc.cores.old <- base::getOption("mc.cores") [13:13:16.406] base::options(mc.cores = 1L) [13:13:16.406] } [13:13:16.406] options(future.plan = NULL) [13:13:16.406] Sys.unsetenv("R_FUTURE_PLAN") [13:13:16.406] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:16.406] } [13:13:16.406] ...future.workdir <- getwd() [13:13:16.406] } [13:13:16.406] ...future.oldOptions <- base::as.list(base::.Options) [13:13:16.406] ...future.oldEnvVars <- base::Sys.getenv() [13:13:16.406] } [13:13:16.406] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:16.406] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:16.406] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:16.406] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:16.406] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:16.406] future.stdout.windows.reencode = NULL, width = 80L) [13:13:16.406] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:16.406] base::names(...future.oldOptions)) [13:13:16.406] } [13:13:16.406] if (FALSE) { [13:13:16.406] } [13:13:16.406] else { [13:13:16.406] if (TRUE) { [13:13:16.406] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:16.406] open = "w") [13:13:16.406] } [13:13:16.406] else { [13:13:16.406] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:16.406] windows = "NUL", "/dev/null"), open = "w") [13:13:16.406] } [13:13:16.406] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:16.406] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:16.406] base::sink(type = "output", split = FALSE) [13:13:16.406] base::close(...future.stdout) [13:13:16.406] }, add = TRUE) [13:13:16.406] } [13:13:16.406] ...future.frame <- base::sys.nframe() [13:13:16.406] ...future.conditions <- base::list() [13:13:16.406] ...future.rng <- base::globalenv()$.Random.seed [13:13:16.406] if (FALSE) { [13:13:16.406] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:16.406] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:16.406] } [13:13:16.406] ...future.result <- base::tryCatch({ [13:13:16.406] base::withCallingHandlers({ [13:13:16.406] ...future.value <- base::withVisible(base::local({ [13:13:16.406] ...future.makeSendCondition <- local({ [13:13:16.406] sendCondition <- NULL [13:13:16.406] function(frame = 1L) { [13:13:16.406] if (is.function(sendCondition)) [13:13:16.406] return(sendCondition) [13:13:16.406] ns <- getNamespace("parallel") [13:13:16.406] if (exists("sendData", mode = "function", [13:13:16.406] envir = ns)) { [13:13:16.406] parallel_sendData <- get("sendData", mode = "function", [13:13:16.406] envir = ns) [13:13:16.406] envir <- sys.frame(frame) [13:13:16.406] master <- NULL [13:13:16.406] while (!identical(envir, .GlobalEnv) && [13:13:16.406] !identical(envir, emptyenv())) { [13:13:16.406] if (exists("master", mode = "list", envir = envir, [13:13:16.406] inherits = FALSE)) { [13:13:16.406] master <- get("master", mode = "list", [13:13:16.406] envir = envir, inherits = FALSE) [13:13:16.406] if (inherits(master, c("SOCKnode", [13:13:16.406] "SOCK0node"))) { [13:13:16.406] sendCondition <<- function(cond) { [13:13:16.406] data <- list(type = "VALUE", value = cond, [13:13:16.406] success = TRUE) [13:13:16.406] parallel_sendData(master, data) [13:13:16.406] } [13:13:16.406] return(sendCondition) [13:13:16.406] } [13:13:16.406] } [13:13:16.406] frame <- frame + 1L [13:13:16.406] envir <- sys.frame(frame) [13:13:16.406] } [13:13:16.406] } [13:13:16.406] sendCondition <<- function(cond) NULL [13:13:16.406] } [13:13:16.406] }) [13:13:16.406] withCallingHandlers({ [13:13:16.406] NA [13:13:16.406] }, immediateCondition = function(cond) { [13:13:16.406] sendCondition <- ...future.makeSendCondition() [13:13:16.406] sendCondition(cond) [13:13:16.406] muffleCondition <- function (cond, pattern = "^muffle") [13:13:16.406] { [13:13:16.406] inherits <- base::inherits [13:13:16.406] invokeRestart <- base::invokeRestart [13:13:16.406] is.null <- base::is.null [13:13:16.406] muffled <- FALSE [13:13:16.406] if (inherits(cond, "message")) { [13:13:16.406] muffled <- grepl(pattern, "muffleMessage") [13:13:16.406] if (muffled) [13:13:16.406] invokeRestart("muffleMessage") [13:13:16.406] } [13:13:16.406] else if (inherits(cond, "warning")) { [13:13:16.406] muffled <- grepl(pattern, "muffleWarning") [13:13:16.406] if (muffled) [13:13:16.406] invokeRestart("muffleWarning") [13:13:16.406] } [13:13:16.406] else if (inherits(cond, "condition")) { [13:13:16.406] if (!is.null(pattern)) { [13:13:16.406] computeRestarts <- base::computeRestarts [13:13:16.406] grepl <- base::grepl [13:13:16.406] restarts <- computeRestarts(cond) [13:13:16.406] for (restart in restarts) { [13:13:16.406] name <- restart$name [13:13:16.406] if (is.null(name)) [13:13:16.406] next [13:13:16.406] if (!grepl(pattern, name)) [13:13:16.406] next [13:13:16.406] invokeRestart(restart) [13:13:16.406] muffled <- TRUE [13:13:16.406] break [13:13:16.406] } [13:13:16.406] } [13:13:16.406] } [13:13:16.406] invisible(muffled) [13:13:16.406] } [13:13:16.406] muffleCondition(cond) [13:13:16.406] }) [13:13:16.406] })) [13:13:16.406] future::FutureResult(value = ...future.value$value, [13:13:16.406] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:16.406] ...future.rng), globalenv = if (FALSE) [13:13:16.406] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:16.406] ...future.globalenv.names)) [13:13:16.406] else NULL, started = ...future.startTime, version = "1.8") [13:13:16.406] }, condition = base::local({ [13:13:16.406] c <- base::c [13:13:16.406] inherits <- base::inherits [13:13:16.406] invokeRestart <- base::invokeRestart [13:13:16.406] length <- base::length [13:13:16.406] list <- base::list [13:13:16.406] seq.int <- base::seq.int [13:13:16.406] signalCondition <- base::signalCondition [13:13:16.406] sys.calls <- base::sys.calls [13:13:16.406] `[[` <- base::`[[` [13:13:16.406] `+` <- base::`+` [13:13:16.406] `<<-` <- base::`<<-` [13:13:16.406] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:16.406] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:16.406] 3L)] [13:13:16.406] } [13:13:16.406] function(cond) { [13:13:16.406] is_error <- inherits(cond, "error") [13:13:16.406] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:16.406] NULL) [13:13:16.406] if (is_error) { [13:13:16.406] sessionInformation <- function() { [13:13:16.406] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:16.406] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:16.406] search = base::search(), system = base::Sys.info()) [13:13:16.406] } [13:13:16.406] ...future.conditions[[length(...future.conditions) + [13:13:16.406] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:16.406] cond$call), session = sessionInformation(), [13:13:16.406] timestamp = base::Sys.time(), signaled = 0L) [13:13:16.406] signalCondition(cond) [13:13:16.406] } [13:13:16.406] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:16.406] "immediateCondition"))) { [13:13:16.406] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:16.406] ...future.conditions[[length(...future.conditions) + [13:13:16.406] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:16.406] if (TRUE && !signal) { [13:13:16.406] muffleCondition <- function (cond, pattern = "^muffle") [13:13:16.406] { [13:13:16.406] inherits <- base::inherits [13:13:16.406] invokeRestart <- base::invokeRestart [13:13:16.406] is.null <- base::is.null [13:13:16.406] muffled <- FALSE [13:13:16.406] if (inherits(cond, "message")) { [13:13:16.406] muffled <- grepl(pattern, "muffleMessage") [13:13:16.406] if (muffled) [13:13:16.406] invokeRestart("muffleMessage") [13:13:16.406] } [13:13:16.406] else if (inherits(cond, "warning")) { [13:13:16.406] muffled <- grepl(pattern, "muffleWarning") [13:13:16.406] if (muffled) [13:13:16.406] invokeRestart("muffleWarning") [13:13:16.406] } [13:13:16.406] else if (inherits(cond, "condition")) { [13:13:16.406] if (!is.null(pattern)) { [13:13:16.406] computeRestarts <- base::computeRestarts [13:13:16.406] grepl <- base::grepl [13:13:16.406] restarts <- computeRestarts(cond) [13:13:16.406] for (restart in restarts) { [13:13:16.406] name <- restart$name [13:13:16.406] if (is.null(name)) [13:13:16.406] next [13:13:16.406] if (!grepl(pattern, name)) [13:13:16.406] next [13:13:16.406] invokeRestart(restart) [13:13:16.406] muffled <- TRUE [13:13:16.406] break [13:13:16.406] } [13:13:16.406] } [13:13:16.406] } [13:13:16.406] invisible(muffled) [13:13:16.406] } [13:13:16.406] muffleCondition(cond, pattern = "^muffle") [13:13:16.406] } [13:13:16.406] } [13:13:16.406] else { [13:13:16.406] if (TRUE) { [13:13:16.406] muffleCondition <- function (cond, pattern = "^muffle") [13:13:16.406] { [13:13:16.406] inherits <- base::inherits [13:13:16.406] invokeRestart <- base::invokeRestart [13:13:16.406] is.null <- base::is.null [13:13:16.406] muffled <- FALSE [13:13:16.406] if (inherits(cond, "message")) { [13:13:16.406] muffled <- grepl(pattern, "muffleMessage") [13:13:16.406] if (muffled) [13:13:16.406] invokeRestart("muffleMessage") [13:13:16.406] } [13:13:16.406] else if (inherits(cond, "warning")) { [13:13:16.406] muffled <- grepl(pattern, "muffleWarning") [13:13:16.406] if (muffled) [13:13:16.406] invokeRestart("muffleWarning") [13:13:16.406] } [13:13:16.406] else if (inherits(cond, "condition")) { [13:13:16.406] if (!is.null(pattern)) { [13:13:16.406] computeRestarts <- base::computeRestarts [13:13:16.406] grepl <- base::grepl [13:13:16.406] restarts <- computeRestarts(cond) [13:13:16.406] for (restart in restarts) { [13:13:16.406] name <- restart$name [13:13:16.406] if (is.null(name)) [13:13:16.406] next [13:13:16.406] if (!grepl(pattern, name)) [13:13:16.406] next [13:13:16.406] invokeRestart(restart) [13:13:16.406] muffled <- TRUE [13:13:16.406] break [13:13:16.406] } [13:13:16.406] } [13:13:16.406] } [13:13:16.406] invisible(muffled) [13:13:16.406] } [13:13:16.406] muffleCondition(cond, pattern = "^muffle") [13:13:16.406] } [13:13:16.406] } [13:13:16.406] } [13:13:16.406] })) [13:13:16.406] }, error = function(ex) { [13:13:16.406] base::structure(base::list(value = NULL, visible = NULL, [13:13:16.406] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:16.406] ...future.rng), started = ...future.startTime, [13:13:16.406] finished = Sys.time(), session_uuid = NA_character_, [13:13:16.406] version = "1.8"), class = "FutureResult") [13:13:16.406] }, finally = { [13:13:16.406] if (!identical(...future.workdir, getwd())) [13:13:16.406] setwd(...future.workdir) [13:13:16.406] { [13:13:16.406] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:16.406] ...future.oldOptions$nwarnings <- NULL [13:13:16.406] } [13:13:16.406] base::options(...future.oldOptions) [13:13:16.406] if (.Platform$OS.type == "windows") { [13:13:16.406] old_names <- names(...future.oldEnvVars) [13:13:16.406] envs <- base::Sys.getenv() [13:13:16.406] names <- names(envs) [13:13:16.406] common <- intersect(names, old_names) [13:13:16.406] added <- setdiff(names, old_names) [13:13:16.406] removed <- setdiff(old_names, names) [13:13:16.406] changed <- common[...future.oldEnvVars[common] != [13:13:16.406] envs[common]] [13:13:16.406] NAMES <- toupper(changed) [13:13:16.406] args <- list() [13:13:16.406] for (kk in seq_along(NAMES)) { [13:13:16.406] name <- changed[[kk]] [13:13:16.406] NAME <- NAMES[[kk]] [13:13:16.406] if (name != NAME && is.element(NAME, old_names)) [13:13:16.406] next [13:13:16.406] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:16.406] } [13:13:16.406] NAMES <- toupper(added) [13:13:16.406] for (kk in seq_along(NAMES)) { [13:13:16.406] name <- added[[kk]] [13:13:16.406] NAME <- NAMES[[kk]] [13:13:16.406] if (name != NAME && is.element(NAME, old_names)) [13:13:16.406] next [13:13:16.406] args[[name]] <- "" [13:13:16.406] } [13:13:16.406] NAMES <- toupper(removed) [13:13:16.406] for (kk in seq_along(NAMES)) { [13:13:16.406] name <- removed[[kk]] [13:13:16.406] NAME <- NAMES[[kk]] [13:13:16.406] if (name != NAME && is.element(NAME, old_names)) [13:13:16.406] next [13:13:16.406] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:16.406] } [13:13:16.406] if (length(args) > 0) [13:13:16.406] base::do.call(base::Sys.setenv, args = args) [13:13:16.406] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:16.406] } [13:13:16.406] else { [13:13:16.406] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:16.406] } [13:13:16.406] { [13:13:16.406] if (base::length(...future.futureOptionsAdded) > [13:13:16.406] 0L) { [13:13:16.406] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:16.406] base::names(opts) <- ...future.futureOptionsAdded [13:13:16.406] base::options(opts) [13:13:16.406] } [13:13:16.406] { [13:13:16.406] { [13:13:16.406] base::options(mc.cores = ...future.mc.cores.old) [13:13:16.406] NULL [13:13:16.406] } [13:13:16.406] options(future.plan = NULL) [13:13:16.406] if (is.na(NA_character_)) [13:13:16.406] Sys.unsetenv("R_FUTURE_PLAN") [13:13:16.406] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:16.406] future::plan(list(function (..., workers = availableCores(), [13:13:16.406] lazy = FALSE, rscript_libs = .libPaths(), [13:13:16.406] envir = parent.frame()) [13:13:16.406] { [13:13:16.406] if (is.function(workers)) [13:13:16.406] workers <- workers() [13:13:16.406] workers <- structure(as.integer(workers), [13:13:16.406] class = class(workers)) [13:13:16.406] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:16.406] workers >= 1) [13:13:16.406] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:16.406] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:16.406] } [13:13:16.406] future <- MultisessionFuture(..., workers = workers, [13:13:16.406] lazy = lazy, rscript_libs = rscript_libs, [13:13:16.406] envir = envir) [13:13:16.406] if (!future$lazy) [13:13:16.406] future <- run(future) [13:13:16.406] invisible(future) [13:13:16.406] }), .cleanup = FALSE, .init = FALSE) [13:13:16.406] } [13:13:16.406] } [13:13:16.406] } [13:13:16.406] }) [13:13:16.406] if (TRUE) { [13:13:16.406] base::sink(type = "output", split = FALSE) [13:13:16.406] if (TRUE) { [13:13:16.406] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:16.406] } [13:13:16.406] else { [13:13:16.406] ...future.result["stdout"] <- base::list(NULL) [13:13:16.406] } [13:13:16.406] base::close(...future.stdout) [13:13:16.406] ...future.stdout <- NULL [13:13:16.406] } [13:13:16.406] ...future.result$conditions <- ...future.conditions [13:13:16.406] ...future.result$finished <- base::Sys.time() [13:13:16.406] ...future.result [13:13:16.406] } [13:13:16.484] MultisessionFuture started [13:13:16.484] result() for ClusterFuture ... [13:13:16.485] receiveMessageFromWorker() for ClusterFuture ... [13:13:16.485] - Validating connection of MultisessionFuture [13:13:16.541] - received message: FutureResult [13:13:16.541] - Received FutureResult [13:13:16.544] - Erased future from FutureRegistry [13:13:16.544] result() for ClusterFuture ... [13:13:16.544] - result already collected: FutureResult [13:13:16.544] result() for ClusterFuture ... done [13:13:16.544] receiveMessageFromWorker() for ClusterFuture ... done [13:13:16.544] result() for ClusterFuture ... done [13:13:16.545] result() for ClusterFuture ... [13:13:16.545] - result already collected: FutureResult [13:13:16.545] result() for ClusterFuture ... done [13:13:16.545] plan(): plan_init() of 'multisession', 'cluster', 'multiprocess', 'future', 'function' ... DONE [13:13:16.548] plan(): nbrOfWorkers() = 2 [13:13:16.548] future_by_internal() ... [13:13:16.548] future_lapply() ... [13:13:16.552] Number of chunks: 2 [13:13:16.552] getGlobalsAndPackagesXApply() ... [13:13:16.552] - future.globals: TRUE [13:13:16.552] getGlobalsAndPackages() ... [13:13:16.552] Searching for globals... [13:13:16.554] - globals found: [2] 'FUN', 'UseMethod' [13:13:16.554] Searching for globals ... DONE [13:13:16.554] Resolving globals: FALSE [13:13:16.555] The total size of the 1 globals is 1.21 KiB (1240 bytes) [13:13:16.555] The total size of the 1 globals exported for future expression ('FUN()') is 1.21 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (1.21 KiB of class 'function') [13:13:16.555] - globals: [1] 'FUN' [13:13:16.555] [13:13:16.556] getGlobalsAndPackages() ... DONE [13:13:16.556] - globals found/used: [n=1] 'FUN' [13:13:16.556] - needed namespaces: [n=0] [13:13:16.556] Finding globals ... DONE [13:13:16.556] - use_args: TRUE [13:13:16.556] - Getting '...' globals ... [13:13:16.557] resolve() on list ... [13:13:16.557] recursive: 0 [13:13:16.557] length: 1 [13:13:16.557] elements: '...' [13:13:16.558] length: 0 (resolved future 1) [13:13:16.558] resolve() on list ... DONE [13:13:16.558] - '...' content: [n=0] [13:13:16.558] List of 1 [13:13:16.558] $ ...: list() [13:13:16.558] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:16.558] - attr(*, "where")=List of 1 [13:13:16.558] ..$ ...: [13:13:16.558] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:16.558] - attr(*, "resolved")= logi TRUE [13:13:16.558] - attr(*, "total_size")= num NA [13:13:16.561] - Getting '...' globals ... DONE [13:13:16.561] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:16.562] List of 2 [13:13:16.562] $ ...future.FUN:function (object, ...) [13:13:16.562] $ ... : list() [13:13:16.562] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:16.562] - attr(*, "where")=List of 2 [13:13:16.562] ..$ ...future.FUN: [13:13:16.562] ..$ ... : [13:13:16.562] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:16.562] - attr(*, "resolved")= logi FALSE [13:13:16.562] - attr(*, "total_size")= num 1240 [13:13:16.565] Packages to be attached in all futures: [n=0] [13:13:16.565] getGlobalsAndPackagesXApply() ... DONE [13:13:16.565] Number of futures (= number of chunks): 2 [13:13:16.565] Launching 2 futures (chunks) ... [13:13:16.566] Chunk #1 of 2 ... [13:13:16.566] - Finding globals in 'X' for chunk #1 ... [13:13:16.566] getGlobalsAndPackages() ... [13:13:16.566] Searching for globals... [13:13:16.567] [13:13:16.567] Searching for globals ... DONE [13:13:16.567] - globals: [0] [13:13:16.567] getGlobalsAndPackages() ... DONE [13:13:16.567] + additional globals found: [n=0] [13:13:16.567] + additional namespaces needed: [n=0] [13:13:16.568] - Finding globals in 'X' for chunk #1 ... DONE [13:13:16.568] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:13:16.568] - seeds: [13:13:16.568] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:16.568] getGlobalsAndPackages() ... [13:13:16.568] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:16.569] Resolving globals: FALSE [13:13:16.569] Tweak future expression to call with '...' arguments ... [13:13:16.569] { [13:13:16.569] do.call(function(...) { [13:13:16.569] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:16.569] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:16.569] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:16.569] on.exit(options(oopts), add = TRUE) [13:13:16.569] } [13:13:16.569] { [13:13:16.569] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:16.569] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:16.569] ...future.FUN(...future.X_jj, ...) [13:13:16.569] }) [13:13:16.569] } [13:13:16.569] }, args = future.call.arguments) [13:13:16.569] } [13:13:16.569] Tweak future expression to call with '...' arguments ... DONE [13:13:16.570] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:16.570] [13:13:16.570] getGlobalsAndPackages() ... DONE [13:13:16.571] run() for 'Future' ... [13:13:16.571] - state: 'created' [13:13:16.571] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:16.585] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:16.585] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:13:16.585] - Field: 'node' [13:13:16.586] - Field: 'label' [13:13:16.586] - Field: 'local' [13:13:16.586] - Field: 'owner' [13:13:16.586] - Field: 'envir' [13:13:16.586] - Field: 'workers' [13:13:16.586] - Field: 'packages' [13:13:16.587] - Field: 'gc' [13:13:16.587] - Field: 'conditions' [13:13:16.587] - Field: 'persistent' [13:13:16.587] - Field: 'expr' [13:13:16.587] - Field: 'uuid' [13:13:16.588] - Field: 'seed' [13:13:16.588] - Field: 'version' [13:13:16.588] - Field: 'result' [13:13:16.588] - Field: 'asynchronous' [13:13:16.588] - Field: 'calls' [13:13:16.588] - Field: 'globals' [13:13:16.589] - Field: 'stdout' [13:13:16.589] - Field: 'earlySignal' [13:13:16.589] - Field: 'lazy' [13:13:16.589] - Field: 'state' [13:13:16.589] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:13:16.589] - Launch lazy future ... [13:13:16.590] Packages needed by the future expression (n = 0): [13:13:16.590] Packages needed by future strategies (n = 0): [13:13:16.591] { [13:13:16.591] { [13:13:16.591] { [13:13:16.591] ...future.startTime <- base::Sys.time() [13:13:16.591] { [13:13:16.591] { [13:13:16.591] { [13:13:16.591] { [13:13:16.591] base::local({ [13:13:16.591] has_future <- base::requireNamespace("future", [13:13:16.591] quietly = TRUE) [13:13:16.591] if (has_future) { [13:13:16.591] ns <- base::getNamespace("future") [13:13:16.591] version <- ns[[".package"]][["version"]] [13:13:16.591] if (is.null(version)) [13:13:16.591] version <- utils::packageVersion("future") [13:13:16.591] } [13:13:16.591] else { [13:13:16.591] version <- NULL [13:13:16.591] } [13:13:16.591] if (!has_future || version < "1.8.0") { [13:13:16.591] info <- base::c(r_version = base::gsub("R version ", [13:13:16.591] "", base::R.version$version.string), [13:13:16.591] platform = base::sprintf("%s (%s-bit)", [13:13:16.591] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:16.591] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:16.591] "release", "version")], collapse = " "), [13:13:16.591] hostname = base::Sys.info()[["nodename"]]) [13:13:16.591] info <- base::sprintf("%s: %s", base::names(info), [13:13:16.591] info) [13:13:16.591] info <- base::paste(info, collapse = "; ") [13:13:16.591] if (!has_future) { [13:13:16.591] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:16.591] info) [13:13:16.591] } [13:13:16.591] else { [13:13:16.591] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:16.591] info, version) [13:13:16.591] } [13:13:16.591] base::stop(msg) [13:13:16.591] } [13:13:16.591] }) [13:13:16.591] } [13:13:16.591] ...future.mc.cores.old <- base::getOption("mc.cores") [13:13:16.591] base::options(mc.cores = 1L) [13:13:16.591] } [13:13:16.591] options(future.plan = NULL) [13:13:16.591] Sys.unsetenv("R_FUTURE_PLAN") [13:13:16.591] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:16.591] } [13:13:16.591] ...future.workdir <- getwd() [13:13:16.591] } [13:13:16.591] ...future.oldOptions <- base::as.list(base::.Options) [13:13:16.591] ...future.oldEnvVars <- base::Sys.getenv() [13:13:16.591] } [13:13:16.591] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:16.591] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:13:16.591] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:16.591] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:16.591] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:16.591] future.stdout.windows.reencode = NULL, width = 80L) [13:13:16.591] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:16.591] base::names(...future.oldOptions)) [13:13:16.591] } [13:13:16.591] if (FALSE) { [13:13:16.591] } [13:13:16.591] else { [13:13:16.591] if (TRUE) { [13:13:16.591] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:16.591] open = "w") [13:13:16.591] } [13:13:16.591] else { [13:13:16.591] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:16.591] windows = "NUL", "/dev/null"), open = "w") [13:13:16.591] } [13:13:16.591] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:16.591] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:16.591] base::sink(type = "output", split = FALSE) [13:13:16.591] base::close(...future.stdout) [13:13:16.591] }, add = TRUE) [13:13:16.591] } [13:13:16.591] ...future.frame <- base::sys.nframe() [13:13:16.591] ...future.conditions <- base::list() [13:13:16.591] ...future.rng <- base::globalenv()$.Random.seed [13:13:16.591] if (FALSE) { [13:13:16.591] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:16.591] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:16.591] } [13:13:16.591] ...future.result <- base::tryCatch({ [13:13:16.591] base::withCallingHandlers({ [13:13:16.591] ...future.value <- base::withVisible(base::local({ [13:13:16.591] ...future.makeSendCondition <- local({ [13:13:16.591] sendCondition <- NULL [13:13:16.591] function(frame = 1L) { [13:13:16.591] if (is.function(sendCondition)) [13:13:16.591] return(sendCondition) [13:13:16.591] ns <- getNamespace("parallel") [13:13:16.591] if (exists("sendData", mode = "function", [13:13:16.591] envir = ns)) { [13:13:16.591] parallel_sendData <- get("sendData", mode = "function", [13:13:16.591] envir = ns) [13:13:16.591] envir <- sys.frame(frame) [13:13:16.591] master <- NULL [13:13:16.591] while (!identical(envir, .GlobalEnv) && [13:13:16.591] !identical(envir, emptyenv())) { [13:13:16.591] if (exists("master", mode = "list", envir = envir, [13:13:16.591] inherits = FALSE)) { [13:13:16.591] master <- get("master", mode = "list", [13:13:16.591] envir = envir, inherits = FALSE) [13:13:16.591] if (inherits(master, c("SOCKnode", [13:13:16.591] "SOCK0node"))) { [13:13:16.591] sendCondition <<- function(cond) { [13:13:16.591] data <- list(type = "VALUE", value = cond, [13:13:16.591] success = TRUE) [13:13:16.591] parallel_sendData(master, data) [13:13:16.591] } [13:13:16.591] return(sendCondition) [13:13:16.591] } [13:13:16.591] } [13:13:16.591] frame <- frame + 1L [13:13:16.591] envir <- sys.frame(frame) [13:13:16.591] } [13:13:16.591] } [13:13:16.591] sendCondition <<- function(cond) NULL [13:13:16.591] } [13:13:16.591] }) [13:13:16.591] withCallingHandlers({ [13:13:16.591] { [13:13:16.591] do.call(function(...) { [13:13:16.591] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:16.591] if (!identical(...future.globals.maxSize.org, [13:13:16.591] ...future.globals.maxSize)) { [13:13:16.591] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:16.591] on.exit(options(oopts), add = TRUE) [13:13:16.591] } [13:13:16.591] { [13:13:16.591] lapply(seq_along(...future.elements_ii), [13:13:16.591] FUN = function(jj) { [13:13:16.591] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:16.591] ...future.FUN(...future.X_jj, ...) [13:13:16.591] }) [13:13:16.591] } [13:13:16.591] }, args = future.call.arguments) [13:13:16.591] } [13:13:16.591] }, immediateCondition = function(cond) { [13:13:16.591] sendCondition <- ...future.makeSendCondition() [13:13:16.591] sendCondition(cond) [13:13:16.591] muffleCondition <- function (cond, pattern = "^muffle") [13:13:16.591] { [13:13:16.591] inherits <- base::inherits [13:13:16.591] invokeRestart <- base::invokeRestart [13:13:16.591] is.null <- base::is.null [13:13:16.591] muffled <- FALSE [13:13:16.591] if (inherits(cond, "message")) { [13:13:16.591] muffled <- grepl(pattern, "muffleMessage") [13:13:16.591] if (muffled) [13:13:16.591] invokeRestart("muffleMessage") [13:13:16.591] } [13:13:16.591] else if (inherits(cond, "warning")) { [13:13:16.591] muffled <- grepl(pattern, "muffleWarning") [13:13:16.591] if (muffled) [13:13:16.591] invokeRestart("muffleWarning") [13:13:16.591] } [13:13:16.591] else if (inherits(cond, "condition")) { [13:13:16.591] if (!is.null(pattern)) { [13:13:16.591] computeRestarts <- base::computeRestarts [13:13:16.591] grepl <- base::grepl [13:13:16.591] restarts <- computeRestarts(cond) [13:13:16.591] for (restart in restarts) { [13:13:16.591] name <- restart$name [13:13:16.591] if (is.null(name)) [13:13:16.591] next [13:13:16.591] if (!grepl(pattern, name)) [13:13:16.591] next [13:13:16.591] invokeRestart(restart) [13:13:16.591] muffled <- TRUE [13:13:16.591] break [13:13:16.591] } [13:13:16.591] } [13:13:16.591] } [13:13:16.591] invisible(muffled) [13:13:16.591] } [13:13:16.591] muffleCondition(cond) [13:13:16.591] }) [13:13:16.591] })) [13:13:16.591] future::FutureResult(value = ...future.value$value, [13:13:16.591] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:16.591] ...future.rng), globalenv = if (FALSE) [13:13:16.591] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:16.591] ...future.globalenv.names)) [13:13:16.591] else NULL, started = ...future.startTime, version = "1.8") [13:13:16.591] }, condition = base::local({ [13:13:16.591] c <- base::c [13:13:16.591] inherits <- base::inherits [13:13:16.591] invokeRestart <- base::invokeRestart [13:13:16.591] length <- base::length [13:13:16.591] list <- base::list [13:13:16.591] seq.int <- base::seq.int [13:13:16.591] signalCondition <- base::signalCondition [13:13:16.591] sys.calls <- base::sys.calls [13:13:16.591] `[[` <- base::`[[` [13:13:16.591] `+` <- base::`+` [13:13:16.591] `<<-` <- base::`<<-` [13:13:16.591] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:16.591] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:16.591] 3L)] [13:13:16.591] } [13:13:16.591] function(cond) { [13:13:16.591] is_error <- inherits(cond, "error") [13:13:16.591] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:16.591] NULL) [13:13:16.591] if (is_error) { [13:13:16.591] sessionInformation <- function() { [13:13:16.591] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:16.591] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:16.591] search = base::search(), system = base::Sys.info()) [13:13:16.591] } [13:13:16.591] ...future.conditions[[length(...future.conditions) + [13:13:16.591] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:16.591] cond$call), session = sessionInformation(), [13:13:16.591] timestamp = base::Sys.time(), signaled = 0L) [13:13:16.591] signalCondition(cond) [13:13:16.591] } [13:13:16.591] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:16.591] "immediateCondition"))) { [13:13:16.591] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:16.591] ...future.conditions[[length(...future.conditions) + [13:13:16.591] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:16.591] if (TRUE && !signal) { [13:13:16.591] muffleCondition <- function (cond, pattern = "^muffle") [13:13:16.591] { [13:13:16.591] inherits <- base::inherits [13:13:16.591] invokeRestart <- base::invokeRestart [13:13:16.591] is.null <- base::is.null [13:13:16.591] muffled <- FALSE [13:13:16.591] if (inherits(cond, "message")) { [13:13:16.591] muffled <- grepl(pattern, "muffleMessage") [13:13:16.591] if (muffled) [13:13:16.591] invokeRestart("muffleMessage") [13:13:16.591] } [13:13:16.591] else if (inherits(cond, "warning")) { [13:13:16.591] muffled <- grepl(pattern, "muffleWarning") [13:13:16.591] if (muffled) [13:13:16.591] invokeRestart("muffleWarning") [13:13:16.591] } [13:13:16.591] else if (inherits(cond, "condition")) { [13:13:16.591] if (!is.null(pattern)) { [13:13:16.591] computeRestarts <- base::computeRestarts [13:13:16.591] grepl <- base::grepl [13:13:16.591] restarts <- computeRestarts(cond) [13:13:16.591] for (restart in restarts) { [13:13:16.591] name <- restart$name [13:13:16.591] if (is.null(name)) [13:13:16.591] next [13:13:16.591] if (!grepl(pattern, name)) [13:13:16.591] next [13:13:16.591] invokeRestart(restart) [13:13:16.591] muffled <- TRUE [13:13:16.591] break [13:13:16.591] } [13:13:16.591] } [13:13:16.591] } [13:13:16.591] invisible(muffled) [13:13:16.591] } [13:13:16.591] muffleCondition(cond, pattern = "^muffle") [13:13:16.591] } [13:13:16.591] } [13:13:16.591] else { [13:13:16.591] if (TRUE) { [13:13:16.591] muffleCondition <- function (cond, pattern = "^muffle") [13:13:16.591] { [13:13:16.591] inherits <- base::inherits [13:13:16.591] invokeRestart <- base::invokeRestart [13:13:16.591] is.null <- base::is.null [13:13:16.591] muffled <- FALSE [13:13:16.591] if (inherits(cond, "message")) { [13:13:16.591] muffled <- grepl(pattern, "muffleMessage") [13:13:16.591] if (muffled) [13:13:16.591] invokeRestart("muffleMessage") [13:13:16.591] } [13:13:16.591] else if (inherits(cond, "warning")) { [13:13:16.591] muffled <- grepl(pattern, "muffleWarning") [13:13:16.591] if (muffled) [13:13:16.591] invokeRestart("muffleWarning") [13:13:16.591] } [13:13:16.591] else if (inherits(cond, "condition")) { [13:13:16.591] if (!is.null(pattern)) { [13:13:16.591] computeRestarts <- base::computeRestarts [13:13:16.591] grepl <- base::grepl [13:13:16.591] restarts <- computeRestarts(cond) [13:13:16.591] for (restart in restarts) { [13:13:16.591] name <- restart$name [13:13:16.591] if (is.null(name)) [13:13:16.591] next [13:13:16.591] if (!grepl(pattern, name)) [13:13:16.591] next [13:13:16.591] invokeRestart(restart) [13:13:16.591] muffled <- TRUE [13:13:16.591] break [13:13:16.591] } [13:13:16.591] } [13:13:16.591] } [13:13:16.591] invisible(muffled) [13:13:16.591] } [13:13:16.591] muffleCondition(cond, pattern = "^muffle") [13:13:16.591] } [13:13:16.591] } [13:13:16.591] } [13:13:16.591] })) [13:13:16.591] }, error = function(ex) { [13:13:16.591] base::structure(base::list(value = NULL, visible = NULL, [13:13:16.591] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:16.591] ...future.rng), started = ...future.startTime, [13:13:16.591] finished = Sys.time(), session_uuid = NA_character_, [13:13:16.591] version = "1.8"), class = "FutureResult") [13:13:16.591] }, finally = { [13:13:16.591] if (!identical(...future.workdir, getwd())) [13:13:16.591] setwd(...future.workdir) [13:13:16.591] { [13:13:16.591] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:16.591] ...future.oldOptions$nwarnings <- NULL [13:13:16.591] } [13:13:16.591] base::options(...future.oldOptions) [13:13:16.591] if (.Platform$OS.type == "windows") { [13:13:16.591] old_names <- names(...future.oldEnvVars) [13:13:16.591] envs <- base::Sys.getenv() [13:13:16.591] names <- names(envs) [13:13:16.591] common <- intersect(names, old_names) [13:13:16.591] added <- setdiff(names, old_names) [13:13:16.591] removed <- setdiff(old_names, names) [13:13:16.591] changed <- common[...future.oldEnvVars[common] != [13:13:16.591] envs[common]] [13:13:16.591] NAMES <- toupper(changed) [13:13:16.591] args <- list() [13:13:16.591] for (kk in seq_along(NAMES)) { [13:13:16.591] name <- changed[[kk]] [13:13:16.591] NAME <- NAMES[[kk]] [13:13:16.591] if (name != NAME && is.element(NAME, old_names)) [13:13:16.591] next [13:13:16.591] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:16.591] } [13:13:16.591] NAMES <- toupper(added) [13:13:16.591] for (kk in seq_along(NAMES)) { [13:13:16.591] name <- added[[kk]] [13:13:16.591] NAME <- NAMES[[kk]] [13:13:16.591] if (name != NAME && is.element(NAME, old_names)) [13:13:16.591] next [13:13:16.591] args[[name]] <- "" [13:13:16.591] } [13:13:16.591] NAMES <- toupper(removed) [13:13:16.591] for (kk in seq_along(NAMES)) { [13:13:16.591] name <- removed[[kk]] [13:13:16.591] NAME <- NAMES[[kk]] [13:13:16.591] if (name != NAME && is.element(NAME, old_names)) [13:13:16.591] next [13:13:16.591] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:16.591] } [13:13:16.591] if (length(args) > 0) [13:13:16.591] base::do.call(base::Sys.setenv, args = args) [13:13:16.591] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:16.591] } [13:13:16.591] else { [13:13:16.591] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:16.591] } [13:13:16.591] { [13:13:16.591] if (base::length(...future.futureOptionsAdded) > [13:13:16.591] 0L) { [13:13:16.591] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:16.591] base::names(opts) <- ...future.futureOptionsAdded [13:13:16.591] base::options(opts) [13:13:16.591] } [13:13:16.591] { [13:13:16.591] { [13:13:16.591] base::options(mc.cores = ...future.mc.cores.old) [13:13:16.591] NULL [13:13:16.591] } [13:13:16.591] options(future.plan = NULL) [13:13:16.591] if (is.na(NA_character_)) [13:13:16.591] Sys.unsetenv("R_FUTURE_PLAN") [13:13:16.591] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:16.591] future::plan(list(function (..., workers = availableCores(), [13:13:16.591] lazy = FALSE, rscript_libs = .libPaths(), [13:13:16.591] envir = parent.frame()) [13:13:16.591] { [13:13:16.591] if (is.function(workers)) [13:13:16.591] workers <- workers() [13:13:16.591] workers <- structure(as.integer(workers), [13:13:16.591] class = class(workers)) [13:13:16.591] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:16.591] workers >= 1) [13:13:16.591] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:16.591] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:16.591] } [13:13:16.591] future <- MultisessionFuture(..., workers = workers, [13:13:16.591] lazy = lazy, rscript_libs = rscript_libs, [13:13:16.591] envir = envir) [13:13:16.591] if (!future$lazy) [13:13:16.591] future <- run(future) [13:13:16.591] invisible(future) [13:13:16.591] }), .cleanup = FALSE, .init = FALSE) [13:13:16.591] } [13:13:16.591] } [13:13:16.591] } [13:13:16.591] }) [13:13:16.591] if (TRUE) { [13:13:16.591] base::sink(type = "output", split = FALSE) [13:13:16.591] if (TRUE) { [13:13:16.591] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:16.591] } [13:13:16.591] else { [13:13:16.591] ...future.result["stdout"] <- base::list(NULL) [13:13:16.591] } [13:13:16.591] base::close(...future.stdout) [13:13:16.591] ...future.stdout <- NULL [13:13:16.591] } [13:13:16.591] ...future.result$conditions <- ...future.conditions [13:13:16.591] ...future.result$finished <- base::Sys.time() [13:13:16.591] ...future.result [13:13:16.591] } [13:13:16.596] Exporting 5 global objects (1.21 KiB) to cluster node #1 ... [13:13:16.596] Exporting '...future.FUN' (1.21 KiB) to cluster node #1 ... [13:13:16.597] Exporting '...future.FUN' (1.21 KiB) to cluster node #1 ... DONE [13:13:16.597] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... [13:13:16.598] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... DONE [13:13:16.598] Exporting '...future.elements_ii' (880 bytes) to cluster node #1 ... [13:13:16.598] Exporting '...future.elements_ii' (880 bytes) to cluster node #1 ... DONE [13:13:16.598] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:13:16.599] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:13:16.599] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:13:16.599] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:13:16.600] Exporting 5 global objects (1.21 KiB) to cluster node #1 ... DONE [13:13:16.600] MultisessionFuture started [13:13:16.601] - Launch lazy future ... done [13:13:16.601] run() for 'MultisessionFuture' ... done [13:13:16.601] Created future: [13:13:16.621] receiveMessageFromWorker() for ClusterFuture ... [13:13:16.621] - Validating connection of MultisessionFuture [13:13:16.621] - received message: FutureResult [13:13:16.621] - Received FutureResult [13:13:16.622] - Erased future from FutureRegistry [13:13:16.622] result() for ClusterFuture ... [13:13:16.622] - result already collected: FutureResult [13:13:16.622] result() for ClusterFuture ... done [13:13:16.622] receiveMessageFromWorker() for ClusterFuture ... done [13:13:16.601] MultisessionFuture: [13:13:16.601] Label: 'future_by-1' [13:13:16.601] Expression: [13:13:16.601] { [13:13:16.601] do.call(function(...) { [13:13:16.601] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:16.601] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:16.601] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:16.601] on.exit(options(oopts), add = TRUE) [13:13:16.601] } [13:13:16.601] { [13:13:16.601] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:16.601] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:16.601] ...future.FUN(...future.X_jj, ...) [13:13:16.601] }) [13:13:16.601] } [13:13:16.601] }, args = future.call.arguments) [13:13:16.601] } [13:13:16.601] Lazy evaluation: FALSE [13:13:16.601] Asynchronous evaluation: TRUE [13:13:16.601] Local evaluation: TRUE [13:13:16.601] Environment: R_GlobalEnv [13:13:16.601] Capture standard output: TRUE [13:13:16.601] Capture condition classes: 'condition' (excluding 'nothing') [13:13:16.601] Globals: 5 objects totaling 2.07 KiB (function '...future.FUN' of 1.21 KiB, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 880 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:13:16.601] Packages: [13:13:16.601] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:16.601] Resolved: TRUE [13:13:16.601] Value: [13:13:16.601] Conditions captured: [13:13:16.601] Early signaling: FALSE [13:13:16.601] Owner process: f0659542-730c-c20a-65b3-84f202449c4d [13:13:16.601] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:16.623] Chunk #1 of 2 ... DONE [13:13:16.623] Chunk #2 of 2 ... [13:13:16.623] - Finding globals in 'X' for chunk #2 ... [13:13:16.623] getGlobalsAndPackages() ... [13:13:16.623] Searching for globals... [13:13:16.624] [13:13:16.624] Searching for globals ... DONE [13:13:16.624] - globals: [0] [13:13:16.624] getGlobalsAndPackages() ... DONE [13:13:16.625] + additional globals found: [n=0] [13:13:16.625] + additional namespaces needed: [n=0] [13:13:16.625] - Finding globals in 'X' for chunk #2 ... DONE [13:13:16.625] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:13:16.625] - seeds: [13:13:16.625] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:16.626] getGlobalsAndPackages() ... [13:13:16.626] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:16.626] Resolving globals: FALSE [13:13:16.626] Tweak future expression to call with '...' arguments ... [13:13:16.626] { [13:13:16.626] do.call(function(...) { [13:13:16.626] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:16.626] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:16.626] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:16.626] on.exit(options(oopts), add = TRUE) [13:13:16.626] } [13:13:16.626] { [13:13:16.626] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:16.626] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:16.626] ...future.FUN(...future.X_jj, ...) [13:13:16.626] }) [13:13:16.626] } [13:13:16.626] }, args = future.call.arguments) [13:13:16.626] } [13:13:16.627] Tweak future expression to call with '...' arguments ... DONE [13:13:16.627] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:16.627] [13:13:16.628] getGlobalsAndPackages() ... DONE [13:13:16.628] run() for 'Future' ... [13:13:16.628] - state: 'created' [13:13:16.628] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:16.642] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:16.643] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:13:16.643] - Field: 'node' [13:13:16.643] - Field: 'label' [13:13:16.643] - Field: 'local' [13:13:16.643] - Field: 'owner' [13:13:16.644] - Field: 'envir' [13:13:16.644] - Field: 'workers' [13:13:16.644] - Field: 'packages' [13:13:16.644] - Field: 'gc' [13:13:16.644] - Field: 'conditions' [13:13:16.645] - Field: 'persistent' [13:13:16.645] - Field: 'expr' [13:13:16.645] - Field: 'uuid' [13:13:16.645] - Field: 'seed' [13:13:16.645] - Field: 'version' [13:13:16.645] - Field: 'result' [13:13:16.646] - Field: 'asynchronous' [13:13:16.646] - Field: 'calls' [13:13:16.646] - Field: 'globals' [13:13:16.646] - Field: 'stdout' [13:13:16.646] - Field: 'earlySignal' [13:13:16.646] - Field: 'lazy' [13:13:16.647] - Field: 'state' [13:13:16.647] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:13:16.647] - Launch lazy future ... [13:13:16.647] Packages needed by the future expression (n = 0): [13:13:16.648] Packages needed by future strategies (n = 0): [13:13:16.648] { [13:13:16.648] { [13:13:16.648] { [13:13:16.648] ...future.startTime <- base::Sys.time() [13:13:16.648] { [13:13:16.648] { [13:13:16.648] { [13:13:16.648] { [13:13:16.648] base::local({ [13:13:16.648] has_future <- base::requireNamespace("future", [13:13:16.648] quietly = TRUE) [13:13:16.648] if (has_future) { [13:13:16.648] ns <- base::getNamespace("future") [13:13:16.648] version <- ns[[".package"]][["version"]] [13:13:16.648] if (is.null(version)) [13:13:16.648] version <- utils::packageVersion("future") [13:13:16.648] } [13:13:16.648] else { [13:13:16.648] version <- NULL [13:13:16.648] } [13:13:16.648] if (!has_future || version < "1.8.0") { [13:13:16.648] info <- base::c(r_version = base::gsub("R version ", [13:13:16.648] "", base::R.version$version.string), [13:13:16.648] platform = base::sprintf("%s (%s-bit)", [13:13:16.648] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:16.648] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:16.648] "release", "version")], collapse = " "), [13:13:16.648] hostname = base::Sys.info()[["nodename"]]) [13:13:16.648] info <- base::sprintf("%s: %s", base::names(info), [13:13:16.648] info) [13:13:16.648] info <- base::paste(info, collapse = "; ") [13:13:16.648] if (!has_future) { [13:13:16.648] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:16.648] info) [13:13:16.648] } [13:13:16.648] else { [13:13:16.648] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:16.648] info, version) [13:13:16.648] } [13:13:16.648] base::stop(msg) [13:13:16.648] } [13:13:16.648] }) [13:13:16.648] } [13:13:16.648] ...future.mc.cores.old <- base::getOption("mc.cores") [13:13:16.648] base::options(mc.cores = 1L) [13:13:16.648] } [13:13:16.648] options(future.plan = NULL) [13:13:16.648] Sys.unsetenv("R_FUTURE_PLAN") [13:13:16.648] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:16.648] } [13:13:16.648] ...future.workdir <- getwd() [13:13:16.648] } [13:13:16.648] ...future.oldOptions <- base::as.list(base::.Options) [13:13:16.648] ...future.oldEnvVars <- base::Sys.getenv() [13:13:16.648] } [13:13:16.648] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:16.648] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:13:16.648] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:16.648] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:16.648] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:16.648] future.stdout.windows.reencode = NULL, width = 80L) [13:13:16.648] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:16.648] base::names(...future.oldOptions)) [13:13:16.648] } [13:13:16.648] if (FALSE) { [13:13:16.648] } [13:13:16.648] else { [13:13:16.648] if (TRUE) { [13:13:16.648] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:16.648] open = "w") [13:13:16.648] } [13:13:16.648] else { [13:13:16.648] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:16.648] windows = "NUL", "/dev/null"), open = "w") [13:13:16.648] } [13:13:16.648] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:16.648] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:16.648] base::sink(type = "output", split = FALSE) [13:13:16.648] base::close(...future.stdout) [13:13:16.648] }, add = TRUE) [13:13:16.648] } [13:13:16.648] ...future.frame <- base::sys.nframe() [13:13:16.648] ...future.conditions <- base::list() [13:13:16.648] ...future.rng <- base::globalenv()$.Random.seed [13:13:16.648] if (FALSE) { [13:13:16.648] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:16.648] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:16.648] } [13:13:16.648] ...future.result <- base::tryCatch({ [13:13:16.648] base::withCallingHandlers({ [13:13:16.648] ...future.value <- base::withVisible(base::local({ [13:13:16.648] ...future.makeSendCondition <- local({ [13:13:16.648] sendCondition <- NULL [13:13:16.648] function(frame = 1L) { [13:13:16.648] if (is.function(sendCondition)) [13:13:16.648] return(sendCondition) [13:13:16.648] ns <- getNamespace("parallel") [13:13:16.648] if (exists("sendData", mode = "function", [13:13:16.648] envir = ns)) { [13:13:16.648] parallel_sendData <- get("sendData", mode = "function", [13:13:16.648] envir = ns) [13:13:16.648] envir <- sys.frame(frame) [13:13:16.648] master <- NULL [13:13:16.648] while (!identical(envir, .GlobalEnv) && [13:13:16.648] !identical(envir, emptyenv())) { [13:13:16.648] if (exists("master", mode = "list", envir = envir, [13:13:16.648] inherits = FALSE)) { [13:13:16.648] master <- get("master", mode = "list", [13:13:16.648] envir = envir, inherits = FALSE) [13:13:16.648] if (inherits(master, c("SOCKnode", [13:13:16.648] "SOCK0node"))) { [13:13:16.648] sendCondition <<- function(cond) { [13:13:16.648] data <- list(type = "VALUE", value = cond, [13:13:16.648] success = TRUE) [13:13:16.648] parallel_sendData(master, data) [13:13:16.648] } [13:13:16.648] return(sendCondition) [13:13:16.648] } [13:13:16.648] } [13:13:16.648] frame <- frame + 1L [13:13:16.648] envir <- sys.frame(frame) [13:13:16.648] } [13:13:16.648] } [13:13:16.648] sendCondition <<- function(cond) NULL [13:13:16.648] } [13:13:16.648] }) [13:13:16.648] withCallingHandlers({ [13:13:16.648] { [13:13:16.648] do.call(function(...) { [13:13:16.648] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:16.648] if (!identical(...future.globals.maxSize.org, [13:13:16.648] ...future.globals.maxSize)) { [13:13:16.648] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:16.648] on.exit(options(oopts), add = TRUE) [13:13:16.648] } [13:13:16.648] { [13:13:16.648] lapply(seq_along(...future.elements_ii), [13:13:16.648] FUN = function(jj) { [13:13:16.648] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:16.648] ...future.FUN(...future.X_jj, ...) [13:13:16.648] }) [13:13:16.648] } [13:13:16.648] }, args = future.call.arguments) [13:13:16.648] } [13:13:16.648] }, immediateCondition = function(cond) { [13:13:16.648] sendCondition <- ...future.makeSendCondition() [13:13:16.648] sendCondition(cond) [13:13:16.648] muffleCondition <- function (cond, pattern = "^muffle") [13:13:16.648] { [13:13:16.648] inherits <- base::inherits [13:13:16.648] invokeRestart <- base::invokeRestart [13:13:16.648] is.null <- base::is.null [13:13:16.648] muffled <- FALSE [13:13:16.648] if (inherits(cond, "message")) { [13:13:16.648] muffled <- grepl(pattern, "muffleMessage") [13:13:16.648] if (muffled) [13:13:16.648] invokeRestart("muffleMessage") [13:13:16.648] } [13:13:16.648] else if (inherits(cond, "warning")) { [13:13:16.648] muffled <- grepl(pattern, "muffleWarning") [13:13:16.648] if (muffled) [13:13:16.648] invokeRestart("muffleWarning") [13:13:16.648] } [13:13:16.648] else if (inherits(cond, "condition")) { [13:13:16.648] if (!is.null(pattern)) { [13:13:16.648] computeRestarts <- base::computeRestarts [13:13:16.648] grepl <- base::grepl [13:13:16.648] restarts <- computeRestarts(cond) [13:13:16.648] for (restart in restarts) { [13:13:16.648] name <- restart$name [13:13:16.648] if (is.null(name)) [13:13:16.648] next [13:13:16.648] if (!grepl(pattern, name)) [13:13:16.648] next [13:13:16.648] invokeRestart(restart) [13:13:16.648] muffled <- TRUE [13:13:16.648] break [13:13:16.648] } [13:13:16.648] } [13:13:16.648] } [13:13:16.648] invisible(muffled) [13:13:16.648] } [13:13:16.648] muffleCondition(cond) [13:13:16.648] }) [13:13:16.648] })) [13:13:16.648] future::FutureResult(value = ...future.value$value, [13:13:16.648] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:16.648] ...future.rng), globalenv = if (FALSE) [13:13:16.648] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:16.648] ...future.globalenv.names)) [13:13:16.648] else NULL, started = ...future.startTime, version = "1.8") [13:13:16.648] }, condition = base::local({ [13:13:16.648] c <- base::c [13:13:16.648] inherits <- base::inherits [13:13:16.648] invokeRestart <- base::invokeRestart [13:13:16.648] length <- base::length [13:13:16.648] list <- base::list [13:13:16.648] seq.int <- base::seq.int [13:13:16.648] signalCondition <- base::signalCondition [13:13:16.648] sys.calls <- base::sys.calls [13:13:16.648] `[[` <- base::`[[` [13:13:16.648] `+` <- base::`+` [13:13:16.648] `<<-` <- base::`<<-` [13:13:16.648] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:16.648] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:16.648] 3L)] [13:13:16.648] } [13:13:16.648] function(cond) { [13:13:16.648] is_error <- inherits(cond, "error") [13:13:16.648] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:16.648] NULL) [13:13:16.648] if (is_error) { [13:13:16.648] sessionInformation <- function() { [13:13:16.648] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:16.648] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:16.648] search = base::search(), system = base::Sys.info()) [13:13:16.648] } [13:13:16.648] ...future.conditions[[length(...future.conditions) + [13:13:16.648] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:16.648] cond$call), session = sessionInformation(), [13:13:16.648] timestamp = base::Sys.time(), signaled = 0L) [13:13:16.648] signalCondition(cond) [13:13:16.648] } [13:13:16.648] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:16.648] "immediateCondition"))) { [13:13:16.648] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:16.648] ...future.conditions[[length(...future.conditions) + [13:13:16.648] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:16.648] if (TRUE && !signal) { [13:13:16.648] muffleCondition <- function (cond, pattern = "^muffle") [13:13:16.648] { [13:13:16.648] inherits <- base::inherits [13:13:16.648] invokeRestart <- base::invokeRestart [13:13:16.648] is.null <- base::is.null [13:13:16.648] muffled <- FALSE [13:13:16.648] if (inherits(cond, "message")) { [13:13:16.648] muffled <- grepl(pattern, "muffleMessage") [13:13:16.648] if (muffled) [13:13:16.648] invokeRestart("muffleMessage") [13:13:16.648] } [13:13:16.648] else if (inherits(cond, "warning")) { [13:13:16.648] muffled <- grepl(pattern, "muffleWarning") [13:13:16.648] if (muffled) [13:13:16.648] invokeRestart("muffleWarning") [13:13:16.648] } [13:13:16.648] else if (inherits(cond, "condition")) { [13:13:16.648] if (!is.null(pattern)) { [13:13:16.648] computeRestarts <- base::computeRestarts [13:13:16.648] grepl <- base::grepl [13:13:16.648] restarts <- computeRestarts(cond) [13:13:16.648] for (restart in restarts) { [13:13:16.648] name <- restart$name [13:13:16.648] if (is.null(name)) [13:13:16.648] next [13:13:16.648] if (!grepl(pattern, name)) [13:13:16.648] next [13:13:16.648] invokeRestart(restart) [13:13:16.648] muffled <- TRUE [13:13:16.648] break [13:13:16.648] } [13:13:16.648] } [13:13:16.648] } [13:13:16.648] invisible(muffled) [13:13:16.648] } [13:13:16.648] muffleCondition(cond, pattern = "^muffle") [13:13:16.648] } [13:13:16.648] } [13:13:16.648] else { [13:13:16.648] if (TRUE) { [13:13:16.648] muffleCondition <- function (cond, pattern = "^muffle") [13:13:16.648] { [13:13:16.648] inherits <- base::inherits [13:13:16.648] invokeRestart <- base::invokeRestart [13:13:16.648] is.null <- base::is.null [13:13:16.648] muffled <- FALSE [13:13:16.648] if (inherits(cond, "message")) { [13:13:16.648] muffled <- grepl(pattern, "muffleMessage") [13:13:16.648] if (muffled) [13:13:16.648] invokeRestart("muffleMessage") [13:13:16.648] } [13:13:16.648] else if (inherits(cond, "warning")) { [13:13:16.648] muffled <- grepl(pattern, "muffleWarning") [13:13:16.648] if (muffled) [13:13:16.648] invokeRestart("muffleWarning") [13:13:16.648] } [13:13:16.648] else if (inherits(cond, "condition")) { [13:13:16.648] if (!is.null(pattern)) { [13:13:16.648] computeRestarts <- base::computeRestarts [13:13:16.648] grepl <- base::grepl [13:13:16.648] restarts <- computeRestarts(cond) [13:13:16.648] for (restart in restarts) { [13:13:16.648] name <- restart$name [13:13:16.648] if (is.null(name)) [13:13:16.648] next [13:13:16.648] if (!grepl(pattern, name)) [13:13:16.648] next [13:13:16.648] invokeRestart(restart) [13:13:16.648] muffled <- TRUE [13:13:16.648] break [13:13:16.648] } [13:13:16.648] } [13:13:16.648] } [13:13:16.648] invisible(muffled) [13:13:16.648] } [13:13:16.648] muffleCondition(cond, pattern = "^muffle") [13:13:16.648] } [13:13:16.648] } [13:13:16.648] } [13:13:16.648] })) [13:13:16.648] }, error = function(ex) { [13:13:16.648] base::structure(base::list(value = NULL, visible = NULL, [13:13:16.648] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:16.648] ...future.rng), started = ...future.startTime, [13:13:16.648] finished = Sys.time(), session_uuid = NA_character_, [13:13:16.648] version = "1.8"), class = "FutureResult") [13:13:16.648] }, finally = { [13:13:16.648] if (!identical(...future.workdir, getwd())) [13:13:16.648] setwd(...future.workdir) [13:13:16.648] { [13:13:16.648] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:16.648] ...future.oldOptions$nwarnings <- NULL [13:13:16.648] } [13:13:16.648] base::options(...future.oldOptions) [13:13:16.648] if (.Platform$OS.type == "windows") { [13:13:16.648] old_names <- names(...future.oldEnvVars) [13:13:16.648] envs <- base::Sys.getenv() [13:13:16.648] names <- names(envs) [13:13:16.648] common <- intersect(names, old_names) [13:13:16.648] added <- setdiff(names, old_names) [13:13:16.648] removed <- setdiff(old_names, names) [13:13:16.648] changed <- common[...future.oldEnvVars[common] != [13:13:16.648] envs[common]] [13:13:16.648] NAMES <- toupper(changed) [13:13:16.648] args <- list() [13:13:16.648] for (kk in seq_along(NAMES)) { [13:13:16.648] name <- changed[[kk]] [13:13:16.648] NAME <- NAMES[[kk]] [13:13:16.648] if (name != NAME && is.element(NAME, old_names)) [13:13:16.648] next [13:13:16.648] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:16.648] } [13:13:16.648] NAMES <- toupper(added) [13:13:16.648] for (kk in seq_along(NAMES)) { [13:13:16.648] name <- added[[kk]] [13:13:16.648] NAME <- NAMES[[kk]] [13:13:16.648] if (name != NAME && is.element(NAME, old_names)) [13:13:16.648] next [13:13:16.648] args[[name]] <- "" [13:13:16.648] } [13:13:16.648] NAMES <- toupper(removed) [13:13:16.648] for (kk in seq_along(NAMES)) { [13:13:16.648] name <- removed[[kk]] [13:13:16.648] NAME <- NAMES[[kk]] [13:13:16.648] if (name != NAME && is.element(NAME, old_names)) [13:13:16.648] next [13:13:16.648] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:16.648] } [13:13:16.648] if (length(args) > 0) [13:13:16.648] base::do.call(base::Sys.setenv, args = args) [13:13:16.648] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:16.648] } [13:13:16.648] else { [13:13:16.648] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:16.648] } [13:13:16.648] { [13:13:16.648] if (base::length(...future.futureOptionsAdded) > [13:13:16.648] 0L) { [13:13:16.648] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:16.648] base::names(opts) <- ...future.futureOptionsAdded [13:13:16.648] base::options(opts) [13:13:16.648] } [13:13:16.648] { [13:13:16.648] { [13:13:16.648] base::options(mc.cores = ...future.mc.cores.old) [13:13:16.648] NULL [13:13:16.648] } [13:13:16.648] options(future.plan = NULL) [13:13:16.648] if (is.na(NA_character_)) [13:13:16.648] Sys.unsetenv("R_FUTURE_PLAN") [13:13:16.648] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:16.648] future::plan(list(function (..., workers = availableCores(), [13:13:16.648] lazy = FALSE, rscript_libs = .libPaths(), [13:13:16.648] envir = parent.frame()) [13:13:16.648] { [13:13:16.648] if (is.function(workers)) [13:13:16.648] workers <- workers() [13:13:16.648] workers <- structure(as.integer(workers), [13:13:16.648] class = class(workers)) [13:13:16.648] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:16.648] workers >= 1) [13:13:16.648] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:16.648] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:16.648] } [13:13:16.648] future <- MultisessionFuture(..., workers = workers, [13:13:16.648] lazy = lazy, rscript_libs = rscript_libs, [13:13:16.648] envir = envir) [13:13:16.648] if (!future$lazy) [13:13:16.648] future <- run(future) [13:13:16.648] invisible(future) [13:13:16.648] }), .cleanup = FALSE, .init = FALSE) [13:13:16.648] } [13:13:16.648] } [13:13:16.648] } [13:13:16.648] }) [13:13:16.648] if (TRUE) { [13:13:16.648] base::sink(type = "output", split = FALSE) [13:13:16.648] if (TRUE) { [13:13:16.648] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:16.648] } [13:13:16.648] else { [13:13:16.648] ...future.result["stdout"] <- base::list(NULL) [13:13:16.648] } [13:13:16.648] base::close(...future.stdout) [13:13:16.648] ...future.stdout <- NULL [13:13:16.648] } [13:13:16.648] ...future.result$conditions <- ...future.conditions [13:13:16.648] ...future.result$finished <- base::Sys.time() [13:13:16.648] ...future.result [13:13:16.648] } [13:13:16.654] Exporting 5 global objects (1.21 KiB) to cluster node #1 ... [13:13:16.654] Exporting '...future.FUN' (1.21 KiB) to cluster node #1 ... [13:13:16.654] Exporting '...future.FUN' (1.21 KiB) to cluster node #1 ... DONE [13:13:16.655] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... [13:13:16.655] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... DONE [13:13:16.655] Exporting '...future.elements_ii' (1.72 KiB) to cluster node #1 ... [13:13:16.656] Exporting '...future.elements_ii' (1.72 KiB) to cluster node #1 ... DONE [13:13:16.656] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:13:16.657] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:13:16.657] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:13:16.657] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:13:16.657] Exporting 5 global objects (1.21 KiB) to cluster node #1 ... DONE [13:13:16.658] MultisessionFuture started [13:13:16.660] - Launch lazy future ... done [13:13:16.661] run() for 'MultisessionFuture' ... done [13:13:16.661] Created future: [13:13:16.676] receiveMessageFromWorker() for ClusterFuture ... [13:13:16.676] - Validating connection of MultisessionFuture [13:13:16.676] - received message: FutureResult [13:13:16.676] - Received FutureResult [13:13:16.677] - Erased future from FutureRegistry [13:13:16.677] result() for ClusterFuture ... [13:13:16.677] - result already collected: FutureResult [13:13:16.677] result() for ClusterFuture ... done [13:13:16.677] receiveMessageFromWorker() for ClusterFuture ... done [13:13:16.661] MultisessionFuture: [13:13:16.661] Label: 'future_by-2' [13:13:16.661] Expression: [13:13:16.661] { [13:13:16.661] do.call(function(...) { [13:13:16.661] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:16.661] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:16.661] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:16.661] on.exit(options(oopts), add = TRUE) [13:13:16.661] } [13:13:16.661] { [13:13:16.661] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:16.661] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:16.661] ...future.FUN(...future.X_jj, ...) [13:13:16.661] }) [13:13:16.661] } [13:13:16.661] }, args = future.call.arguments) [13:13:16.661] } [13:13:16.661] Lazy evaluation: FALSE [13:13:16.661] Asynchronous evaluation: TRUE [13:13:16.661] Local evaluation: TRUE [13:13:16.661] Environment: R_GlobalEnv [13:13:16.661] Capture standard output: TRUE [13:13:16.661] Capture condition classes: 'condition' (excluding 'nothing') [13:13:16.661] Globals: 5 objects totaling 2.93 KiB (function '...future.FUN' of 1.21 KiB, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 1.72 KiB, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:13:16.661] Packages: [13:13:16.661] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:16.661] Resolved: TRUE [13:13:16.661] Value: [13:13:16.661] Conditions captured: [13:13:16.661] Early signaling: FALSE [13:13:16.661] Owner process: f0659542-730c-c20a-65b3-84f202449c4d [13:13:16.661] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:16.678] Chunk #2 of 2 ... DONE [13:13:16.678] Launching 2 futures (chunks) ... DONE [13:13:16.678] Resolving 2 futures (chunks) ... [13:13:16.678] resolve() on list ... [13:13:16.678] recursive: 0 [13:13:16.678] length: 2 [13:13:16.679] [13:13:16.679] Future #1 [13:13:16.679] result() for ClusterFuture ... [13:13:16.679] - result already collected: FutureResult [13:13:16.679] result() for ClusterFuture ... done [13:13:16.679] result() for ClusterFuture ... [13:13:16.679] - result already collected: FutureResult [13:13:16.680] result() for ClusterFuture ... done [13:13:16.680] signalConditionsASAP(MultisessionFuture, pos=1) ... [13:13:16.680] - nx: 2 [13:13:16.680] - relay: TRUE [13:13:16.680] - stdout: TRUE [13:13:16.680] - signal: TRUE [13:13:16.681] - resignal: FALSE [13:13:16.681] - force: TRUE [13:13:16.681] - relayed: [n=2] FALSE, FALSE [13:13:16.681] - queued futures: [n=2] FALSE, FALSE [13:13:16.681] - until=1 [13:13:16.681] - relaying element #1 [13:13:16.682] result() for ClusterFuture ... [13:13:16.682] - result already collected: FutureResult [13:13:16.682] result() for ClusterFuture ... done [13:13:16.682] result() for ClusterFuture ... [13:13:16.682] - result already collected: FutureResult [13:13:16.682] result() for ClusterFuture ... done [13:13:16.683] result() for ClusterFuture ... [13:13:16.683] - result already collected: FutureResult [13:13:16.683] result() for ClusterFuture ... done [13:13:16.683] result() for ClusterFuture ... [13:13:16.683] - result already collected: FutureResult [13:13:16.683] result() for ClusterFuture ... done [13:13:16.683] - relayed: [n=2] TRUE, FALSE [13:13:16.684] - queued futures: [n=2] TRUE, FALSE [13:13:16.684] signalConditionsASAP(MultisessionFuture, pos=1) ... done [13:13:16.684] length: 1 (resolved future 1) [13:13:16.684] Future #2 [13:13:16.684] result() for ClusterFuture ... [13:13:16.684] - result already collected: FutureResult [13:13:16.685] result() for ClusterFuture ... done [13:13:16.685] result() for ClusterFuture ... [13:13:16.685] - result already collected: FutureResult [13:13:16.685] result() for ClusterFuture ... done [13:13:16.685] signalConditionsASAP(MultisessionFuture, pos=2) ... [13:13:16.685] - nx: 2 [13:13:16.686] - relay: TRUE [13:13:16.686] - stdout: TRUE [13:13:16.686] - signal: TRUE [13:13:16.686] - resignal: FALSE [13:13:16.686] - force: TRUE [13:13:16.686] - relayed: [n=2] TRUE, FALSE [13:13:16.686] - queued futures: [n=2] TRUE, FALSE [13:13:16.687] - until=2 [13:13:16.687] - relaying element #2 [13:13:16.687] result() for ClusterFuture ... [13:13:16.687] - result already collected: FutureResult [13:13:16.687] result() for ClusterFuture ... done [13:13:16.687] result() for ClusterFuture ... [13:13:16.687] - result already collected: FutureResult [13:13:16.688] result() for ClusterFuture ... done [13:13:16.688] result() for ClusterFuture ... [13:13:16.688] - result already collected: FutureResult [13:13:16.688] result() for ClusterFuture ... done [13:13:16.688] result() for ClusterFuture ... [13:13:16.688] - result already collected: FutureResult [13:13:16.689] result() for ClusterFuture ... done [13:13:16.689] - relayed: [n=2] TRUE, TRUE [13:13:16.689] - queued futures: [n=2] TRUE, TRUE [13:13:16.689] signalConditionsASAP(MultisessionFuture, pos=2) ... done [13:13:16.689] length: 0 (resolved future 2) [13:13:16.689] Relaying remaining futures [13:13:16.690] signalConditionsASAP(NULL, pos=0) ... [13:13:16.690] - nx: 2 [13:13:16.690] - relay: TRUE [13:13:16.690] - stdout: TRUE [13:13:16.690] - signal: TRUE [13:13:16.690] - resignal: FALSE [13:13:16.690] - force: TRUE [13:13:16.691] - relayed: [n=2] TRUE, TRUE [13:13:16.691] - queued futures: [n=2] TRUE, TRUE - flush all [13:13:16.691] - relayed: [n=2] TRUE, TRUE [13:13:16.691] - queued futures: [n=2] TRUE, TRUE [13:13:16.691] signalConditionsASAP(NULL, pos=0) ... done [13:13:16.691] resolve() on list ... DONE [13:13:16.692] result() for ClusterFuture ... [13:13:16.692] - result already collected: FutureResult [13:13:16.692] result() for ClusterFuture ... done [13:13:16.692] result() for ClusterFuture ... [13:13:16.692] - result already collected: FutureResult [13:13:16.692] result() for ClusterFuture ... done [13:13:16.693] result() for ClusterFuture ... [13:13:16.693] - result already collected: FutureResult [13:13:16.693] result() for ClusterFuture ... done [13:13:16.693] result() for ClusterFuture ... [13:13:16.693] - result already collected: FutureResult [13:13:16.693] result() for ClusterFuture ... done [13:13:16.694] - Number of value chunks collected: 2 [13:13:16.694] Resolving 2 futures (chunks) ... DONE [13:13:16.694] Reducing values from 2 chunks ... [13:13:16.694] - Number of values collected after concatenation: 3 [13:13:16.694] - Number of values expected: 3 [13:13:16.694] Reducing values from 2 chunks ... DONE [13:13:16.694] future_lapply() ... DONE [13:13:16.695] future_by_internal() ... DONE [13:13:16.695] future_by_internal() ... [13:13:16.695] future_lapply() ... [13:13:16.698] Number of chunks: 2 [13:13:16.698] getGlobalsAndPackagesXApply() ... [13:13:16.699] - future.globals: TRUE [13:13:16.699] getGlobalsAndPackages() ... [13:13:16.699] Searching for globals... [13:13:16.700] - globals found: [2] 'FUN', 'UseMethod' [13:13:16.700] Searching for globals ... DONE [13:13:16.701] Resolving globals: FALSE [13:13:16.701] The total size of the 1 globals is 1.21 KiB (1240 bytes) [13:13:16.701] The total size of the 1 globals exported for future expression ('FUN(digits = 2L)') is 1.21 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (1.21 KiB of class 'function') [13:13:16.702] - globals: [1] 'FUN' [13:13:16.702] [13:13:16.702] getGlobalsAndPackages() ... DONE [13:13:16.702] - globals found/used: [n=1] 'FUN' [13:13:16.703] - needed namespaces: [n=0] [13:13:16.703] Finding globals ... DONE [13:13:16.703] - use_args: TRUE [13:13:16.703] - Getting '...' globals ... [13:13:16.704] resolve() on list ... [13:13:16.704] recursive: 0 [13:13:16.704] length: 1 [13:13:16.704] elements: '...' [13:13:16.705] length: 0 (resolved future 1) [13:13:16.705] resolve() on list ... DONE [13:13:16.705] - '...' content: [n=1] 'digits' [13:13:16.705] List of 1 [13:13:16.705] $ ...:List of 1 [13:13:16.705] ..$ digits: int 2 [13:13:16.705] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:16.705] - attr(*, "where")=List of 1 [13:13:16.705] ..$ ...: [13:13:16.705] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:16.705] - attr(*, "resolved")= logi TRUE [13:13:16.705] - attr(*, "total_size")= num NA [13:13:16.709] - Getting '...' globals ... DONE [13:13:16.709] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:16.709] List of 2 [13:13:16.709] $ ...future.FUN:function (object, ...) [13:13:16.709] $ ... :List of 1 [13:13:16.709] ..$ digits: int 2 [13:13:16.709] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:16.709] - attr(*, "where")=List of 2 [13:13:16.709] ..$ ...future.FUN: [13:13:16.709] ..$ ... : [13:13:16.709] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:16.709] - attr(*, "resolved")= logi FALSE [13:13:16.709] - attr(*, "total_size")= num 1296 [13:13:16.713] Packages to be attached in all futures: [n=0] [13:13:16.713] getGlobalsAndPackagesXApply() ... DONE [13:13:16.713] Number of futures (= number of chunks): 2 [13:13:16.714] Launching 2 futures (chunks) ... [13:13:16.714] Chunk #1 of 2 ... [13:13:16.714] - Finding globals in 'X' for chunk #1 ... [13:13:16.714] getGlobalsAndPackages() ... [13:13:16.714] Searching for globals... [13:13:16.715] [13:13:16.715] Searching for globals ... DONE [13:13:16.715] - globals: [0] [13:13:16.715] getGlobalsAndPackages() ... DONE [13:13:16.715] + additional globals found: [n=0] [13:13:16.715] + additional namespaces needed: [n=0] [13:13:16.715] - Finding globals in 'X' for chunk #1 ... DONE [13:13:16.716] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:13:16.716] - seeds: [13:13:16.716] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:16.716] getGlobalsAndPackages() ... [13:13:16.716] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:16.717] Resolving globals: FALSE [13:13:16.717] Tweak future expression to call with '...' arguments ... [13:13:16.717] { [13:13:16.717] do.call(function(...) { [13:13:16.717] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:16.717] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:16.717] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:16.717] on.exit(options(oopts), add = TRUE) [13:13:16.717] } [13:13:16.717] { [13:13:16.717] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:16.717] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:16.717] ...future.FUN(...future.X_jj, ...) [13:13:16.717] }) [13:13:16.717] } [13:13:16.717] }, args = future.call.arguments) [13:13:16.717] } [13:13:16.717] Tweak future expression to call with '...' arguments ... DONE [13:13:16.718] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:16.718] [13:13:16.718] getGlobalsAndPackages() ... DONE [13:13:16.718] run() for 'Future' ... [13:13:16.719] - state: 'created' [13:13:16.719] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:16.732] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:16.733] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:13:16.733] - Field: 'node' [13:13:16.733] - Field: 'label' [13:13:16.733] - Field: 'local' [13:13:16.734] - Field: 'owner' [13:13:16.734] - Field: 'envir' [13:13:16.734] - Field: 'workers' [13:13:16.734] - Field: 'packages' [13:13:16.734] - Field: 'gc' [13:13:16.734] - Field: 'conditions' [13:13:16.735] - Field: 'persistent' [13:13:16.735] - Field: 'expr' [13:13:16.735] - Field: 'uuid' [13:13:16.735] - Field: 'seed' [13:13:16.735] - Field: 'version' [13:13:16.736] - Field: 'result' [13:13:16.736] - Field: 'asynchronous' [13:13:16.736] - Field: 'calls' [13:13:16.736] - Field: 'globals' [13:13:16.736] - Field: 'stdout' [13:13:16.736] - Field: 'earlySignal' [13:13:16.737] - Field: 'lazy' [13:13:16.737] - Field: 'state' [13:13:16.737] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:13:16.737] - Launch lazy future ... [13:13:16.737] Packages needed by the future expression (n = 0): [13:13:16.738] Packages needed by future strategies (n = 0): [13:13:16.738] { [13:13:16.738] { [13:13:16.738] { [13:13:16.738] ...future.startTime <- base::Sys.time() [13:13:16.738] { [13:13:16.738] { [13:13:16.738] { [13:13:16.738] { [13:13:16.738] base::local({ [13:13:16.738] has_future <- base::requireNamespace("future", [13:13:16.738] quietly = TRUE) [13:13:16.738] if (has_future) { [13:13:16.738] ns <- base::getNamespace("future") [13:13:16.738] version <- ns[[".package"]][["version"]] [13:13:16.738] if (is.null(version)) [13:13:16.738] version <- utils::packageVersion("future") [13:13:16.738] } [13:13:16.738] else { [13:13:16.738] version <- NULL [13:13:16.738] } [13:13:16.738] if (!has_future || version < "1.8.0") { [13:13:16.738] info <- base::c(r_version = base::gsub("R version ", [13:13:16.738] "", base::R.version$version.string), [13:13:16.738] platform = base::sprintf("%s (%s-bit)", [13:13:16.738] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:16.738] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:16.738] "release", "version")], collapse = " "), [13:13:16.738] hostname = base::Sys.info()[["nodename"]]) [13:13:16.738] info <- base::sprintf("%s: %s", base::names(info), [13:13:16.738] info) [13:13:16.738] info <- base::paste(info, collapse = "; ") [13:13:16.738] if (!has_future) { [13:13:16.738] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:16.738] info) [13:13:16.738] } [13:13:16.738] else { [13:13:16.738] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:16.738] info, version) [13:13:16.738] } [13:13:16.738] base::stop(msg) [13:13:16.738] } [13:13:16.738] }) [13:13:16.738] } [13:13:16.738] ...future.mc.cores.old <- base::getOption("mc.cores") [13:13:16.738] base::options(mc.cores = 1L) [13:13:16.738] } [13:13:16.738] options(future.plan = NULL) [13:13:16.738] Sys.unsetenv("R_FUTURE_PLAN") [13:13:16.738] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:16.738] } [13:13:16.738] ...future.workdir <- getwd() [13:13:16.738] } [13:13:16.738] ...future.oldOptions <- base::as.list(base::.Options) [13:13:16.738] ...future.oldEnvVars <- base::Sys.getenv() [13:13:16.738] } [13:13:16.738] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:16.738] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:13:16.738] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:16.738] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:16.738] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:16.738] future.stdout.windows.reencode = NULL, width = 80L) [13:13:16.738] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:16.738] base::names(...future.oldOptions)) [13:13:16.738] } [13:13:16.738] if (FALSE) { [13:13:16.738] } [13:13:16.738] else { [13:13:16.738] if (TRUE) { [13:13:16.738] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:16.738] open = "w") [13:13:16.738] } [13:13:16.738] else { [13:13:16.738] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:16.738] windows = "NUL", "/dev/null"), open = "w") [13:13:16.738] } [13:13:16.738] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:16.738] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:16.738] base::sink(type = "output", split = FALSE) [13:13:16.738] base::close(...future.stdout) [13:13:16.738] }, add = TRUE) [13:13:16.738] } [13:13:16.738] ...future.frame <- base::sys.nframe() [13:13:16.738] ...future.conditions <- base::list() [13:13:16.738] ...future.rng <- base::globalenv()$.Random.seed [13:13:16.738] if (FALSE) { [13:13:16.738] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:16.738] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:16.738] } [13:13:16.738] ...future.result <- base::tryCatch({ [13:13:16.738] base::withCallingHandlers({ [13:13:16.738] ...future.value <- base::withVisible(base::local({ [13:13:16.738] ...future.makeSendCondition <- local({ [13:13:16.738] sendCondition <- NULL [13:13:16.738] function(frame = 1L) { [13:13:16.738] if (is.function(sendCondition)) [13:13:16.738] return(sendCondition) [13:13:16.738] ns <- getNamespace("parallel") [13:13:16.738] if (exists("sendData", mode = "function", [13:13:16.738] envir = ns)) { [13:13:16.738] parallel_sendData <- get("sendData", mode = "function", [13:13:16.738] envir = ns) [13:13:16.738] envir <- sys.frame(frame) [13:13:16.738] master <- NULL [13:13:16.738] while (!identical(envir, .GlobalEnv) && [13:13:16.738] !identical(envir, emptyenv())) { [13:13:16.738] if (exists("master", mode = "list", envir = envir, [13:13:16.738] inherits = FALSE)) { [13:13:16.738] master <- get("master", mode = "list", [13:13:16.738] envir = envir, inherits = FALSE) [13:13:16.738] if (inherits(master, c("SOCKnode", [13:13:16.738] "SOCK0node"))) { [13:13:16.738] sendCondition <<- function(cond) { [13:13:16.738] data <- list(type = "VALUE", value = cond, [13:13:16.738] success = TRUE) [13:13:16.738] parallel_sendData(master, data) [13:13:16.738] } [13:13:16.738] return(sendCondition) [13:13:16.738] } [13:13:16.738] } [13:13:16.738] frame <- frame + 1L [13:13:16.738] envir <- sys.frame(frame) [13:13:16.738] } [13:13:16.738] } [13:13:16.738] sendCondition <<- function(cond) NULL [13:13:16.738] } [13:13:16.738] }) [13:13:16.738] withCallingHandlers({ [13:13:16.738] { [13:13:16.738] do.call(function(...) { [13:13:16.738] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:16.738] if (!identical(...future.globals.maxSize.org, [13:13:16.738] ...future.globals.maxSize)) { [13:13:16.738] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:16.738] on.exit(options(oopts), add = TRUE) [13:13:16.738] } [13:13:16.738] { [13:13:16.738] lapply(seq_along(...future.elements_ii), [13:13:16.738] FUN = function(jj) { [13:13:16.738] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:16.738] ...future.FUN(...future.X_jj, ...) [13:13:16.738] }) [13:13:16.738] } [13:13:16.738] }, args = future.call.arguments) [13:13:16.738] } [13:13:16.738] }, immediateCondition = function(cond) { [13:13:16.738] sendCondition <- ...future.makeSendCondition() [13:13:16.738] sendCondition(cond) [13:13:16.738] muffleCondition <- function (cond, pattern = "^muffle") [13:13:16.738] { [13:13:16.738] inherits <- base::inherits [13:13:16.738] invokeRestart <- base::invokeRestart [13:13:16.738] is.null <- base::is.null [13:13:16.738] muffled <- FALSE [13:13:16.738] if (inherits(cond, "message")) { [13:13:16.738] muffled <- grepl(pattern, "muffleMessage") [13:13:16.738] if (muffled) [13:13:16.738] invokeRestart("muffleMessage") [13:13:16.738] } [13:13:16.738] else if (inherits(cond, "warning")) { [13:13:16.738] muffled <- grepl(pattern, "muffleWarning") [13:13:16.738] if (muffled) [13:13:16.738] invokeRestart("muffleWarning") [13:13:16.738] } [13:13:16.738] else if (inherits(cond, "condition")) { [13:13:16.738] if (!is.null(pattern)) { [13:13:16.738] computeRestarts <- base::computeRestarts [13:13:16.738] grepl <- base::grepl [13:13:16.738] restarts <- computeRestarts(cond) [13:13:16.738] for (restart in restarts) { [13:13:16.738] name <- restart$name [13:13:16.738] if (is.null(name)) [13:13:16.738] next [13:13:16.738] if (!grepl(pattern, name)) [13:13:16.738] next [13:13:16.738] invokeRestart(restart) [13:13:16.738] muffled <- TRUE [13:13:16.738] break [13:13:16.738] } [13:13:16.738] } [13:13:16.738] } [13:13:16.738] invisible(muffled) [13:13:16.738] } [13:13:16.738] muffleCondition(cond) [13:13:16.738] }) [13:13:16.738] })) [13:13:16.738] future::FutureResult(value = ...future.value$value, [13:13:16.738] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:16.738] ...future.rng), globalenv = if (FALSE) [13:13:16.738] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:16.738] ...future.globalenv.names)) [13:13:16.738] else NULL, started = ...future.startTime, version = "1.8") [13:13:16.738] }, condition = base::local({ [13:13:16.738] c <- base::c [13:13:16.738] inherits <- base::inherits [13:13:16.738] invokeRestart <- base::invokeRestart [13:13:16.738] length <- base::length [13:13:16.738] list <- base::list [13:13:16.738] seq.int <- base::seq.int [13:13:16.738] signalCondition <- base::signalCondition [13:13:16.738] sys.calls <- base::sys.calls [13:13:16.738] `[[` <- base::`[[` [13:13:16.738] `+` <- base::`+` [13:13:16.738] `<<-` <- base::`<<-` [13:13:16.738] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:16.738] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:16.738] 3L)] [13:13:16.738] } [13:13:16.738] function(cond) { [13:13:16.738] is_error <- inherits(cond, "error") [13:13:16.738] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:16.738] NULL) [13:13:16.738] if (is_error) { [13:13:16.738] sessionInformation <- function() { [13:13:16.738] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:16.738] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:16.738] search = base::search(), system = base::Sys.info()) [13:13:16.738] } [13:13:16.738] ...future.conditions[[length(...future.conditions) + [13:13:16.738] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:16.738] cond$call), session = sessionInformation(), [13:13:16.738] timestamp = base::Sys.time(), signaled = 0L) [13:13:16.738] signalCondition(cond) [13:13:16.738] } [13:13:16.738] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:16.738] "immediateCondition"))) { [13:13:16.738] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:16.738] ...future.conditions[[length(...future.conditions) + [13:13:16.738] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:16.738] if (TRUE && !signal) { [13:13:16.738] muffleCondition <- function (cond, pattern = "^muffle") [13:13:16.738] { [13:13:16.738] inherits <- base::inherits [13:13:16.738] invokeRestart <- base::invokeRestart [13:13:16.738] is.null <- base::is.null [13:13:16.738] muffled <- FALSE [13:13:16.738] if (inherits(cond, "message")) { [13:13:16.738] muffled <- grepl(pattern, "muffleMessage") [13:13:16.738] if (muffled) [13:13:16.738] invokeRestart("muffleMessage") [13:13:16.738] } [13:13:16.738] else if (inherits(cond, "warning")) { [13:13:16.738] muffled <- grepl(pattern, "muffleWarning") [13:13:16.738] if (muffled) [13:13:16.738] invokeRestart("muffleWarning") [13:13:16.738] } [13:13:16.738] else if (inherits(cond, "condition")) { [13:13:16.738] if (!is.null(pattern)) { [13:13:16.738] computeRestarts <- base::computeRestarts [13:13:16.738] grepl <- base::grepl [13:13:16.738] restarts <- computeRestarts(cond) [13:13:16.738] for (restart in restarts) { [13:13:16.738] name <- restart$name [13:13:16.738] if (is.null(name)) [13:13:16.738] next [13:13:16.738] if (!grepl(pattern, name)) [13:13:16.738] next [13:13:16.738] invokeRestart(restart) [13:13:16.738] muffled <- TRUE [13:13:16.738] break [13:13:16.738] } [13:13:16.738] } [13:13:16.738] } [13:13:16.738] invisible(muffled) [13:13:16.738] } [13:13:16.738] muffleCondition(cond, pattern = "^muffle") [13:13:16.738] } [13:13:16.738] } [13:13:16.738] else { [13:13:16.738] if (TRUE) { [13:13:16.738] muffleCondition <- function (cond, pattern = "^muffle") [13:13:16.738] { [13:13:16.738] inherits <- base::inherits [13:13:16.738] invokeRestart <- base::invokeRestart [13:13:16.738] is.null <- base::is.null [13:13:16.738] muffled <- FALSE [13:13:16.738] if (inherits(cond, "message")) { [13:13:16.738] muffled <- grepl(pattern, "muffleMessage") [13:13:16.738] if (muffled) [13:13:16.738] invokeRestart("muffleMessage") [13:13:16.738] } [13:13:16.738] else if (inherits(cond, "warning")) { [13:13:16.738] muffled <- grepl(pattern, "muffleWarning") [13:13:16.738] if (muffled) [13:13:16.738] invokeRestart("muffleWarning") [13:13:16.738] } [13:13:16.738] else if (inherits(cond, "condition")) { [13:13:16.738] if (!is.null(pattern)) { [13:13:16.738] computeRestarts <- base::computeRestarts [13:13:16.738] grepl <- base::grepl [13:13:16.738] restarts <- computeRestarts(cond) [13:13:16.738] for (restart in restarts) { [13:13:16.738] name <- restart$name [13:13:16.738] if (is.null(name)) [13:13:16.738] next [13:13:16.738] if (!grepl(pattern, name)) [13:13:16.738] next [13:13:16.738] invokeRestart(restart) [13:13:16.738] muffled <- TRUE [13:13:16.738] break [13:13:16.738] } [13:13:16.738] } [13:13:16.738] } [13:13:16.738] invisible(muffled) [13:13:16.738] } [13:13:16.738] muffleCondition(cond, pattern = "^muffle") [13:13:16.738] } [13:13:16.738] } [13:13:16.738] } [13:13:16.738] })) [13:13:16.738] }, error = function(ex) { [13:13:16.738] base::structure(base::list(value = NULL, visible = NULL, [13:13:16.738] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:16.738] ...future.rng), started = ...future.startTime, [13:13:16.738] finished = Sys.time(), session_uuid = NA_character_, [13:13:16.738] version = "1.8"), class = "FutureResult") [13:13:16.738] }, finally = { [13:13:16.738] if (!identical(...future.workdir, getwd())) [13:13:16.738] setwd(...future.workdir) [13:13:16.738] { [13:13:16.738] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:16.738] ...future.oldOptions$nwarnings <- NULL [13:13:16.738] } [13:13:16.738] base::options(...future.oldOptions) [13:13:16.738] if (.Platform$OS.type == "windows") { [13:13:16.738] old_names <- names(...future.oldEnvVars) [13:13:16.738] envs <- base::Sys.getenv() [13:13:16.738] names <- names(envs) [13:13:16.738] common <- intersect(names, old_names) [13:13:16.738] added <- setdiff(names, old_names) [13:13:16.738] removed <- setdiff(old_names, names) [13:13:16.738] changed <- common[...future.oldEnvVars[common] != [13:13:16.738] envs[common]] [13:13:16.738] NAMES <- toupper(changed) [13:13:16.738] args <- list() [13:13:16.738] for (kk in seq_along(NAMES)) { [13:13:16.738] name <- changed[[kk]] [13:13:16.738] NAME <- NAMES[[kk]] [13:13:16.738] if (name != NAME && is.element(NAME, old_names)) [13:13:16.738] next [13:13:16.738] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:16.738] } [13:13:16.738] NAMES <- toupper(added) [13:13:16.738] for (kk in seq_along(NAMES)) { [13:13:16.738] name <- added[[kk]] [13:13:16.738] NAME <- NAMES[[kk]] [13:13:16.738] if (name != NAME && is.element(NAME, old_names)) [13:13:16.738] next [13:13:16.738] args[[name]] <- "" [13:13:16.738] } [13:13:16.738] NAMES <- toupper(removed) [13:13:16.738] for (kk in seq_along(NAMES)) { [13:13:16.738] name <- removed[[kk]] [13:13:16.738] NAME <- NAMES[[kk]] [13:13:16.738] if (name != NAME && is.element(NAME, old_names)) [13:13:16.738] next [13:13:16.738] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:16.738] } [13:13:16.738] if (length(args) > 0) [13:13:16.738] base::do.call(base::Sys.setenv, args = args) [13:13:16.738] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:16.738] } [13:13:16.738] else { [13:13:16.738] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:16.738] } [13:13:16.738] { [13:13:16.738] if (base::length(...future.futureOptionsAdded) > [13:13:16.738] 0L) { [13:13:16.738] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:16.738] base::names(opts) <- ...future.futureOptionsAdded [13:13:16.738] base::options(opts) [13:13:16.738] } [13:13:16.738] { [13:13:16.738] { [13:13:16.738] base::options(mc.cores = ...future.mc.cores.old) [13:13:16.738] NULL [13:13:16.738] } [13:13:16.738] options(future.plan = NULL) [13:13:16.738] if (is.na(NA_character_)) [13:13:16.738] Sys.unsetenv("R_FUTURE_PLAN") [13:13:16.738] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:16.738] future::plan(list(function (..., workers = availableCores(), [13:13:16.738] lazy = FALSE, rscript_libs = .libPaths(), [13:13:16.738] envir = parent.frame()) [13:13:16.738] { [13:13:16.738] if (is.function(workers)) [13:13:16.738] workers <- workers() [13:13:16.738] workers <- structure(as.integer(workers), [13:13:16.738] class = class(workers)) [13:13:16.738] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:16.738] workers >= 1) [13:13:16.738] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:16.738] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:16.738] } [13:13:16.738] future <- MultisessionFuture(..., workers = workers, [13:13:16.738] lazy = lazy, rscript_libs = rscript_libs, [13:13:16.738] envir = envir) [13:13:16.738] if (!future$lazy) [13:13:16.738] future <- run(future) [13:13:16.738] invisible(future) [13:13:16.738] }), .cleanup = FALSE, .init = FALSE) [13:13:16.738] } [13:13:16.738] } [13:13:16.738] } [13:13:16.738] }) [13:13:16.738] if (TRUE) { [13:13:16.738] base::sink(type = "output", split = FALSE) [13:13:16.738] if (TRUE) { [13:13:16.738] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:16.738] } [13:13:16.738] else { [13:13:16.738] ...future.result["stdout"] <- base::list(NULL) [13:13:16.738] } [13:13:16.738] base::close(...future.stdout) [13:13:16.738] ...future.stdout <- NULL [13:13:16.738] } [13:13:16.738] ...future.result$conditions <- ...future.conditions [13:13:16.738] ...future.result$finished <- base::Sys.time() [13:13:16.738] ...future.result [13:13:16.738] } [13:13:16.743] Exporting 5 global objects (1.27 KiB) to cluster node #1 ... [13:13:16.744] Exporting '...future.FUN' (1.21 KiB) to cluster node #1 ... [13:13:16.744] Exporting '...future.FUN' (1.21 KiB) to cluster node #1 ... DONE [13:13:16.744] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... [13:13:16.745] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... DONE [13:13:16.745] Exporting '...future.elements_ii' (528 bytes) to cluster node #1 ... [13:13:16.746] Exporting '...future.elements_ii' (528 bytes) to cluster node #1 ... DONE [13:13:16.746] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:13:16.746] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:13:16.746] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:13:16.747] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:13:16.747] Exporting 5 global objects (1.27 KiB) to cluster node #1 ... DONE [13:13:16.748] MultisessionFuture started [13:13:16.748] - Launch lazy future ... done [13:13:16.748] run() for 'MultisessionFuture' ... done [13:13:16.748] Created future: [13:13:16.763] receiveMessageFromWorker() for ClusterFuture ... [13:13:16.764] - Validating connection of MultisessionFuture [13:13:16.764] - received message: FutureResult [13:13:16.764] - Received FutureResult [13:13:16.764] - Erased future from FutureRegistry [13:13:16.765] result() for ClusterFuture ... [13:13:16.765] - result already collected: FutureResult [13:13:16.765] result() for ClusterFuture ... done [13:13:16.765] receiveMessageFromWorker() for ClusterFuture ... done [13:13:16.748] MultisessionFuture: [13:13:16.748] Label: 'future_by-1' [13:13:16.748] Expression: [13:13:16.748] { [13:13:16.748] do.call(function(...) { [13:13:16.748] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:16.748] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:16.748] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:16.748] on.exit(options(oopts), add = TRUE) [13:13:16.748] } [13:13:16.748] { [13:13:16.748] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:16.748] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:16.748] ...future.FUN(...future.X_jj, ...) [13:13:16.748] }) [13:13:16.748] } [13:13:16.748] }, args = future.call.arguments) [13:13:16.748] } [13:13:16.748] Lazy evaluation: FALSE [13:13:16.748] Asynchronous evaluation: TRUE [13:13:16.748] Local evaluation: TRUE [13:13:16.748] Environment: R_GlobalEnv [13:13:16.748] Capture standard output: TRUE [13:13:16.748] Capture condition classes: 'condition' (excluding 'nothing') [13:13:16.748] Globals: 5 objects totaling 1.78 KiB (function '...future.FUN' of 1.21 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 528 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:13:16.748] Packages: [13:13:16.748] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:16.748] Resolved: TRUE [13:13:16.748] Value: [13:13:16.748] Conditions captured: [13:13:16.748] Early signaling: FALSE [13:13:16.748] Owner process: f0659542-730c-c20a-65b3-84f202449c4d [13:13:16.748] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:16.765] Chunk #1 of 2 ... DONE [13:13:16.766] Chunk #2 of 2 ... [13:13:16.766] - Finding globals in 'X' for chunk #2 ... [13:13:16.766] getGlobalsAndPackages() ... [13:13:16.766] Searching for globals... [13:13:16.766] [13:13:16.767] Searching for globals ... DONE [13:13:16.767] - globals: [0] [13:13:16.767] getGlobalsAndPackages() ... DONE [13:13:16.767] + additional globals found: [n=0] [13:13:16.767] + additional namespaces needed: [n=0] [13:13:16.767] - Finding globals in 'X' for chunk #2 ... DONE [13:13:16.768] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:13:16.768] - seeds: [13:13:16.768] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:16.768] getGlobalsAndPackages() ... [13:13:16.768] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:16.768] Resolving globals: FALSE [13:13:16.769] Tweak future expression to call with '...' arguments ... [13:13:16.769] { [13:13:16.769] do.call(function(...) { [13:13:16.769] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:16.769] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:16.769] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:16.769] on.exit(options(oopts), add = TRUE) [13:13:16.769] } [13:13:16.769] { [13:13:16.769] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:16.769] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:16.769] ...future.FUN(...future.X_jj, ...) [13:13:16.769] }) [13:13:16.769] } [13:13:16.769] }, args = future.call.arguments) [13:13:16.769] } [13:13:16.769] Tweak future expression to call with '...' arguments ... DONE [13:13:16.770] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:16.770] [13:13:16.770] getGlobalsAndPackages() ... DONE [13:13:16.770] run() for 'Future' ... [13:13:16.770] - state: 'created' [13:13:16.771] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:16.784] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:16.785] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:13:16.785] - Field: 'node' [13:13:16.785] - Field: 'label' [13:13:16.785] - Field: 'local' [13:13:16.785] - Field: 'owner' [13:13:16.786] - Field: 'envir' [13:13:16.786] - Field: 'workers' [13:13:16.786] - Field: 'packages' [13:13:16.786] - Field: 'gc' [13:13:16.786] - Field: 'conditions' [13:13:16.786] - Field: 'persistent' [13:13:16.787] - Field: 'expr' [13:13:16.787] - Field: 'uuid' [13:13:16.787] - Field: 'seed' [13:13:16.787] - Field: 'version' [13:13:16.787] - Field: 'result' [13:13:16.787] - Field: 'asynchronous' [13:13:16.788] - Field: 'calls' [13:13:16.788] - Field: 'globals' [13:13:16.788] - Field: 'stdout' [13:13:16.788] - Field: 'earlySignal' [13:13:16.788] - Field: 'lazy' [13:13:16.789] - Field: 'state' [13:13:16.789] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:13:16.789] - Launch lazy future ... [13:13:16.789] Packages needed by the future expression (n = 0): [13:13:16.789] Packages needed by future strategies (n = 0): [13:13:16.790] { [13:13:16.790] { [13:13:16.790] { [13:13:16.790] ...future.startTime <- base::Sys.time() [13:13:16.790] { [13:13:16.790] { [13:13:16.790] { [13:13:16.790] { [13:13:16.790] base::local({ [13:13:16.790] has_future <- base::requireNamespace("future", [13:13:16.790] quietly = TRUE) [13:13:16.790] if (has_future) { [13:13:16.790] ns <- base::getNamespace("future") [13:13:16.790] version <- ns[[".package"]][["version"]] [13:13:16.790] if (is.null(version)) [13:13:16.790] version <- utils::packageVersion("future") [13:13:16.790] } [13:13:16.790] else { [13:13:16.790] version <- NULL [13:13:16.790] } [13:13:16.790] if (!has_future || version < "1.8.0") { [13:13:16.790] info <- base::c(r_version = base::gsub("R version ", [13:13:16.790] "", base::R.version$version.string), [13:13:16.790] platform = base::sprintf("%s (%s-bit)", [13:13:16.790] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:16.790] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:16.790] "release", "version")], collapse = " "), [13:13:16.790] hostname = base::Sys.info()[["nodename"]]) [13:13:16.790] info <- base::sprintf("%s: %s", base::names(info), [13:13:16.790] info) [13:13:16.790] info <- base::paste(info, collapse = "; ") [13:13:16.790] if (!has_future) { [13:13:16.790] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:16.790] info) [13:13:16.790] } [13:13:16.790] else { [13:13:16.790] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:16.790] info, version) [13:13:16.790] } [13:13:16.790] base::stop(msg) [13:13:16.790] } [13:13:16.790] }) [13:13:16.790] } [13:13:16.790] ...future.mc.cores.old <- base::getOption("mc.cores") [13:13:16.790] base::options(mc.cores = 1L) [13:13:16.790] } [13:13:16.790] options(future.plan = NULL) [13:13:16.790] Sys.unsetenv("R_FUTURE_PLAN") [13:13:16.790] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:16.790] } [13:13:16.790] ...future.workdir <- getwd() [13:13:16.790] } [13:13:16.790] ...future.oldOptions <- base::as.list(base::.Options) [13:13:16.790] ...future.oldEnvVars <- base::Sys.getenv() [13:13:16.790] } [13:13:16.790] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:16.790] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:13:16.790] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:16.790] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:16.790] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:16.790] future.stdout.windows.reencode = NULL, width = 80L) [13:13:16.790] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:16.790] base::names(...future.oldOptions)) [13:13:16.790] } [13:13:16.790] if (FALSE) { [13:13:16.790] } [13:13:16.790] else { [13:13:16.790] if (TRUE) { [13:13:16.790] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:16.790] open = "w") [13:13:16.790] } [13:13:16.790] else { [13:13:16.790] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:16.790] windows = "NUL", "/dev/null"), open = "w") [13:13:16.790] } [13:13:16.790] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:16.790] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:16.790] base::sink(type = "output", split = FALSE) [13:13:16.790] base::close(...future.stdout) [13:13:16.790] }, add = TRUE) [13:13:16.790] } [13:13:16.790] ...future.frame <- base::sys.nframe() [13:13:16.790] ...future.conditions <- base::list() [13:13:16.790] ...future.rng <- base::globalenv()$.Random.seed [13:13:16.790] if (FALSE) { [13:13:16.790] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:16.790] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:16.790] } [13:13:16.790] ...future.result <- base::tryCatch({ [13:13:16.790] base::withCallingHandlers({ [13:13:16.790] ...future.value <- base::withVisible(base::local({ [13:13:16.790] ...future.makeSendCondition <- local({ [13:13:16.790] sendCondition <- NULL [13:13:16.790] function(frame = 1L) { [13:13:16.790] if (is.function(sendCondition)) [13:13:16.790] return(sendCondition) [13:13:16.790] ns <- getNamespace("parallel") [13:13:16.790] if (exists("sendData", mode = "function", [13:13:16.790] envir = ns)) { [13:13:16.790] parallel_sendData <- get("sendData", mode = "function", [13:13:16.790] envir = ns) [13:13:16.790] envir <- sys.frame(frame) [13:13:16.790] master <- NULL [13:13:16.790] while (!identical(envir, .GlobalEnv) && [13:13:16.790] !identical(envir, emptyenv())) { [13:13:16.790] if (exists("master", mode = "list", envir = envir, [13:13:16.790] inherits = FALSE)) { [13:13:16.790] master <- get("master", mode = "list", [13:13:16.790] envir = envir, inherits = FALSE) [13:13:16.790] if (inherits(master, c("SOCKnode", [13:13:16.790] "SOCK0node"))) { [13:13:16.790] sendCondition <<- function(cond) { [13:13:16.790] data <- list(type = "VALUE", value = cond, [13:13:16.790] success = TRUE) [13:13:16.790] parallel_sendData(master, data) [13:13:16.790] } [13:13:16.790] return(sendCondition) [13:13:16.790] } [13:13:16.790] } [13:13:16.790] frame <- frame + 1L [13:13:16.790] envir <- sys.frame(frame) [13:13:16.790] } [13:13:16.790] } [13:13:16.790] sendCondition <<- function(cond) NULL [13:13:16.790] } [13:13:16.790] }) [13:13:16.790] withCallingHandlers({ [13:13:16.790] { [13:13:16.790] do.call(function(...) { [13:13:16.790] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:16.790] if (!identical(...future.globals.maxSize.org, [13:13:16.790] ...future.globals.maxSize)) { [13:13:16.790] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:16.790] on.exit(options(oopts), add = TRUE) [13:13:16.790] } [13:13:16.790] { [13:13:16.790] lapply(seq_along(...future.elements_ii), [13:13:16.790] FUN = function(jj) { [13:13:16.790] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:16.790] ...future.FUN(...future.X_jj, ...) [13:13:16.790] }) [13:13:16.790] } [13:13:16.790] }, args = future.call.arguments) [13:13:16.790] } [13:13:16.790] }, immediateCondition = function(cond) { [13:13:16.790] sendCondition <- ...future.makeSendCondition() [13:13:16.790] sendCondition(cond) [13:13:16.790] muffleCondition <- function (cond, pattern = "^muffle") [13:13:16.790] { [13:13:16.790] inherits <- base::inherits [13:13:16.790] invokeRestart <- base::invokeRestart [13:13:16.790] is.null <- base::is.null [13:13:16.790] muffled <- FALSE [13:13:16.790] if (inherits(cond, "message")) { [13:13:16.790] muffled <- grepl(pattern, "muffleMessage") [13:13:16.790] if (muffled) [13:13:16.790] invokeRestart("muffleMessage") [13:13:16.790] } [13:13:16.790] else if (inherits(cond, "warning")) { [13:13:16.790] muffled <- grepl(pattern, "muffleWarning") [13:13:16.790] if (muffled) [13:13:16.790] invokeRestart("muffleWarning") [13:13:16.790] } [13:13:16.790] else if (inherits(cond, "condition")) { [13:13:16.790] if (!is.null(pattern)) { [13:13:16.790] computeRestarts <- base::computeRestarts [13:13:16.790] grepl <- base::grepl [13:13:16.790] restarts <- computeRestarts(cond) [13:13:16.790] for (restart in restarts) { [13:13:16.790] name <- restart$name [13:13:16.790] if (is.null(name)) [13:13:16.790] next [13:13:16.790] if (!grepl(pattern, name)) [13:13:16.790] next [13:13:16.790] invokeRestart(restart) [13:13:16.790] muffled <- TRUE [13:13:16.790] break [13:13:16.790] } [13:13:16.790] } [13:13:16.790] } [13:13:16.790] invisible(muffled) [13:13:16.790] } [13:13:16.790] muffleCondition(cond) [13:13:16.790] }) [13:13:16.790] })) [13:13:16.790] future::FutureResult(value = ...future.value$value, [13:13:16.790] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:16.790] ...future.rng), globalenv = if (FALSE) [13:13:16.790] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:16.790] ...future.globalenv.names)) [13:13:16.790] else NULL, started = ...future.startTime, version = "1.8") [13:13:16.790] }, condition = base::local({ [13:13:16.790] c <- base::c [13:13:16.790] inherits <- base::inherits [13:13:16.790] invokeRestart <- base::invokeRestart [13:13:16.790] length <- base::length [13:13:16.790] list <- base::list [13:13:16.790] seq.int <- base::seq.int [13:13:16.790] signalCondition <- base::signalCondition [13:13:16.790] sys.calls <- base::sys.calls [13:13:16.790] `[[` <- base::`[[` [13:13:16.790] `+` <- base::`+` [13:13:16.790] `<<-` <- base::`<<-` [13:13:16.790] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:16.790] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:16.790] 3L)] [13:13:16.790] } [13:13:16.790] function(cond) { [13:13:16.790] is_error <- inherits(cond, "error") [13:13:16.790] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:16.790] NULL) [13:13:16.790] if (is_error) { [13:13:16.790] sessionInformation <- function() { [13:13:16.790] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:16.790] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:16.790] search = base::search(), system = base::Sys.info()) [13:13:16.790] } [13:13:16.790] ...future.conditions[[length(...future.conditions) + [13:13:16.790] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:16.790] cond$call), session = sessionInformation(), [13:13:16.790] timestamp = base::Sys.time(), signaled = 0L) [13:13:16.790] signalCondition(cond) [13:13:16.790] } [13:13:16.790] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:16.790] "immediateCondition"))) { [13:13:16.790] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:16.790] ...future.conditions[[length(...future.conditions) + [13:13:16.790] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:16.790] if (TRUE && !signal) { [13:13:16.790] muffleCondition <- function (cond, pattern = "^muffle") [13:13:16.790] { [13:13:16.790] inherits <- base::inherits [13:13:16.790] invokeRestart <- base::invokeRestart [13:13:16.790] is.null <- base::is.null [13:13:16.790] muffled <- FALSE [13:13:16.790] if (inherits(cond, "message")) { [13:13:16.790] muffled <- grepl(pattern, "muffleMessage") [13:13:16.790] if (muffled) [13:13:16.790] invokeRestart("muffleMessage") [13:13:16.790] } [13:13:16.790] else if (inherits(cond, "warning")) { [13:13:16.790] muffled <- grepl(pattern, "muffleWarning") [13:13:16.790] if (muffled) [13:13:16.790] invokeRestart("muffleWarning") [13:13:16.790] } [13:13:16.790] else if (inherits(cond, "condition")) { [13:13:16.790] if (!is.null(pattern)) { [13:13:16.790] computeRestarts <- base::computeRestarts [13:13:16.790] grepl <- base::grepl [13:13:16.790] restarts <- computeRestarts(cond) [13:13:16.790] for (restart in restarts) { [13:13:16.790] name <- restart$name [13:13:16.790] if (is.null(name)) [13:13:16.790] next [13:13:16.790] if (!grepl(pattern, name)) [13:13:16.790] next [13:13:16.790] invokeRestart(restart) [13:13:16.790] muffled <- TRUE [13:13:16.790] break [13:13:16.790] } [13:13:16.790] } [13:13:16.790] } [13:13:16.790] invisible(muffled) [13:13:16.790] } [13:13:16.790] muffleCondition(cond, pattern = "^muffle") [13:13:16.790] } [13:13:16.790] } [13:13:16.790] else { [13:13:16.790] if (TRUE) { [13:13:16.790] muffleCondition <- function (cond, pattern = "^muffle") [13:13:16.790] { [13:13:16.790] inherits <- base::inherits [13:13:16.790] invokeRestart <- base::invokeRestart [13:13:16.790] is.null <- base::is.null [13:13:16.790] muffled <- FALSE [13:13:16.790] if (inherits(cond, "message")) { [13:13:16.790] muffled <- grepl(pattern, "muffleMessage") [13:13:16.790] if (muffled) [13:13:16.790] invokeRestart("muffleMessage") [13:13:16.790] } [13:13:16.790] else if (inherits(cond, "warning")) { [13:13:16.790] muffled <- grepl(pattern, "muffleWarning") [13:13:16.790] if (muffled) [13:13:16.790] invokeRestart("muffleWarning") [13:13:16.790] } [13:13:16.790] else if (inherits(cond, "condition")) { [13:13:16.790] if (!is.null(pattern)) { [13:13:16.790] computeRestarts <- base::computeRestarts [13:13:16.790] grepl <- base::grepl [13:13:16.790] restarts <- computeRestarts(cond) [13:13:16.790] for (restart in restarts) { [13:13:16.790] name <- restart$name [13:13:16.790] if (is.null(name)) [13:13:16.790] next [13:13:16.790] if (!grepl(pattern, name)) [13:13:16.790] next [13:13:16.790] invokeRestart(restart) [13:13:16.790] muffled <- TRUE [13:13:16.790] break [13:13:16.790] } [13:13:16.790] } [13:13:16.790] } [13:13:16.790] invisible(muffled) [13:13:16.790] } [13:13:16.790] muffleCondition(cond, pattern = "^muffle") [13:13:16.790] } [13:13:16.790] } [13:13:16.790] } [13:13:16.790] })) [13:13:16.790] }, error = function(ex) { [13:13:16.790] base::structure(base::list(value = NULL, visible = NULL, [13:13:16.790] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:16.790] ...future.rng), started = ...future.startTime, [13:13:16.790] finished = Sys.time(), session_uuid = NA_character_, [13:13:16.790] version = "1.8"), class = "FutureResult") [13:13:16.790] }, finally = { [13:13:16.790] if (!identical(...future.workdir, getwd())) [13:13:16.790] setwd(...future.workdir) [13:13:16.790] { [13:13:16.790] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:16.790] ...future.oldOptions$nwarnings <- NULL [13:13:16.790] } [13:13:16.790] base::options(...future.oldOptions) [13:13:16.790] if (.Platform$OS.type == "windows") { [13:13:16.790] old_names <- names(...future.oldEnvVars) [13:13:16.790] envs <- base::Sys.getenv() [13:13:16.790] names <- names(envs) [13:13:16.790] common <- intersect(names, old_names) [13:13:16.790] added <- setdiff(names, old_names) [13:13:16.790] removed <- setdiff(old_names, names) [13:13:16.790] changed <- common[...future.oldEnvVars[common] != [13:13:16.790] envs[common]] [13:13:16.790] NAMES <- toupper(changed) [13:13:16.790] args <- list() [13:13:16.790] for (kk in seq_along(NAMES)) { [13:13:16.790] name <- changed[[kk]] [13:13:16.790] NAME <- NAMES[[kk]] [13:13:16.790] if (name != NAME && is.element(NAME, old_names)) [13:13:16.790] next [13:13:16.790] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:16.790] } [13:13:16.790] NAMES <- toupper(added) [13:13:16.790] for (kk in seq_along(NAMES)) { [13:13:16.790] name <- added[[kk]] [13:13:16.790] NAME <- NAMES[[kk]] [13:13:16.790] if (name != NAME && is.element(NAME, old_names)) [13:13:16.790] next [13:13:16.790] args[[name]] <- "" [13:13:16.790] } [13:13:16.790] NAMES <- toupper(removed) [13:13:16.790] for (kk in seq_along(NAMES)) { [13:13:16.790] name <- removed[[kk]] [13:13:16.790] NAME <- NAMES[[kk]] [13:13:16.790] if (name != NAME && is.element(NAME, old_names)) [13:13:16.790] next [13:13:16.790] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:16.790] } [13:13:16.790] if (length(args) > 0) [13:13:16.790] base::do.call(base::Sys.setenv, args = args) [13:13:16.790] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:16.790] } [13:13:16.790] else { [13:13:16.790] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:16.790] } [13:13:16.790] { [13:13:16.790] if (base::length(...future.futureOptionsAdded) > [13:13:16.790] 0L) { [13:13:16.790] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:16.790] base::names(opts) <- ...future.futureOptionsAdded [13:13:16.790] base::options(opts) [13:13:16.790] } [13:13:16.790] { [13:13:16.790] { [13:13:16.790] base::options(mc.cores = ...future.mc.cores.old) [13:13:16.790] NULL [13:13:16.790] } [13:13:16.790] options(future.plan = NULL) [13:13:16.790] if (is.na(NA_character_)) [13:13:16.790] Sys.unsetenv("R_FUTURE_PLAN") [13:13:16.790] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:16.790] future::plan(list(function (..., workers = availableCores(), [13:13:16.790] lazy = FALSE, rscript_libs = .libPaths(), [13:13:16.790] envir = parent.frame()) [13:13:16.790] { [13:13:16.790] if (is.function(workers)) [13:13:16.790] workers <- workers() [13:13:16.790] workers <- structure(as.integer(workers), [13:13:16.790] class = class(workers)) [13:13:16.790] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:16.790] workers >= 1) [13:13:16.790] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:16.790] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:16.790] } [13:13:16.790] future <- MultisessionFuture(..., workers = workers, [13:13:16.790] lazy = lazy, rscript_libs = rscript_libs, [13:13:16.790] envir = envir) [13:13:16.790] if (!future$lazy) [13:13:16.790] future <- run(future) [13:13:16.790] invisible(future) [13:13:16.790] }), .cleanup = FALSE, .init = FALSE) [13:13:16.790] } [13:13:16.790] } [13:13:16.790] } [13:13:16.790] }) [13:13:16.790] if (TRUE) { [13:13:16.790] base::sink(type = "output", split = FALSE) [13:13:16.790] if (TRUE) { [13:13:16.790] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:16.790] } [13:13:16.790] else { [13:13:16.790] ...future.result["stdout"] <- base::list(NULL) [13:13:16.790] } [13:13:16.790] base::close(...future.stdout) [13:13:16.790] ...future.stdout <- NULL [13:13:16.790] } [13:13:16.790] ...future.result$conditions <- ...future.conditions [13:13:16.790] ...future.result$finished <- base::Sys.time() [13:13:16.790] ...future.result [13:13:16.790] } [13:13:16.795] Exporting 5 global objects (1.27 KiB) to cluster node #1 ... [13:13:16.796] Exporting '...future.FUN' (1.21 KiB) to cluster node #1 ... [13:13:16.796] Exporting '...future.FUN' (1.21 KiB) to cluster node #1 ... DONE [13:13:16.796] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... [13:13:16.797] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... DONE [13:13:16.797] Exporting '...future.elements_ii' (528 bytes) to cluster node #1 ... [13:13:16.797] Exporting '...future.elements_ii' (528 bytes) to cluster node #1 ... DONE [13:13:16.798] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:13:16.798] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:13:16.798] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:13:16.799] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:13:16.799] Exporting 5 global objects (1.27 KiB) to cluster node #1 ... DONE [13:13:16.799] MultisessionFuture started [13:13:16.800] - Launch lazy future ... done [13:13:16.800] run() for 'MultisessionFuture' ... done [13:13:16.800] Created future: [13:13:16.816] receiveMessageFromWorker() for ClusterFuture ... [13:13:16.817] - Validating connection of MultisessionFuture [13:13:16.817] - received message: FutureResult [13:13:16.817] - Received FutureResult [13:13:16.817] - Erased future from FutureRegistry [13:13:16.817] result() for ClusterFuture ... [13:13:16.818] - result already collected: FutureResult [13:13:16.818] result() for ClusterFuture ... done [13:13:16.818] receiveMessageFromWorker() for ClusterFuture ... done [13:13:16.800] MultisessionFuture: [13:13:16.800] Label: 'future_by-2' [13:13:16.800] Expression: [13:13:16.800] { [13:13:16.800] do.call(function(...) { [13:13:16.800] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:16.800] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:16.800] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:16.800] on.exit(options(oopts), add = TRUE) [13:13:16.800] } [13:13:16.800] { [13:13:16.800] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:16.800] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:16.800] ...future.FUN(...future.X_jj, ...) [13:13:16.800] }) [13:13:16.800] } [13:13:16.800] }, args = future.call.arguments) [13:13:16.800] } [13:13:16.800] Lazy evaluation: FALSE [13:13:16.800] Asynchronous evaluation: TRUE [13:13:16.800] Local evaluation: TRUE [13:13:16.800] Environment: R_GlobalEnv [13:13:16.800] Capture standard output: TRUE [13:13:16.800] Capture condition classes: 'condition' (excluding 'nothing') [13:13:16.800] Globals: 5 objects totaling 1.78 KiB (function '...future.FUN' of 1.21 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 528 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:13:16.800] Packages: [13:13:16.800] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:16.800] Resolved: TRUE [13:13:16.800] Value: [13:13:16.800] Conditions captured: [13:13:16.800] Early signaling: FALSE [13:13:16.800] Owner process: f0659542-730c-c20a-65b3-84f202449c4d [13:13:16.800] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:16.818] Chunk #2 of 2 ... DONE [13:13:16.818] Launching 2 futures (chunks) ... DONE [13:13:16.819] Resolving 2 futures (chunks) ... [13:13:16.819] resolve() on list ... [13:13:16.819] recursive: 0 [13:13:16.819] length: 2 [13:13:16.819] [13:13:16.819] Future #1 [13:13:16.820] result() for ClusterFuture ... [13:13:16.820] - result already collected: FutureResult [13:13:16.820] result() for ClusterFuture ... done [13:13:16.820] result() for ClusterFuture ... [13:13:16.820] - result already collected: FutureResult [13:13:16.820] result() for ClusterFuture ... done [13:13:16.821] signalConditionsASAP(MultisessionFuture, pos=1) ... [13:13:16.821] - nx: 2 [13:13:16.821] - relay: TRUE [13:13:16.821] - stdout: TRUE [13:13:16.821] - signal: TRUE [13:13:16.821] - resignal: FALSE [13:13:16.821] - force: TRUE [13:13:16.822] - relayed: [n=2] FALSE, FALSE [13:13:16.822] - queued futures: [n=2] FALSE, FALSE [13:13:16.822] - until=1 [13:13:16.822] - relaying element #1 [13:13:16.822] result() for ClusterFuture ... [13:13:16.822] - result already collected: FutureResult [13:13:16.823] result() for ClusterFuture ... done [13:13:16.823] result() for ClusterFuture ... [13:13:16.823] - result already collected: FutureResult [13:13:16.823] result() for ClusterFuture ... done [13:13:16.823] result() for ClusterFuture ... [13:13:16.823] - result already collected: FutureResult [13:13:16.824] result() for ClusterFuture ... done [13:13:16.824] result() for ClusterFuture ... [13:13:16.824] - result already collected: FutureResult [13:13:16.824] result() for ClusterFuture ... done [13:13:16.824] - relayed: [n=2] TRUE, FALSE [13:13:16.824] - queued futures: [n=2] TRUE, FALSE [13:13:16.825] signalConditionsASAP(MultisessionFuture, pos=1) ... done [13:13:16.825] length: 1 (resolved future 1) [13:13:16.825] Future #2 [13:13:16.825] result() for ClusterFuture ... [13:13:16.825] - result already collected: FutureResult [13:13:16.825] result() for ClusterFuture ... done [13:13:16.826] result() for ClusterFuture ... [13:13:16.826] - result already collected: FutureResult [13:13:16.826] result() for ClusterFuture ... done [13:13:16.826] signalConditionsASAP(MultisessionFuture, pos=2) ... [13:13:16.826] - nx: 2 [13:13:16.826] - relay: TRUE [13:13:16.826] - stdout: TRUE [13:13:16.827] - signal: TRUE [13:13:16.827] - resignal: FALSE [13:13:16.827] - force: TRUE [13:13:16.827] - relayed: [n=2] TRUE, FALSE [13:13:16.827] - queued futures: [n=2] TRUE, FALSE [13:13:16.827] - until=2 [13:13:16.828] - relaying element #2 [13:13:16.828] result() for ClusterFuture ... [13:13:16.828] - result already collected: FutureResult [13:13:16.828] result() for ClusterFuture ... done [13:13:16.828] result() for ClusterFuture ... [13:13:16.828] - result already collected: FutureResult [13:13:16.829] result() for ClusterFuture ... done [13:13:16.829] result() for ClusterFuture ... [13:13:16.829] - result already collected: FutureResult [13:13:16.829] result() for ClusterFuture ... done [13:13:16.829] result() for ClusterFuture ... [13:13:16.829] - result already collected: FutureResult [13:13:16.830] result() for ClusterFuture ... done [13:13:16.830] - relayed: [n=2] TRUE, TRUE [13:13:16.830] - queued futures: [n=2] TRUE, TRUE [13:13:16.830] signalConditionsASAP(MultisessionFuture, pos=2) ... done [13:13:16.830] length: 0 (resolved future 2) [13:13:16.830] Relaying remaining futures [13:13:16.830] signalConditionsASAP(NULL, pos=0) ... [13:13:16.831] - nx: 2 [13:13:16.831] - relay: TRUE [13:13:16.831] - stdout: TRUE [13:13:16.831] - signal: TRUE [13:13:16.831] - resignal: FALSE [13:13:16.831] - force: TRUE [13:13:16.832] - relayed: [n=2] TRUE, TRUE [13:13:16.832] - queued futures: [n=2] TRUE, TRUE - flush all [13:13:16.832] - relayed: [n=2] TRUE, TRUE [13:13:16.832] - queued futures: [n=2] TRUE, TRUE [13:13:16.832] signalConditionsASAP(NULL, pos=0) ... done [13:13:16.832] resolve() on list ... DONE [13:13:16.833] result() for ClusterFuture ... [13:13:16.833] - result already collected: FutureResult [13:13:16.833] result() for ClusterFuture ... done [13:13:16.833] result() for ClusterFuture ... [13:13:16.833] - result already collected: FutureResult [13:13:16.833] result() for ClusterFuture ... done [13:13:16.834] result() for ClusterFuture ... [13:13:16.834] - result already collected: FutureResult [13:13:16.834] result() for ClusterFuture ... done [13:13:16.834] result() for ClusterFuture ... [13:13:16.834] - result already collected: FutureResult [13:13:16.834] result() for ClusterFuture ... done [13:13:16.834] - Number of value chunks collected: 2 [13:13:16.835] Resolving 2 futures (chunks) ... DONE [13:13:16.835] Reducing values from 2 chunks ... [13:13:16.835] - Number of values collected after concatenation: 6 [13:13:16.835] - Number of values expected: 6 [13:13:16.835] Reducing values from 2 chunks ... DONE [13:13:16.835] future_lapply() ... DONE [13:13:16.836] future_by_internal() ... DONE [13:13:16.837] future_by_internal() ... [13:13:16.837] future_lapply() ... [13:13:16.841] Number of chunks: 2 [13:13:16.841] getGlobalsAndPackagesXApply() ... [13:13:16.841] - future.globals: TRUE [13:13:16.841] getGlobalsAndPackages() ... [13:13:16.841] Searching for globals... [13:13:16.843] - globals found: [6] 'FUN', '{', 'lm', '~', 'breaks', 'wool' [13:13:16.844] Searching for globals ... DONE [13:13:16.844] Resolving globals: FALSE [13:13:16.844] The total size of the 1 globals is 5.20 KiB (5328 bytes) [13:13:16.845] The total size of the 1 globals exported for future expression ('FUN(singular.ok = FALSE)') is 5.20 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (5.20 KiB of class 'function') [13:13:16.845] - globals: [1] 'FUN' [13:13:16.845] - packages: [1] 'stats' [13:13:16.845] getGlobalsAndPackages() ... DONE [13:13:16.846] - globals found/used: [n=1] 'FUN' [13:13:16.846] - needed namespaces: [n=1] 'stats' [13:13:16.846] Finding globals ... DONE [13:13:16.846] - use_args: TRUE [13:13:16.846] - Getting '...' globals ... [13:13:16.847] resolve() on list ... [13:13:16.847] recursive: 0 [13:13:16.847] length: 1 [13:13:16.847] elements: '...' [13:13:16.847] length: 0 (resolved future 1) [13:13:16.847] resolve() on list ... DONE [13:13:16.848] - '...' content: [n=1] 'singular.ok' [13:13:16.848] List of 1 [13:13:16.848] $ ...:List of 1 [13:13:16.848] ..$ singular.ok: logi FALSE [13:13:16.848] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:16.848] - attr(*, "where")=List of 1 [13:13:16.848] ..$ ...: [13:13:16.848] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:16.848] - attr(*, "resolved")= logi TRUE [13:13:16.848] - attr(*, "total_size")= num NA [13:13:16.853] - Getting '...' globals ... DONE [13:13:16.853] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:16.853] List of 2 [13:13:16.853] $ ...future.FUN:function (x, ...) [13:13:16.853] $ ... :List of 1 [13:13:16.853] ..$ singular.ok: logi FALSE [13:13:16.853] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:16.853] - attr(*, "where")=List of 2 [13:13:16.853] ..$ ...future.FUN: [13:13:16.853] ..$ ... : [13:13:16.853] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:16.853] - attr(*, "resolved")= logi FALSE [13:13:16.853] - attr(*, "total_size")= num 5384 [13:13:16.857] Packages to be attached in all futures: [n=1] 'stats' [13:13:16.857] getGlobalsAndPackagesXApply() ... DONE [13:13:16.858] Number of futures (= number of chunks): 2 [13:13:16.858] Launching 2 futures (chunks) ... [13:13:16.858] Chunk #1 of 2 ... [13:13:16.858] - Finding globals in 'X' for chunk #1 ... [13:13:16.858] getGlobalsAndPackages() ... [13:13:16.859] Searching for globals... [13:13:16.859] [13:13:16.859] Searching for globals ... DONE [13:13:16.859] - globals: [0] [13:13:16.859] getGlobalsAndPackages() ... DONE [13:13:16.860] + additional globals found: [n=0] [13:13:16.860] + additional namespaces needed: [n=0] [13:13:16.860] - Finding globals in 'X' for chunk #1 ... DONE [13:13:16.860] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:13:16.860] - seeds: [13:13:16.860] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:16.861] getGlobalsAndPackages() ... [13:13:16.861] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:16.861] Resolving globals: FALSE [13:13:16.861] Tweak future expression to call with '...' arguments ... [13:13:16.861] { [13:13:16.861] do.call(function(...) { [13:13:16.861] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:16.861] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:16.861] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:16.861] on.exit(options(oopts), add = TRUE) [13:13:16.861] } [13:13:16.861] { [13:13:16.861] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:16.861] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:16.861] ...future.FUN(...future.X_jj, ...) [13:13:16.861] }) [13:13:16.861] } [13:13:16.861] }, args = future.call.arguments) [13:13:16.861] } [13:13:16.862] Tweak future expression to call with '...' arguments ... DONE [13:13:16.862] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:16.862] [13:13:16.863] getGlobalsAndPackages() ... DONE [13:13:16.863] run() for 'Future' ... [13:13:16.863] - state: 'created' [13:13:16.863] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:16.877] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:16.877] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:13:16.877] - Field: 'node' [13:13:16.878] - Field: 'label' [13:13:16.878] - Field: 'local' [13:13:16.878] - Field: 'owner' [13:13:16.878] - Field: 'envir' [13:13:16.878] - Field: 'workers' [13:13:16.879] - Field: 'packages' [13:13:16.879] - Field: 'gc' [13:13:16.879] - Field: 'conditions' [13:13:16.879] - Field: 'persistent' [13:13:16.879] - Field: 'expr' [13:13:16.879] - Field: 'uuid' [13:13:16.880] - Field: 'seed' [13:13:16.880] - Field: 'version' [13:13:16.880] - Field: 'result' [13:13:16.880] - Field: 'asynchronous' [13:13:16.880] - Field: 'calls' [13:13:16.880] - Field: 'globals' [13:13:16.881] - Field: 'stdout' [13:13:16.881] - Field: 'earlySignal' [13:13:16.881] - Field: 'lazy' [13:13:16.881] - Field: 'state' [13:13:16.881] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:13:16.881] - Launch lazy future ... [13:13:16.882] Packages needed by the future expression (n = 1): 'stats' [13:13:16.882] Packages needed by future strategies (n = 0): [13:13:16.883] { [13:13:16.883] { [13:13:16.883] { [13:13:16.883] ...future.startTime <- base::Sys.time() [13:13:16.883] { [13:13:16.883] { [13:13:16.883] { [13:13:16.883] { [13:13:16.883] { [13:13:16.883] base::local({ [13:13:16.883] has_future <- base::requireNamespace("future", [13:13:16.883] quietly = TRUE) [13:13:16.883] if (has_future) { [13:13:16.883] ns <- base::getNamespace("future") [13:13:16.883] version <- ns[[".package"]][["version"]] [13:13:16.883] if (is.null(version)) [13:13:16.883] version <- utils::packageVersion("future") [13:13:16.883] } [13:13:16.883] else { [13:13:16.883] version <- NULL [13:13:16.883] } [13:13:16.883] if (!has_future || version < "1.8.0") { [13:13:16.883] info <- base::c(r_version = base::gsub("R version ", [13:13:16.883] "", base::R.version$version.string), [13:13:16.883] platform = base::sprintf("%s (%s-bit)", [13:13:16.883] base::R.version$platform, 8 * [13:13:16.883] base::.Machine$sizeof.pointer), [13:13:16.883] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:16.883] "release", "version")], collapse = " "), [13:13:16.883] hostname = base::Sys.info()[["nodename"]]) [13:13:16.883] info <- base::sprintf("%s: %s", base::names(info), [13:13:16.883] info) [13:13:16.883] info <- base::paste(info, collapse = "; ") [13:13:16.883] if (!has_future) { [13:13:16.883] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:16.883] info) [13:13:16.883] } [13:13:16.883] else { [13:13:16.883] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:16.883] info, version) [13:13:16.883] } [13:13:16.883] base::stop(msg) [13:13:16.883] } [13:13:16.883] }) [13:13:16.883] } [13:13:16.883] ...future.mc.cores.old <- base::getOption("mc.cores") [13:13:16.883] base::options(mc.cores = 1L) [13:13:16.883] } [13:13:16.883] base::local({ [13:13:16.883] for (pkg in "stats") { [13:13:16.883] base::loadNamespace(pkg) [13:13:16.883] base::library(pkg, character.only = TRUE) [13:13:16.883] } [13:13:16.883] }) [13:13:16.883] } [13:13:16.883] options(future.plan = NULL) [13:13:16.883] Sys.unsetenv("R_FUTURE_PLAN") [13:13:16.883] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:16.883] } [13:13:16.883] ...future.workdir <- getwd() [13:13:16.883] } [13:13:16.883] ...future.oldOptions <- base::as.list(base::.Options) [13:13:16.883] ...future.oldEnvVars <- base::Sys.getenv() [13:13:16.883] } [13:13:16.883] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:16.883] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:13:16.883] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:16.883] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:16.883] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:16.883] future.stdout.windows.reencode = NULL, width = 80L) [13:13:16.883] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:16.883] base::names(...future.oldOptions)) [13:13:16.883] } [13:13:16.883] if (FALSE) { [13:13:16.883] } [13:13:16.883] else { [13:13:16.883] if (TRUE) { [13:13:16.883] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:16.883] open = "w") [13:13:16.883] } [13:13:16.883] else { [13:13:16.883] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:16.883] windows = "NUL", "/dev/null"), open = "w") [13:13:16.883] } [13:13:16.883] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:16.883] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:16.883] base::sink(type = "output", split = FALSE) [13:13:16.883] base::close(...future.stdout) [13:13:16.883] }, add = TRUE) [13:13:16.883] } [13:13:16.883] ...future.frame <- base::sys.nframe() [13:13:16.883] ...future.conditions <- base::list() [13:13:16.883] ...future.rng <- base::globalenv()$.Random.seed [13:13:16.883] if (FALSE) { [13:13:16.883] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:16.883] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:16.883] } [13:13:16.883] ...future.result <- base::tryCatch({ [13:13:16.883] base::withCallingHandlers({ [13:13:16.883] ...future.value <- base::withVisible(base::local({ [13:13:16.883] ...future.makeSendCondition <- local({ [13:13:16.883] sendCondition <- NULL [13:13:16.883] function(frame = 1L) { [13:13:16.883] if (is.function(sendCondition)) [13:13:16.883] return(sendCondition) [13:13:16.883] ns <- getNamespace("parallel") [13:13:16.883] if (exists("sendData", mode = "function", [13:13:16.883] envir = ns)) { [13:13:16.883] parallel_sendData <- get("sendData", mode = "function", [13:13:16.883] envir = ns) [13:13:16.883] envir <- sys.frame(frame) [13:13:16.883] master <- NULL [13:13:16.883] while (!identical(envir, .GlobalEnv) && [13:13:16.883] !identical(envir, emptyenv())) { [13:13:16.883] if (exists("master", mode = "list", envir = envir, [13:13:16.883] inherits = FALSE)) { [13:13:16.883] master <- get("master", mode = "list", [13:13:16.883] envir = envir, inherits = FALSE) [13:13:16.883] if (inherits(master, c("SOCKnode", [13:13:16.883] "SOCK0node"))) { [13:13:16.883] sendCondition <<- function(cond) { [13:13:16.883] data <- list(type = "VALUE", value = cond, [13:13:16.883] success = TRUE) [13:13:16.883] parallel_sendData(master, data) [13:13:16.883] } [13:13:16.883] return(sendCondition) [13:13:16.883] } [13:13:16.883] } [13:13:16.883] frame <- frame + 1L [13:13:16.883] envir <- sys.frame(frame) [13:13:16.883] } [13:13:16.883] } [13:13:16.883] sendCondition <<- function(cond) NULL [13:13:16.883] } [13:13:16.883] }) [13:13:16.883] withCallingHandlers({ [13:13:16.883] { [13:13:16.883] do.call(function(...) { [13:13:16.883] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:16.883] if (!identical(...future.globals.maxSize.org, [13:13:16.883] ...future.globals.maxSize)) { [13:13:16.883] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:16.883] on.exit(options(oopts), add = TRUE) [13:13:16.883] } [13:13:16.883] { [13:13:16.883] lapply(seq_along(...future.elements_ii), [13:13:16.883] FUN = function(jj) { [13:13:16.883] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:16.883] ...future.FUN(...future.X_jj, ...) [13:13:16.883] }) [13:13:16.883] } [13:13:16.883] }, args = future.call.arguments) [13:13:16.883] } [13:13:16.883] }, immediateCondition = function(cond) { [13:13:16.883] sendCondition <- ...future.makeSendCondition() [13:13:16.883] sendCondition(cond) [13:13:16.883] muffleCondition <- function (cond, pattern = "^muffle") [13:13:16.883] { [13:13:16.883] inherits <- base::inherits [13:13:16.883] invokeRestart <- base::invokeRestart [13:13:16.883] is.null <- base::is.null [13:13:16.883] muffled <- FALSE [13:13:16.883] if (inherits(cond, "message")) { [13:13:16.883] muffled <- grepl(pattern, "muffleMessage") [13:13:16.883] if (muffled) [13:13:16.883] invokeRestart("muffleMessage") [13:13:16.883] } [13:13:16.883] else if (inherits(cond, "warning")) { [13:13:16.883] muffled <- grepl(pattern, "muffleWarning") [13:13:16.883] if (muffled) [13:13:16.883] invokeRestart("muffleWarning") [13:13:16.883] } [13:13:16.883] else if (inherits(cond, "condition")) { [13:13:16.883] if (!is.null(pattern)) { [13:13:16.883] computeRestarts <- base::computeRestarts [13:13:16.883] grepl <- base::grepl [13:13:16.883] restarts <- computeRestarts(cond) [13:13:16.883] for (restart in restarts) { [13:13:16.883] name <- restart$name [13:13:16.883] if (is.null(name)) [13:13:16.883] next [13:13:16.883] if (!grepl(pattern, name)) [13:13:16.883] next [13:13:16.883] invokeRestart(restart) [13:13:16.883] muffled <- TRUE [13:13:16.883] break [13:13:16.883] } [13:13:16.883] } [13:13:16.883] } [13:13:16.883] invisible(muffled) [13:13:16.883] } [13:13:16.883] muffleCondition(cond) [13:13:16.883] }) [13:13:16.883] })) [13:13:16.883] future::FutureResult(value = ...future.value$value, [13:13:16.883] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:16.883] ...future.rng), globalenv = if (FALSE) [13:13:16.883] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:16.883] ...future.globalenv.names)) [13:13:16.883] else NULL, started = ...future.startTime, version = "1.8") [13:13:16.883] }, condition = base::local({ [13:13:16.883] c <- base::c [13:13:16.883] inherits <- base::inherits [13:13:16.883] invokeRestart <- base::invokeRestart [13:13:16.883] length <- base::length [13:13:16.883] list <- base::list [13:13:16.883] seq.int <- base::seq.int [13:13:16.883] signalCondition <- base::signalCondition [13:13:16.883] sys.calls <- base::sys.calls [13:13:16.883] `[[` <- base::`[[` [13:13:16.883] `+` <- base::`+` [13:13:16.883] `<<-` <- base::`<<-` [13:13:16.883] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:16.883] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:16.883] 3L)] [13:13:16.883] } [13:13:16.883] function(cond) { [13:13:16.883] is_error <- inherits(cond, "error") [13:13:16.883] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:16.883] NULL) [13:13:16.883] if (is_error) { [13:13:16.883] sessionInformation <- function() { [13:13:16.883] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:16.883] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:16.883] search = base::search(), system = base::Sys.info()) [13:13:16.883] } [13:13:16.883] ...future.conditions[[length(...future.conditions) + [13:13:16.883] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:16.883] cond$call), session = sessionInformation(), [13:13:16.883] timestamp = base::Sys.time(), signaled = 0L) [13:13:16.883] signalCondition(cond) [13:13:16.883] } [13:13:16.883] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:16.883] "immediateCondition"))) { [13:13:16.883] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:16.883] ...future.conditions[[length(...future.conditions) + [13:13:16.883] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:16.883] if (TRUE && !signal) { [13:13:16.883] muffleCondition <- function (cond, pattern = "^muffle") [13:13:16.883] { [13:13:16.883] inherits <- base::inherits [13:13:16.883] invokeRestart <- base::invokeRestart [13:13:16.883] is.null <- base::is.null [13:13:16.883] muffled <- FALSE [13:13:16.883] if (inherits(cond, "message")) { [13:13:16.883] muffled <- grepl(pattern, "muffleMessage") [13:13:16.883] if (muffled) [13:13:16.883] invokeRestart("muffleMessage") [13:13:16.883] } [13:13:16.883] else if (inherits(cond, "warning")) { [13:13:16.883] muffled <- grepl(pattern, "muffleWarning") [13:13:16.883] if (muffled) [13:13:16.883] invokeRestart("muffleWarning") [13:13:16.883] } [13:13:16.883] else if (inherits(cond, "condition")) { [13:13:16.883] if (!is.null(pattern)) { [13:13:16.883] computeRestarts <- base::computeRestarts [13:13:16.883] grepl <- base::grepl [13:13:16.883] restarts <- computeRestarts(cond) [13:13:16.883] for (restart in restarts) { [13:13:16.883] name <- restart$name [13:13:16.883] if (is.null(name)) [13:13:16.883] next [13:13:16.883] if (!grepl(pattern, name)) [13:13:16.883] next [13:13:16.883] invokeRestart(restart) [13:13:16.883] muffled <- TRUE [13:13:16.883] break [13:13:16.883] } [13:13:16.883] } [13:13:16.883] } [13:13:16.883] invisible(muffled) [13:13:16.883] } [13:13:16.883] muffleCondition(cond, pattern = "^muffle") [13:13:16.883] } [13:13:16.883] } [13:13:16.883] else { [13:13:16.883] if (TRUE) { [13:13:16.883] muffleCondition <- function (cond, pattern = "^muffle") [13:13:16.883] { [13:13:16.883] inherits <- base::inherits [13:13:16.883] invokeRestart <- base::invokeRestart [13:13:16.883] is.null <- base::is.null [13:13:16.883] muffled <- FALSE [13:13:16.883] if (inherits(cond, "message")) { [13:13:16.883] muffled <- grepl(pattern, "muffleMessage") [13:13:16.883] if (muffled) [13:13:16.883] invokeRestart("muffleMessage") [13:13:16.883] } [13:13:16.883] else if (inherits(cond, "warning")) { [13:13:16.883] muffled <- grepl(pattern, "muffleWarning") [13:13:16.883] if (muffled) [13:13:16.883] invokeRestart("muffleWarning") [13:13:16.883] } [13:13:16.883] else if (inherits(cond, "condition")) { [13:13:16.883] if (!is.null(pattern)) { [13:13:16.883] computeRestarts <- base::computeRestarts [13:13:16.883] grepl <- base::grepl [13:13:16.883] restarts <- computeRestarts(cond) [13:13:16.883] for (restart in restarts) { [13:13:16.883] name <- restart$name [13:13:16.883] if (is.null(name)) [13:13:16.883] next [13:13:16.883] if (!grepl(pattern, name)) [13:13:16.883] next [13:13:16.883] invokeRestart(restart) [13:13:16.883] muffled <- TRUE [13:13:16.883] break [13:13:16.883] } [13:13:16.883] } [13:13:16.883] } [13:13:16.883] invisible(muffled) [13:13:16.883] } [13:13:16.883] muffleCondition(cond, pattern = "^muffle") [13:13:16.883] } [13:13:16.883] } [13:13:16.883] } [13:13:16.883] })) [13:13:16.883] }, error = function(ex) { [13:13:16.883] base::structure(base::list(value = NULL, visible = NULL, [13:13:16.883] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:16.883] ...future.rng), started = ...future.startTime, [13:13:16.883] finished = Sys.time(), session_uuid = NA_character_, [13:13:16.883] version = "1.8"), class = "FutureResult") [13:13:16.883] }, finally = { [13:13:16.883] if (!identical(...future.workdir, getwd())) [13:13:16.883] setwd(...future.workdir) [13:13:16.883] { [13:13:16.883] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:16.883] ...future.oldOptions$nwarnings <- NULL [13:13:16.883] } [13:13:16.883] base::options(...future.oldOptions) [13:13:16.883] if (.Platform$OS.type == "windows") { [13:13:16.883] old_names <- names(...future.oldEnvVars) [13:13:16.883] envs <- base::Sys.getenv() [13:13:16.883] names <- names(envs) [13:13:16.883] common <- intersect(names, old_names) [13:13:16.883] added <- setdiff(names, old_names) [13:13:16.883] removed <- setdiff(old_names, names) [13:13:16.883] changed <- common[...future.oldEnvVars[common] != [13:13:16.883] envs[common]] [13:13:16.883] NAMES <- toupper(changed) [13:13:16.883] args <- list() [13:13:16.883] for (kk in seq_along(NAMES)) { [13:13:16.883] name <- changed[[kk]] [13:13:16.883] NAME <- NAMES[[kk]] [13:13:16.883] if (name != NAME && is.element(NAME, old_names)) [13:13:16.883] next [13:13:16.883] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:16.883] } [13:13:16.883] NAMES <- toupper(added) [13:13:16.883] for (kk in seq_along(NAMES)) { [13:13:16.883] name <- added[[kk]] [13:13:16.883] NAME <- NAMES[[kk]] [13:13:16.883] if (name != NAME && is.element(NAME, old_names)) [13:13:16.883] next [13:13:16.883] args[[name]] <- "" [13:13:16.883] } [13:13:16.883] NAMES <- toupper(removed) [13:13:16.883] for (kk in seq_along(NAMES)) { [13:13:16.883] name <- removed[[kk]] [13:13:16.883] NAME <- NAMES[[kk]] [13:13:16.883] if (name != NAME && is.element(NAME, old_names)) [13:13:16.883] next [13:13:16.883] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:16.883] } [13:13:16.883] if (length(args) > 0) [13:13:16.883] base::do.call(base::Sys.setenv, args = args) [13:13:16.883] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:16.883] } [13:13:16.883] else { [13:13:16.883] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:16.883] } [13:13:16.883] { [13:13:16.883] if (base::length(...future.futureOptionsAdded) > [13:13:16.883] 0L) { [13:13:16.883] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:16.883] base::names(opts) <- ...future.futureOptionsAdded [13:13:16.883] base::options(opts) [13:13:16.883] } [13:13:16.883] { [13:13:16.883] { [13:13:16.883] base::options(mc.cores = ...future.mc.cores.old) [13:13:16.883] NULL [13:13:16.883] } [13:13:16.883] options(future.plan = NULL) [13:13:16.883] if (is.na(NA_character_)) [13:13:16.883] Sys.unsetenv("R_FUTURE_PLAN") [13:13:16.883] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:16.883] future::plan(list(function (..., workers = availableCores(), [13:13:16.883] lazy = FALSE, rscript_libs = .libPaths(), [13:13:16.883] envir = parent.frame()) [13:13:16.883] { [13:13:16.883] if (is.function(workers)) [13:13:16.883] workers <- workers() [13:13:16.883] workers <- structure(as.integer(workers), [13:13:16.883] class = class(workers)) [13:13:16.883] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:16.883] workers >= 1) [13:13:16.883] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:16.883] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:16.883] } [13:13:16.883] future <- MultisessionFuture(..., workers = workers, [13:13:16.883] lazy = lazy, rscript_libs = rscript_libs, [13:13:16.883] envir = envir) [13:13:16.883] if (!future$lazy) [13:13:16.883] future <- run(future) [13:13:16.883] invisible(future) [13:13:16.883] }), .cleanup = FALSE, .init = FALSE) [13:13:16.883] } [13:13:16.883] } [13:13:16.883] } [13:13:16.883] }) [13:13:16.883] if (TRUE) { [13:13:16.883] base::sink(type = "output", split = FALSE) [13:13:16.883] if (TRUE) { [13:13:16.883] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:16.883] } [13:13:16.883] else { [13:13:16.883] ...future.result["stdout"] <- base::list(NULL) [13:13:16.883] } [13:13:16.883] base::close(...future.stdout) [13:13:16.883] ...future.stdout <- NULL [13:13:16.883] } [13:13:16.883] ...future.result$conditions <- ...future.conditions [13:13:16.883] ...future.result$finished <- base::Sys.time() [13:13:16.883] ...future.result [13:13:16.883] } [13:13:16.888] Exporting 5 global objects (5.26 KiB) to cluster node #1 ... [13:13:16.888] Exporting '...future.FUN' (5.20 KiB) to cluster node #1 ... [13:13:16.889] Exporting '...future.FUN' (5.20 KiB) to cluster node #1 ... DONE [13:13:16.889] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... [13:13:16.889] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... DONE [13:13:16.890] Exporting '...future.elements_ii' (1.60 KiB) to cluster node #1 ... [13:13:16.890] Exporting '...future.elements_ii' (1.60 KiB) to cluster node #1 ... DONE [13:13:16.890] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:13:16.891] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:13:16.891] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:13:16.891] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:13:16.892] Exporting 5 global objects (5.26 KiB) to cluster node #1 ... DONE [13:13:16.892] MultisessionFuture started [13:13:16.892] - Launch lazy future ... done [13:13:16.893] run() for 'MultisessionFuture' ... done [13:13:16.893] Created future: [13:13:16.913] receiveMessageFromWorker() for ClusterFuture ... [13:13:16.913] - Validating connection of MultisessionFuture [13:13:16.913] - received message: FutureResult [13:13:16.913] - Received FutureResult [13:13:16.914] - Erased future from FutureRegistry [13:13:16.914] result() for ClusterFuture ... [13:13:16.914] - result already collected: FutureResult [13:13:16.914] result() for ClusterFuture ... done [13:13:16.914] receiveMessageFromWorker() for ClusterFuture ... done [13:13:16.893] MultisessionFuture: [13:13:16.893] Label: 'future_by-1' [13:13:16.893] Expression: [13:13:16.893] { [13:13:16.893] do.call(function(...) { [13:13:16.893] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:16.893] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:16.893] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:16.893] on.exit(options(oopts), add = TRUE) [13:13:16.893] } [13:13:16.893] { [13:13:16.893] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:16.893] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:16.893] ...future.FUN(...future.X_jj, ...) [13:13:16.893] }) [13:13:16.893] } [13:13:16.893] }, args = future.call.arguments) [13:13:16.893] } [13:13:16.893] Lazy evaluation: FALSE [13:13:16.893] Asynchronous evaluation: TRUE [13:13:16.893] Local evaluation: TRUE [13:13:16.893] Environment: R_GlobalEnv [13:13:16.893] Capture standard output: TRUE [13:13:16.893] Capture condition classes: 'condition' (excluding 'nothing') [13:13:16.893] Globals: 5 objects totaling 6.86 KiB (function '...future.FUN' of 5.20 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 1.60 KiB, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:13:16.893] Packages: 1 packages ('stats') [13:13:16.893] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:16.893] Resolved: TRUE [13:13:16.893] Value: [13:13:16.893] Conditions captured: [13:13:16.893] Early signaling: FALSE [13:13:16.893] Owner process: f0659542-730c-c20a-65b3-84f202449c4d [13:13:16.893] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:16.915] Chunk #1 of 2 ... DONE [13:13:16.915] Chunk #2 of 2 ... [13:13:16.915] - Finding globals in 'X' for chunk #2 ... [13:13:16.915] getGlobalsAndPackages() ... [13:13:16.915] Searching for globals... [13:13:16.916] [13:13:16.916] Searching for globals ... DONE [13:13:16.916] - globals: [0] [13:13:16.916] getGlobalsAndPackages() ... DONE [13:13:16.916] + additional globals found: [n=0] [13:13:16.917] + additional namespaces needed: [n=0] [13:13:16.917] - Finding globals in 'X' for chunk #2 ... DONE [13:13:16.917] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:13:16.917] - seeds: [13:13:16.917] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:16.917] getGlobalsAndPackages() ... [13:13:16.918] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:16.918] Resolving globals: FALSE [13:13:16.918] Tweak future expression to call with '...' arguments ... [13:13:16.918] { [13:13:16.918] do.call(function(...) { [13:13:16.918] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:16.918] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:16.918] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:16.918] on.exit(options(oopts), add = TRUE) [13:13:16.918] } [13:13:16.918] { [13:13:16.918] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:16.918] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:16.918] ...future.FUN(...future.X_jj, ...) [13:13:16.918] }) [13:13:16.918] } [13:13:16.918] }, args = future.call.arguments) [13:13:16.918] } [13:13:16.919] Tweak future expression to call with '...' arguments ... DONE [13:13:16.919] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:16.919] [13:13:16.919] getGlobalsAndPackages() ... DONE [13:13:16.920] run() for 'Future' ... [13:13:16.920] - state: 'created' [13:13:16.920] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:16.934] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:16.934] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:13:16.934] - Field: 'node' [13:13:16.935] - Field: 'label' [13:13:16.935] - Field: 'local' [13:13:16.935] - Field: 'owner' [13:13:16.935] - Field: 'envir' [13:13:16.935] - Field: 'workers' [13:13:16.935] - Field: 'packages' [13:13:16.936] - Field: 'gc' [13:13:16.936] - Field: 'conditions' [13:13:16.936] - Field: 'persistent' [13:13:16.936] - Field: 'expr' [13:13:16.936] - Field: 'uuid' [13:13:16.936] - Field: 'seed' [13:13:16.937] - Field: 'version' [13:13:16.937] - Field: 'result' [13:13:16.937] - Field: 'asynchronous' [13:13:16.937] - Field: 'calls' [13:13:16.937] - Field: 'globals' [13:13:16.938] - Field: 'stdout' [13:13:16.938] - Field: 'earlySignal' [13:13:16.938] - Field: 'lazy' [13:13:16.938] - Field: 'state' [13:13:16.938] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:13:16.938] - Launch lazy future ... [13:13:16.939] Packages needed by the future expression (n = 1): 'stats' [13:13:16.939] Packages needed by future strategies (n = 0): [13:13:16.940] { [13:13:16.940] { [13:13:16.940] { [13:13:16.940] ...future.startTime <- base::Sys.time() [13:13:16.940] { [13:13:16.940] { [13:13:16.940] { [13:13:16.940] { [13:13:16.940] { [13:13:16.940] base::local({ [13:13:16.940] has_future <- base::requireNamespace("future", [13:13:16.940] quietly = TRUE) [13:13:16.940] if (has_future) { [13:13:16.940] ns <- base::getNamespace("future") [13:13:16.940] version <- ns[[".package"]][["version"]] [13:13:16.940] if (is.null(version)) [13:13:16.940] version <- utils::packageVersion("future") [13:13:16.940] } [13:13:16.940] else { [13:13:16.940] version <- NULL [13:13:16.940] } [13:13:16.940] if (!has_future || version < "1.8.0") { [13:13:16.940] info <- base::c(r_version = base::gsub("R version ", [13:13:16.940] "", base::R.version$version.string), [13:13:16.940] platform = base::sprintf("%s (%s-bit)", [13:13:16.940] base::R.version$platform, 8 * [13:13:16.940] base::.Machine$sizeof.pointer), [13:13:16.940] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:16.940] "release", "version")], collapse = " "), [13:13:16.940] hostname = base::Sys.info()[["nodename"]]) [13:13:16.940] info <- base::sprintf("%s: %s", base::names(info), [13:13:16.940] info) [13:13:16.940] info <- base::paste(info, collapse = "; ") [13:13:16.940] if (!has_future) { [13:13:16.940] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:16.940] info) [13:13:16.940] } [13:13:16.940] else { [13:13:16.940] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:16.940] info, version) [13:13:16.940] } [13:13:16.940] base::stop(msg) [13:13:16.940] } [13:13:16.940] }) [13:13:16.940] } [13:13:16.940] ...future.mc.cores.old <- base::getOption("mc.cores") [13:13:16.940] base::options(mc.cores = 1L) [13:13:16.940] } [13:13:16.940] base::local({ [13:13:16.940] for (pkg in "stats") { [13:13:16.940] base::loadNamespace(pkg) [13:13:16.940] base::library(pkg, character.only = TRUE) [13:13:16.940] } [13:13:16.940] }) [13:13:16.940] } [13:13:16.940] options(future.plan = NULL) [13:13:16.940] Sys.unsetenv("R_FUTURE_PLAN") [13:13:16.940] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:16.940] } [13:13:16.940] ...future.workdir <- getwd() [13:13:16.940] } [13:13:16.940] ...future.oldOptions <- base::as.list(base::.Options) [13:13:16.940] ...future.oldEnvVars <- base::Sys.getenv() [13:13:16.940] } [13:13:16.940] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:16.940] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:13:16.940] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:16.940] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:16.940] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:16.940] future.stdout.windows.reencode = NULL, width = 80L) [13:13:16.940] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:16.940] base::names(...future.oldOptions)) [13:13:16.940] } [13:13:16.940] if (FALSE) { [13:13:16.940] } [13:13:16.940] else { [13:13:16.940] if (TRUE) { [13:13:16.940] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:16.940] open = "w") [13:13:16.940] } [13:13:16.940] else { [13:13:16.940] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:16.940] windows = "NUL", "/dev/null"), open = "w") [13:13:16.940] } [13:13:16.940] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:16.940] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:16.940] base::sink(type = "output", split = FALSE) [13:13:16.940] base::close(...future.stdout) [13:13:16.940] }, add = TRUE) [13:13:16.940] } [13:13:16.940] ...future.frame <- base::sys.nframe() [13:13:16.940] ...future.conditions <- base::list() [13:13:16.940] ...future.rng <- base::globalenv()$.Random.seed [13:13:16.940] if (FALSE) { [13:13:16.940] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:16.940] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:16.940] } [13:13:16.940] ...future.result <- base::tryCatch({ [13:13:16.940] base::withCallingHandlers({ [13:13:16.940] ...future.value <- base::withVisible(base::local({ [13:13:16.940] ...future.makeSendCondition <- local({ [13:13:16.940] sendCondition <- NULL [13:13:16.940] function(frame = 1L) { [13:13:16.940] if (is.function(sendCondition)) [13:13:16.940] return(sendCondition) [13:13:16.940] ns <- getNamespace("parallel") [13:13:16.940] if (exists("sendData", mode = "function", [13:13:16.940] envir = ns)) { [13:13:16.940] parallel_sendData <- get("sendData", mode = "function", [13:13:16.940] envir = ns) [13:13:16.940] envir <- sys.frame(frame) [13:13:16.940] master <- NULL [13:13:16.940] while (!identical(envir, .GlobalEnv) && [13:13:16.940] !identical(envir, emptyenv())) { [13:13:16.940] if (exists("master", mode = "list", envir = envir, [13:13:16.940] inherits = FALSE)) { [13:13:16.940] master <- get("master", mode = "list", [13:13:16.940] envir = envir, inherits = FALSE) [13:13:16.940] if (inherits(master, c("SOCKnode", [13:13:16.940] "SOCK0node"))) { [13:13:16.940] sendCondition <<- function(cond) { [13:13:16.940] data <- list(type = "VALUE", value = cond, [13:13:16.940] success = TRUE) [13:13:16.940] parallel_sendData(master, data) [13:13:16.940] } [13:13:16.940] return(sendCondition) [13:13:16.940] } [13:13:16.940] } [13:13:16.940] frame <- frame + 1L [13:13:16.940] envir <- sys.frame(frame) [13:13:16.940] } [13:13:16.940] } [13:13:16.940] sendCondition <<- function(cond) NULL [13:13:16.940] } [13:13:16.940] }) [13:13:16.940] withCallingHandlers({ [13:13:16.940] { [13:13:16.940] do.call(function(...) { [13:13:16.940] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:16.940] if (!identical(...future.globals.maxSize.org, [13:13:16.940] ...future.globals.maxSize)) { [13:13:16.940] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:16.940] on.exit(options(oopts), add = TRUE) [13:13:16.940] } [13:13:16.940] { [13:13:16.940] lapply(seq_along(...future.elements_ii), [13:13:16.940] FUN = function(jj) { [13:13:16.940] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:16.940] ...future.FUN(...future.X_jj, ...) [13:13:16.940] }) [13:13:16.940] } [13:13:16.940] }, args = future.call.arguments) [13:13:16.940] } [13:13:16.940] }, immediateCondition = function(cond) { [13:13:16.940] sendCondition <- ...future.makeSendCondition() [13:13:16.940] sendCondition(cond) [13:13:16.940] muffleCondition <- function (cond, pattern = "^muffle") [13:13:16.940] { [13:13:16.940] inherits <- base::inherits [13:13:16.940] invokeRestart <- base::invokeRestart [13:13:16.940] is.null <- base::is.null [13:13:16.940] muffled <- FALSE [13:13:16.940] if (inherits(cond, "message")) { [13:13:16.940] muffled <- grepl(pattern, "muffleMessage") [13:13:16.940] if (muffled) [13:13:16.940] invokeRestart("muffleMessage") [13:13:16.940] } [13:13:16.940] else if (inherits(cond, "warning")) { [13:13:16.940] muffled <- grepl(pattern, "muffleWarning") [13:13:16.940] if (muffled) [13:13:16.940] invokeRestart("muffleWarning") [13:13:16.940] } [13:13:16.940] else if (inherits(cond, "condition")) { [13:13:16.940] if (!is.null(pattern)) { [13:13:16.940] computeRestarts <- base::computeRestarts [13:13:16.940] grepl <- base::grepl [13:13:16.940] restarts <- computeRestarts(cond) [13:13:16.940] for (restart in restarts) { [13:13:16.940] name <- restart$name [13:13:16.940] if (is.null(name)) [13:13:16.940] next [13:13:16.940] if (!grepl(pattern, name)) [13:13:16.940] next [13:13:16.940] invokeRestart(restart) [13:13:16.940] muffled <- TRUE [13:13:16.940] break [13:13:16.940] } [13:13:16.940] } [13:13:16.940] } [13:13:16.940] invisible(muffled) [13:13:16.940] } [13:13:16.940] muffleCondition(cond) [13:13:16.940] }) [13:13:16.940] })) [13:13:16.940] future::FutureResult(value = ...future.value$value, [13:13:16.940] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:16.940] ...future.rng), globalenv = if (FALSE) [13:13:16.940] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:16.940] ...future.globalenv.names)) [13:13:16.940] else NULL, started = ...future.startTime, version = "1.8") [13:13:16.940] }, condition = base::local({ [13:13:16.940] c <- base::c [13:13:16.940] inherits <- base::inherits [13:13:16.940] invokeRestart <- base::invokeRestart [13:13:16.940] length <- base::length [13:13:16.940] list <- base::list [13:13:16.940] seq.int <- base::seq.int [13:13:16.940] signalCondition <- base::signalCondition [13:13:16.940] sys.calls <- base::sys.calls [13:13:16.940] `[[` <- base::`[[` [13:13:16.940] `+` <- base::`+` [13:13:16.940] `<<-` <- base::`<<-` [13:13:16.940] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:16.940] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:16.940] 3L)] [13:13:16.940] } [13:13:16.940] function(cond) { [13:13:16.940] is_error <- inherits(cond, "error") [13:13:16.940] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:16.940] NULL) [13:13:16.940] if (is_error) { [13:13:16.940] sessionInformation <- function() { [13:13:16.940] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:16.940] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:16.940] search = base::search(), system = base::Sys.info()) [13:13:16.940] } [13:13:16.940] ...future.conditions[[length(...future.conditions) + [13:13:16.940] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:16.940] cond$call), session = sessionInformation(), [13:13:16.940] timestamp = base::Sys.time(), signaled = 0L) [13:13:16.940] signalCondition(cond) [13:13:16.940] } [13:13:16.940] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:16.940] "immediateCondition"))) { [13:13:16.940] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:16.940] ...future.conditions[[length(...future.conditions) + [13:13:16.940] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:16.940] if (TRUE && !signal) { [13:13:16.940] muffleCondition <- function (cond, pattern = "^muffle") [13:13:16.940] { [13:13:16.940] inherits <- base::inherits [13:13:16.940] invokeRestart <- base::invokeRestart [13:13:16.940] is.null <- base::is.null [13:13:16.940] muffled <- FALSE [13:13:16.940] if (inherits(cond, "message")) { [13:13:16.940] muffled <- grepl(pattern, "muffleMessage") [13:13:16.940] if (muffled) [13:13:16.940] invokeRestart("muffleMessage") [13:13:16.940] } [13:13:16.940] else if (inherits(cond, "warning")) { [13:13:16.940] muffled <- grepl(pattern, "muffleWarning") [13:13:16.940] if (muffled) [13:13:16.940] invokeRestart("muffleWarning") [13:13:16.940] } [13:13:16.940] else if (inherits(cond, "condition")) { [13:13:16.940] if (!is.null(pattern)) { [13:13:16.940] computeRestarts <- base::computeRestarts [13:13:16.940] grepl <- base::grepl [13:13:16.940] restarts <- computeRestarts(cond) [13:13:16.940] for (restart in restarts) { [13:13:16.940] name <- restart$name [13:13:16.940] if (is.null(name)) [13:13:16.940] next [13:13:16.940] if (!grepl(pattern, name)) [13:13:16.940] next [13:13:16.940] invokeRestart(restart) [13:13:16.940] muffled <- TRUE [13:13:16.940] break [13:13:16.940] } [13:13:16.940] } [13:13:16.940] } [13:13:16.940] invisible(muffled) [13:13:16.940] } [13:13:16.940] muffleCondition(cond, pattern = "^muffle") [13:13:16.940] } [13:13:16.940] } [13:13:16.940] else { [13:13:16.940] if (TRUE) { [13:13:16.940] muffleCondition <- function (cond, pattern = "^muffle") [13:13:16.940] { [13:13:16.940] inherits <- base::inherits [13:13:16.940] invokeRestart <- base::invokeRestart [13:13:16.940] is.null <- base::is.null [13:13:16.940] muffled <- FALSE [13:13:16.940] if (inherits(cond, "message")) { [13:13:16.940] muffled <- grepl(pattern, "muffleMessage") [13:13:16.940] if (muffled) [13:13:16.940] invokeRestart("muffleMessage") [13:13:16.940] } [13:13:16.940] else if (inherits(cond, "warning")) { [13:13:16.940] muffled <- grepl(pattern, "muffleWarning") [13:13:16.940] if (muffled) [13:13:16.940] invokeRestart("muffleWarning") [13:13:16.940] } [13:13:16.940] else if (inherits(cond, "condition")) { [13:13:16.940] if (!is.null(pattern)) { [13:13:16.940] computeRestarts <- base::computeRestarts [13:13:16.940] grepl <- base::grepl [13:13:16.940] restarts <- computeRestarts(cond) [13:13:16.940] for (restart in restarts) { [13:13:16.940] name <- restart$name [13:13:16.940] if (is.null(name)) [13:13:16.940] next [13:13:16.940] if (!grepl(pattern, name)) [13:13:16.940] next [13:13:16.940] invokeRestart(restart) [13:13:16.940] muffled <- TRUE [13:13:16.940] break [13:13:16.940] } [13:13:16.940] } [13:13:16.940] } [13:13:16.940] invisible(muffled) [13:13:16.940] } [13:13:16.940] muffleCondition(cond, pattern = "^muffle") [13:13:16.940] } [13:13:16.940] } [13:13:16.940] } [13:13:16.940] })) [13:13:16.940] }, error = function(ex) { [13:13:16.940] base::structure(base::list(value = NULL, visible = NULL, [13:13:16.940] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:16.940] ...future.rng), started = ...future.startTime, [13:13:16.940] finished = Sys.time(), session_uuid = NA_character_, [13:13:16.940] version = "1.8"), class = "FutureResult") [13:13:16.940] }, finally = { [13:13:16.940] if (!identical(...future.workdir, getwd())) [13:13:16.940] setwd(...future.workdir) [13:13:16.940] { [13:13:16.940] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:16.940] ...future.oldOptions$nwarnings <- NULL [13:13:16.940] } [13:13:16.940] base::options(...future.oldOptions) [13:13:16.940] if (.Platform$OS.type == "windows") { [13:13:16.940] old_names <- names(...future.oldEnvVars) [13:13:16.940] envs <- base::Sys.getenv() [13:13:16.940] names <- names(envs) [13:13:16.940] common <- intersect(names, old_names) [13:13:16.940] added <- setdiff(names, old_names) [13:13:16.940] removed <- setdiff(old_names, names) [13:13:16.940] changed <- common[...future.oldEnvVars[common] != [13:13:16.940] envs[common]] [13:13:16.940] NAMES <- toupper(changed) [13:13:16.940] args <- list() [13:13:16.940] for (kk in seq_along(NAMES)) { [13:13:16.940] name <- changed[[kk]] [13:13:16.940] NAME <- NAMES[[kk]] [13:13:16.940] if (name != NAME && is.element(NAME, old_names)) [13:13:16.940] next [13:13:16.940] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:16.940] } [13:13:16.940] NAMES <- toupper(added) [13:13:16.940] for (kk in seq_along(NAMES)) { [13:13:16.940] name <- added[[kk]] [13:13:16.940] NAME <- NAMES[[kk]] [13:13:16.940] if (name != NAME && is.element(NAME, old_names)) [13:13:16.940] next [13:13:16.940] args[[name]] <- "" [13:13:16.940] } [13:13:16.940] NAMES <- toupper(removed) [13:13:16.940] for (kk in seq_along(NAMES)) { [13:13:16.940] name <- removed[[kk]] [13:13:16.940] NAME <- NAMES[[kk]] [13:13:16.940] if (name != NAME && is.element(NAME, old_names)) [13:13:16.940] next [13:13:16.940] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:16.940] } [13:13:16.940] if (length(args) > 0) [13:13:16.940] base::do.call(base::Sys.setenv, args = args) [13:13:16.940] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:16.940] } [13:13:16.940] else { [13:13:16.940] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:16.940] } [13:13:16.940] { [13:13:16.940] if (base::length(...future.futureOptionsAdded) > [13:13:16.940] 0L) { [13:13:16.940] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:16.940] base::names(opts) <- ...future.futureOptionsAdded [13:13:16.940] base::options(opts) [13:13:16.940] } [13:13:16.940] { [13:13:16.940] { [13:13:16.940] base::options(mc.cores = ...future.mc.cores.old) [13:13:16.940] NULL [13:13:16.940] } [13:13:16.940] options(future.plan = NULL) [13:13:16.940] if (is.na(NA_character_)) [13:13:16.940] Sys.unsetenv("R_FUTURE_PLAN") [13:13:16.940] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:16.940] future::plan(list(function (..., workers = availableCores(), [13:13:16.940] lazy = FALSE, rscript_libs = .libPaths(), [13:13:16.940] envir = parent.frame()) [13:13:16.940] { [13:13:16.940] if (is.function(workers)) [13:13:16.940] workers <- workers() [13:13:16.940] workers <- structure(as.integer(workers), [13:13:16.940] class = class(workers)) [13:13:16.940] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:16.940] workers >= 1) [13:13:16.940] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:16.940] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:16.940] } [13:13:16.940] future <- MultisessionFuture(..., workers = workers, [13:13:16.940] lazy = lazy, rscript_libs = rscript_libs, [13:13:16.940] envir = envir) [13:13:16.940] if (!future$lazy) [13:13:16.940] future <- run(future) [13:13:16.940] invisible(future) [13:13:16.940] }), .cleanup = FALSE, .init = FALSE) [13:13:16.940] } [13:13:16.940] } [13:13:16.940] } [13:13:16.940] }) [13:13:16.940] if (TRUE) { [13:13:16.940] base::sink(type = "output", split = FALSE) [13:13:16.940] if (TRUE) { [13:13:16.940] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:16.940] } [13:13:16.940] else { [13:13:16.940] ...future.result["stdout"] <- base::list(NULL) [13:13:16.940] } [13:13:16.940] base::close(...future.stdout) [13:13:16.940] ...future.stdout <- NULL [13:13:16.940] } [13:13:16.940] ...future.result$conditions <- ...future.conditions [13:13:16.940] ...future.result$finished <- base::Sys.time() [13:13:16.940] ...future.result [13:13:16.940] } [13:13:16.945] Exporting 5 global objects (5.26 KiB) to cluster node #1 ... [13:13:16.945] Exporting '...future.FUN' (5.20 KiB) to cluster node #1 ... [13:13:16.946] Exporting '...future.FUN' (5.20 KiB) to cluster node #1 ... DONE [13:13:16.946] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... [13:13:16.946] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... DONE [13:13:16.947] Exporting '...future.elements_ii' (3.20 KiB) to cluster node #1 ... [13:13:16.947] Exporting '...future.elements_ii' (3.20 KiB) to cluster node #1 ... DONE [13:13:16.947] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:13:16.948] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:13:16.948] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:13:16.948] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:13:16.949] Exporting 5 global objects (5.26 KiB) to cluster node #1 ... DONE [13:13:16.949] MultisessionFuture started [13:13:16.949] - Launch lazy future ... done [13:13:16.950] run() for 'MultisessionFuture' ... done [13:13:16.950] Created future: [13:13:16.967] receiveMessageFromWorker() for ClusterFuture ... [13:13:16.968] - Validating connection of MultisessionFuture [13:13:16.968] - received message: FutureResult [13:13:16.968] - Received FutureResult [13:13:16.968] - Erased future from FutureRegistry [13:13:16.968] result() for ClusterFuture ... [13:13:16.969] - result already collected: FutureResult [13:13:16.969] result() for ClusterFuture ... done [13:13:16.969] receiveMessageFromWorker() for ClusterFuture ... done [13:13:16.950] MultisessionFuture: [13:13:16.950] Label: 'future_by-2' [13:13:16.950] Expression: [13:13:16.950] { [13:13:16.950] do.call(function(...) { [13:13:16.950] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:16.950] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:16.950] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:16.950] on.exit(options(oopts), add = TRUE) [13:13:16.950] } [13:13:16.950] { [13:13:16.950] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:16.950] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:16.950] ...future.FUN(...future.X_jj, ...) [13:13:16.950] }) [13:13:16.950] } [13:13:16.950] }, args = future.call.arguments) [13:13:16.950] } [13:13:16.950] Lazy evaluation: FALSE [13:13:16.950] Asynchronous evaluation: TRUE [13:13:16.950] Local evaluation: TRUE [13:13:16.950] Environment: R_GlobalEnv [13:13:16.950] Capture standard output: TRUE [13:13:16.950] Capture condition classes: 'condition' (excluding 'nothing') [13:13:16.950] Globals: 5 objects totaling 8.46 KiB (function '...future.FUN' of 5.20 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 3.20 KiB, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:13:16.950] Packages: 1 packages ('stats') [13:13:16.950] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:16.950] Resolved: TRUE [13:13:16.950] Value: [13:13:16.950] Conditions captured: [13:13:16.950] Early signaling: FALSE [13:13:16.950] Owner process: f0659542-730c-c20a-65b3-84f202449c4d [13:13:16.950] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:16.969] Chunk #2 of 2 ... DONE [13:13:16.970] Launching 2 futures (chunks) ... DONE [13:13:16.970] Resolving 2 futures (chunks) ... [13:13:16.970] resolve() on list ... [13:13:16.970] recursive: 0 [13:13:16.970] length: 2 [13:13:16.970] [13:13:16.970] Future #1 [13:13:16.971] result() for ClusterFuture ... [13:13:16.971] - result already collected: FutureResult [13:13:16.971] result() for ClusterFuture ... done [13:13:16.971] result() for ClusterFuture ... [13:13:16.971] - result already collected: FutureResult [13:13:16.971] result() for ClusterFuture ... done [13:13:16.972] signalConditionsASAP(MultisessionFuture, pos=1) ... [13:13:16.972] - nx: 2 [13:13:16.972] - relay: TRUE [13:13:16.972] - stdout: TRUE [13:13:16.972] - signal: TRUE [13:13:16.972] - resignal: FALSE [13:13:16.972] - force: TRUE [13:13:16.973] - relayed: [n=2] FALSE, FALSE [13:13:16.973] - queued futures: [n=2] FALSE, FALSE [13:13:16.973] - until=1 [13:13:16.973] - relaying element #1 [13:13:16.973] result() for ClusterFuture ... [13:13:16.973] - result already collected: FutureResult [13:13:16.974] result() for ClusterFuture ... done [13:13:16.974] result() for ClusterFuture ... [13:13:16.974] - result already collected: FutureResult [13:13:16.974] result() for ClusterFuture ... done [13:13:16.974] result() for ClusterFuture ... [13:13:16.974] - result already collected: FutureResult [13:13:16.975] result() for ClusterFuture ... done [13:13:16.975] result() for ClusterFuture ... [13:13:16.975] - result already collected: FutureResult [13:13:16.975] result() for ClusterFuture ... done [13:13:16.975] - relayed: [n=2] TRUE, FALSE [13:13:16.975] - queued futures: [n=2] TRUE, FALSE [13:13:16.975] signalConditionsASAP(MultisessionFuture, pos=1) ... done [13:13:16.976] length: 1 (resolved future 1) [13:13:16.976] Future #2 [13:13:16.976] result() for ClusterFuture ... [13:13:16.976] - result already collected: FutureResult [13:13:16.976] result() for ClusterFuture ... done [13:13:16.976] result() for ClusterFuture ... [13:13:16.977] - result already collected: FutureResult [13:13:16.977] result() for ClusterFuture ... done [13:13:16.977] signalConditionsASAP(MultisessionFuture, pos=2) ... [13:13:16.977] - nx: 2 [13:13:16.977] - relay: TRUE [13:13:16.977] - stdout: TRUE [13:13:16.978] - signal: TRUE [13:13:16.978] - resignal: FALSE [13:13:16.978] - force: TRUE [13:13:16.978] - relayed: [n=2] TRUE, FALSE [13:13:16.978] - queued futures: [n=2] TRUE, FALSE [13:13:16.978] - until=2 [13:13:16.978] - relaying element #2 [13:13:16.979] result() for ClusterFuture ... [13:13:16.979] - result already collected: FutureResult [13:13:16.979] result() for ClusterFuture ... done [13:13:16.979] result() for ClusterFuture ... [13:13:16.979] - result already collected: FutureResult [13:13:16.979] result() for ClusterFuture ... done [13:13:16.980] result() for ClusterFuture ... [13:13:16.980] - result already collected: FutureResult [13:13:16.980] result() for ClusterFuture ... done [13:13:16.980] result() for ClusterFuture ... [13:13:16.980] - result already collected: FutureResult [13:13:16.980] result() for ClusterFuture ... done [13:13:16.981] - relayed: [n=2] TRUE, TRUE [13:13:16.981] - queued futures: [n=2] TRUE, TRUE [13:13:16.981] signalConditionsASAP(MultisessionFuture, pos=2) ... done [13:13:16.981] length: 0 (resolved future 2) [13:13:16.981] Relaying remaining futures [13:13:16.981] signalConditionsASAP(NULL, pos=0) ... [13:13:16.981] - nx: 2 [13:13:16.982] - relay: TRUE [13:13:16.982] - stdout: TRUE [13:13:16.982] - signal: TRUE [13:13:16.982] - resignal: FALSE [13:13:16.982] - force: TRUE [13:13:16.982] - relayed: [n=2] TRUE, TRUE [13:13:16.983] - queued futures: [n=2] TRUE, TRUE - flush all [13:13:16.983] - relayed: [n=2] TRUE, TRUE [13:13:16.983] - queued futures: [n=2] TRUE, TRUE [13:13:16.983] signalConditionsASAP(NULL, pos=0) ... done [13:13:16.983] resolve() on list ... DONE [13:13:16.983] result() for ClusterFuture ... [13:13:16.984] - result already collected: FutureResult [13:13:16.984] result() for ClusterFuture ... done [13:13:16.984] result() for ClusterFuture ... [13:13:16.984] - result already collected: FutureResult [13:13:16.984] result() for ClusterFuture ... done [13:13:16.984] result() for ClusterFuture ... [13:13:16.985] - result already collected: FutureResult [13:13:16.985] result() for ClusterFuture ... done [13:13:16.985] result() for ClusterFuture ... [13:13:16.985] - result already collected: FutureResult [13:13:16.985] result() for ClusterFuture ... done [13:13:16.985] - Number of value chunks collected: 2 [13:13:16.986] Resolving 2 futures (chunks) ... DONE [13:13:16.986] Reducing values from 2 chunks ... [13:13:16.986] - Number of values collected after concatenation: 3 [13:13:16.986] - Number of values expected: 3 [13:13:16.986] Reducing values from 2 chunks ... DONE [13:13:16.986] future_lapply() ... DONE [13:13:16.987] future_by_internal() ... DONE [13:13:16.991] future_by_internal() ... [13:13:16.992] future_lapply() ... [13:13:16.995] Number of chunks: 2 [13:13:16.995] getGlobalsAndPackagesXApply() ... [13:13:16.996] - future.globals: TRUE [13:13:16.996] getGlobalsAndPackages() ... [13:13:16.996] Searching for globals... [13:13:16.998] - globals found: [6] 'FUN', '{', 'lm', '~', 'breaks', 'wool' [13:13:16.998] Searching for globals ... DONE [13:13:16.998] Resolving globals: FALSE [13:13:16.999] The total size of the 3 globals is 2.27 KiB (2320 bytes) [13:13:17.000] The total size of the 3 globals exported for future expression ('FUN()') is 2.27 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There are three globals: 'FUN' (1.04 KiB of class 'function'), 'wool' (776 bytes of class 'numeric') and 'breaks' (480 bytes of class 'numeric') [13:13:17.000] - globals: [3] 'FUN', 'breaks', 'wool' [13:13:17.000] - packages: [1] 'stats' [13:13:17.000] getGlobalsAndPackages() ... DONE [13:13:17.000] - globals found/used: [n=3] 'FUN', 'breaks', 'wool' [13:13:17.000] - needed namespaces: [n=1] 'stats' [13:13:17.001] Finding globals ... DONE [13:13:17.001] - use_args: TRUE [13:13:17.001] - Getting '...' globals ... [13:13:17.001] resolve() on list ... [13:13:17.002] recursive: 0 [13:13:17.002] length: 1 [13:13:17.002] elements: '...' [13:13:17.002] length: 0 (resolved future 1) [13:13:17.002] resolve() on list ... DONE [13:13:17.002] - '...' content: [n=0] [13:13:17.003] List of 1 [13:13:17.003] $ ...: list() [13:13:17.003] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:17.003] - attr(*, "where")=List of 1 [13:13:17.003] ..$ ...: [13:13:17.003] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:17.003] - attr(*, "resolved")= logi TRUE [13:13:17.003] - attr(*, "total_size")= num NA [13:13:17.006] - Getting '...' globals ... DONE [13:13:17.006] Globals to be used in all futures (chunks): [n=4] '...future.FUN', 'breaks', 'wool', '...' [13:13:17.006] List of 4 [13:13:17.006] $ ...future.FUN:function (x) [13:13:17.006] $ breaks : num [1:54] 26 30 54 25 70 52 51 26 67 18 ... [13:13:17.006] $ wool : Factor w/ 2 levels "A","B": 1 1 1 1 1 1 1 1 1 1 ... [13:13:17.006] $ ... : list() [13:13:17.006] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:17.006] - attr(*, "where")=List of 4 [13:13:17.006] ..$ ...future.FUN: [13:13:17.006] ..$ breaks : [13:13:17.006] ..$ wool : [13:13:17.006] ..$ ... : [13:13:17.006] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:17.006] - attr(*, "resolved")= logi FALSE [13:13:17.006] - attr(*, "total_size")= num 2320 [13:13:17.011] Packages to be attached in all futures: [n=1] 'stats' [13:13:17.011] getGlobalsAndPackagesXApply() ... DONE [13:13:17.011] Number of futures (= number of chunks): 2 [13:13:17.011] Launching 2 futures (chunks) ... [13:13:17.012] Chunk #1 of 2 ... [13:13:17.012] - Finding globals in 'X' for chunk #1 ... [13:13:17.012] getGlobalsAndPackages() ... [13:13:17.012] Searching for globals... [13:13:17.013] [13:13:17.013] Searching for globals ... DONE [13:13:17.013] - globals: [0] [13:13:17.013] getGlobalsAndPackages() ... DONE [13:13:17.013] + additional globals found: [n=0] [13:13:17.013] + additional namespaces needed: [n=0] [13:13:17.014] - Finding globals in 'X' for chunk #1 ... DONE [13:13:17.014] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:13:17.014] - seeds: [13:13:17.014] - All globals exported: [n=7] '...future.FUN', 'breaks', 'wool', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:17.014] getGlobalsAndPackages() ... [13:13:17.014] - globals passed as-is: [7] '...future.FUN', 'breaks', 'wool', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:17.015] Resolving globals: FALSE [13:13:17.015] Tweak future expression to call with '...' arguments ... [13:13:17.015] { [13:13:17.015] do.call(function(...) { [13:13:17.015] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:17.015] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:17.015] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:17.015] on.exit(options(oopts), add = TRUE) [13:13:17.015] } [13:13:17.015] { [13:13:17.015] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:17.015] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:17.015] ...future.FUN(...future.X_jj, ...) [13:13:17.015] }) [13:13:17.015] } [13:13:17.015] }, args = future.call.arguments) [13:13:17.015] } [13:13:17.015] Tweak future expression to call with '...' arguments ... DONE [13:13:17.016] - globals: [7] '...future.FUN', 'breaks', 'wool', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:17.016] [13:13:17.016] getGlobalsAndPackages() ... DONE [13:13:17.017] run() for 'Future' ... [13:13:17.017] - state: 'created' [13:13:17.017] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:17.034] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:17.034] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:13:17.034] - Field: 'node' [13:13:17.034] - Field: 'label' [13:13:17.035] - Field: 'local' [13:13:17.035] - Field: 'owner' [13:13:17.035] - Field: 'envir' [13:13:17.035] - Field: 'workers' [13:13:17.035] - Field: 'packages' [13:13:17.036] - Field: 'gc' [13:13:17.036] - Field: 'conditions' [13:13:17.036] - Field: 'persistent' [13:13:17.036] - Field: 'expr' [13:13:17.036] - Field: 'uuid' [13:13:17.036] - Field: 'seed' [13:13:17.037] - Field: 'version' [13:13:17.037] - Field: 'result' [13:13:17.037] - Field: 'asynchronous' [13:13:17.037] - Field: 'calls' [13:13:17.037] - Field: 'globals' [13:13:17.037] - Field: 'stdout' [13:13:17.038] - Field: 'earlySignal' [13:13:17.038] - Field: 'lazy' [13:13:17.038] - Field: 'state' [13:13:17.038] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:13:17.038] - Launch lazy future ... [13:13:17.039] Packages needed by the future expression (n = 1): 'stats' [13:13:17.039] Packages needed by future strategies (n = 0): [13:13:17.040] { [13:13:17.040] { [13:13:17.040] { [13:13:17.040] ...future.startTime <- base::Sys.time() [13:13:17.040] { [13:13:17.040] { [13:13:17.040] { [13:13:17.040] { [13:13:17.040] { [13:13:17.040] base::local({ [13:13:17.040] has_future <- base::requireNamespace("future", [13:13:17.040] quietly = TRUE) [13:13:17.040] if (has_future) { [13:13:17.040] ns <- base::getNamespace("future") [13:13:17.040] version <- ns[[".package"]][["version"]] [13:13:17.040] if (is.null(version)) [13:13:17.040] version <- utils::packageVersion("future") [13:13:17.040] } [13:13:17.040] else { [13:13:17.040] version <- NULL [13:13:17.040] } [13:13:17.040] if (!has_future || version < "1.8.0") { [13:13:17.040] info <- base::c(r_version = base::gsub("R version ", [13:13:17.040] "", base::R.version$version.string), [13:13:17.040] platform = base::sprintf("%s (%s-bit)", [13:13:17.040] base::R.version$platform, 8 * [13:13:17.040] base::.Machine$sizeof.pointer), [13:13:17.040] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:17.040] "release", "version")], collapse = " "), [13:13:17.040] hostname = base::Sys.info()[["nodename"]]) [13:13:17.040] info <- base::sprintf("%s: %s", base::names(info), [13:13:17.040] info) [13:13:17.040] info <- base::paste(info, collapse = "; ") [13:13:17.040] if (!has_future) { [13:13:17.040] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:17.040] info) [13:13:17.040] } [13:13:17.040] else { [13:13:17.040] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:17.040] info, version) [13:13:17.040] } [13:13:17.040] base::stop(msg) [13:13:17.040] } [13:13:17.040] }) [13:13:17.040] } [13:13:17.040] ...future.mc.cores.old <- base::getOption("mc.cores") [13:13:17.040] base::options(mc.cores = 1L) [13:13:17.040] } [13:13:17.040] base::local({ [13:13:17.040] for (pkg in "stats") { [13:13:17.040] base::loadNamespace(pkg) [13:13:17.040] base::library(pkg, character.only = TRUE) [13:13:17.040] } [13:13:17.040] }) [13:13:17.040] } [13:13:17.040] options(future.plan = NULL) [13:13:17.040] Sys.unsetenv("R_FUTURE_PLAN") [13:13:17.040] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:17.040] } [13:13:17.040] ...future.workdir <- getwd() [13:13:17.040] } [13:13:17.040] ...future.oldOptions <- base::as.list(base::.Options) [13:13:17.040] ...future.oldEnvVars <- base::Sys.getenv() [13:13:17.040] } [13:13:17.040] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:17.040] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:13:17.040] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:17.040] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:17.040] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:17.040] future.stdout.windows.reencode = NULL, width = 80L) [13:13:17.040] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:17.040] base::names(...future.oldOptions)) [13:13:17.040] } [13:13:17.040] if (FALSE) { [13:13:17.040] } [13:13:17.040] else { [13:13:17.040] if (TRUE) { [13:13:17.040] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:17.040] open = "w") [13:13:17.040] } [13:13:17.040] else { [13:13:17.040] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:17.040] windows = "NUL", "/dev/null"), open = "w") [13:13:17.040] } [13:13:17.040] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:17.040] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:17.040] base::sink(type = "output", split = FALSE) [13:13:17.040] base::close(...future.stdout) [13:13:17.040] }, add = TRUE) [13:13:17.040] } [13:13:17.040] ...future.frame <- base::sys.nframe() [13:13:17.040] ...future.conditions <- base::list() [13:13:17.040] ...future.rng <- base::globalenv()$.Random.seed [13:13:17.040] if (FALSE) { [13:13:17.040] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:17.040] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:17.040] } [13:13:17.040] ...future.result <- base::tryCatch({ [13:13:17.040] base::withCallingHandlers({ [13:13:17.040] ...future.value <- base::withVisible(base::local({ [13:13:17.040] ...future.makeSendCondition <- local({ [13:13:17.040] sendCondition <- NULL [13:13:17.040] function(frame = 1L) { [13:13:17.040] if (is.function(sendCondition)) [13:13:17.040] return(sendCondition) [13:13:17.040] ns <- getNamespace("parallel") [13:13:17.040] if (exists("sendData", mode = "function", [13:13:17.040] envir = ns)) { [13:13:17.040] parallel_sendData <- get("sendData", mode = "function", [13:13:17.040] envir = ns) [13:13:17.040] envir <- sys.frame(frame) [13:13:17.040] master <- NULL [13:13:17.040] while (!identical(envir, .GlobalEnv) && [13:13:17.040] !identical(envir, emptyenv())) { [13:13:17.040] if (exists("master", mode = "list", envir = envir, [13:13:17.040] inherits = FALSE)) { [13:13:17.040] master <- get("master", mode = "list", [13:13:17.040] envir = envir, inherits = FALSE) [13:13:17.040] if (inherits(master, c("SOCKnode", [13:13:17.040] "SOCK0node"))) { [13:13:17.040] sendCondition <<- function(cond) { [13:13:17.040] data <- list(type = "VALUE", value = cond, [13:13:17.040] success = TRUE) [13:13:17.040] parallel_sendData(master, data) [13:13:17.040] } [13:13:17.040] return(sendCondition) [13:13:17.040] } [13:13:17.040] } [13:13:17.040] frame <- frame + 1L [13:13:17.040] envir <- sys.frame(frame) [13:13:17.040] } [13:13:17.040] } [13:13:17.040] sendCondition <<- function(cond) NULL [13:13:17.040] } [13:13:17.040] }) [13:13:17.040] withCallingHandlers({ [13:13:17.040] { [13:13:17.040] do.call(function(...) { [13:13:17.040] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:17.040] if (!identical(...future.globals.maxSize.org, [13:13:17.040] ...future.globals.maxSize)) { [13:13:17.040] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:17.040] on.exit(options(oopts), add = TRUE) [13:13:17.040] } [13:13:17.040] { [13:13:17.040] lapply(seq_along(...future.elements_ii), [13:13:17.040] FUN = function(jj) { [13:13:17.040] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:17.040] ...future.FUN(...future.X_jj, ...) [13:13:17.040] }) [13:13:17.040] } [13:13:17.040] }, args = future.call.arguments) [13:13:17.040] } [13:13:17.040] }, immediateCondition = function(cond) { [13:13:17.040] sendCondition <- ...future.makeSendCondition() [13:13:17.040] sendCondition(cond) [13:13:17.040] muffleCondition <- function (cond, pattern = "^muffle") [13:13:17.040] { [13:13:17.040] inherits <- base::inherits [13:13:17.040] invokeRestart <- base::invokeRestart [13:13:17.040] is.null <- base::is.null [13:13:17.040] muffled <- FALSE [13:13:17.040] if (inherits(cond, "message")) { [13:13:17.040] muffled <- grepl(pattern, "muffleMessage") [13:13:17.040] if (muffled) [13:13:17.040] invokeRestart("muffleMessage") [13:13:17.040] } [13:13:17.040] else if (inherits(cond, "warning")) { [13:13:17.040] muffled <- grepl(pattern, "muffleWarning") [13:13:17.040] if (muffled) [13:13:17.040] invokeRestart("muffleWarning") [13:13:17.040] } [13:13:17.040] else if (inherits(cond, "condition")) { [13:13:17.040] if (!is.null(pattern)) { [13:13:17.040] computeRestarts <- base::computeRestarts [13:13:17.040] grepl <- base::grepl [13:13:17.040] restarts <- computeRestarts(cond) [13:13:17.040] for (restart in restarts) { [13:13:17.040] name <- restart$name [13:13:17.040] if (is.null(name)) [13:13:17.040] next [13:13:17.040] if (!grepl(pattern, name)) [13:13:17.040] next [13:13:17.040] invokeRestart(restart) [13:13:17.040] muffled <- TRUE [13:13:17.040] break [13:13:17.040] } [13:13:17.040] } [13:13:17.040] } [13:13:17.040] invisible(muffled) [13:13:17.040] } [13:13:17.040] muffleCondition(cond) [13:13:17.040] }) [13:13:17.040] })) [13:13:17.040] future::FutureResult(value = ...future.value$value, [13:13:17.040] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:17.040] ...future.rng), globalenv = if (FALSE) [13:13:17.040] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:17.040] ...future.globalenv.names)) [13:13:17.040] else NULL, started = ...future.startTime, version = "1.8") [13:13:17.040] }, condition = base::local({ [13:13:17.040] c <- base::c [13:13:17.040] inherits <- base::inherits [13:13:17.040] invokeRestart <- base::invokeRestart [13:13:17.040] length <- base::length [13:13:17.040] list <- base::list [13:13:17.040] seq.int <- base::seq.int [13:13:17.040] signalCondition <- base::signalCondition [13:13:17.040] sys.calls <- base::sys.calls [13:13:17.040] `[[` <- base::`[[` [13:13:17.040] `+` <- base::`+` [13:13:17.040] `<<-` <- base::`<<-` [13:13:17.040] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:17.040] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:17.040] 3L)] [13:13:17.040] } [13:13:17.040] function(cond) { [13:13:17.040] is_error <- inherits(cond, "error") [13:13:17.040] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:17.040] NULL) [13:13:17.040] if (is_error) { [13:13:17.040] sessionInformation <- function() { [13:13:17.040] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:17.040] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:17.040] search = base::search(), system = base::Sys.info()) [13:13:17.040] } [13:13:17.040] ...future.conditions[[length(...future.conditions) + [13:13:17.040] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:17.040] cond$call), session = sessionInformation(), [13:13:17.040] timestamp = base::Sys.time(), signaled = 0L) [13:13:17.040] signalCondition(cond) [13:13:17.040] } [13:13:17.040] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:17.040] "immediateCondition"))) { [13:13:17.040] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:17.040] ...future.conditions[[length(...future.conditions) + [13:13:17.040] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:17.040] if (TRUE && !signal) { [13:13:17.040] muffleCondition <- function (cond, pattern = "^muffle") [13:13:17.040] { [13:13:17.040] inherits <- base::inherits [13:13:17.040] invokeRestart <- base::invokeRestart [13:13:17.040] is.null <- base::is.null [13:13:17.040] muffled <- FALSE [13:13:17.040] if (inherits(cond, "message")) { [13:13:17.040] muffled <- grepl(pattern, "muffleMessage") [13:13:17.040] if (muffled) [13:13:17.040] invokeRestart("muffleMessage") [13:13:17.040] } [13:13:17.040] else if (inherits(cond, "warning")) { [13:13:17.040] muffled <- grepl(pattern, "muffleWarning") [13:13:17.040] if (muffled) [13:13:17.040] invokeRestart("muffleWarning") [13:13:17.040] } [13:13:17.040] else if (inherits(cond, "condition")) { [13:13:17.040] if (!is.null(pattern)) { [13:13:17.040] computeRestarts <- base::computeRestarts [13:13:17.040] grepl <- base::grepl [13:13:17.040] restarts <- computeRestarts(cond) [13:13:17.040] for (restart in restarts) { [13:13:17.040] name <- restart$name [13:13:17.040] if (is.null(name)) [13:13:17.040] next [13:13:17.040] if (!grepl(pattern, name)) [13:13:17.040] next [13:13:17.040] invokeRestart(restart) [13:13:17.040] muffled <- TRUE [13:13:17.040] break [13:13:17.040] } [13:13:17.040] } [13:13:17.040] } [13:13:17.040] invisible(muffled) [13:13:17.040] } [13:13:17.040] muffleCondition(cond, pattern = "^muffle") [13:13:17.040] } [13:13:17.040] } [13:13:17.040] else { [13:13:17.040] if (TRUE) { [13:13:17.040] muffleCondition <- function (cond, pattern = "^muffle") [13:13:17.040] { [13:13:17.040] inherits <- base::inherits [13:13:17.040] invokeRestart <- base::invokeRestart [13:13:17.040] is.null <- base::is.null [13:13:17.040] muffled <- FALSE [13:13:17.040] if (inherits(cond, "message")) { [13:13:17.040] muffled <- grepl(pattern, "muffleMessage") [13:13:17.040] if (muffled) [13:13:17.040] invokeRestart("muffleMessage") [13:13:17.040] } [13:13:17.040] else if (inherits(cond, "warning")) { [13:13:17.040] muffled <- grepl(pattern, "muffleWarning") [13:13:17.040] if (muffled) [13:13:17.040] invokeRestart("muffleWarning") [13:13:17.040] } [13:13:17.040] else if (inherits(cond, "condition")) { [13:13:17.040] if (!is.null(pattern)) { [13:13:17.040] computeRestarts <- base::computeRestarts [13:13:17.040] grepl <- base::grepl [13:13:17.040] restarts <- computeRestarts(cond) [13:13:17.040] for (restart in restarts) { [13:13:17.040] name <- restart$name [13:13:17.040] if (is.null(name)) [13:13:17.040] next [13:13:17.040] if (!grepl(pattern, name)) [13:13:17.040] next [13:13:17.040] invokeRestart(restart) [13:13:17.040] muffled <- TRUE [13:13:17.040] break [13:13:17.040] } [13:13:17.040] } [13:13:17.040] } [13:13:17.040] invisible(muffled) [13:13:17.040] } [13:13:17.040] muffleCondition(cond, pattern = "^muffle") [13:13:17.040] } [13:13:17.040] } [13:13:17.040] } [13:13:17.040] })) [13:13:17.040] }, error = function(ex) { [13:13:17.040] base::structure(base::list(value = NULL, visible = NULL, [13:13:17.040] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:17.040] ...future.rng), started = ...future.startTime, [13:13:17.040] finished = Sys.time(), session_uuid = NA_character_, [13:13:17.040] version = "1.8"), class = "FutureResult") [13:13:17.040] }, finally = { [13:13:17.040] if (!identical(...future.workdir, getwd())) [13:13:17.040] setwd(...future.workdir) [13:13:17.040] { [13:13:17.040] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:17.040] ...future.oldOptions$nwarnings <- NULL [13:13:17.040] } [13:13:17.040] base::options(...future.oldOptions) [13:13:17.040] if (.Platform$OS.type == "windows") { [13:13:17.040] old_names <- names(...future.oldEnvVars) [13:13:17.040] envs <- base::Sys.getenv() [13:13:17.040] names <- names(envs) [13:13:17.040] common <- intersect(names, old_names) [13:13:17.040] added <- setdiff(names, old_names) [13:13:17.040] removed <- setdiff(old_names, names) [13:13:17.040] changed <- common[...future.oldEnvVars[common] != [13:13:17.040] envs[common]] [13:13:17.040] NAMES <- toupper(changed) [13:13:17.040] args <- list() [13:13:17.040] for (kk in seq_along(NAMES)) { [13:13:17.040] name <- changed[[kk]] [13:13:17.040] NAME <- NAMES[[kk]] [13:13:17.040] if (name != NAME && is.element(NAME, old_names)) [13:13:17.040] next [13:13:17.040] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:17.040] } [13:13:17.040] NAMES <- toupper(added) [13:13:17.040] for (kk in seq_along(NAMES)) { [13:13:17.040] name <- added[[kk]] [13:13:17.040] NAME <- NAMES[[kk]] [13:13:17.040] if (name != NAME && is.element(NAME, old_names)) [13:13:17.040] next [13:13:17.040] args[[name]] <- "" [13:13:17.040] } [13:13:17.040] NAMES <- toupper(removed) [13:13:17.040] for (kk in seq_along(NAMES)) { [13:13:17.040] name <- removed[[kk]] [13:13:17.040] NAME <- NAMES[[kk]] [13:13:17.040] if (name != NAME && is.element(NAME, old_names)) [13:13:17.040] next [13:13:17.040] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:17.040] } [13:13:17.040] if (length(args) > 0) [13:13:17.040] base::do.call(base::Sys.setenv, args = args) [13:13:17.040] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:17.040] } [13:13:17.040] else { [13:13:17.040] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:17.040] } [13:13:17.040] { [13:13:17.040] if (base::length(...future.futureOptionsAdded) > [13:13:17.040] 0L) { [13:13:17.040] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:17.040] base::names(opts) <- ...future.futureOptionsAdded [13:13:17.040] base::options(opts) [13:13:17.040] } [13:13:17.040] { [13:13:17.040] { [13:13:17.040] base::options(mc.cores = ...future.mc.cores.old) [13:13:17.040] NULL [13:13:17.040] } [13:13:17.040] options(future.plan = NULL) [13:13:17.040] if (is.na(NA_character_)) [13:13:17.040] Sys.unsetenv("R_FUTURE_PLAN") [13:13:17.040] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:17.040] future::plan(list(function (..., workers = availableCores(), [13:13:17.040] lazy = FALSE, rscript_libs = .libPaths(), [13:13:17.040] envir = parent.frame()) [13:13:17.040] { [13:13:17.040] if (is.function(workers)) [13:13:17.040] workers <- workers() [13:13:17.040] workers <- structure(as.integer(workers), [13:13:17.040] class = class(workers)) [13:13:17.040] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:17.040] workers >= 1) [13:13:17.040] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:17.040] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:17.040] } [13:13:17.040] future <- MultisessionFuture(..., workers = workers, [13:13:17.040] lazy = lazy, rscript_libs = rscript_libs, [13:13:17.040] envir = envir) [13:13:17.040] if (!future$lazy) [13:13:17.040] future <- run(future) [13:13:17.040] invisible(future) [13:13:17.040] }), .cleanup = FALSE, .init = FALSE) [13:13:17.040] } [13:13:17.040] } [13:13:17.040] } [13:13:17.040] }) [13:13:17.040] if (TRUE) { [13:13:17.040] base::sink(type = "output", split = FALSE) [13:13:17.040] if (TRUE) { [13:13:17.040] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:17.040] } [13:13:17.040] else { [13:13:17.040] ...future.result["stdout"] <- base::list(NULL) [13:13:17.040] } [13:13:17.040] base::close(...future.stdout) [13:13:17.040] ...future.stdout <- NULL [13:13:17.040] } [13:13:17.040] ...future.result$conditions <- ...future.conditions [13:13:17.040] ...future.result$finished <- base::Sys.time() [13:13:17.040] ...future.result [13:13:17.040] } [13:13:17.045] Exporting 7 global objects (2.27 KiB) to cluster node #1 ... [13:13:17.045] Exporting '...future.FUN' (1.04 KiB) to cluster node #1 ... [13:13:17.046] Exporting '...future.FUN' (1.04 KiB) to cluster node #1 ... DONE [13:13:17.046] Exporting 'breaks' (480 bytes) to cluster node #1 ... [13:13:17.046] Exporting 'breaks' (480 bytes) to cluster node #1 ... DONE [13:13:17.047] Exporting 'wool' (776 bytes) to cluster node #1 ... [13:13:17.047] Exporting 'wool' (776 bytes) to cluster node #1 ... DONE [13:13:17.047] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... [13:13:17.048] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... DONE [13:13:17.048] Exporting '...future.elements_ii' (1.60 KiB) to cluster node #1 ... [13:13:17.048] Exporting '...future.elements_ii' (1.60 KiB) to cluster node #1 ... DONE [13:13:17.049] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:13:17.049] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:13:17.049] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:13:17.050] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:13:17.050] Exporting 7 global objects (2.27 KiB) to cluster node #1 ... DONE [13:13:17.050] MultisessionFuture started [13:13:17.051] - Launch lazy future ... done [13:13:17.051] run() for 'MultisessionFuture' ... done [13:13:17.051] Created future: [13:13:17.068] receiveMessageFromWorker() for ClusterFuture ... [13:13:17.068] - Validating connection of MultisessionFuture [13:13:17.068] - received message: FutureResult [13:13:17.068] - Received FutureResult [13:13:17.069] - Erased future from FutureRegistry [13:13:17.069] result() for ClusterFuture ... [13:13:17.069] - result already collected: FutureResult [13:13:17.069] result() for ClusterFuture ... done [13:13:17.069] receiveMessageFromWorker() for ClusterFuture ... done [13:13:17.051] MultisessionFuture: [13:13:17.051] Label: 'future_by-1' [13:13:17.051] Expression: [13:13:17.051] { [13:13:17.051] do.call(function(...) { [13:13:17.051] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:17.051] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:17.051] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:17.051] on.exit(options(oopts), add = TRUE) [13:13:17.051] } [13:13:17.051] { [13:13:17.051] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:17.051] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:17.051] ...future.FUN(...future.X_jj, ...) [13:13:17.051] }) [13:13:17.051] } [13:13:17.051] }, args = future.call.arguments) [13:13:17.051] } [13:13:17.051] Lazy evaluation: FALSE [13:13:17.051] Asynchronous evaluation: TRUE [13:13:17.051] Local evaluation: TRUE [13:13:17.051] Environment: 0x0000018690630c88 [13:13:17.051] Capture standard output: TRUE [13:13:17.051] Capture condition classes: 'condition' (excluding 'nothing') [13:13:17.051] Globals: 7 objects totaling 3.87 KiB (function '...future.FUN' of 1.04 KiB, numeric 'breaks' of 480 bytes, factor 'wool' of 776 bytes, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 1.60 KiB, ...) [13:13:17.051] Packages: 1 packages ('stats') [13:13:17.051] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:17.051] Resolved: TRUE [13:13:17.051] Value: [13:13:17.051] Conditions captured: [13:13:17.051] Early signaling: FALSE [13:13:17.051] Owner process: f0659542-730c-c20a-65b3-84f202449c4d [13:13:17.051] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:17.070] Chunk #1 of 2 ... DONE [13:13:17.070] Chunk #2 of 2 ... [13:13:17.070] - Finding globals in 'X' for chunk #2 ... [13:13:17.070] getGlobalsAndPackages() ... [13:13:17.070] Searching for globals... [13:13:17.071] [13:13:17.071] Searching for globals ... DONE [13:13:17.071] - globals: [0] [13:13:17.071] getGlobalsAndPackages() ... DONE [13:13:17.072] + additional globals found: [n=0] [13:13:17.072] + additional namespaces needed: [n=0] [13:13:17.072] - Finding globals in 'X' for chunk #2 ... DONE [13:13:17.072] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:13:17.072] - seeds: [13:13:17.072] - All globals exported: [n=7] '...future.FUN', 'breaks', 'wool', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:17.073] getGlobalsAndPackages() ... [13:13:17.073] - globals passed as-is: [7] '...future.FUN', 'breaks', 'wool', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:17.073] Resolving globals: FALSE [13:13:17.073] Tweak future expression to call with '...' arguments ... [13:13:17.073] { [13:13:17.073] do.call(function(...) { [13:13:17.073] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:17.073] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:17.073] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:17.073] on.exit(options(oopts), add = TRUE) [13:13:17.073] } [13:13:17.073] { [13:13:17.073] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:17.073] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:17.073] ...future.FUN(...future.X_jj, ...) [13:13:17.073] }) [13:13:17.073] } [13:13:17.073] }, args = future.call.arguments) [13:13:17.073] } [13:13:17.074] Tweak future expression to call with '...' arguments ... DONE [13:13:17.074] - globals: [7] '...future.FUN', 'breaks', 'wool', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:17.074] [13:13:17.075] getGlobalsAndPackages() ... DONE [13:13:17.075] run() for 'Future' ... [13:13:17.075] - state: 'created' [13:13:17.075] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:17.089] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:17.089] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:13:17.089] - Field: 'node' [13:13:17.090] - Field: 'label' [13:13:17.090] - Field: 'local' [13:13:17.090] - Field: 'owner' [13:13:17.090] - Field: 'envir' [13:13:17.090] - Field: 'workers' [13:13:17.090] - Field: 'packages' [13:13:17.091] - Field: 'gc' [13:13:17.091] - Field: 'conditions' [13:13:17.091] - Field: 'persistent' [13:13:17.091] - Field: 'expr' [13:13:17.091] - Field: 'uuid' [13:13:17.091] - Field: 'seed' [13:13:17.092] - Field: 'version' [13:13:17.092] - Field: 'result' [13:13:17.092] - Field: 'asynchronous' [13:13:17.092] - Field: 'calls' [13:13:17.092] - Field: 'globals' [13:13:17.093] - Field: 'stdout' [13:13:17.093] - Field: 'earlySignal' [13:13:17.093] - Field: 'lazy' [13:13:17.093] - Field: 'state' [13:13:17.093] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:13:17.093] - Launch lazy future ... [13:13:17.094] Packages needed by the future expression (n = 1): 'stats' [13:13:17.094] Packages needed by future strategies (n = 0): [13:13:17.095] { [13:13:17.095] { [13:13:17.095] { [13:13:17.095] ...future.startTime <- base::Sys.time() [13:13:17.095] { [13:13:17.095] { [13:13:17.095] { [13:13:17.095] { [13:13:17.095] { [13:13:17.095] base::local({ [13:13:17.095] has_future <- base::requireNamespace("future", [13:13:17.095] quietly = TRUE) [13:13:17.095] if (has_future) { [13:13:17.095] ns <- base::getNamespace("future") [13:13:17.095] version <- ns[[".package"]][["version"]] [13:13:17.095] if (is.null(version)) [13:13:17.095] version <- utils::packageVersion("future") [13:13:17.095] } [13:13:17.095] else { [13:13:17.095] version <- NULL [13:13:17.095] } [13:13:17.095] if (!has_future || version < "1.8.0") { [13:13:17.095] info <- base::c(r_version = base::gsub("R version ", [13:13:17.095] "", base::R.version$version.string), [13:13:17.095] platform = base::sprintf("%s (%s-bit)", [13:13:17.095] base::R.version$platform, 8 * [13:13:17.095] base::.Machine$sizeof.pointer), [13:13:17.095] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:17.095] "release", "version")], collapse = " "), [13:13:17.095] hostname = base::Sys.info()[["nodename"]]) [13:13:17.095] info <- base::sprintf("%s: %s", base::names(info), [13:13:17.095] info) [13:13:17.095] info <- base::paste(info, collapse = "; ") [13:13:17.095] if (!has_future) { [13:13:17.095] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:17.095] info) [13:13:17.095] } [13:13:17.095] else { [13:13:17.095] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:17.095] info, version) [13:13:17.095] } [13:13:17.095] base::stop(msg) [13:13:17.095] } [13:13:17.095] }) [13:13:17.095] } [13:13:17.095] ...future.mc.cores.old <- base::getOption("mc.cores") [13:13:17.095] base::options(mc.cores = 1L) [13:13:17.095] } [13:13:17.095] base::local({ [13:13:17.095] for (pkg in "stats") { [13:13:17.095] base::loadNamespace(pkg) [13:13:17.095] base::library(pkg, character.only = TRUE) [13:13:17.095] } [13:13:17.095] }) [13:13:17.095] } [13:13:17.095] options(future.plan = NULL) [13:13:17.095] Sys.unsetenv("R_FUTURE_PLAN") [13:13:17.095] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:17.095] } [13:13:17.095] ...future.workdir <- getwd() [13:13:17.095] } [13:13:17.095] ...future.oldOptions <- base::as.list(base::.Options) [13:13:17.095] ...future.oldEnvVars <- base::Sys.getenv() [13:13:17.095] } [13:13:17.095] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:17.095] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:13:17.095] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:17.095] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:17.095] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:17.095] future.stdout.windows.reencode = NULL, width = 80L) [13:13:17.095] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:17.095] base::names(...future.oldOptions)) [13:13:17.095] } [13:13:17.095] if (FALSE) { [13:13:17.095] } [13:13:17.095] else { [13:13:17.095] if (TRUE) { [13:13:17.095] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:17.095] open = "w") [13:13:17.095] } [13:13:17.095] else { [13:13:17.095] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:17.095] windows = "NUL", "/dev/null"), open = "w") [13:13:17.095] } [13:13:17.095] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:17.095] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:17.095] base::sink(type = "output", split = FALSE) [13:13:17.095] base::close(...future.stdout) [13:13:17.095] }, add = TRUE) [13:13:17.095] } [13:13:17.095] ...future.frame <- base::sys.nframe() [13:13:17.095] ...future.conditions <- base::list() [13:13:17.095] ...future.rng <- base::globalenv()$.Random.seed [13:13:17.095] if (FALSE) { [13:13:17.095] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:17.095] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:17.095] } [13:13:17.095] ...future.result <- base::tryCatch({ [13:13:17.095] base::withCallingHandlers({ [13:13:17.095] ...future.value <- base::withVisible(base::local({ [13:13:17.095] ...future.makeSendCondition <- local({ [13:13:17.095] sendCondition <- NULL [13:13:17.095] function(frame = 1L) { [13:13:17.095] if (is.function(sendCondition)) [13:13:17.095] return(sendCondition) [13:13:17.095] ns <- getNamespace("parallel") [13:13:17.095] if (exists("sendData", mode = "function", [13:13:17.095] envir = ns)) { [13:13:17.095] parallel_sendData <- get("sendData", mode = "function", [13:13:17.095] envir = ns) [13:13:17.095] envir <- sys.frame(frame) [13:13:17.095] master <- NULL [13:13:17.095] while (!identical(envir, .GlobalEnv) && [13:13:17.095] !identical(envir, emptyenv())) { [13:13:17.095] if (exists("master", mode = "list", envir = envir, [13:13:17.095] inherits = FALSE)) { [13:13:17.095] master <- get("master", mode = "list", [13:13:17.095] envir = envir, inherits = FALSE) [13:13:17.095] if (inherits(master, c("SOCKnode", [13:13:17.095] "SOCK0node"))) { [13:13:17.095] sendCondition <<- function(cond) { [13:13:17.095] data <- list(type = "VALUE", value = cond, [13:13:17.095] success = TRUE) [13:13:17.095] parallel_sendData(master, data) [13:13:17.095] } [13:13:17.095] return(sendCondition) [13:13:17.095] } [13:13:17.095] } [13:13:17.095] frame <- frame + 1L [13:13:17.095] envir <- sys.frame(frame) [13:13:17.095] } [13:13:17.095] } [13:13:17.095] sendCondition <<- function(cond) NULL [13:13:17.095] } [13:13:17.095] }) [13:13:17.095] withCallingHandlers({ [13:13:17.095] { [13:13:17.095] do.call(function(...) { [13:13:17.095] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:17.095] if (!identical(...future.globals.maxSize.org, [13:13:17.095] ...future.globals.maxSize)) { [13:13:17.095] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:17.095] on.exit(options(oopts), add = TRUE) [13:13:17.095] } [13:13:17.095] { [13:13:17.095] lapply(seq_along(...future.elements_ii), [13:13:17.095] FUN = function(jj) { [13:13:17.095] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:17.095] ...future.FUN(...future.X_jj, ...) [13:13:17.095] }) [13:13:17.095] } [13:13:17.095] }, args = future.call.arguments) [13:13:17.095] } [13:13:17.095] }, immediateCondition = function(cond) { [13:13:17.095] sendCondition <- ...future.makeSendCondition() [13:13:17.095] sendCondition(cond) [13:13:17.095] muffleCondition <- function (cond, pattern = "^muffle") [13:13:17.095] { [13:13:17.095] inherits <- base::inherits [13:13:17.095] invokeRestart <- base::invokeRestart [13:13:17.095] is.null <- base::is.null [13:13:17.095] muffled <- FALSE [13:13:17.095] if (inherits(cond, "message")) { [13:13:17.095] muffled <- grepl(pattern, "muffleMessage") [13:13:17.095] if (muffled) [13:13:17.095] invokeRestart("muffleMessage") [13:13:17.095] } [13:13:17.095] else if (inherits(cond, "warning")) { [13:13:17.095] muffled <- grepl(pattern, "muffleWarning") [13:13:17.095] if (muffled) [13:13:17.095] invokeRestart("muffleWarning") [13:13:17.095] } [13:13:17.095] else if (inherits(cond, "condition")) { [13:13:17.095] if (!is.null(pattern)) { [13:13:17.095] computeRestarts <- base::computeRestarts [13:13:17.095] grepl <- base::grepl [13:13:17.095] restarts <- computeRestarts(cond) [13:13:17.095] for (restart in restarts) { [13:13:17.095] name <- restart$name [13:13:17.095] if (is.null(name)) [13:13:17.095] next [13:13:17.095] if (!grepl(pattern, name)) [13:13:17.095] next [13:13:17.095] invokeRestart(restart) [13:13:17.095] muffled <- TRUE [13:13:17.095] break [13:13:17.095] } [13:13:17.095] } [13:13:17.095] } [13:13:17.095] invisible(muffled) [13:13:17.095] } [13:13:17.095] muffleCondition(cond) [13:13:17.095] }) [13:13:17.095] })) [13:13:17.095] future::FutureResult(value = ...future.value$value, [13:13:17.095] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:17.095] ...future.rng), globalenv = if (FALSE) [13:13:17.095] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:17.095] ...future.globalenv.names)) [13:13:17.095] else NULL, started = ...future.startTime, version = "1.8") [13:13:17.095] }, condition = base::local({ [13:13:17.095] c <- base::c [13:13:17.095] inherits <- base::inherits [13:13:17.095] invokeRestart <- base::invokeRestart [13:13:17.095] length <- base::length [13:13:17.095] list <- base::list [13:13:17.095] seq.int <- base::seq.int [13:13:17.095] signalCondition <- base::signalCondition [13:13:17.095] sys.calls <- base::sys.calls [13:13:17.095] `[[` <- base::`[[` [13:13:17.095] `+` <- base::`+` [13:13:17.095] `<<-` <- base::`<<-` [13:13:17.095] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:17.095] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:17.095] 3L)] [13:13:17.095] } [13:13:17.095] function(cond) { [13:13:17.095] is_error <- inherits(cond, "error") [13:13:17.095] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:17.095] NULL) [13:13:17.095] if (is_error) { [13:13:17.095] sessionInformation <- function() { [13:13:17.095] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:17.095] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:17.095] search = base::search(), system = base::Sys.info()) [13:13:17.095] } [13:13:17.095] ...future.conditions[[length(...future.conditions) + [13:13:17.095] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:17.095] cond$call), session = sessionInformation(), [13:13:17.095] timestamp = base::Sys.time(), signaled = 0L) [13:13:17.095] signalCondition(cond) [13:13:17.095] } [13:13:17.095] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:17.095] "immediateCondition"))) { [13:13:17.095] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:17.095] ...future.conditions[[length(...future.conditions) + [13:13:17.095] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:17.095] if (TRUE && !signal) { [13:13:17.095] muffleCondition <- function (cond, pattern = "^muffle") [13:13:17.095] { [13:13:17.095] inherits <- base::inherits [13:13:17.095] invokeRestart <- base::invokeRestart [13:13:17.095] is.null <- base::is.null [13:13:17.095] muffled <- FALSE [13:13:17.095] if (inherits(cond, "message")) { [13:13:17.095] muffled <- grepl(pattern, "muffleMessage") [13:13:17.095] if (muffled) [13:13:17.095] invokeRestart("muffleMessage") [13:13:17.095] } [13:13:17.095] else if (inherits(cond, "warning")) { [13:13:17.095] muffled <- grepl(pattern, "muffleWarning") [13:13:17.095] if (muffled) [13:13:17.095] invokeRestart("muffleWarning") [13:13:17.095] } [13:13:17.095] else if (inherits(cond, "condition")) { [13:13:17.095] if (!is.null(pattern)) { [13:13:17.095] computeRestarts <- base::computeRestarts [13:13:17.095] grepl <- base::grepl [13:13:17.095] restarts <- computeRestarts(cond) [13:13:17.095] for (restart in restarts) { [13:13:17.095] name <- restart$name [13:13:17.095] if (is.null(name)) [13:13:17.095] next [13:13:17.095] if (!grepl(pattern, name)) [13:13:17.095] next [13:13:17.095] invokeRestart(restart) [13:13:17.095] muffled <- TRUE [13:13:17.095] break [13:13:17.095] } [13:13:17.095] } [13:13:17.095] } [13:13:17.095] invisible(muffled) [13:13:17.095] } [13:13:17.095] muffleCondition(cond, pattern = "^muffle") [13:13:17.095] } [13:13:17.095] } [13:13:17.095] else { [13:13:17.095] if (TRUE) { [13:13:17.095] muffleCondition <- function (cond, pattern = "^muffle") [13:13:17.095] { [13:13:17.095] inherits <- base::inherits [13:13:17.095] invokeRestart <- base::invokeRestart [13:13:17.095] is.null <- base::is.null [13:13:17.095] muffled <- FALSE [13:13:17.095] if (inherits(cond, "message")) { [13:13:17.095] muffled <- grepl(pattern, "muffleMessage") [13:13:17.095] if (muffled) [13:13:17.095] invokeRestart("muffleMessage") [13:13:17.095] } [13:13:17.095] else if (inherits(cond, "warning")) { [13:13:17.095] muffled <- grepl(pattern, "muffleWarning") [13:13:17.095] if (muffled) [13:13:17.095] invokeRestart("muffleWarning") [13:13:17.095] } [13:13:17.095] else if (inherits(cond, "condition")) { [13:13:17.095] if (!is.null(pattern)) { [13:13:17.095] computeRestarts <- base::computeRestarts [13:13:17.095] grepl <- base::grepl [13:13:17.095] restarts <- computeRestarts(cond) [13:13:17.095] for (restart in restarts) { [13:13:17.095] name <- restart$name [13:13:17.095] if (is.null(name)) [13:13:17.095] next [13:13:17.095] if (!grepl(pattern, name)) [13:13:17.095] next [13:13:17.095] invokeRestart(restart) [13:13:17.095] muffled <- TRUE [13:13:17.095] break [13:13:17.095] } [13:13:17.095] } [13:13:17.095] } [13:13:17.095] invisible(muffled) [13:13:17.095] } [13:13:17.095] muffleCondition(cond, pattern = "^muffle") [13:13:17.095] } [13:13:17.095] } [13:13:17.095] } [13:13:17.095] })) [13:13:17.095] }, error = function(ex) { [13:13:17.095] base::structure(base::list(value = NULL, visible = NULL, [13:13:17.095] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:17.095] ...future.rng), started = ...future.startTime, [13:13:17.095] finished = Sys.time(), session_uuid = NA_character_, [13:13:17.095] version = "1.8"), class = "FutureResult") [13:13:17.095] }, finally = { [13:13:17.095] if (!identical(...future.workdir, getwd())) [13:13:17.095] setwd(...future.workdir) [13:13:17.095] { [13:13:17.095] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:17.095] ...future.oldOptions$nwarnings <- NULL [13:13:17.095] } [13:13:17.095] base::options(...future.oldOptions) [13:13:17.095] if (.Platform$OS.type == "windows") { [13:13:17.095] old_names <- names(...future.oldEnvVars) [13:13:17.095] envs <- base::Sys.getenv() [13:13:17.095] names <- names(envs) [13:13:17.095] common <- intersect(names, old_names) [13:13:17.095] added <- setdiff(names, old_names) [13:13:17.095] removed <- setdiff(old_names, names) [13:13:17.095] changed <- common[...future.oldEnvVars[common] != [13:13:17.095] envs[common]] [13:13:17.095] NAMES <- toupper(changed) [13:13:17.095] args <- list() [13:13:17.095] for (kk in seq_along(NAMES)) { [13:13:17.095] name <- changed[[kk]] [13:13:17.095] NAME <- NAMES[[kk]] [13:13:17.095] if (name != NAME && is.element(NAME, old_names)) [13:13:17.095] next [13:13:17.095] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:17.095] } [13:13:17.095] NAMES <- toupper(added) [13:13:17.095] for (kk in seq_along(NAMES)) { [13:13:17.095] name <- added[[kk]] [13:13:17.095] NAME <- NAMES[[kk]] [13:13:17.095] if (name != NAME && is.element(NAME, old_names)) [13:13:17.095] next [13:13:17.095] args[[name]] <- "" [13:13:17.095] } [13:13:17.095] NAMES <- toupper(removed) [13:13:17.095] for (kk in seq_along(NAMES)) { [13:13:17.095] name <- removed[[kk]] [13:13:17.095] NAME <- NAMES[[kk]] [13:13:17.095] if (name != NAME && is.element(NAME, old_names)) [13:13:17.095] next [13:13:17.095] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:17.095] } [13:13:17.095] if (length(args) > 0) [13:13:17.095] base::do.call(base::Sys.setenv, args = args) [13:13:17.095] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:17.095] } [13:13:17.095] else { [13:13:17.095] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:17.095] } [13:13:17.095] { [13:13:17.095] if (base::length(...future.futureOptionsAdded) > [13:13:17.095] 0L) { [13:13:17.095] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:17.095] base::names(opts) <- ...future.futureOptionsAdded [13:13:17.095] base::options(opts) [13:13:17.095] } [13:13:17.095] { [13:13:17.095] { [13:13:17.095] base::options(mc.cores = ...future.mc.cores.old) [13:13:17.095] NULL [13:13:17.095] } [13:13:17.095] options(future.plan = NULL) [13:13:17.095] if (is.na(NA_character_)) [13:13:17.095] Sys.unsetenv("R_FUTURE_PLAN") [13:13:17.095] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:17.095] future::plan(list(function (..., workers = availableCores(), [13:13:17.095] lazy = FALSE, rscript_libs = .libPaths(), [13:13:17.095] envir = parent.frame()) [13:13:17.095] { [13:13:17.095] if (is.function(workers)) [13:13:17.095] workers <- workers() [13:13:17.095] workers <- structure(as.integer(workers), [13:13:17.095] class = class(workers)) [13:13:17.095] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:17.095] workers >= 1) [13:13:17.095] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:17.095] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:17.095] } [13:13:17.095] future <- MultisessionFuture(..., workers = workers, [13:13:17.095] lazy = lazy, rscript_libs = rscript_libs, [13:13:17.095] envir = envir) [13:13:17.095] if (!future$lazy) [13:13:17.095] future <- run(future) [13:13:17.095] invisible(future) [13:13:17.095] }), .cleanup = FALSE, .init = FALSE) [13:13:17.095] } [13:13:17.095] } [13:13:17.095] } [13:13:17.095] }) [13:13:17.095] if (TRUE) { [13:13:17.095] base::sink(type = "output", split = FALSE) [13:13:17.095] if (TRUE) { [13:13:17.095] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:17.095] } [13:13:17.095] else { [13:13:17.095] ...future.result["stdout"] <- base::list(NULL) [13:13:17.095] } [13:13:17.095] base::close(...future.stdout) [13:13:17.095] ...future.stdout <- NULL [13:13:17.095] } [13:13:17.095] ...future.result$conditions <- ...future.conditions [13:13:17.095] ...future.result$finished <- base::Sys.time() [13:13:17.095] ...future.result [13:13:17.095] } [13:13:17.100] Exporting 7 global objects (2.27 KiB) to cluster node #1 ... [13:13:17.100] Exporting '...future.FUN' (1.04 KiB) to cluster node #1 ... [13:13:17.101] Exporting '...future.FUN' (1.04 KiB) to cluster node #1 ... DONE [13:13:17.101] Exporting 'breaks' (480 bytes) to cluster node #1 ... [13:13:17.101] Exporting 'breaks' (480 bytes) to cluster node #1 ... DONE [13:13:17.101] Exporting 'wool' (776 bytes) to cluster node #1 ... [13:13:17.102] Exporting 'wool' (776 bytes) to cluster node #1 ... DONE [13:13:17.102] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... [13:13:17.102] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... DONE [13:13:17.103] Exporting '...future.elements_ii' (3.20 KiB) to cluster node #1 ... [13:13:17.103] Exporting '...future.elements_ii' (3.20 KiB) to cluster node #1 ... DONE [13:13:17.103] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:13:17.104] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:13:17.104] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:13:17.104] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:13:17.105] Exporting 7 global objects (2.27 KiB) to cluster node #1 ... DONE [13:13:17.105] MultisessionFuture started [13:13:17.106] - Launch lazy future ... done [13:13:17.106] run() for 'MultisessionFuture' ... done [13:13:17.106] Created future: [13:13:17.122] receiveMessageFromWorker() for ClusterFuture ... [13:13:17.123] - Validating connection of MultisessionFuture [13:13:17.123] - received message: FutureResult [13:13:17.123] - Received FutureResult [13:13:17.123] - Erased future from FutureRegistry [13:13:17.124] result() for ClusterFuture ... [13:13:17.124] - result already collected: FutureResult [13:13:17.124] result() for ClusterFuture ... done [13:13:17.124] receiveMessageFromWorker() for ClusterFuture ... done [13:13:17.106] MultisessionFuture: [13:13:17.106] Label: 'future_by-2' [13:13:17.106] Expression: [13:13:17.106] { [13:13:17.106] do.call(function(...) { [13:13:17.106] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:17.106] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:17.106] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:17.106] on.exit(options(oopts), add = TRUE) [13:13:17.106] } [13:13:17.106] { [13:13:17.106] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:17.106] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:17.106] ...future.FUN(...future.X_jj, ...) [13:13:17.106] }) [13:13:17.106] } [13:13:17.106] }, args = future.call.arguments) [13:13:17.106] } [13:13:17.106] Lazy evaluation: FALSE [13:13:17.106] Asynchronous evaluation: TRUE [13:13:17.106] Local evaluation: TRUE [13:13:17.106] Environment: 0x0000018690630c88 [13:13:17.106] Capture standard output: TRUE [13:13:17.106] Capture condition classes: 'condition' (excluding 'nothing') [13:13:17.106] Globals: 7 objects totaling 5.47 KiB (function '...future.FUN' of 1.04 KiB, numeric 'breaks' of 480 bytes, factor 'wool' of 776 bytes, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 3.20 KiB, ...) [13:13:17.106] Packages: 1 packages ('stats') [13:13:17.106] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:17.106] Resolved: TRUE [13:13:17.106] Value: [13:13:17.106] Conditions captured: [13:13:17.106] Early signaling: FALSE [13:13:17.106] Owner process: f0659542-730c-c20a-65b3-84f202449c4d [13:13:17.106] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:17.124] Chunk #2 of 2 ... DONE [13:13:17.125] Launching 2 futures (chunks) ... DONE [13:13:17.125] Resolving 2 futures (chunks) ... [13:13:17.125] resolve() on list ... [13:13:17.125] recursive: 0 [13:13:17.125] length: 2 [13:13:17.125] [13:13:17.126] Future #1 [13:13:17.126] result() for ClusterFuture ... [13:13:17.126] - result already collected: FutureResult [13:13:17.126] result() for ClusterFuture ... done [13:13:17.126] result() for ClusterFuture ... [13:13:17.126] - result already collected: FutureResult [13:13:17.127] result() for ClusterFuture ... done [13:13:17.127] signalConditionsASAP(MultisessionFuture, pos=1) ... [13:13:17.127] - nx: 2 [13:13:17.127] - relay: TRUE [13:13:17.127] - stdout: TRUE [13:13:17.127] - signal: TRUE [13:13:17.127] - resignal: FALSE [13:13:17.128] - force: TRUE [13:13:17.128] - relayed: [n=2] FALSE, FALSE [13:13:17.128] - queued futures: [n=2] FALSE, FALSE [13:13:17.128] - until=1 [13:13:17.128] - relaying element #1 [13:13:17.128] result() for ClusterFuture ... [13:13:17.129] - result already collected: FutureResult [13:13:17.129] result() for ClusterFuture ... done [13:13:17.129] result() for ClusterFuture ... [13:13:17.129] - result already collected: FutureResult [13:13:17.129] result() for ClusterFuture ... done [13:13:17.129] result() for ClusterFuture ... [13:13:17.130] - result already collected: FutureResult [13:13:17.130] result() for ClusterFuture ... done [13:13:17.130] result() for ClusterFuture ... [13:13:17.130] - result already collected: FutureResult [13:13:17.130] result() for ClusterFuture ... done [13:13:17.130] - relayed: [n=2] TRUE, FALSE [13:13:17.130] - queued futures: [n=2] TRUE, FALSE [13:13:17.131] signalConditionsASAP(MultisessionFuture, pos=1) ... done [13:13:17.131] length: 1 (resolved future 1) [13:13:17.131] Future #2 [13:13:17.131] result() for ClusterFuture ... [13:13:17.131] - result already collected: FutureResult [13:13:17.131] result() for ClusterFuture ... done [13:13:17.132] result() for ClusterFuture ... [13:13:17.132] - result already collected: FutureResult [13:13:17.132] result() for ClusterFuture ... done [13:13:17.132] signalConditionsASAP(MultisessionFuture, pos=2) ... [13:13:17.132] - nx: 2 [13:13:17.132] - relay: TRUE [13:13:17.133] - stdout: TRUE [13:13:17.133] - signal: TRUE [13:13:17.133] - resignal: FALSE [13:13:17.133] - force: TRUE [13:13:17.133] - relayed: [n=2] TRUE, FALSE [13:13:17.133] - queued futures: [n=2] TRUE, FALSE [13:13:17.133] - until=2 [13:13:17.134] - relaying element #2 [13:13:17.134] result() for ClusterFuture ... [13:13:17.134] - result already collected: FutureResult [13:13:17.134] result() for ClusterFuture ... done [13:13:17.134] result() for ClusterFuture ... [13:13:17.134] - result already collected: FutureResult [13:13:17.135] result() for ClusterFuture ... done [13:13:17.135] result() for ClusterFuture ... [13:13:17.135] - result already collected: FutureResult [13:13:17.135] result() for ClusterFuture ... done [13:13:17.135] result() for ClusterFuture ... [13:13:17.135] - result already collected: FutureResult [13:13:17.136] result() for ClusterFuture ... done [13:13:17.136] - relayed: [n=2] TRUE, TRUE [13:13:17.136] - queued futures: [n=2] TRUE, TRUE [13:13:17.136] signalConditionsASAP(MultisessionFuture, pos=2) ... done [13:13:17.136] length: 0 (resolved future 2) [13:13:17.136] Relaying remaining futures [13:13:17.136] signalConditionsASAP(NULL, pos=0) ... [13:13:17.137] - nx: 2 [13:13:17.137] - relay: TRUE [13:13:17.137] - stdout: TRUE [13:13:17.137] - signal: TRUE [13:13:17.137] - resignal: FALSE [13:13:17.137] - force: TRUE [13:13:17.137] - relayed: [n=2] TRUE, TRUE [13:13:17.138] - queued futures: [n=2] TRUE, TRUE - flush all [13:13:17.138] - relayed: [n=2] TRUE, TRUE [13:13:17.138] - queued futures: [n=2] TRUE, TRUE [13:13:17.138] signalConditionsASAP(NULL, pos=0) ... done [13:13:17.138] resolve() on list ... DONE [13:13:17.139] result() for ClusterFuture ... [13:13:17.139] - result already collected: FutureResult [13:13:17.139] result() for ClusterFuture ... done [13:13:17.139] result() for ClusterFuture ... [13:13:17.139] - result already collected: FutureResult [13:13:17.139] result() for ClusterFuture ... done [13:13:17.139] result() for ClusterFuture ... [13:13:17.140] - result already collected: FutureResult [13:13:17.140] result() for ClusterFuture ... done [13:13:17.140] result() for ClusterFuture ... [13:13:17.140] - result already collected: FutureResult [13:13:17.140] result() for ClusterFuture ... done [13:13:17.140] - Number of value chunks collected: 2 [13:13:17.141] Resolving 2 futures (chunks) ... DONE [13:13:17.141] Reducing values from 2 chunks ... [13:13:17.141] - Number of values collected after concatenation: 3 [13:13:17.141] - Number of values expected: 3 [13:13:17.141] Reducing values from 2 chunks ... DONE [13:13:17.141] future_lapply() ... DONE [13:13:17.142] future_by_internal() ... DONE [13:13:17.142] future_by_internal() ... [13:13:17.143] future_lapply() ... [13:13:17.145] Number of chunks: 2 [13:13:17.145] getGlobalsAndPackagesXApply() ... [13:13:17.146] - future.globals: TRUE [13:13:17.146] getGlobalsAndPackages() ... [13:13:17.146] Searching for globals... [13:13:17.147] - globals found: [2] 'FUN', 'UseMethod' [13:13:17.147] Searching for globals ... DONE [13:13:17.148] Resolving globals: FALSE [13:13:17.148] The total size of the 1 globals is 1.21 KiB (1240 bytes) [13:13:17.148] The total size of the 1 globals exported for future expression ('FUN()') is 1.21 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (1.21 KiB of class 'function') [13:13:17.149] - globals: [1] 'FUN' [13:13:17.149] [13:13:17.149] getGlobalsAndPackages() ... DONE [13:13:17.149] - globals found/used: [n=1] 'FUN' [13:13:17.149] - needed namespaces: [n=0] [13:13:17.150] Finding globals ... DONE [13:13:17.150] - use_args: TRUE [13:13:17.150] - Getting '...' globals ... [13:13:17.150] resolve() on list ... [13:13:17.150] recursive: 0 [13:13:17.151] length: 1 [13:13:17.151] elements: '...' [13:13:17.151] length: 0 (resolved future 1) [13:13:17.151] resolve() on list ... DONE [13:13:17.151] - '...' content: [n=0] [13:13:17.151] List of 1 [13:13:17.151] $ ...: list() [13:13:17.151] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:17.151] - attr(*, "where")=List of 1 [13:13:17.151] ..$ ...: [13:13:17.151] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:17.151] - attr(*, "resolved")= logi TRUE [13:13:17.151] - attr(*, "total_size")= num NA [13:13:17.154] - Getting '...' globals ... DONE [13:13:17.155] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:17.155] List of 2 [13:13:17.155] $ ...future.FUN:function (object, ...) [13:13:17.155] $ ... : list() [13:13:17.155] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:17.155] - attr(*, "where")=List of 2 [13:13:17.155] ..$ ...future.FUN: [13:13:17.155] ..$ ... : [13:13:17.155] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:17.155] - attr(*, "resolved")= logi FALSE [13:13:17.155] - attr(*, "total_size")= num 1240 [13:13:17.158] Packages to be attached in all futures: [n=0] [13:13:17.158] getGlobalsAndPackagesXApply() ... DONE [13:13:17.159] Number of futures (= number of chunks): 2 [13:13:17.159] Launching 2 futures (chunks) ... [13:13:17.159] Chunk #1 of 2 ... [13:13:17.159] - Finding globals in 'X' for chunk #1 ... [13:13:17.159] getGlobalsAndPackages() ... [13:13:17.159] Searching for globals... [13:13:17.160] [13:13:17.160] Searching for globals ... DONE [13:13:17.160] - globals: [0] [13:13:17.160] getGlobalsAndPackages() ... DONE [13:13:17.160] + additional globals found: [n=0] [13:13:17.161] + additional namespaces needed: [n=0] [13:13:17.161] - Finding globals in 'X' for chunk #1 ... DONE [13:13:17.161] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:13:17.161] - seeds: [13:13:17.161] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:17.161] getGlobalsAndPackages() ... [13:13:17.162] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:17.162] Resolving globals: FALSE [13:13:17.162] Tweak future expression to call with '...' arguments ... [13:13:17.162] { [13:13:17.162] do.call(function(...) { [13:13:17.162] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:17.162] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:17.162] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:17.162] on.exit(options(oopts), add = TRUE) [13:13:17.162] } [13:13:17.162] { [13:13:17.162] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:17.162] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:17.162] ...future.FUN(...future.X_jj, ...) [13:13:17.162] }) [13:13:17.162] } [13:13:17.162] }, args = future.call.arguments) [13:13:17.162] } [13:13:17.163] Tweak future expression to call with '...' arguments ... DONE [13:13:17.163] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:17.163] [13:13:17.163] getGlobalsAndPackages() ... DONE [13:13:17.164] run() for 'Future' ... [13:13:17.164] - state: 'created' [13:13:17.164] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:17.178] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:17.178] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:13:17.178] - Field: 'node' [13:13:17.179] - Field: 'label' [13:13:17.179] - Field: 'local' [13:13:17.179] - Field: 'owner' [13:13:17.179] - Field: 'envir' [13:13:17.179] - Field: 'workers' [13:13:17.180] - Field: 'packages' [13:13:17.180] - Field: 'gc' [13:13:17.180] - Field: 'conditions' [13:13:17.180] - Field: 'persistent' [13:13:17.180] - Field: 'expr' [13:13:17.180] - Field: 'uuid' [13:13:17.181] - Field: 'seed' [13:13:17.181] - Field: 'version' [13:13:17.181] - Field: 'result' [13:13:17.181] - Field: 'asynchronous' [13:13:17.181] - Field: 'calls' [13:13:17.181] - Field: 'globals' [13:13:17.182] - Field: 'stdout' [13:13:17.182] - Field: 'earlySignal' [13:13:17.182] - Field: 'lazy' [13:13:17.182] - Field: 'state' [13:13:17.182] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:13:17.183] - Launch lazy future ... [13:13:17.183] Packages needed by the future expression (n = 0): [13:13:17.183] Packages needed by future strategies (n = 0): [13:13:17.184] { [13:13:17.184] { [13:13:17.184] { [13:13:17.184] ...future.startTime <- base::Sys.time() [13:13:17.184] { [13:13:17.184] { [13:13:17.184] { [13:13:17.184] { [13:13:17.184] base::local({ [13:13:17.184] has_future <- base::requireNamespace("future", [13:13:17.184] quietly = TRUE) [13:13:17.184] if (has_future) { [13:13:17.184] ns <- base::getNamespace("future") [13:13:17.184] version <- ns[[".package"]][["version"]] [13:13:17.184] if (is.null(version)) [13:13:17.184] version <- utils::packageVersion("future") [13:13:17.184] } [13:13:17.184] else { [13:13:17.184] version <- NULL [13:13:17.184] } [13:13:17.184] if (!has_future || version < "1.8.0") { [13:13:17.184] info <- base::c(r_version = base::gsub("R version ", [13:13:17.184] "", base::R.version$version.string), [13:13:17.184] platform = base::sprintf("%s (%s-bit)", [13:13:17.184] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:17.184] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:17.184] "release", "version")], collapse = " "), [13:13:17.184] hostname = base::Sys.info()[["nodename"]]) [13:13:17.184] info <- base::sprintf("%s: %s", base::names(info), [13:13:17.184] info) [13:13:17.184] info <- base::paste(info, collapse = "; ") [13:13:17.184] if (!has_future) { [13:13:17.184] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:17.184] info) [13:13:17.184] } [13:13:17.184] else { [13:13:17.184] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:17.184] info, version) [13:13:17.184] } [13:13:17.184] base::stop(msg) [13:13:17.184] } [13:13:17.184] }) [13:13:17.184] } [13:13:17.184] ...future.mc.cores.old <- base::getOption("mc.cores") [13:13:17.184] base::options(mc.cores = 1L) [13:13:17.184] } [13:13:17.184] options(future.plan = NULL) [13:13:17.184] Sys.unsetenv("R_FUTURE_PLAN") [13:13:17.184] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:17.184] } [13:13:17.184] ...future.workdir <- getwd() [13:13:17.184] } [13:13:17.184] ...future.oldOptions <- base::as.list(base::.Options) [13:13:17.184] ...future.oldEnvVars <- base::Sys.getenv() [13:13:17.184] } [13:13:17.184] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:17.184] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:13:17.184] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:17.184] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:17.184] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:17.184] future.stdout.windows.reencode = NULL, width = 80L) [13:13:17.184] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:17.184] base::names(...future.oldOptions)) [13:13:17.184] } [13:13:17.184] if (FALSE) { [13:13:17.184] } [13:13:17.184] else { [13:13:17.184] if (TRUE) { [13:13:17.184] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:17.184] open = "w") [13:13:17.184] } [13:13:17.184] else { [13:13:17.184] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:17.184] windows = "NUL", "/dev/null"), open = "w") [13:13:17.184] } [13:13:17.184] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:17.184] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:17.184] base::sink(type = "output", split = FALSE) [13:13:17.184] base::close(...future.stdout) [13:13:17.184] }, add = TRUE) [13:13:17.184] } [13:13:17.184] ...future.frame <- base::sys.nframe() [13:13:17.184] ...future.conditions <- base::list() [13:13:17.184] ...future.rng <- base::globalenv()$.Random.seed [13:13:17.184] if (FALSE) { [13:13:17.184] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:17.184] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:17.184] } [13:13:17.184] ...future.result <- base::tryCatch({ [13:13:17.184] base::withCallingHandlers({ [13:13:17.184] ...future.value <- base::withVisible(base::local({ [13:13:17.184] ...future.makeSendCondition <- local({ [13:13:17.184] sendCondition <- NULL [13:13:17.184] function(frame = 1L) { [13:13:17.184] if (is.function(sendCondition)) [13:13:17.184] return(sendCondition) [13:13:17.184] ns <- getNamespace("parallel") [13:13:17.184] if (exists("sendData", mode = "function", [13:13:17.184] envir = ns)) { [13:13:17.184] parallel_sendData <- get("sendData", mode = "function", [13:13:17.184] envir = ns) [13:13:17.184] envir <- sys.frame(frame) [13:13:17.184] master <- NULL [13:13:17.184] while (!identical(envir, .GlobalEnv) && [13:13:17.184] !identical(envir, emptyenv())) { [13:13:17.184] if (exists("master", mode = "list", envir = envir, [13:13:17.184] inherits = FALSE)) { [13:13:17.184] master <- get("master", mode = "list", [13:13:17.184] envir = envir, inherits = FALSE) [13:13:17.184] if (inherits(master, c("SOCKnode", [13:13:17.184] "SOCK0node"))) { [13:13:17.184] sendCondition <<- function(cond) { [13:13:17.184] data <- list(type = "VALUE", value = cond, [13:13:17.184] success = TRUE) [13:13:17.184] parallel_sendData(master, data) [13:13:17.184] } [13:13:17.184] return(sendCondition) [13:13:17.184] } [13:13:17.184] } [13:13:17.184] frame <- frame + 1L [13:13:17.184] envir <- sys.frame(frame) [13:13:17.184] } [13:13:17.184] } [13:13:17.184] sendCondition <<- function(cond) NULL [13:13:17.184] } [13:13:17.184] }) [13:13:17.184] withCallingHandlers({ [13:13:17.184] { [13:13:17.184] do.call(function(...) { [13:13:17.184] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:17.184] if (!identical(...future.globals.maxSize.org, [13:13:17.184] ...future.globals.maxSize)) { [13:13:17.184] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:17.184] on.exit(options(oopts), add = TRUE) [13:13:17.184] } [13:13:17.184] { [13:13:17.184] lapply(seq_along(...future.elements_ii), [13:13:17.184] FUN = function(jj) { [13:13:17.184] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:17.184] ...future.FUN(...future.X_jj, ...) [13:13:17.184] }) [13:13:17.184] } [13:13:17.184] }, args = future.call.arguments) [13:13:17.184] } [13:13:17.184] }, immediateCondition = function(cond) { [13:13:17.184] sendCondition <- ...future.makeSendCondition() [13:13:17.184] sendCondition(cond) [13:13:17.184] muffleCondition <- function (cond, pattern = "^muffle") [13:13:17.184] { [13:13:17.184] inherits <- base::inherits [13:13:17.184] invokeRestart <- base::invokeRestart [13:13:17.184] is.null <- base::is.null [13:13:17.184] muffled <- FALSE [13:13:17.184] if (inherits(cond, "message")) { [13:13:17.184] muffled <- grepl(pattern, "muffleMessage") [13:13:17.184] if (muffled) [13:13:17.184] invokeRestart("muffleMessage") [13:13:17.184] } [13:13:17.184] else if (inherits(cond, "warning")) { [13:13:17.184] muffled <- grepl(pattern, "muffleWarning") [13:13:17.184] if (muffled) [13:13:17.184] invokeRestart("muffleWarning") [13:13:17.184] } [13:13:17.184] else if (inherits(cond, "condition")) { [13:13:17.184] if (!is.null(pattern)) { [13:13:17.184] computeRestarts <- base::computeRestarts [13:13:17.184] grepl <- base::grepl [13:13:17.184] restarts <- computeRestarts(cond) [13:13:17.184] for (restart in restarts) { [13:13:17.184] name <- restart$name [13:13:17.184] if (is.null(name)) [13:13:17.184] next [13:13:17.184] if (!grepl(pattern, name)) [13:13:17.184] next [13:13:17.184] invokeRestart(restart) [13:13:17.184] muffled <- TRUE [13:13:17.184] break [13:13:17.184] } [13:13:17.184] } [13:13:17.184] } [13:13:17.184] invisible(muffled) [13:13:17.184] } [13:13:17.184] muffleCondition(cond) [13:13:17.184] }) [13:13:17.184] })) [13:13:17.184] future::FutureResult(value = ...future.value$value, [13:13:17.184] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:17.184] ...future.rng), globalenv = if (FALSE) [13:13:17.184] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:17.184] ...future.globalenv.names)) [13:13:17.184] else NULL, started = ...future.startTime, version = "1.8") [13:13:17.184] }, condition = base::local({ [13:13:17.184] c <- base::c [13:13:17.184] inherits <- base::inherits [13:13:17.184] invokeRestart <- base::invokeRestart [13:13:17.184] length <- base::length [13:13:17.184] list <- base::list [13:13:17.184] seq.int <- base::seq.int [13:13:17.184] signalCondition <- base::signalCondition [13:13:17.184] sys.calls <- base::sys.calls [13:13:17.184] `[[` <- base::`[[` [13:13:17.184] `+` <- base::`+` [13:13:17.184] `<<-` <- base::`<<-` [13:13:17.184] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:17.184] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:17.184] 3L)] [13:13:17.184] } [13:13:17.184] function(cond) { [13:13:17.184] is_error <- inherits(cond, "error") [13:13:17.184] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:17.184] NULL) [13:13:17.184] if (is_error) { [13:13:17.184] sessionInformation <- function() { [13:13:17.184] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:17.184] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:17.184] search = base::search(), system = base::Sys.info()) [13:13:17.184] } [13:13:17.184] ...future.conditions[[length(...future.conditions) + [13:13:17.184] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:17.184] cond$call), session = sessionInformation(), [13:13:17.184] timestamp = base::Sys.time(), signaled = 0L) [13:13:17.184] signalCondition(cond) [13:13:17.184] } [13:13:17.184] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:17.184] "immediateCondition"))) { [13:13:17.184] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:17.184] ...future.conditions[[length(...future.conditions) + [13:13:17.184] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:17.184] if (TRUE && !signal) { [13:13:17.184] muffleCondition <- function (cond, pattern = "^muffle") [13:13:17.184] { [13:13:17.184] inherits <- base::inherits [13:13:17.184] invokeRestart <- base::invokeRestart [13:13:17.184] is.null <- base::is.null [13:13:17.184] muffled <- FALSE [13:13:17.184] if (inherits(cond, "message")) { [13:13:17.184] muffled <- grepl(pattern, "muffleMessage") [13:13:17.184] if (muffled) [13:13:17.184] invokeRestart("muffleMessage") [13:13:17.184] } [13:13:17.184] else if (inherits(cond, "warning")) { [13:13:17.184] muffled <- grepl(pattern, "muffleWarning") [13:13:17.184] if (muffled) [13:13:17.184] invokeRestart("muffleWarning") [13:13:17.184] } [13:13:17.184] else if (inherits(cond, "condition")) { [13:13:17.184] if (!is.null(pattern)) { [13:13:17.184] computeRestarts <- base::computeRestarts [13:13:17.184] grepl <- base::grepl [13:13:17.184] restarts <- computeRestarts(cond) [13:13:17.184] for (restart in restarts) { [13:13:17.184] name <- restart$name [13:13:17.184] if (is.null(name)) [13:13:17.184] next [13:13:17.184] if (!grepl(pattern, name)) [13:13:17.184] next [13:13:17.184] invokeRestart(restart) [13:13:17.184] muffled <- TRUE [13:13:17.184] break [13:13:17.184] } [13:13:17.184] } [13:13:17.184] } [13:13:17.184] invisible(muffled) [13:13:17.184] } [13:13:17.184] muffleCondition(cond, pattern = "^muffle") [13:13:17.184] } [13:13:17.184] } [13:13:17.184] else { [13:13:17.184] if (TRUE) { [13:13:17.184] muffleCondition <- function (cond, pattern = "^muffle") [13:13:17.184] { [13:13:17.184] inherits <- base::inherits [13:13:17.184] invokeRestart <- base::invokeRestart [13:13:17.184] is.null <- base::is.null [13:13:17.184] muffled <- FALSE [13:13:17.184] if (inherits(cond, "message")) { [13:13:17.184] muffled <- grepl(pattern, "muffleMessage") [13:13:17.184] if (muffled) [13:13:17.184] invokeRestart("muffleMessage") [13:13:17.184] } [13:13:17.184] else if (inherits(cond, "warning")) { [13:13:17.184] muffled <- grepl(pattern, "muffleWarning") [13:13:17.184] if (muffled) [13:13:17.184] invokeRestart("muffleWarning") [13:13:17.184] } [13:13:17.184] else if (inherits(cond, "condition")) { [13:13:17.184] if (!is.null(pattern)) { [13:13:17.184] computeRestarts <- base::computeRestarts [13:13:17.184] grepl <- base::grepl [13:13:17.184] restarts <- computeRestarts(cond) [13:13:17.184] for (restart in restarts) { [13:13:17.184] name <- restart$name [13:13:17.184] if (is.null(name)) [13:13:17.184] next [13:13:17.184] if (!grepl(pattern, name)) [13:13:17.184] next [13:13:17.184] invokeRestart(restart) [13:13:17.184] muffled <- TRUE [13:13:17.184] break [13:13:17.184] } [13:13:17.184] } [13:13:17.184] } [13:13:17.184] invisible(muffled) [13:13:17.184] } [13:13:17.184] muffleCondition(cond, pattern = "^muffle") [13:13:17.184] } [13:13:17.184] } [13:13:17.184] } [13:13:17.184] })) [13:13:17.184] }, error = function(ex) { [13:13:17.184] base::structure(base::list(value = NULL, visible = NULL, [13:13:17.184] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:17.184] ...future.rng), started = ...future.startTime, [13:13:17.184] finished = Sys.time(), session_uuid = NA_character_, [13:13:17.184] version = "1.8"), class = "FutureResult") [13:13:17.184] }, finally = { [13:13:17.184] if (!identical(...future.workdir, getwd())) [13:13:17.184] setwd(...future.workdir) [13:13:17.184] { [13:13:17.184] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:17.184] ...future.oldOptions$nwarnings <- NULL [13:13:17.184] } [13:13:17.184] base::options(...future.oldOptions) [13:13:17.184] if (.Platform$OS.type == "windows") { [13:13:17.184] old_names <- names(...future.oldEnvVars) [13:13:17.184] envs <- base::Sys.getenv() [13:13:17.184] names <- names(envs) [13:13:17.184] common <- intersect(names, old_names) [13:13:17.184] added <- setdiff(names, old_names) [13:13:17.184] removed <- setdiff(old_names, names) [13:13:17.184] changed <- common[...future.oldEnvVars[common] != [13:13:17.184] envs[common]] [13:13:17.184] NAMES <- toupper(changed) [13:13:17.184] args <- list() [13:13:17.184] for (kk in seq_along(NAMES)) { [13:13:17.184] name <- changed[[kk]] [13:13:17.184] NAME <- NAMES[[kk]] [13:13:17.184] if (name != NAME && is.element(NAME, old_names)) [13:13:17.184] next [13:13:17.184] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:17.184] } [13:13:17.184] NAMES <- toupper(added) [13:13:17.184] for (kk in seq_along(NAMES)) { [13:13:17.184] name <- added[[kk]] [13:13:17.184] NAME <- NAMES[[kk]] [13:13:17.184] if (name != NAME && is.element(NAME, old_names)) [13:13:17.184] next [13:13:17.184] args[[name]] <- "" [13:13:17.184] } [13:13:17.184] NAMES <- toupper(removed) [13:13:17.184] for (kk in seq_along(NAMES)) { [13:13:17.184] name <- removed[[kk]] [13:13:17.184] NAME <- NAMES[[kk]] [13:13:17.184] if (name != NAME && is.element(NAME, old_names)) [13:13:17.184] next [13:13:17.184] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:17.184] } [13:13:17.184] if (length(args) > 0) [13:13:17.184] base::do.call(base::Sys.setenv, args = args) [13:13:17.184] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:17.184] } [13:13:17.184] else { [13:13:17.184] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:17.184] } [13:13:17.184] { [13:13:17.184] if (base::length(...future.futureOptionsAdded) > [13:13:17.184] 0L) { [13:13:17.184] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:17.184] base::names(opts) <- ...future.futureOptionsAdded [13:13:17.184] base::options(opts) [13:13:17.184] } [13:13:17.184] { [13:13:17.184] { [13:13:17.184] base::options(mc.cores = ...future.mc.cores.old) [13:13:17.184] NULL [13:13:17.184] } [13:13:17.184] options(future.plan = NULL) [13:13:17.184] if (is.na(NA_character_)) [13:13:17.184] Sys.unsetenv("R_FUTURE_PLAN") [13:13:17.184] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:17.184] future::plan(list(function (..., workers = availableCores(), [13:13:17.184] lazy = FALSE, rscript_libs = .libPaths(), [13:13:17.184] envir = parent.frame()) [13:13:17.184] { [13:13:17.184] if (is.function(workers)) [13:13:17.184] workers <- workers() [13:13:17.184] workers <- structure(as.integer(workers), [13:13:17.184] class = class(workers)) [13:13:17.184] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:17.184] workers >= 1) [13:13:17.184] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:17.184] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:17.184] } [13:13:17.184] future <- MultisessionFuture(..., workers = workers, [13:13:17.184] lazy = lazy, rscript_libs = rscript_libs, [13:13:17.184] envir = envir) [13:13:17.184] if (!future$lazy) [13:13:17.184] future <- run(future) [13:13:17.184] invisible(future) [13:13:17.184] }), .cleanup = FALSE, .init = FALSE) [13:13:17.184] } [13:13:17.184] } [13:13:17.184] } [13:13:17.184] }) [13:13:17.184] if (TRUE) { [13:13:17.184] base::sink(type = "output", split = FALSE) [13:13:17.184] if (TRUE) { [13:13:17.184] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:17.184] } [13:13:17.184] else { [13:13:17.184] ...future.result["stdout"] <- base::list(NULL) [13:13:17.184] } [13:13:17.184] base::close(...future.stdout) [13:13:17.184] ...future.stdout <- NULL [13:13:17.184] } [13:13:17.184] ...future.result$conditions <- ...future.conditions [13:13:17.184] ...future.result$finished <- base::Sys.time() [13:13:17.184] ...future.result [13:13:17.184] } [13:13:17.189] Exporting 5 global objects (1.21 KiB) to cluster node #1 ... [13:13:17.189] Exporting '...future.FUN' (1.21 KiB) to cluster node #1 ... [13:13:17.190] Exporting '...future.FUN' (1.21 KiB) to cluster node #1 ... DONE [13:13:17.190] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... [13:13:17.190] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... DONE [13:13:17.191] Exporting '...future.elements_ii' (1.60 KiB) to cluster node #1 ... [13:13:17.191] Exporting '...future.elements_ii' (1.60 KiB) to cluster node #1 ... DONE [13:13:17.191] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:13:17.192] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:13:17.192] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:13:17.192] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:13:17.193] Exporting 5 global objects (1.21 KiB) to cluster node #1 ... DONE [13:13:17.193] MultisessionFuture started [13:13:17.193] - Launch lazy future ... done [13:13:17.194] run() for 'MultisessionFuture' ... done [13:13:17.194] Created future: [13:13:17.210] receiveMessageFromWorker() for ClusterFuture ... [13:13:17.210] - Validating connection of MultisessionFuture [13:13:17.211] - received message: FutureResult [13:13:17.211] - Received FutureResult [13:13:17.211] - Erased future from FutureRegistry [13:13:17.211] result() for ClusterFuture ... [13:13:17.211] - result already collected: FutureResult [13:13:17.211] result() for ClusterFuture ... done [13:13:17.212] receiveMessageFromWorker() for ClusterFuture ... done [13:13:17.194] MultisessionFuture: [13:13:17.194] Label: 'future_by-1' [13:13:17.194] Expression: [13:13:17.194] { [13:13:17.194] do.call(function(...) { [13:13:17.194] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:17.194] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:17.194] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:17.194] on.exit(options(oopts), add = TRUE) [13:13:17.194] } [13:13:17.194] { [13:13:17.194] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:17.194] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:17.194] ...future.FUN(...future.X_jj, ...) [13:13:17.194] }) [13:13:17.194] } [13:13:17.194] }, args = future.call.arguments) [13:13:17.194] } [13:13:17.194] Lazy evaluation: FALSE [13:13:17.194] Asynchronous evaluation: TRUE [13:13:17.194] Local evaluation: TRUE [13:13:17.194] Environment: 0x0000018691393970 [13:13:17.194] Capture standard output: TRUE [13:13:17.194] Capture condition classes: 'condition' (excluding 'nothing') [13:13:17.194] Globals: 5 objects totaling 2.81 KiB (function '...future.FUN' of 1.21 KiB, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 1.60 KiB, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:13:17.194] Packages: [13:13:17.194] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:17.194] Resolved: TRUE [13:13:17.194] Value: [13:13:17.194] Conditions captured: [13:13:17.194] Early signaling: FALSE [13:13:17.194] Owner process: f0659542-730c-c20a-65b3-84f202449c4d [13:13:17.194] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:17.212] Chunk #1 of 2 ... DONE [13:13:17.212] Chunk #2 of 2 ... [13:13:17.212] - Finding globals in 'X' for chunk #2 ... [13:13:17.213] getGlobalsAndPackages() ... [13:13:17.213] Searching for globals... [13:13:17.213] [13:13:17.213] Searching for globals ... DONE [13:13:17.214] - globals: [0] [13:13:17.214] getGlobalsAndPackages() ... DONE [13:13:17.214] + additional globals found: [n=0] [13:13:17.214] + additional namespaces needed: [n=0] [13:13:17.214] - Finding globals in 'X' for chunk #2 ... DONE [13:13:17.214] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:13:17.214] - seeds: [13:13:17.215] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:17.215] getGlobalsAndPackages() ... [13:13:17.215] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:17.215] Resolving globals: FALSE [13:13:17.215] Tweak future expression to call with '...' arguments ... [13:13:17.216] { [13:13:17.216] do.call(function(...) { [13:13:17.216] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:17.216] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:17.216] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:17.216] on.exit(options(oopts), add = TRUE) [13:13:17.216] } [13:13:17.216] { [13:13:17.216] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:17.216] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:17.216] ...future.FUN(...future.X_jj, ...) [13:13:17.216] }) [13:13:17.216] } [13:13:17.216] }, args = future.call.arguments) [13:13:17.216] } [13:13:17.216] Tweak future expression to call with '...' arguments ... DONE [13:13:17.216] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:17.217] [13:13:17.217] getGlobalsAndPackages() ... DONE [13:13:17.217] run() for 'Future' ... [13:13:17.217] - state: 'created' [13:13:17.218] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:17.232] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:17.232] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:13:17.232] - Field: 'node' [13:13:17.233] - Field: 'label' [13:13:17.233] - Field: 'local' [13:13:17.233] - Field: 'owner' [13:13:17.233] - Field: 'envir' [13:13:17.233] - Field: 'workers' [13:13:17.234] - Field: 'packages' [13:13:17.234] - Field: 'gc' [13:13:17.234] - Field: 'conditions' [13:13:17.234] - Field: 'persistent' [13:13:17.234] - Field: 'expr' [13:13:17.234] - Field: 'uuid' [13:13:17.235] - Field: 'seed' [13:13:17.235] - Field: 'version' [13:13:17.235] - Field: 'result' [13:13:17.235] - Field: 'asynchronous' [13:13:17.235] - Field: 'calls' [13:13:17.235] - Field: 'globals' [13:13:17.236] - Field: 'stdout' [13:13:17.236] - Field: 'earlySignal' [13:13:17.236] - Field: 'lazy' [13:13:17.236] - Field: 'state' [13:13:17.236] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:13:17.237] - Launch lazy future ... [13:13:17.237] Packages needed by the future expression (n = 0): [13:13:17.237] Packages needed by future strategies (n = 0): [13:13:17.238] { [13:13:17.238] { [13:13:17.238] { [13:13:17.238] ...future.startTime <- base::Sys.time() [13:13:17.238] { [13:13:17.238] { [13:13:17.238] { [13:13:17.238] { [13:13:17.238] base::local({ [13:13:17.238] has_future <- base::requireNamespace("future", [13:13:17.238] quietly = TRUE) [13:13:17.238] if (has_future) { [13:13:17.238] ns <- base::getNamespace("future") [13:13:17.238] version <- ns[[".package"]][["version"]] [13:13:17.238] if (is.null(version)) [13:13:17.238] version <- utils::packageVersion("future") [13:13:17.238] } [13:13:17.238] else { [13:13:17.238] version <- NULL [13:13:17.238] } [13:13:17.238] if (!has_future || version < "1.8.0") { [13:13:17.238] info <- base::c(r_version = base::gsub("R version ", [13:13:17.238] "", base::R.version$version.string), [13:13:17.238] platform = base::sprintf("%s (%s-bit)", [13:13:17.238] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:17.238] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:17.238] "release", "version")], collapse = " "), [13:13:17.238] hostname = base::Sys.info()[["nodename"]]) [13:13:17.238] info <- base::sprintf("%s: %s", base::names(info), [13:13:17.238] info) [13:13:17.238] info <- base::paste(info, collapse = "; ") [13:13:17.238] if (!has_future) { [13:13:17.238] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:17.238] info) [13:13:17.238] } [13:13:17.238] else { [13:13:17.238] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:17.238] info, version) [13:13:17.238] } [13:13:17.238] base::stop(msg) [13:13:17.238] } [13:13:17.238] }) [13:13:17.238] } [13:13:17.238] ...future.mc.cores.old <- base::getOption("mc.cores") [13:13:17.238] base::options(mc.cores = 1L) [13:13:17.238] } [13:13:17.238] options(future.plan = NULL) [13:13:17.238] Sys.unsetenv("R_FUTURE_PLAN") [13:13:17.238] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:17.238] } [13:13:17.238] ...future.workdir <- getwd() [13:13:17.238] } [13:13:17.238] ...future.oldOptions <- base::as.list(base::.Options) [13:13:17.238] ...future.oldEnvVars <- base::Sys.getenv() [13:13:17.238] } [13:13:17.238] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:17.238] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:13:17.238] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:17.238] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:17.238] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:17.238] future.stdout.windows.reencode = NULL, width = 80L) [13:13:17.238] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:17.238] base::names(...future.oldOptions)) [13:13:17.238] } [13:13:17.238] if (FALSE) { [13:13:17.238] } [13:13:17.238] else { [13:13:17.238] if (TRUE) { [13:13:17.238] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:17.238] open = "w") [13:13:17.238] } [13:13:17.238] else { [13:13:17.238] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:17.238] windows = "NUL", "/dev/null"), open = "w") [13:13:17.238] } [13:13:17.238] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:17.238] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:17.238] base::sink(type = "output", split = FALSE) [13:13:17.238] base::close(...future.stdout) [13:13:17.238] }, add = TRUE) [13:13:17.238] } [13:13:17.238] ...future.frame <- base::sys.nframe() [13:13:17.238] ...future.conditions <- base::list() [13:13:17.238] ...future.rng <- base::globalenv()$.Random.seed [13:13:17.238] if (FALSE) { [13:13:17.238] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:17.238] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:17.238] } [13:13:17.238] ...future.result <- base::tryCatch({ [13:13:17.238] base::withCallingHandlers({ [13:13:17.238] ...future.value <- base::withVisible(base::local({ [13:13:17.238] ...future.makeSendCondition <- local({ [13:13:17.238] sendCondition <- NULL [13:13:17.238] function(frame = 1L) { [13:13:17.238] if (is.function(sendCondition)) [13:13:17.238] return(sendCondition) [13:13:17.238] ns <- getNamespace("parallel") [13:13:17.238] if (exists("sendData", mode = "function", [13:13:17.238] envir = ns)) { [13:13:17.238] parallel_sendData <- get("sendData", mode = "function", [13:13:17.238] envir = ns) [13:13:17.238] envir <- sys.frame(frame) [13:13:17.238] master <- NULL [13:13:17.238] while (!identical(envir, .GlobalEnv) && [13:13:17.238] !identical(envir, emptyenv())) { [13:13:17.238] if (exists("master", mode = "list", envir = envir, [13:13:17.238] inherits = FALSE)) { [13:13:17.238] master <- get("master", mode = "list", [13:13:17.238] envir = envir, inherits = FALSE) [13:13:17.238] if (inherits(master, c("SOCKnode", [13:13:17.238] "SOCK0node"))) { [13:13:17.238] sendCondition <<- function(cond) { [13:13:17.238] data <- list(type = "VALUE", value = cond, [13:13:17.238] success = TRUE) [13:13:17.238] parallel_sendData(master, data) [13:13:17.238] } [13:13:17.238] return(sendCondition) [13:13:17.238] } [13:13:17.238] } [13:13:17.238] frame <- frame + 1L [13:13:17.238] envir <- sys.frame(frame) [13:13:17.238] } [13:13:17.238] } [13:13:17.238] sendCondition <<- function(cond) NULL [13:13:17.238] } [13:13:17.238] }) [13:13:17.238] withCallingHandlers({ [13:13:17.238] { [13:13:17.238] do.call(function(...) { [13:13:17.238] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:17.238] if (!identical(...future.globals.maxSize.org, [13:13:17.238] ...future.globals.maxSize)) { [13:13:17.238] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:17.238] on.exit(options(oopts), add = TRUE) [13:13:17.238] } [13:13:17.238] { [13:13:17.238] lapply(seq_along(...future.elements_ii), [13:13:17.238] FUN = function(jj) { [13:13:17.238] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:17.238] ...future.FUN(...future.X_jj, ...) [13:13:17.238] }) [13:13:17.238] } [13:13:17.238] }, args = future.call.arguments) [13:13:17.238] } [13:13:17.238] }, immediateCondition = function(cond) { [13:13:17.238] sendCondition <- ...future.makeSendCondition() [13:13:17.238] sendCondition(cond) [13:13:17.238] muffleCondition <- function (cond, pattern = "^muffle") [13:13:17.238] { [13:13:17.238] inherits <- base::inherits [13:13:17.238] invokeRestart <- base::invokeRestart [13:13:17.238] is.null <- base::is.null [13:13:17.238] muffled <- FALSE [13:13:17.238] if (inherits(cond, "message")) { [13:13:17.238] muffled <- grepl(pattern, "muffleMessage") [13:13:17.238] if (muffled) [13:13:17.238] invokeRestart("muffleMessage") [13:13:17.238] } [13:13:17.238] else if (inherits(cond, "warning")) { [13:13:17.238] muffled <- grepl(pattern, "muffleWarning") [13:13:17.238] if (muffled) [13:13:17.238] invokeRestart("muffleWarning") [13:13:17.238] } [13:13:17.238] else if (inherits(cond, "condition")) { [13:13:17.238] if (!is.null(pattern)) { [13:13:17.238] computeRestarts <- base::computeRestarts [13:13:17.238] grepl <- base::grepl [13:13:17.238] restarts <- computeRestarts(cond) [13:13:17.238] for (restart in restarts) { [13:13:17.238] name <- restart$name [13:13:17.238] if (is.null(name)) [13:13:17.238] next [13:13:17.238] if (!grepl(pattern, name)) [13:13:17.238] next [13:13:17.238] invokeRestart(restart) [13:13:17.238] muffled <- TRUE [13:13:17.238] break [13:13:17.238] } [13:13:17.238] } [13:13:17.238] } [13:13:17.238] invisible(muffled) [13:13:17.238] } [13:13:17.238] muffleCondition(cond) [13:13:17.238] }) [13:13:17.238] })) [13:13:17.238] future::FutureResult(value = ...future.value$value, [13:13:17.238] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:17.238] ...future.rng), globalenv = if (FALSE) [13:13:17.238] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:17.238] ...future.globalenv.names)) [13:13:17.238] else NULL, started = ...future.startTime, version = "1.8") [13:13:17.238] }, condition = base::local({ [13:13:17.238] c <- base::c [13:13:17.238] inherits <- base::inherits [13:13:17.238] invokeRestart <- base::invokeRestart [13:13:17.238] length <- base::length [13:13:17.238] list <- base::list [13:13:17.238] seq.int <- base::seq.int [13:13:17.238] signalCondition <- base::signalCondition [13:13:17.238] sys.calls <- base::sys.calls [13:13:17.238] `[[` <- base::`[[` [13:13:17.238] `+` <- base::`+` [13:13:17.238] `<<-` <- base::`<<-` [13:13:17.238] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:17.238] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:17.238] 3L)] [13:13:17.238] } [13:13:17.238] function(cond) { [13:13:17.238] is_error <- inherits(cond, "error") [13:13:17.238] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:17.238] NULL) [13:13:17.238] if (is_error) { [13:13:17.238] sessionInformation <- function() { [13:13:17.238] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:17.238] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:17.238] search = base::search(), system = base::Sys.info()) [13:13:17.238] } [13:13:17.238] ...future.conditions[[length(...future.conditions) + [13:13:17.238] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:17.238] cond$call), session = sessionInformation(), [13:13:17.238] timestamp = base::Sys.time(), signaled = 0L) [13:13:17.238] signalCondition(cond) [13:13:17.238] } [13:13:17.238] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:17.238] "immediateCondition"))) { [13:13:17.238] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:17.238] ...future.conditions[[length(...future.conditions) + [13:13:17.238] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:17.238] if (TRUE && !signal) { [13:13:17.238] muffleCondition <- function (cond, pattern = "^muffle") [13:13:17.238] { [13:13:17.238] inherits <- base::inherits [13:13:17.238] invokeRestart <- base::invokeRestart [13:13:17.238] is.null <- base::is.null [13:13:17.238] muffled <- FALSE [13:13:17.238] if (inherits(cond, "message")) { [13:13:17.238] muffled <- grepl(pattern, "muffleMessage") [13:13:17.238] if (muffled) [13:13:17.238] invokeRestart("muffleMessage") [13:13:17.238] } [13:13:17.238] else if (inherits(cond, "warning")) { [13:13:17.238] muffled <- grepl(pattern, "muffleWarning") [13:13:17.238] if (muffled) [13:13:17.238] invokeRestart("muffleWarning") [13:13:17.238] } [13:13:17.238] else if (inherits(cond, "condition")) { [13:13:17.238] if (!is.null(pattern)) { [13:13:17.238] computeRestarts <- base::computeRestarts [13:13:17.238] grepl <- base::grepl [13:13:17.238] restarts <- computeRestarts(cond) [13:13:17.238] for (restart in restarts) { [13:13:17.238] name <- restart$name [13:13:17.238] if (is.null(name)) [13:13:17.238] next [13:13:17.238] if (!grepl(pattern, name)) [13:13:17.238] next [13:13:17.238] invokeRestart(restart) [13:13:17.238] muffled <- TRUE [13:13:17.238] break [13:13:17.238] } [13:13:17.238] } [13:13:17.238] } [13:13:17.238] invisible(muffled) [13:13:17.238] } [13:13:17.238] muffleCondition(cond, pattern = "^muffle") [13:13:17.238] } [13:13:17.238] } [13:13:17.238] else { [13:13:17.238] if (TRUE) { [13:13:17.238] muffleCondition <- function (cond, pattern = "^muffle") [13:13:17.238] { [13:13:17.238] inherits <- base::inherits [13:13:17.238] invokeRestart <- base::invokeRestart [13:13:17.238] is.null <- base::is.null [13:13:17.238] muffled <- FALSE [13:13:17.238] if (inherits(cond, "message")) { [13:13:17.238] muffled <- grepl(pattern, "muffleMessage") [13:13:17.238] if (muffled) [13:13:17.238] invokeRestart("muffleMessage") [13:13:17.238] } [13:13:17.238] else if (inherits(cond, "warning")) { [13:13:17.238] muffled <- grepl(pattern, "muffleWarning") [13:13:17.238] if (muffled) [13:13:17.238] invokeRestart("muffleWarning") [13:13:17.238] } [13:13:17.238] else if (inherits(cond, "condition")) { [13:13:17.238] if (!is.null(pattern)) { [13:13:17.238] computeRestarts <- base::computeRestarts [13:13:17.238] grepl <- base::grepl [13:13:17.238] restarts <- computeRestarts(cond) [13:13:17.238] for (restart in restarts) { [13:13:17.238] name <- restart$name [13:13:17.238] if (is.null(name)) [13:13:17.238] next [13:13:17.238] if (!grepl(pattern, name)) [13:13:17.238] next [13:13:17.238] invokeRestart(restart) [13:13:17.238] muffled <- TRUE [13:13:17.238] break [13:13:17.238] } [13:13:17.238] } [13:13:17.238] } [13:13:17.238] invisible(muffled) [13:13:17.238] } [13:13:17.238] muffleCondition(cond, pattern = "^muffle") [13:13:17.238] } [13:13:17.238] } [13:13:17.238] } [13:13:17.238] })) [13:13:17.238] }, error = function(ex) { [13:13:17.238] base::structure(base::list(value = NULL, visible = NULL, [13:13:17.238] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:17.238] ...future.rng), started = ...future.startTime, [13:13:17.238] finished = Sys.time(), session_uuid = NA_character_, [13:13:17.238] version = "1.8"), class = "FutureResult") [13:13:17.238] }, finally = { [13:13:17.238] if (!identical(...future.workdir, getwd())) [13:13:17.238] setwd(...future.workdir) [13:13:17.238] { [13:13:17.238] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:17.238] ...future.oldOptions$nwarnings <- NULL [13:13:17.238] } [13:13:17.238] base::options(...future.oldOptions) [13:13:17.238] if (.Platform$OS.type == "windows") { [13:13:17.238] old_names <- names(...future.oldEnvVars) [13:13:17.238] envs <- base::Sys.getenv() [13:13:17.238] names <- names(envs) [13:13:17.238] common <- intersect(names, old_names) [13:13:17.238] added <- setdiff(names, old_names) [13:13:17.238] removed <- setdiff(old_names, names) [13:13:17.238] changed <- common[...future.oldEnvVars[common] != [13:13:17.238] envs[common]] [13:13:17.238] NAMES <- toupper(changed) [13:13:17.238] args <- list() [13:13:17.238] for (kk in seq_along(NAMES)) { [13:13:17.238] name <- changed[[kk]] [13:13:17.238] NAME <- NAMES[[kk]] [13:13:17.238] if (name != NAME && is.element(NAME, old_names)) [13:13:17.238] next [13:13:17.238] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:17.238] } [13:13:17.238] NAMES <- toupper(added) [13:13:17.238] for (kk in seq_along(NAMES)) { [13:13:17.238] name <- added[[kk]] [13:13:17.238] NAME <- NAMES[[kk]] [13:13:17.238] if (name != NAME && is.element(NAME, old_names)) [13:13:17.238] next [13:13:17.238] args[[name]] <- "" [13:13:17.238] } [13:13:17.238] NAMES <- toupper(removed) [13:13:17.238] for (kk in seq_along(NAMES)) { [13:13:17.238] name <- removed[[kk]] [13:13:17.238] NAME <- NAMES[[kk]] [13:13:17.238] if (name != NAME && is.element(NAME, old_names)) [13:13:17.238] next [13:13:17.238] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:17.238] } [13:13:17.238] if (length(args) > 0) [13:13:17.238] base::do.call(base::Sys.setenv, args = args) [13:13:17.238] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:17.238] } [13:13:17.238] else { [13:13:17.238] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:17.238] } [13:13:17.238] { [13:13:17.238] if (base::length(...future.futureOptionsAdded) > [13:13:17.238] 0L) { [13:13:17.238] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:17.238] base::names(opts) <- ...future.futureOptionsAdded [13:13:17.238] base::options(opts) [13:13:17.238] } [13:13:17.238] { [13:13:17.238] { [13:13:17.238] base::options(mc.cores = ...future.mc.cores.old) [13:13:17.238] NULL [13:13:17.238] } [13:13:17.238] options(future.plan = NULL) [13:13:17.238] if (is.na(NA_character_)) [13:13:17.238] Sys.unsetenv("R_FUTURE_PLAN") [13:13:17.238] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:17.238] future::plan(list(function (..., workers = availableCores(), [13:13:17.238] lazy = FALSE, rscript_libs = .libPaths(), [13:13:17.238] envir = parent.frame()) [13:13:17.238] { [13:13:17.238] if (is.function(workers)) [13:13:17.238] workers <- workers() [13:13:17.238] workers <- structure(as.integer(workers), [13:13:17.238] class = class(workers)) [13:13:17.238] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:17.238] workers >= 1) [13:13:17.238] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:17.238] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:17.238] } [13:13:17.238] future <- MultisessionFuture(..., workers = workers, [13:13:17.238] lazy = lazy, rscript_libs = rscript_libs, [13:13:17.238] envir = envir) [13:13:17.238] if (!future$lazy) [13:13:17.238] future <- run(future) [13:13:17.238] invisible(future) [13:13:17.238] }), .cleanup = FALSE, .init = FALSE) [13:13:17.238] } [13:13:17.238] } [13:13:17.238] } [13:13:17.238] }) [13:13:17.238] if (TRUE) { [13:13:17.238] base::sink(type = "output", split = FALSE) [13:13:17.238] if (TRUE) { [13:13:17.238] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:17.238] } [13:13:17.238] else { [13:13:17.238] ...future.result["stdout"] <- base::list(NULL) [13:13:17.238] } [13:13:17.238] base::close(...future.stdout) [13:13:17.238] ...future.stdout <- NULL [13:13:17.238] } [13:13:17.238] ...future.result$conditions <- ...future.conditions [13:13:17.238] ...future.result$finished <- base::Sys.time() [13:13:17.238] ...future.result [13:13:17.238] } [13:13:17.243] Exporting 5 global objects (1.21 KiB) to cluster node #1 ... [13:13:17.243] Exporting '...future.FUN' (1.21 KiB) to cluster node #1 ... [13:13:17.244] Exporting '...future.FUN' (1.21 KiB) to cluster node #1 ... DONE [13:13:17.244] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... [13:13:17.245] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... DONE [13:13:17.247] Exporting '...future.elements_ii' (3.20 KiB) to cluster node #1 ... [13:13:17.247] Exporting '...future.elements_ii' (3.20 KiB) to cluster node #1 ... DONE [13:13:17.247] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:13:17.248] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:13:17.248] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:13:17.248] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:13:17.249] Exporting 5 global objects (1.21 KiB) to cluster node #1 ... DONE [13:13:17.249] MultisessionFuture started [13:13:17.250] - Launch lazy future ... done [13:13:17.250] run() for 'MultisessionFuture' ... done [13:13:17.250] Created future: [13:13:17.266] receiveMessageFromWorker() for ClusterFuture ... [13:13:17.267] - Validating connection of MultisessionFuture [13:13:17.267] - received message: FutureResult [13:13:17.267] - Received FutureResult [13:13:17.267] - Erased future from FutureRegistry [13:13:17.268] result() for ClusterFuture ... [13:13:17.268] - result already collected: FutureResult [13:13:17.268] result() for ClusterFuture ... done [13:13:17.268] receiveMessageFromWorker() for ClusterFuture ... done [13:13:17.250] MultisessionFuture: [13:13:17.250] Label: 'future_by-2' [13:13:17.250] Expression: [13:13:17.250] { [13:13:17.250] do.call(function(...) { [13:13:17.250] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:17.250] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:17.250] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:17.250] on.exit(options(oopts), add = TRUE) [13:13:17.250] } [13:13:17.250] { [13:13:17.250] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:17.250] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:17.250] ...future.FUN(...future.X_jj, ...) [13:13:17.250] }) [13:13:17.250] } [13:13:17.250] }, args = future.call.arguments) [13:13:17.250] } [13:13:17.250] Lazy evaluation: FALSE [13:13:17.250] Asynchronous evaluation: TRUE [13:13:17.250] Local evaluation: TRUE [13:13:17.250] Environment: 0x0000018691393970 [13:13:17.250] Capture standard output: TRUE [13:13:17.250] Capture condition classes: 'condition' (excluding 'nothing') [13:13:17.250] Globals: 5 objects totaling 4.41 KiB (function '...future.FUN' of 1.21 KiB, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 3.20 KiB, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:13:17.250] Packages: [13:13:17.250] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:17.250] Resolved: TRUE [13:13:17.250] Value: [13:13:17.250] Conditions captured: [13:13:17.250] Early signaling: FALSE [13:13:17.250] Owner process: f0659542-730c-c20a-65b3-84f202449c4d [13:13:17.250] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:17.268] Chunk #2 of 2 ... DONE [13:13:17.269] Launching 2 futures (chunks) ... DONE [13:13:17.269] Resolving 2 futures (chunks) ... [13:13:17.269] resolve() on list ... [13:13:17.269] recursive: 0 [13:13:17.269] length: 2 [13:13:17.269] [13:13:17.270] Future #1 [13:13:17.270] result() for ClusterFuture ... [13:13:17.270] - result already collected: FutureResult [13:13:17.270] result() for ClusterFuture ... done [13:13:17.270] result() for ClusterFuture ... [13:13:17.270] - result already collected: FutureResult [13:13:17.270] result() for ClusterFuture ... done [13:13:17.271] signalConditionsASAP(MultisessionFuture, pos=1) ... [13:13:17.271] - nx: 2 [13:13:17.271] - relay: TRUE [13:13:17.271] - stdout: TRUE [13:13:17.271] - signal: TRUE [13:13:17.271] - resignal: FALSE [13:13:17.272] - force: TRUE [13:13:17.272] - relayed: [n=2] FALSE, FALSE [13:13:17.272] - queued futures: [n=2] FALSE, FALSE [13:13:17.272] - until=1 [13:13:17.272] - relaying element #1 [13:13:17.272] result() for ClusterFuture ... [13:13:17.273] - result already collected: FutureResult [13:13:17.273] result() for ClusterFuture ... done [13:13:17.273] result() for ClusterFuture ... [13:13:17.273] - result already collected: FutureResult [13:13:17.273] result() for ClusterFuture ... done [13:13:17.273] result() for ClusterFuture ... [13:13:17.274] - result already collected: FutureResult [13:13:17.274] result() for ClusterFuture ... done [13:13:17.274] result() for ClusterFuture ... [13:13:17.274] - result already collected: FutureResult [13:13:17.274] result() for ClusterFuture ... done [13:13:17.274] - relayed: [n=2] TRUE, FALSE [13:13:17.274] - queued futures: [n=2] TRUE, FALSE [13:13:17.275] signalConditionsASAP(MultisessionFuture, pos=1) ... done [13:13:17.275] length: 1 (resolved future 1) [13:13:17.275] Future #2 [13:13:17.275] result() for ClusterFuture ... [13:13:17.275] - result already collected: FutureResult [13:13:17.275] result() for ClusterFuture ... done [13:13:17.276] result() for ClusterFuture ... [13:13:17.276] - result already collected: FutureResult [13:13:17.276] result() for ClusterFuture ... done [13:13:17.276] signalConditionsASAP(MultisessionFuture, pos=2) ... [13:13:17.276] - nx: 2 [13:13:17.276] - relay: TRUE [13:13:17.277] - stdout: TRUE [13:13:17.277] - signal: TRUE [13:13:17.277] - resignal: FALSE [13:13:17.277] - force: TRUE [13:13:17.277] - relayed: [n=2] TRUE, FALSE [13:13:17.277] - queued futures: [n=2] TRUE, FALSE [13:13:17.277] - until=2 [13:13:17.278] - relaying element #2 [13:13:17.278] result() for ClusterFuture ... [13:13:17.278] - result already collected: FutureResult [13:13:17.278] result() for ClusterFuture ... done [13:13:17.278] result() for ClusterFuture ... [13:13:17.278] - result already collected: FutureResult [13:13:17.278] result() for ClusterFuture ... done [13:13:17.279] result() for ClusterFuture ... [13:13:17.279] - result already collected: FutureResult [13:13:17.279] result() for ClusterFuture ... done [13:13:17.279] result() for ClusterFuture ... [13:13:17.279] - result already collected: FutureResult [13:13:17.279] result() for ClusterFuture ... done [13:13:17.280] - relayed: [n=2] TRUE, TRUE [13:13:17.280] - queued futures: [n=2] TRUE, TRUE [13:13:17.280] signalConditionsASAP(MultisessionFuture, pos=2) ... done [13:13:17.280] length: 0 (resolved future 2) [13:13:17.280] Relaying remaining futures [13:13:17.281] signalConditionsASAP(NULL, pos=0) ... [13:13:17.281] - nx: 2 [13:13:17.281] - relay: TRUE [13:13:17.281] - stdout: TRUE [13:13:17.281] - signal: TRUE [13:13:17.281] - resignal: FALSE [13:13:17.281] - force: TRUE [13:13:17.282] - relayed: [n=2] TRUE, TRUE [13:13:17.282] - queued futures: [n=2] TRUE, TRUE - flush all [13:13:17.282] - relayed: [n=2] TRUE, TRUE [13:13:17.282] - queued futures: [n=2] TRUE, TRUE [13:13:17.282] signalConditionsASAP(NULL, pos=0) ... done [13:13:17.282] resolve() on list ... DONE [13:13:17.283] result() for ClusterFuture ... [13:13:17.283] - result already collected: FutureResult [13:13:17.283] result() for ClusterFuture ... done [13:13:17.283] result() for ClusterFuture ... [13:13:17.283] - result already collected: FutureResult [13:13:17.283] result() for ClusterFuture ... done [13:13:17.284] result() for ClusterFuture ... [13:13:17.284] - result already collected: FutureResult [13:13:17.284] result() for ClusterFuture ... done [13:13:17.284] result() for ClusterFuture ... [13:13:17.284] - result already collected: FutureResult [13:13:17.284] result() for ClusterFuture ... done [13:13:17.285] - Number of value chunks collected: 2 [13:13:17.285] Resolving 2 futures (chunks) ... DONE [13:13:17.285] Reducing values from 2 chunks ... [13:13:17.285] - Number of values collected after concatenation: 3 [13:13:17.285] - Number of values expected: 3 [13:13:17.285] Reducing values from 2 chunks ... DONE [13:13:17.285] future_lapply() ... DONE [13:13:17.286] future_by_internal() ... DONE [13:13:17.287] future_by_internal() ... Warning: Specifying the function 'FUN' for future_by() as a character string is deprecated in future.apply (>= 1.10.0) [2022-11-04], because base::by() does not support it. Instead, specify it as a function, e.g. FUN = sqrt and FUN = `[[`. It is deprecated. [13:13:17.287] future_lapply() ... [13:13:17.290] Number of chunks: 2 [13:13:17.290] getGlobalsAndPackagesXApply() ... [13:13:17.290] - future.globals: TRUE [13:13:17.291] getGlobalsAndPackages() ... [13:13:17.291] Searching for globals... [13:13:17.292] - globals found: [2] 'FUN', 'UseMethod' [13:13:17.292] Searching for globals ... DONE [13:13:17.292] Resolving globals: FALSE [13:13:17.293] The total size of the 1 globals is 1.21 KiB (1240 bytes) [13:13:17.293] The total size of the 1 globals exported for future expression ('FUN()') is 1.21 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (1.21 KiB of class 'function') [13:13:17.293] - globals: [1] 'FUN' [13:13:17.294] [13:13:17.294] getGlobalsAndPackages() ... DONE [13:13:17.294] - globals found/used: [n=1] 'FUN' [13:13:17.294] - needed namespaces: [n=0] [13:13:17.294] Finding globals ... DONE [13:13:17.294] - use_args: TRUE [13:13:17.295] - Getting '...' globals ... [13:13:17.295] resolve() on list ... [13:13:17.295] recursive: 0 [13:13:17.295] length: 1 [13:13:17.295] elements: '...' [13:13:17.296] length: 0 (resolved future 1) [13:13:17.296] resolve() on list ... DONE [13:13:17.296] - '...' content: [n=0] [13:13:17.296] List of 1 [13:13:17.296] $ ...: list() [13:13:17.296] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:17.296] - attr(*, "where")=List of 1 [13:13:17.296] ..$ ...: [13:13:17.296] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:17.296] - attr(*, "resolved")= logi TRUE [13:13:17.296] - attr(*, "total_size")= num NA [13:13:17.299] - Getting '...' globals ... DONE [13:13:17.299] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:17.300] List of 2 [13:13:17.300] $ ...future.FUN:function (object, ...) [13:13:17.300] $ ... : list() [13:13:17.300] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:17.300] - attr(*, "where")=List of 2 [13:13:17.300] ..$ ...future.FUN: [13:13:17.300] ..$ ... : [13:13:17.300] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:17.300] - attr(*, "resolved")= logi FALSE [13:13:17.300] - attr(*, "total_size")= num 1240 [13:13:17.303] Packages to be attached in all futures: [n=0] [13:13:17.303] getGlobalsAndPackagesXApply() ... DONE [13:13:17.303] Number of futures (= number of chunks): 2 [13:13:17.304] Launching 2 futures (chunks) ... [13:13:17.304] Chunk #1 of 2 ... [13:13:17.304] - Finding globals in 'X' for chunk #1 ... [13:13:17.304] getGlobalsAndPackages() ... [13:13:17.304] Searching for globals... [13:13:17.305] [13:13:17.305] Searching for globals ... DONE [13:13:17.305] - globals: [0] [13:13:17.305] getGlobalsAndPackages() ... DONE [13:13:17.305] + additional globals found: [n=0] [13:13:17.305] + additional namespaces needed: [n=0] [13:13:17.306] - Finding globals in 'X' for chunk #1 ... DONE [13:13:17.306] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:13:17.306] - seeds: [13:13:17.306] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:17.306] getGlobalsAndPackages() ... [13:13:17.306] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:17.307] Resolving globals: FALSE [13:13:17.307] Tweak future expression to call with '...' arguments ... [13:13:17.307] { [13:13:17.307] do.call(function(...) { [13:13:17.307] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:17.307] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:17.307] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:17.307] on.exit(options(oopts), add = TRUE) [13:13:17.307] } [13:13:17.307] { [13:13:17.307] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:17.307] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:17.307] ...future.FUN(...future.X_jj, ...) [13:13:17.307] }) [13:13:17.307] } [13:13:17.307] }, args = future.call.arguments) [13:13:17.307] } [13:13:17.308] Tweak future expression to call with '...' arguments ... DONE [13:13:17.308] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:17.308] [13:13:17.308] getGlobalsAndPackages() ... DONE [13:13:17.309] run() for 'Future' ... [13:13:17.309] - state: 'created' [13:13:17.309] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:17.323] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:17.323] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:13:17.323] - Field: 'node' [13:13:17.324] - Field: 'label' [13:13:17.324] - Field: 'local' [13:13:17.324] - Field: 'owner' [13:13:17.324] - Field: 'envir' [13:13:17.324] - Field: 'workers' [13:13:17.324] - Field: 'packages' [13:13:17.325] - Field: 'gc' [13:13:17.325] - Field: 'conditions' [13:13:17.325] - Field: 'persistent' [13:13:17.325] - Field: 'expr' [13:13:17.325] - Field: 'uuid' [13:13:17.325] - Field: 'seed' [13:13:17.326] - Field: 'version' [13:13:17.326] - Field: 'result' [13:13:17.326] - Field: 'asynchronous' [13:13:17.326] - Field: 'calls' [13:13:17.326] - Field: 'globals' [13:13:17.327] - Field: 'stdout' [13:13:17.327] - Field: 'earlySignal' [13:13:17.327] - Field: 'lazy' [13:13:17.327] - Field: 'state' [13:13:17.327] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:13:17.327] - Launch lazy future ... [13:13:17.328] Packages needed by the future expression (n = 0): [13:13:17.328] Packages needed by future strategies (n = 0): [13:13:17.328] { [13:13:17.328] { [13:13:17.328] { [13:13:17.328] ...future.startTime <- base::Sys.time() [13:13:17.328] { [13:13:17.328] { [13:13:17.328] { [13:13:17.328] { [13:13:17.328] base::local({ [13:13:17.328] has_future <- base::requireNamespace("future", [13:13:17.328] quietly = TRUE) [13:13:17.328] if (has_future) { [13:13:17.328] ns <- base::getNamespace("future") [13:13:17.328] version <- ns[[".package"]][["version"]] [13:13:17.328] if (is.null(version)) [13:13:17.328] version <- utils::packageVersion("future") [13:13:17.328] } [13:13:17.328] else { [13:13:17.328] version <- NULL [13:13:17.328] } [13:13:17.328] if (!has_future || version < "1.8.0") { [13:13:17.328] info <- base::c(r_version = base::gsub("R version ", [13:13:17.328] "", base::R.version$version.string), [13:13:17.328] platform = base::sprintf("%s (%s-bit)", [13:13:17.328] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:17.328] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:17.328] "release", "version")], collapse = " "), [13:13:17.328] hostname = base::Sys.info()[["nodename"]]) [13:13:17.328] info <- base::sprintf("%s: %s", base::names(info), [13:13:17.328] info) [13:13:17.328] info <- base::paste(info, collapse = "; ") [13:13:17.328] if (!has_future) { [13:13:17.328] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:17.328] info) [13:13:17.328] } [13:13:17.328] else { [13:13:17.328] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:17.328] info, version) [13:13:17.328] } [13:13:17.328] base::stop(msg) [13:13:17.328] } [13:13:17.328] }) [13:13:17.328] } [13:13:17.328] ...future.mc.cores.old <- base::getOption("mc.cores") [13:13:17.328] base::options(mc.cores = 1L) [13:13:17.328] } [13:13:17.328] options(future.plan = NULL) [13:13:17.328] Sys.unsetenv("R_FUTURE_PLAN") [13:13:17.328] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:17.328] } [13:13:17.328] ...future.workdir <- getwd() [13:13:17.328] } [13:13:17.328] ...future.oldOptions <- base::as.list(base::.Options) [13:13:17.328] ...future.oldEnvVars <- base::Sys.getenv() [13:13:17.328] } [13:13:17.328] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:17.328] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:13:17.328] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:17.328] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:17.328] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:17.328] future.stdout.windows.reencode = NULL, width = 80L) [13:13:17.328] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:17.328] base::names(...future.oldOptions)) [13:13:17.328] } [13:13:17.328] if (FALSE) { [13:13:17.328] } [13:13:17.328] else { [13:13:17.328] if (TRUE) { [13:13:17.328] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:17.328] open = "w") [13:13:17.328] } [13:13:17.328] else { [13:13:17.328] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:17.328] windows = "NUL", "/dev/null"), open = "w") [13:13:17.328] } [13:13:17.328] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:17.328] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:17.328] base::sink(type = "output", split = FALSE) [13:13:17.328] base::close(...future.stdout) [13:13:17.328] }, add = TRUE) [13:13:17.328] } [13:13:17.328] ...future.frame <- base::sys.nframe() [13:13:17.328] ...future.conditions <- base::list() [13:13:17.328] ...future.rng <- base::globalenv()$.Random.seed [13:13:17.328] if (FALSE) { [13:13:17.328] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:17.328] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:17.328] } [13:13:17.328] ...future.result <- base::tryCatch({ [13:13:17.328] base::withCallingHandlers({ [13:13:17.328] ...future.value <- base::withVisible(base::local({ [13:13:17.328] ...future.makeSendCondition <- local({ [13:13:17.328] sendCondition <- NULL [13:13:17.328] function(frame = 1L) { [13:13:17.328] if (is.function(sendCondition)) [13:13:17.328] return(sendCondition) [13:13:17.328] ns <- getNamespace("parallel") [13:13:17.328] if (exists("sendData", mode = "function", [13:13:17.328] envir = ns)) { [13:13:17.328] parallel_sendData <- get("sendData", mode = "function", [13:13:17.328] envir = ns) [13:13:17.328] envir <- sys.frame(frame) [13:13:17.328] master <- NULL [13:13:17.328] while (!identical(envir, .GlobalEnv) && [13:13:17.328] !identical(envir, emptyenv())) { [13:13:17.328] if (exists("master", mode = "list", envir = envir, [13:13:17.328] inherits = FALSE)) { [13:13:17.328] master <- get("master", mode = "list", [13:13:17.328] envir = envir, inherits = FALSE) [13:13:17.328] if (inherits(master, c("SOCKnode", [13:13:17.328] "SOCK0node"))) { [13:13:17.328] sendCondition <<- function(cond) { [13:13:17.328] data <- list(type = "VALUE", value = cond, [13:13:17.328] success = TRUE) [13:13:17.328] parallel_sendData(master, data) [13:13:17.328] } [13:13:17.328] return(sendCondition) [13:13:17.328] } [13:13:17.328] } [13:13:17.328] frame <- frame + 1L [13:13:17.328] envir <- sys.frame(frame) [13:13:17.328] } [13:13:17.328] } [13:13:17.328] sendCondition <<- function(cond) NULL [13:13:17.328] } [13:13:17.328] }) [13:13:17.328] withCallingHandlers({ [13:13:17.328] { [13:13:17.328] do.call(function(...) { [13:13:17.328] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:17.328] if (!identical(...future.globals.maxSize.org, [13:13:17.328] ...future.globals.maxSize)) { [13:13:17.328] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:17.328] on.exit(options(oopts), add = TRUE) [13:13:17.328] } [13:13:17.328] { [13:13:17.328] lapply(seq_along(...future.elements_ii), [13:13:17.328] FUN = function(jj) { [13:13:17.328] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:17.328] ...future.FUN(...future.X_jj, ...) [13:13:17.328] }) [13:13:17.328] } [13:13:17.328] }, args = future.call.arguments) [13:13:17.328] } [13:13:17.328] }, immediateCondition = function(cond) { [13:13:17.328] sendCondition <- ...future.makeSendCondition() [13:13:17.328] sendCondition(cond) [13:13:17.328] muffleCondition <- function (cond, pattern = "^muffle") [13:13:17.328] { [13:13:17.328] inherits <- base::inherits [13:13:17.328] invokeRestart <- base::invokeRestart [13:13:17.328] is.null <- base::is.null [13:13:17.328] muffled <- FALSE [13:13:17.328] if (inherits(cond, "message")) { [13:13:17.328] muffled <- grepl(pattern, "muffleMessage") [13:13:17.328] if (muffled) [13:13:17.328] invokeRestart("muffleMessage") [13:13:17.328] } [13:13:17.328] else if (inherits(cond, "warning")) { [13:13:17.328] muffled <- grepl(pattern, "muffleWarning") [13:13:17.328] if (muffled) [13:13:17.328] invokeRestart("muffleWarning") [13:13:17.328] } [13:13:17.328] else if (inherits(cond, "condition")) { [13:13:17.328] if (!is.null(pattern)) { [13:13:17.328] computeRestarts <- base::computeRestarts [13:13:17.328] grepl <- base::grepl [13:13:17.328] restarts <- computeRestarts(cond) [13:13:17.328] for (restart in restarts) { [13:13:17.328] name <- restart$name [13:13:17.328] if (is.null(name)) [13:13:17.328] next [13:13:17.328] if (!grepl(pattern, name)) [13:13:17.328] next [13:13:17.328] invokeRestart(restart) [13:13:17.328] muffled <- TRUE [13:13:17.328] break [13:13:17.328] } [13:13:17.328] } [13:13:17.328] } [13:13:17.328] invisible(muffled) [13:13:17.328] } [13:13:17.328] muffleCondition(cond) [13:13:17.328] }) [13:13:17.328] })) [13:13:17.328] future::FutureResult(value = ...future.value$value, [13:13:17.328] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:17.328] ...future.rng), globalenv = if (FALSE) [13:13:17.328] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:17.328] ...future.globalenv.names)) [13:13:17.328] else NULL, started = ...future.startTime, version = "1.8") [13:13:17.328] }, condition = base::local({ [13:13:17.328] c <- base::c [13:13:17.328] inherits <- base::inherits [13:13:17.328] invokeRestart <- base::invokeRestart [13:13:17.328] length <- base::length [13:13:17.328] list <- base::list [13:13:17.328] seq.int <- base::seq.int [13:13:17.328] signalCondition <- base::signalCondition [13:13:17.328] sys.calls <- base::sys.calls [13:13:17.328] `[[` <- base::`[[` [13:13:17.328] `+` <- base::`+` [13:13:17.328] `<<-` <- base::`<<-` [13:13:17.328] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:17.328] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:17.328] 3L)] [13:13:17.328] } [13:13:17.328] function(cond) { [13:13:17.328] is_error <- inherits(cond, "error") [13:13:17.328] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:17.328] NULL) [13:13:17.328] if (is_error) { [13:13:17.328] sessionInformation <- function() { [13:13:17.328] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:17.328] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:17.328] search = base::search(), system = base::Sys.info()) [13:13:17.328] } [13:13:17.328] ...future.conditions[[length(...future.conditions) + [13:13:17.328] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:17.328] cond$call), session = sessionInformation(), [13:13:17.328] timestamp = base::Sys.time(), signaled = 0L) [13:13:17.328] signalCondition(cond) [13:13:17.328] } [13:13:17.328] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:17.328] "immediateCondition"))) { [13:13:17.328] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:17.328] ...future.conditions[[length(...future.conditions) + [13:13:17.328] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:17.328] if (TRUE && !signal) { [13:13:17.328] muffleCondition <- function (cond, pattern = "^muffle") [13:13:17.328] { [13:13:17.328] inherits <- base::inherits [13:13:17.328] invokeRestart <- base::invokeRestart [13:13:17.328] is.null <- base::is.null [13:13:17.328] muffled <- FALSE [13:13:17.328] if (inherits(cond, "message")) { [13:13:17.328] muffled <- grepl(pattern, "muffleMessage") [13:13:17.328] if (muffled) [13:13:17.328] invokeRestart("muffleMessage") [13:13:17.328] } [13:13:17.328] else if (inherits(cond, "warning")) { [13:13:17.328] muffled <- grepl(pattern, "muffleWarning") [13:13:17.328] if (muffled) [13:13:17.328] invokeRestart("muffleWarning") [13:13:17.328] } [13:13:17.328] else if (inherits(cond, "condition")) { [13:13:17.328] if (!is.null(pattern)) { [13:13:17.328] computeRestarts <- base::computeRestarts [13:13:17.328] grepl <- base::grepl [13:13:17.328] restarts <- computeRestarts(cond) [13:13:17.328] for (restart in restarts) { [13:13:17.328] name <- restart$name [13:13:17.328] if (is.null(name)) [13:13:17.328] next [13:13:17.328] if (!grepl(pattern, name)) [13:13:17.328] next [13:13:17.328] invokeRestart(restart) [13:13:17.328] muffled <- TRUE [13:13:17.328] break [13:13:17.328] } [13:13:17.328] } [13:13:17.328] } [13:13:17.328] invisible(muffled) [13:13:17.328] } [13:13:17.328] muffleCondition(cond, pattern = "^muffle") [13:13:17.328] } [13:13:17.328] } [13:13:17.328] else { [13:13:17.328] if (TRUE) { [13:13:17.328] muffleCondition <- function (cond, pattern = "^muffle") [13:13:17.328] { [13:13:17.328] inherits <- base::inherits [13:13:17.328] invokeRestart <- base::invokeRestart [13:13:17.328] is.null <- base::is.null [13:13:17.328] muffled <- FALSE [13:13:17.328] if (inherits(cond, "message")) { [13:13:17.328] muffled <- grepl(pattern, "muffleMessage") [13:13:17.328] if (muffled) [13:13:17.328] invokeRestart("muffleMessage") [13:13:17.328] } [13:13:17.328] else if (inherits(cond, "warning")) { [13:13:17.328] muffled <- grepl(pattern, "muffleWarning") [13:13:17.328] if (muffled) [13:13:17.328] invokeRestart("muffleWarning") [13:13:17.328] } [13:13:17.328] else if (inherits(cond, "condition")) { [13:13:17.328] if (!is.null(pattern)) { [13:13:17.328] computeRestarts <- base::computeRestarts [13:13:17.328] grepl <- base::grepl [13:13:17.328] restarts <- computeRestarts(cond) [13:13:17.328] for (restart in restarts) { [13:13:17.328] name <- restart$name [13:13:17.328] if (is.null(name)) [13:13:17.328] next [13:13:17.328] if (!grepl(pattern, name)) [13:13:17.328] next [13:13:17.328] invokeRestart(restart) [13:13:17.328] muffled <- TRUE [13:13:17.328] break [13:13:17.328] } [13:13:17.328] } [13:13:17.328] } [13:13:17.328] invisible(muffled) [13:13:17.328] } [13:13:17.328] muffleCondition(cond, pattern = "^muffle") [13:13:17.328] } [13:13:17.328] } [13:13:17.328] } [13:13:17.328] })) [13:13:17.328] }, error = function(ex) { [13:13:17.328] base::structure(base::list(value = NULL, visible = NULL, [13:13:17.328] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:17.328] ...future.rng), started = ...future.startTime, [13:13:17.328] finished = Sys.time(), session_uuid = NA_character_, [13:13:17.328] version = "1.8"), class = "FutureResult") [13:13:17.328] }, finally = { [13:13:17.328] if (!identical(...future.workdir, getwd())) [13:13:17.328] setwd(...future.workdir) [13:13:17.328] { [13:13:17.328] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:17.328] ...future.oldOptions$nwarnings <- NULL [13:13:17.328] } [13:13:17.328] base::options(...future.oldOptions) [13:13:17.328] if (.Platform$OS.type == "windows") { [13:13:17.328] old_names <- names(...future.oldEnvVars) [13:13:17.328] envs <- base::Sys.getenv() [13:13:17.328] names <- names(envs) [13:13:17.328] common <- intersect(names, old_names) [13:13:17.328] added <- setdiff(names, old_names) [13:13:17.328] removed <- setdiff(old_names, names) [13:13:17.328] changed <- common[...future.oldEnvVars[common] != [13:13:17.328] envs[common]] [13:13:17.328] NAMES <- toupper(changed) [13:13:17.328] args <- list() [13:13:17.328] for (kk in seq_along(NAMES)) { [13:13:17.328] name <- changed[[kk]] [13:13:17.328] NAME <- NAMES[[kk]] [13:13:17.328] if (name != NAME && is.element(NAME, old_names)) [13:13:17.328] next [13:13:17.328] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:17.328] } [13:13:17.328] NAMES <- toupper(added) [13:13:17.328] for (kk in seq_along(NAMES)) { [13:13:17.328] name <- added[[kk]] [13:13:17.328] NAME <- NAMES[[kk]] [13:13:17.328] if (name != NAME && is.element(NAME, old_names)) [13:13:17.328] next [13:13:17.328] args[[name]] <- "" [13:13:17.328] } [13:13:17.328] NAMES <- toupper(removed) [13:13:17.328] for (kk in seq_along(NAMES)) { [13:13:17.328] name <- removed[[kk]] [13:13:17.328] NAME <- NAMES[[kk]] [13:13:17.328] if (name != NAME && is.element(NAME, old_names)) [13:13:17.328] next [13:13:17.328] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:17.328] } [13:13:17.328] if (length(args) > 0) [13:13:17.328] base::do.call(base::Sys.setenv, args = args) [13:13:17.328] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:17.328] } [13:13:17.328] else { [13:13:17.328] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:17.328] } [13:13:17.328] { [13:13:17.328] if (base::length(...future.futureOptionsAdded) > [13:13:17.328] 0L) { [13:13:17.328] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:17.328] base::names(opts) <- ...future.futureOptionsAdded [13:13:17.328] base::options(opts) [13:13:17.328] } [13:13:17.328] { [13:13:17.328] { [13:13:17.328] base::options(mc.cores = ...future.mc.cores.old) [13:13:17.328] NULL [13:13:17.328] } [13:13:17.328] options(future.plan = NULL) [13:13:17.328] if (is.na(NA_character_)) [13:13:17.328] Sys.unsetenv("R_FUTURE_PLAN") [13:13:17.328] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:17.328] future::plan(list(function (..., workers = availableCores(), [13:13:17.328] lazy = FALSE, rscript_libs = .libPaths(), [13:13:17.328] envir = parent.frame()) [13:13:17.328] { [13:13:17.328] if (is.function(workers)) [13:13:17.328] workers <- workers() [13:13:17.328] workers <- structure(as.integer(workers), [13:13:17.328] class = class(workers)) [13:13:17.328] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:17.328] workers >= 1) [13:13:17.328] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:17.328] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:17.328] } [13:13:17.328] future <- MultisessionFuture(..., workers = workers, [13:13:17.328] lazy = lazy, rscript_libs = rscript_libs, [13:13:17.328] envir = envir) [13:13:17.328] if (!future$lazy) [13:13:17.328] future <- run(future) [13:13:17.328] invisible(future) [13:13:17.328] }), .cleanup = FALSE, .init = FALSE) [13:13:17.328] } [13:13:17.328] } [13:13:17.328] } [13:13:17.328] }) [13:13:17.328] if (TRUE) { [13:13:17.328] base::sink(type = "output", split = FALSE) [13:13:17.328] if (TRUE) { [13:13:17.328] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:17.328] } [13:13:17.328] else { [13:13:17.328] ...future.result["stdout"] <- base::list(NULL) [13:13:17.328] } [13:13:17.328] base::close(...future.stdout) [13:13:17.328] ...future.stdout <- NULL [13:13:17.328] } [13:13:17.328] ...future.result$conditions <- ...future.conditions [13:13:17.328] ...future.result$finished <- base::Sys.time() [13:13:17.328] ...future.result [13:13:17.328] } [13:13:17.334] Exporting 5 global objects (1.21 KiB) to cluster node #1 ... [13:13:17.334] Exporting '...future.FUN' (1.21 KiB) to cluster node #1 ... [13:13:17.334] Exporting '...future.FUN' (1.21 KiB) to cluster node #1 ... DONE [13:13:17.335] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... [13:13:17.335] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... DONE [13:13:17.335] Exporting '...future.elements_ii' (1.60 KiB) to cluster node #1 ... [13:13:17.336] Exporting '...future.elements_ii' (1.60 KiB) to cluster node #1 ... DONE [13:13:17.336] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:13:17.337] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:13:17.337] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:13:17.337] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:13:17.337] Exporting 5 global objects (1.21 KiB) to cluster node #1 ... DONE [13:13:17.338] MultisessionFuture started [13:13:17.338] - Launch lazy future ... done [13:13:17.338] run() for 'MultisessionFuture' ... done [13:13:17.339] Created future: [13:13:17.355] receiveMessageFromWorker() for ClusterFuture ... [13:13:17.355] - Validating connection of MultisessionFuture [13:13:17.355] - received message: FutureResult [13:13:17.355] - Received FutureResult [13:13:17.356] - Erased future from FutureRegistry [13:13:17.356] result() for ClusterFuture ... [13:13:17.356] - result already collected: FutureResult [13:13:17.356] result() for ClusterFuture ... done [13:13:17.356] receiveMessageFromWorker() for ClusterFuture ... done [13:13:17.339] MultisessionFuture: [13:13:17.339] Label: 'future_by-1' [13:13:17.339] Expression: [13:13:17.339] { [13:13:17.339] do.call(function(...) { [13:13:17.339] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:17.339] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:17.339] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:17.339] on.exit(options(oopts), add = TRUE) [13:13:17.339] } [13:13:17.339] { [13:13:17.339] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:17.339] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:17.339] ...future.FUN(...future.X_jj, ...) [13:13:17.339] }) [13:13:17.339] } [13:13:17.339] }, args = future.call.arguments) [13:13:17.339] } [13:13:17.339] Lazy evaluation: FALSE [13:13:17.339] Asynchronous evaluation: TRUE [13:13:17.339] Local evaluation: TRUE [13:13:17.339] Environment: 0x00000186906590f0 [13:13:17.339] Capture standard output: TRUE [13:13:17.339] Capture condition classes: 'condition' (excluding 'nothing') [13:13:17.339] Globals: 5 objects totaling 2.81 KiB (function '...future.FUN' of 1.21 KiB, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 1.60 KiB, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:13:17.339] Packages: [13:13:17.339] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:17.339] Resolved: TRUE [13:13:17.339] Value: [13:13:17.339] Conditions captured: [13:13:17.339] Early signaling: FALSE [13:13:17.339] Owner process: f0659542-730c-c20a-65b3-84f202449c4d [13:13:17.339] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:17.357] Chunk #1 of 2 ... DONE [13:13:17.357] Chunk #2 of 2 ... [13:13:17.357] - Finding globals in 'X' for chunk #2 ... [13:13:17.357] getGlobalsAndPackages() ... [13:13:17.357] Searching for globals... [13:13:17.358] [13:13:17.358] Searching for globals ... DONE [13:13:17.358] - globals: [0] [13:13:17.358] getGlobalsAndPackages() ... DONE [13:13:17.358] + additional globals found: [n=0] [13:13:17.359] + additional namespaces needed: [n=0] [13:13:17.359] - Finding globals in 'X' for chunk #2 ... DONE [13:13:17.359] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:13:17.359] - seeds: [13:13:17.359] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:17.359] getGlobalsAndPackages() ... [13:13:17.360] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:17.360] Resolving globals: FALSE [13:13:17.360] Tweak future expression to call with '...' arguments ... [13:13:17.360] { [13:13:17.360] do.call(function(...) { [13:13:17.360] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:17.360] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:17.360] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:17.360] on.exit(options(oopts), add = TRUE) [13:13:17.360] } [13:13:17.360] { [13:13:17.360] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:17.360] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:17.360] ...future.FUN(...future.X_jj, ...) [13:13:17.360] }) [13:13:17.360] } [13:13:17.360] }, args = future.call.arguments) [13:13:17.360] } [13:13:17.361] Tweak future expression to call with '...' arguments ... DONE [13:13:17.361] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:17.361] [13:13:17.361] getGlobalsAndPackages() ... DONE [13:13:17.362] run() for 'Future' ... [13:13:17.362] - state: 'created' [13:13:17.362] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:17.376] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:17.376] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:13:17.376] - Field: 'node' [13:13:17.376] - Field: 'label' [13:13:17.377] - Field: 'local' [13:13:17.377] - Field: 'owner' [13:13:17.377] - Field: 'envir' [13:13:17.377] - Field: 'workers' [13:13:17.377] - Field: 'packages' [13:13:17.378] - Field: 'gc' [13:13:17.378] - Field: 'conditions' [13:13:17.378] - Field: 'persistent' [13:13:17.378] - Field: 'expr' [13:13:17.378] - Field: 'uuid' [13:13:17.378] - Field: 'seed' [13:13:17.379] - Field: 'version' [13:13:17.379] - Field: 'result' [13:13:17.379] - Field: 'asynchronous' [13:13:17.379] - Field: 'calls' [13:13:17.379] - Field: 'globals' [13:13:17.379] - Field: 'stdout' [13:13:17.380] - Field: 'earlySignal' [13:13:17.380] - Field: 'lazy' [13:13:17.380] - Field: 'state' [13:13:17.380] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:13:17.380] - Launch lazy future ... [13:13:17.381] Packages needed by the future expression (n = 0): [13:13:17.381] Packages needed by future strategies (n = 0): [13:13:17.381] { [13:13:17.381] { [13:13:17.381] { [13:13:17.381] ...future.startTime <- base::Sys.time() [13:13:17.381] { [13:13:17.381] { [13:13:17.381] { [13:13:17.381] { [13:13:17.381] base::local({ [13:13:17.381] has_future <- base::requireNamespace("future", [13:13:17.381] quietly = TRUE) [13:13:17.381] if (has_future) { [13:13:17.381] ns <- base::getNamespace("future") [13:13:17.381] version <- ns[[".package"]][["version"]] [13:13:17.381] if (is.null(version)) [13:13:17.381] version <- utils::packageVersion("future") [13:13:17.381] } [13:13:17.381] else { [13:13:17.381] version <- NULL [13:13:17.381] } [13:13:17.381] if (!has_future || version < "1.8.0") { [13:13:17.381] info <- base::c(r_version = base::gsub("R version ", [13:13:17.381] "", base::R.version$version.string), [13:13:17.381] platform = base::sprintf("%s (%s-bit)", [13:13:17.381] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:17.381] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:17.381] "release", "version")], collapse = " "), [13:13:17.381] hostname = base::Sys.info()[["nodename"]]) [13:13:17.381] info <- base::sprintf("%s: %s", base::names(info), [13:13:17.381] info) [13:13:17.381] info <- base::paste(info, collapse = "; ") [13:13:17.381] if (!has_future) { [13:13:17.381] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:17.381] info) [13:13:17.381] } [13:13:17.381] else { [13:13:17.381] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:17.381] info, version) [13:13:17.381] } [13:13:17.381] base::stop(msg) [13:13:17.381] } [13:13:17.381] }) [13:13:17.381] } [13:13:17.381] ...future.mc.cores.old <- base::getOption("mc.cores") [13:13:17.381] base::options(mc.cores = 1L) [13:13:17.381] } [13:13:17.381] options(future.plan = NULL) [13:13:17.381] Sys.unsetenv("R_FUTURE_PLAN") [13:13:17.381] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:17.381] } [13:13:17.381] ...future.workdir <- getwd() [13:13:17.381] } [13:13:17.381] ...future.oldOptions <- base::as.list(base::.Options) [13:13:17.381] ...future.oldEnvVars <- base::Sys.getenv() [13:13:17.381] } [13:13:17.381] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:17.381] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:13:17.381] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:17.381] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:17.381] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:17.381] future.stdout.windows.reencode = NULL, width = 80L) [13:13:17.381] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:17.381] base::names(...future.oldOptions)) [13:13:17.381] } [13:13:17.381] if (FALSE) { [13:13:17.381] } [13:13:17.381] else { [13:13:17.381] if (TRUE) { [13:13:17.381] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:17.381] open = "w") [13:13:17.381] } [13:13:17.381] else { [13:13:17.381] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:17.381] windows = "NUL", "/dev/null"), open = "w") [13:13:17.381] } [13:13:17.381] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:17.381] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:17.381] base::sink(type = "output", split = FALSE) [13:13:17.381] base::close(...future.stdout) [13:13:17.381] }, add = TRUE) [13:13:17.381] } [13:13:17.381] ...future.frame <- base::sys.nframe() [13:13:17.381] ...future.conditions <- base::list() [13:13:17.381] ...future.rng <- base::globalenv()$.Random.seed [13:13:17.381] if (FALSE) { [13:13:17.381] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:17.381] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:17.381] } [13:13:17.381] ...future.result <- base::tryCatch({ [13:13:17.381] base::withCallingHandlers({ [13:13:17.381] ...future.value <- base::withVisible(base::local({ [13:13:17.381] ...future.makeSendCondition <- local({ [13:13:17.381] sendCondition <- NULL [13:13:17.381] function(frame = 1L) { [13:13:17.381] if (is.function(sendCondition)) [13:13:17.381] return(sendCondition) [13:13:17.381] ns <- getNamespace("parallel") [13:13:17.381] if (exists("sendData", mode = "function", [13:13:17.381] envir = ns)) { [13:13:17.381] parallel_sendData <- get("sendData", mode = "function", [13:13:17.381] envir = ns) [13:13:17.381] envir <- sys.frame(frame) [13:13:17.381] master <- NULL [13:13:17.381] while (!identical(envir, .GlobalEnv) && [13:13:17.381] !identical(envir, emptyenv())) { [13:13:17.381] if (exists("master", mode = "list", envir = envir, [13:13:17.381] inherits = FALSE)) { [13:13:17.381] master <- get("master", mode = "list", [13:13:17.381] envir = envir, inherits = FALSE) [13:13:17.381] if (inherits(master, c("SOCKnode", [13:13:17.381] "SOCK0node"))) { [13:13:17.381] sendCondition <<- function(cond) { [13:13:17.381] data <- list(type = "VALUE", value = cond, [13:13:17.381] success = TRUE) [13:13:17.381] parallel_sendData(master, data) [13:13:17.381] } [13:13:17.381] return(sendCondition) [13:13:17.381] } [13:13:17.381] } [13:13:17.381] frame <- frame + 1L [13:13:17.381] envir <- sys.frame(frame) [13:13:17.381] } [13:13:17.381] } [13:13:17.381] sendCondition <<- function(cond) NULL [13:13:17.381] } [13:13:17.381] }) [13:13:17.381] withCallingHandlers({ [13:13:17.381] { [13:13:17.381] do.call(function(...) { [13:13:17.381] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:17.381] if (!identical(...future.globals.maxSize.org, [13:13:17.381] ...future.globals.maxSize)) { [13:13:17.381] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:17.381] on.exit(options(oopts), add = TRUE) [13:13:17.381] } [13:13:17.381] { [13:13:17.381] lapply(seq_along(...future.elements_ii), [13:13:17.381] FUN = function(jj) { [13:13:17.381] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:17.381] ...future.FUN(...future.X_jj, ...) [13:13:17.381] }) [13:13:17.381] } [13:13:17.381] }, args = future.call.arguments) [13:13:17.381] } [13:13:17.381] }, immediateCondition = function(cond) { [13:13:17.381] sendCondition <- ...future.makeSendCondition() [13:13:17.381] sendCondition(cond) [13:13:17.381] muffleCondition <- function (cond, pattern = "^muffle") [13:13:17.381] { [13:13:17.381] inherits <- base::inherits [13:13:17.381] invokeRestart <- base::invokeRestart [13:13:17.381] is.null <- base::is.null [13:13:17.381] muffled <- FALSE [13:13:17.381] if (inherits(cond, "message")) { [13:13:17.381] muffled <- grepl(pattern, "muffleMessage") [13:13:17.381] if (muffled) [13:13:17.381] invokeRestart("muffleMessage") [13:13:17.381] } [13:13:17.381] else if (inherits(cond, "warning")) { [13:13:17.381] muffled <- grepl(pattern, "muffleWarning") [13:13:17.381] if (muffled) [13:13:17.381] invokeRestart("muffleWarning") [13:13:17.381] } [13:13:17.381] else if (inherits(cond, "condition")) { [13:13:17.381] if (!is.null(pattern)) { [13:13:17.381] computeRestarts <- base::computeRestarts [13:13:17.381] grepl <- base::grepl [13:13:17.381] restarts <- computeRestarts(cond) [13:13:17.381] for (restart in restarts) { [13:13:17.381] name <- restart$name [13:13:17.381] if (is.null(name)) [13:13:17.381] next [13:13:17.381] if (!grepl(pattern, name)) [13:13:17.381] next [13:13:17.381] invokeRestart(restart) [13:13:17.381] muffled <- TRUE [13:13:17.381] break [13:13:17.381] } [13:13:17.381] } [13:13:17.381] } [13:13:17.381] invisible(muffled) [13:13:17.381] } [13:13:17.381] muffleCondition(cond) [13:13:17.381] }) [13:13:17.381] })) [13:13:17.381] future::FutureResult(value = ...future.value$value, [13:13:17.381] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:17.381] ...future.rng), globalenv = if (FALSE) [13:13:17.381] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:17.381] ...future.globalenv.names)) [13:13:17.381] else NULL, started = ...future.startTime, version = "1.8") [13:13:17.381] }, condition = base::local({ [13:13:17.381] c <- base::c [13:13:17.381] inherits <- base::inherits [13:13:17.381] invokeRestart <- base::invokeRestart [13:13:17.381] length <- base::length [13:13:17.381] list <- base::list [13:13:17.381] seq.int <- base::seq.int [13:13:17.381] signalCondition <- base::signalCondition [13:13:17.381] sys.calls <- base::sys.calls [13:13:17.381] `[[` <- base::`[[` [13:13:17.381] `+` <- base::`+` [13:13:17.381] `<<-` <- base::`<<-` [13:13:17.381] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:17.381] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:17.381] 3L)] [13:13:17.381] } [13:13:17.381] function(cond) { [13:13:17.381] is_error <- inherits(cond, "error") [13:13:17.381] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:17.381] NULL) [13:13:17.381] if (is_error) { [13:13:17.381] sessionInformation <- function() { [13:13:17.381] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:17.381] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:17.381] search = base::search(), system = base::Sys.info()) [13:13:17.381] } [13:13:17.381] ...future.conditions[[length(...future.conditions) + [13:13:17.381] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:17.381] cond$call), session = sessionInformation(), [13:13:17.381] timestamp = base::Sys.time(), signaled = 0L) [13:13:17.381] signalCondition(cond) [13:13:17.381] } [13:13:17.381] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:17.381] "immediateCondition"))) { [13:13:17.381] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:17.381] ...future.conditions[[length(...future.conditions) + [13:13:17.381] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:17.381] if (TRUE && !signal) { [13:13:17.381] muffleCondition <- function (cond, pattern = "^muffle") [13:13:17.381] { [13:13:17.381] inherits <- base::inherits [13:13:17.381] invokeRestart <- base::invokeRestart [13:13:17.381] is.null <- base::is.null [13:13:17.381] muffled <- FALSE [13:13:17.381] if (inherits(cond, "message")) { [13:13:17.381] muffled <- grepl(pattern, "muffleMessage") [13:13:17.381] if (muffled) [13:13:17.381] invokeRestart("muffleMessage") [13:13:17.381] } [13:13:17.381] else if (inherits(cond, "warning")) { [13:13:17.381] muffled <- grepl(pattern, "muffleWarning") [13:13:17.381] if (muffled) [13:13:17.381] invokeRestart("muffleWarning") [13:13:17.381] } [13:13:17.381] else if (inherits(cond, "condition")) { [13:13:17.381] if (!is.null(pattern)) { [13:13:17.381] computeRestarts <- base::computeRestarts [13:13:17.381] grepl <- base::grepl [13:13:17.381] restarts <- computeRestarts(cond) [13:13:17.381] for (restart in restarts) { [13:13:17.381] name <- restart$name [13:13:17.381] if (is.null(name)) [13:13:17.381] next [13:13:17.381] if (!grepl(pattern, name)) [13:13:17.381] next [13:13:17.381] invokeRestart(restart) [13:13:17.381] muffled <- TRUE [13:13:17.381] break [13:13:17.381] } [13:13:17.381] } [13:13:17.381] } [13:13:17.381] invisible(muffled) [13:13:17.381] } [13:13:17.381] muffleCondition(cond, pattern = "^muffle") [13:13:17.381] } [13:13:17.381] } [13:13:17.381] else { [13:13:17.381] if (TRUE) { [13:13:17.381] muffleCondition <- function (cond, pattern = "^muffle") [13:13:17.381] { [13:13:17.381] inherits <- base::inherits [13:13:17.381] invokeRestart <- base::invokeRestart [13:13:17.381] is.null <- base::is.null [13:13:17.381] muffled <- FALSE [13:13:17.381] if (inherits(cond, "message")) { [13:13:17.381] muffled <- grepl(pattern, "muffleMessage") [13:13:17.381] if (muffled) [13:13:17.381] invokeRestart("muffleMessage") [13:13:17.381] } [13:13:17.381] else if (inherits(cond, "warning")) { [13:13:17.381] muffled <- grepl(pattern, "muffleWarning") [13:13:17.381] if (muffled) [13:13:17.381] invokeRestart("muffleWarning") [13:13:17.381] } [13:13:17.381] else if (inherits(cond, "condition")) { [13:13:17.381] if (!is.null(pattern)) { [13:13:17.381] computeRestarts <- base::computeRestarts [13:13:17.381] grepl <- base::grepl [13:13:17.381] restarts <- computeRestarts(cond) [13:13:17.381] for (restart in restarts) { [13:13:17.381] name <- restart$name [13:13:17.381] if (is.null(name)) [13:13:17.381] next [13:13:17.381] if (!grepl(pattern, name)) [13:13:17.381] next [13:13:17.381] invokeRestart(restart) [13:13:17.381] muffled <- TRUE [13:13:17.381] break [13:13:17.381] } [13:13:17.381] } [13:13:17.381] } [13:13:17.381] invisible(muffled) [13:13:17.381] } [13:13:17.381] muffleCondition(cond, pattern = "^muffle") [13:13:17.381] } [13:13:17.381] } [13:13:17.381] } [13:13:17.381] })) [13:13:17.381] }, error = function(ex) { [13:13:17.381] base::structure(base::list(value = NULL, visible = NULL, [13:13:17.381] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:17.381] ...future.rng), started = ...future.startTime, [13:13:17.381] finished = Sys.time(), session_uuid = NA_character_, [13:13:17.381] version = "1.8"), class = "FutureResult") [13:13:17.381] }, finally = { [13:13:17.381] if (!identical(...future.workdir, getwd())) [13:13:17.381] setwd(...future.workdir) [13:13:17.381] { [13:13:17.381] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:17.381] ...future.oldOptions$nwarnings <- NULL [13:13:17.381] } [13:13:17.381] base::options(...future.oldOptions) [13:13:17.381] if (.Platform$OS.type == "windows") { [13:13:17.381] old_names <- names(...future.oldEnvVars) [13:13:17.381] envs <- base::Sys.getenv() [13:13:17.381] names <- names(envs) [13:13:17.381] common <- intersect(names, old_names) [13:13:17.381] added <- setdiff(names, old_names) [13:13:17.381] removed <- setdiff(old_names, names) [13:13:17.381] changed <- common[...future.oldEnvVars[common] != [13:13:17.381] envs[common]] [13:13:17.381] NAMES <- toupper(changed) [13:13:17.381] args <- list() [13:13:17.381] for (kk in seq_along(NAMES)) { [13:13:17.381] name <- changed[[kk]] [13:13:17.381] NAME <- NAMES[[kk]] [13:13:17.381] if (name != NAME && is.element(NAME, old_names)) [13:13:17.381] next [13:13:17.381] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:17.381] } [13:13:17.381] NAMES <- toupper(added) [13:13:17.381] for (kk in seq_along(NAMES)) { [13:13:17.381] name <- added[[kk]] [13:13:17.381] NAME <- NAMES[[kk]] [13:13:17.381] if (name != NAME && is.element(NAME, old_names)) [13:13:17.381] next [13:13:17.381] args[[name]] <- "" [13:13:17.381] } [13:13:17.381] NAMES <- toupper(removed) [13:13:17.381] for (kk in seq_along(NAMES)) { [13:13:17.381] name <- removed[[kk]] [13:13:17.381] NAME <- NAMES[[kk]] [13:13:17.381] if (name != NAME && is.element(NAME, old_names)) [13:13:17.381] next [13:13:17.381] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:17.381] } [13:13:17.381] if (length(args) > 0) [13:13:17.381] base::do.call(base::Sys.setenv, args = args) [13:13:17.381] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:17.381] } [13:13:17.381] else { [13:13:17.381] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:17.381] } [13:13:17.381] { [13:13:17.381] if (base::length(...future.futureOptionsAdded) > [13:13:17.381] 0L) { [13:13:17.381] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:17.381] base::names(opts) <- ...future.futureOptionsAdded [13:13:17.381] base::options(opts) [13:13:17.381] } [13:13:17.381] { [13:13:17.381] { [13:13:17.381] base::options(mc.cores = ...future.mc.cores.old) [13:13:17.381] NULL [13:13:17.381] } [13:13:17.381] options(future.plan = NULL) [13:13:17.381] if (is.na(NA_character_)) [13:13:17.381] Sys.unsetenv("R_FUTURE_PLAN") [13:13:17.381] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:17.381] future::plan(list(function (..., workers = availableCores(), [13:13:17.381] lazy = FALSE, rscript_libs = .libPaths(), [13:13:17.381] envir = parent.frame()) [13:13:17.381] { [13:13:17.381] if (is.function(workers)) [13:13:17.381] workers <- workers() [13:13:17.381] workers <- structure(as.integer(workers), [13:13:17.381] class = class(workers)) [13:13:17.381] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:17.381] workers >= 1) [13:13:17.381] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:17.381] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:17.381] } [13:13:17.381] future <- MultisessionFuture(..., workers = workers, [13:13:17.381] lazy = lazy, rscript_libs = rscript_libs, [13:13:17.381] envir = envir) [13:13:17.381] if (!future$lazy) [13:13:17.381] future <- run(future) [13:13:17.381] invisible(future) [13:13:17.381] }), .cleanup = FALSE, .init = FALSE) [13:13:17.381] } [13:13:17.381] } [13:13:17.381] } [13:13:17.381] }) [13:13:17.381] if (TRUE) { [13:13:17.381] base::sink(type = "output", split = FALSE) [13:13:17.381] if (TRUE) { [13:13:17.381] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:17.381] } [13:13:17.381] else { [13:13:17.381] ...future.result["stdout"] <- base::list(NULL) [13:13:17.381] } [13:13:17.381] base::close(...future.stdout) [13:13:17.381] ...future.stdout <- NULL [13:13:17.381] } [13:13:17.381] ...future.result$conditions <- ...future.conditions [13:13:17.381] ...future.result$finished <- base::Sys.time() [13:13:17.381] ...future.result [13:13:17.381] } [13:13:17.387] Exporting 5 global objects (1.21 KiB) to cluster node #1 ... [13:13:17.387] Exporting '...future.FUN' (1.21 KiB) to cluster node #1 ... [13:13:17.387] Exporting '...future.FUN' (1.21 KiB) to cluster node #1 ... DONE [13:13:17.388] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... [13:13:17.388] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... DONE [13:13:17.388] Exporting '...future.elements_ii' (3.20 KiB) to cluster node #1 ... [13:13:17.389] Exporting '...future.elements_ii' (3.20 KiB) to cluster node #1 ... DONE [13:13:17.389] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:13:17.389] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:13:17.390] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:13:17.390] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:13:17.390] Exporting 5 global objects (1.21 KiB) to cluster node #1 ... DONE [13:13:17.391] MultisessionFuture started [13:13:17.391] - Launch lazy future ... done [13:13:17.391] run() for 'MultisessionFuture' ... done [13:13:17.392] Created future: [13:13:17.408] receiveMessageFromWorker() for ClusterFuture ... [13:13:17.408] - Validating connection of MultisessionFuture [13:13:17.409] - received message: FutureResult [13:13:17.409] - Received FutureResult [13:13:17.409] - Erased future from FutureRegistry [13:13:17.409] result() for ClusterFuture ... [13:13:17.409] - result already collected: FutureResult [13:13:17.409] result() for ClusterFuture ... done [13:13:17.410] receiveMessageFromWorker() for ClusterFuture ... done [13:13:17.392] MultisessionFuture: [13:13:17.392] Label: 'future_by-2' [13:13:17.392] Expression: [13:13:17.392] { [13:13:17.392] do.call(function(...) { [13:13:17.392] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:17.392] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:17.392] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:17.392] on.exit(options(oopts), add = TRUE) [13:13:17.392] } [13:13:17.392] { [13:13:17.392] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:17.392] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:17.392] ...future.FUN(...future.X_jj, ...) [13:13:17.392] }) [13:13:17.392] } [13:13:17.392] }, args = future.call.arguments) [13:13:17.392] } [13:13:17.392] Lazy evaluation: FALSE [13:13:17.392] Asynchronous evaluation: TRUE [13:13:17.392] Local evaluation: TRUE [13:13:17.392] Environment: 0x00000186906590f0 [13:13:17.392] Capture standard output: TRUE [13:13:17.392] Capture condition classes: 'condition' (excluding 'nothing') [13:13:17.392] Globals: 5 objects totaling 4.41 KiB (function '...future.FUN' of 1.21 KiB, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 3.20 KiB, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:13:17.392] Packages: [13:13:17.392] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:17.392] Resolved: TRUE [13:13:17.392] Value: [13:13:17.392] Conditions captured: [13:13:17.392] Early signaling: FALSE [13:13:17.392] Owner process: f0659542-730c-c20a-65b3-84f202449c4d [13:13:17.392] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:17.410] Chunk #2 of 2 ... DONE [13:13:17.410] Launching 2 futures (chunks) ... DONE [13:13:17.410] Resolving 2 futures (chunks) ... [13:13:17.411] resolve() on list ... [13:13:17.411] recursive: 0 [13:13:17.411] length: 2 [13:13:17.411] [13:13:17.411] Future #1 [13:13:17.411] result() for ClusterFuture ... [13:13:17.412] - result already collected: FutureResult [13:13:17.412] result() for ClusterFuture ... done [13:13:17.412] result() for ClusterFuture ... [13:13:17.412] - result already collected: FutureResult [13:13:17.412] result() for ClusterFuture ... done [13:13:17.412] signalConditionsASAP(MultisessionFuture, pos=1) ... [13:13:17.412] - nx: 2 [13:13:17.413] - relay: TRUE [13:13:17.413] - stdout: TRUE [13:13:17.413] - signal: TRUE [13:13:17.413] - resignal: FALSE [13:13:17.413] - force: TRUE [13:13:17.413] - relayed: [n=2] FALSE, FALSE [13:13:17.414] - queued futures: [n=2] FALSE, FALSE [13:13:17.414] - until=1 [13:13:17.414] - relaying element #1 [13:13:17.414] result() for ClusterFuture ... [13:13:17.414] - result already collected: FutureResult [13:13:17.414] result() for ClusterFuture ... done [13:13:17.415] result() for ClusterFuture ... [13:13:17.415] - result already collected: FutureResult [13:13:17.415] result() for ClusterFuture ... done [13:13:17.415] result() for ClusterFuture ... [13:13:17.415] - result already collected: FutureResult [13:13:17.415] result() for ClusterFuture ... done [13:13:17.416] result() for ClusterFuture ... [13:13:17.416] - result already collected: FutureResult [13:13:17.416] result() for ClusterFuture ... done [13:13:17.416] - relayed: [n=2] TRUE, FALSE [13:13:17.416] - queued futures: [n=2] TRUE, FALSE [13:13:17.416] signalConditionsASAP(MultisessionFuture, pos=1) ... done [13:13:17.417] length: 1 (resolved future 1) [13:13:17.417] Future #2 [13:13:17.417] result() for ClusterFuture ... [13:13:17.417] - result already collected: FutureResult [13:13:17.417] result() for ClusterFuture ... done [13:13:17.417] result() for ClusterFuture ... [13:13:17.418] - result already collected: FutureResult [13:13:17.418] result() for ClusterFuture ... done [13:13:17.418] signalConditionsASAP(MultisessionFuture, pos=2) ... [13:13:17.418] - nx: 2 [13:13:17.418] - relay: TRUE [13:13:17.418] - stdout: TRUE [13:13:17.418] - signal: TRUE [13:13:17.419] - resignal: FALSE [13:13:17.419] - force: TRUE [13:13:17.419] - relayed: [n=2] TRUE, FALSE [13:13:17.419] - queued futures: [n=2] TRUE, FALSE [13:13:17.419] - until=2 [13:13:17.419] - relaying element #2 [13:13:17.420] result() for ClusterFuture ... [13:13:17.420] - result already collected: FutureResult [13:13:17.420] result() for ClusterFuture ... done [13:13:17.420] result() for ClusterFuture ... [13:13:17.420] - result already collected: FutureResult [13:13:17.420] result() for ClusterFuture ... done [13:13:17.421] result() for ClusterFuture ... [13:13:17.421] - result already collected: FutureResult [13:13:17.421] result() for ClusterFuture ... done [13:13:17.421] result() for ClusterFuture ... [13:13:17.421] - result already collected: FutureResult [13:13:17.421] result() for ClusterFuture ... done [13:13:17.422] - relayed: [n=2] TRUE, TRUE [13:13:17.422] - queued futures: [n=2] TRUE, TRUE [13:13:17.422] signalConditionsASAP(MultisessionFuture, pos=2) ... done [13:13:17.422] length: 0 (resolved future 2) [13:13:17.422] Relaying remaining futures [13:13:17.422] signalConditionsASAP(NULL, pos=0) ... [13:13:17.423] - nx: 2 [13:13:17.423] - relay: TRUE [13:13:17.423] - stdout: TRUE [13:13:17.423] - signal: TRUE [13:13:17.423] - resignal: FALSE [13:13:17.423] - force: TRUE [13:13:17.423] - relayed: [n=2] TRUE, TRUE [13:13:17.424] - queued futures: [n=2] TRUE, TRUE - flush all [13:13:17.424] - relayed: [n=2] TRUE, TRUE [13:13:17.424] - queued futures: [n=2] TRUE, TRUE [13:13:17.424] signalConditionsASAP(NULL, pos=0) ... done [13:13:17.424] resolve() on list ... DONE [13:13:17.425] result() for ClusterFuture ... [13:13:17.425] - result already collected: FutureResult [13:13:17.425] result() for ClusterFuture ... done [13:13:17.425] result() for ClusterFuture ... [13:13:17.425] - result already collected: FutureResult [13:13:17.425] result() for ClusterFuture ... done [13:13:17.426] result() for ClusterFuture ... [13:13:17.426] - result already collected: FutureResult [13:13:17.426] result() for ClusterFuture ... done [13:13:17.426] result() for ClusterFuture ... [13:13:17.426] - result already collected: FutureResult [13:13:17.426] result() for ClusterFuture ... done [13:13:17.427] - Number of value chunks collected: 2 [13:13:17.427] Resolving 2 futures (chunks) ... DONE [13:13:17.427] Reducing values from 2 chunks ... [13:13:17.427] - Number of values collected after concatenation: 3 [13:13:17.427] - Number of values expected: 3 [13:13:17.427] Reducing values from 2 chunks ... DONE [13:13:17.427] future_lapply() ... DONE [13:13:17.428] future_by_internal() ... DONE [13:13:17.429] future_by_internal() ... Testing with 2 cores ... DONE > > message("*** future_by() ... DONE") *** future_by() ... DONE > > source("incl/end.R") [13:13:17.430] plan(): Setting new future strategy stack: [13:13:17.430] List of future strategies: [13:13:17.430] 1. FutureStrategy: [13:13:17.430] - args: function (..., envir = parent.frame(), workers = "") [13:13:17.430] - tweaked: FALSE [13:13:17.430] - call: future::plan(oplan) [13:13:17.431] plan(): nbrOfWorkers() = 1 > > proc.time() user system elapsed 2.53 0.20 3.62